Library/Packages

library(tidyverse)
## Warning: package 'tidyverse' was built under R version 4.0.5
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5     v purrr   0.3.4
## v tibble  3.1.3     v dplyr   1.0.7
## v tidyr   1.1.3     v stringr 1.4.0
## v readr   2.0.0     v forcats 0.5.1
## Warning: package 'ggplot2' was built under R version 4.0.5
## Warning: package 'readr' was built under R version 4.0.5
## Warning: package 'dplyr' was built under R version 4.0.5
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(janitor)
## 
## Attaching package: 'janitor'
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test

Data Source: U.S. Department of Education, National Center for Education Statistics, Common Core of Data (CCD), “Public Elementary/Secondary School Universe Survey”, 2018-19; “Public Elementary/Secondary School Universe Survey Geographic Data (EDGE)”, 2018-2019.

† indicates that the data are not applicable. – indicates that the data are missing. ‡ indicates that the data do not meet NCES data quality standards.

#Public school information exported from ELIS 2018-2019 school year used symbols "-" for missing values, † is for Not applicable, ‡ for data not met quality standard
public_school <-read.csv('./Datasets/public_schoolv3.csv', na.strings = c("","-","‡"), 
                         header = T, strip.white = T, sep = ",",
                         fileEncoding="UTF-8-BOM")

#public school file exported from ELIS, when importing the excel file it was problematic with mixed data types.
#Note that csv version is 26 MB, instead of 15 MB in excel format

Public School Data 2018-2019 School Year

colnames(public_school)
##  [1] "State.Name"            "ST"                    "School.Name"          
##  [4] "NCES.SchID"            "Agency_Name"           "County_Name"          
##  [7] "COUNTY.ID"             "Urban.centric.Locale"  "Latitude"             
## [10] "Longitude"             "Title.I.School.Status" "Updated.Status"       
## [13] "Agency.Type"           "School.Type"           "Members"              
## [16] "Male"                  "Female"                "FTE.Equivalent"       
## [19] "Pupil.Teacher.Ratio"
head(public_school)
##      State.Name ST                     School.Name  NCES.SchID
## 1 Massachusetts MA 1 LT Charles W. Whitcomb School 2.50732e+11
## 2    Washington WA              10th Street School 5.30486e+11
## 3     Minnesota MN       112 ALC Independent Study 2.70819e+11
## 4     Minnesota MN           112 ALC MIDDLE SCHOOL 2.70819e+11
## 5     MINNESOTA MN              112 ALC Seat-Based 2.70819e+11
## 6      Michigan MI          12th Street Elementary 2.62895e+11
##                           Agency_Name      County_Name COUNTY.ID
## 1                         Marlborough Middlesex County     25017
## 2          Marysville School District Snohomish County     53061
## 3 EASTERN CARVER COUNTY PUBLIC SCHOOL    Carver County     27019
## 4 EASTERN CARVER COUNTY PUBLIC SCHOOL    Carver County     27019
## 5 EASTERN CARVER COUNTY PUBLIC SCHOOL    Carver County     27019
## 6              Portage Public Schools Kalamazoo County     26077
##   Urban.centric.Locale Latitude  Longitude                Title.I.School.Status
## 1     21-Suburb: Large 42.35735  -71.54859          5-Title I schoolwide school
## 2  22-Suburb: Mid-size 48.05744 -122.18199               6-Not a Title I school
## 3     21-Suburb: Large 44.84528  -93.57477 2-Title I targeted assistance school
## 4     21-Suburb: Large 44.84161  -93.59692 2-Title I targeted assistance school
## 5     21-Suburb: Large 44.84280  -93.59659                                  n/a
## 6       13-City: Small 42.22038  -85.64661               6-Not a Title I school
##   Updated.Status
## 1         1-Open
## 2         1-Open
## 3         1-Open
## 4         1-Open
## 5        4-Added
## 6         1-Open
##                                                                      Agency.Type
## 1 1-Regular local school district that is NOT a component of a supervisory union
## 2 1-Regular local school district that is NOT a component of a supervisory union
## 3 1-Regular local school district that is NOT a component of a supervisory union
## 4 1-Regular local school district that is NOT a component of a supervisory union
## 5 1-Regular local school district that is NOT a component of a supervisory union
## 6 1-Regular local school district that is NOT a component of a supervisory union
##                  School.Type Members Male Female FTE.Equivalent
## 1           1-Regular school    1308  681    627          118.8
## 2           1-Regular school     178   77    101            7.3
## 3 4-Alternative/other school      37   20     17           <NA>
## 4 4-Alternative/other school     366  198    168           <NA>
## 5 4-Alternative/other school       0    0      0              0
## 6           1-Regular school     530  269    261          29.26
##   Pupil.Teacher.Ratio
## 1               11.01
## 2               24.38
## 3                 n/a
## 4                 n/a
## 5                 n/a
## 6               18.11
str(public_school) #99348 rows
## 'data.frame':    99348 obs. of  19 variables:
##  $ State.Name           : chr  "Massachusetts" "Washington" "Minnesota" "Minnesota" ...
##  $ ST                   : chr  "MA" "WA" "MN" "MN" ...
##  $ School.Name          : chr  "1 LT Charles W. Whitcomb School" "10th Street School" "112 ALC Independent Study" "112 ALC MIDDLE SCHOOL" ...
##  $ NCES.SchID           : num  2.51e+11 5.30e+11 2.71e+11 2.71e+11 2.71e+11 ...
##  $ Agency_Name          : chr  "Marlborough" "Marysville School District" "EASTERN CARVER COUNTY PUBLIC SCHOOL" "EASTERN CARVER COUNTY PUBLIC SCHOOL" ...
##  $ County_Name          : chr  "Middlesex County" "Snohomish County" "Carver County" "Carver County" ...
##  $ COUNTY.ID            : int  25017 53061 27019 27019 27019 26077 31001 31079 18089 42029 ...
##  $ Urban.centric.Locale : chr  "21-Suburb: Large" "22-Suburb: Mid-size" "21-Suburb: Large" "21-Suburb: Large" ...
##  $ Latitude             : num  42.4 48.1 44.8 44.8 44.8 ...
##  $ Longitude            : num  -71.5 -122.2 -93.6 -93.6 -93.6 ...
##  $ Title.I.School.Status: chr  "5-Title I schoolwide school" "6-Not a Title I school" "2-Title I targeted assistance school" "2-Title I targeted assistance school" ...
##  $ Updated.Status       : chr  "1-Open" "1-Open" "1-Open" "1-Open" ...
##  $ Agency.Type          : chr  "1-Regular local school district that is NOT a component of a supervisory union" "1-Regular local school district that is NOT a component of a supervisory union" "1-Regular local school district that is NOT a component of a supervisory union" "1-Regular local school district that is NOT a component of a supervisory union" ...
##  $ School.Type          : chr  "1-Regular school" "1-Regular school" "4-Alternative/other school" "4-Alternative/other school" ...
##  $ Members              : chr  "1308" "178" "37" "366" ...
##  $ Male                 : chr  "681" "77" "20" "198" ...
##  $ Female               : chr  "627" "101" "17" "168" ...
##  $ FTE.Equivalent       : chr  "118.8" "7.3" NA NA ...
##  $ Pupil.Teacher.Ratio  : chr  "11.01" "24.38" "n/a" "n/a" ...

Note that some data types aren’t read in correctly. For this exploration there is no modification.

get_dupes(public_school)
## No variable names specified - using all columns.
## No duplicate combinations found of: State.Name, ST, School.Name, NCES.SchID, Agency_Name, County_Name, COUNTY.ID, Urban.centric.Locale, Latitude, ... and 10 other variables
##  [1] State.Name            ST                    School.Name          
##  [4] NCES.SchID            Agency_Name           County_Name          
##  [7] COUNTY.ID             Urban.centric.Locale  Latitude             
## [10] Longitude             Title.I.School.Status Updated.Status       
## [13] Agency.Type           School.Type           Members              
## [16] Male                  Female                FTE.Equivalent       
## [19] Pupil.Teacher.Ratio   dupe_count           
## <0 rows> (or 0-length row.names)

Part 1. Data Exploration

public_school[!complete.cases(public_school),]
##           State.Name ST
## 3          Minnesota MN
## 4          Minnesota MN
## 108         Illinois IL
## 129         Illinois IL
## 133       California CA
## 163        Louisiana LA
## 177         Virginia VA
## 209          Arizona AZ
## 210          Arizona AZ
## 212          Georgia GA
## 263            Texas TX
## 283    Massachusetts MA
## 397          Florida FL
## 398          FLORIDA FL
## 399          Florida FL
## 400          FLORIDA FL
## 404         VIRGINIA VA
## 406          Arizona AZ
## 407          Arizona AZ
## 413         Virginia VA
## 421          Arizona AZ
## 422          Arizona AZ
## 427       California CA
## 432       NEW JERSEY NJ
## 446       NEW JERSEY NJ
## 455       New Jersey NJ
## 457             Utah UT
## 458       New Jersey NJ
## 496          Arizona AZ
## 497           Nevada NV
## 499    West Virginia WV
## 506         VIRGINIA VA
## 508          Arizona AZ
## 516          Arizona AZ
## 517          ARIZONA AZ
## 518          Arizona AZ
## 535          Arizona AZ
## 536          Arizona AZ
## 537          Arizona AZ
## 544             Utah UT
## 545       California CA
## 546    West Virginia WV
## 552          Arizona AZ
## 574          Arizona AZ
## 575          Arizona AZ
## 579          ALABAMA AL
## 584        Minnesota MN
## 591          Arizona AZ
## 637       California CA
## 661         Virginia VA
## 680          Arizona AZ
## 681          Arizona AZ
## 688         ILLINOIS IL
## 717       California CA
## 803             Utah UT
## 805             Utah UT
## 807          Arizona AZ
## 849             Utah UT
## 875         Illinois IL
## 898          Arizona AZ
## 899          Alabama AL
## 915         Virginia VA
## 919       New Jersey NJ
## 924           NEVADA NV
## 925          Florida FL
## 929          Florida FL
## 930         Virginia VA
## 932          Florida FL
## 933          Florida FL
## 936         Virginia VA
## 937          Florida FL
## 938          Florida FL
## 942          FLORIDA FL
## 943          Florida FL
## 950         Virginia VA
## 951         Virginia VA
## 952    MASSACHUSETTS MA
## 959         Virginia VA
## 969          Arizona AZ
## 1028         ARIZONA AZ
## 1072         ARIZONA AZ
## 1105         Arizona AZ
## 1106         Arizona AZ
## 1139         Arizona AZ
## 1140         Arizona AZ
## 1141         Arizona AZ
## 1144         Florida FL
## 1145         Florida FL
## 1150         Florida FL
## 1151         Florida FL
## 1160      California CA
## 1163      California CA
## 1247        Illinois IL
## 1252      New Jersey NJ
## 1290            Utah UT
## 1318            Utah UT
## 1335        Virginia VA
## 1336        Virginia VA
## 1337        Virginia VA
## 1338        Virginia VA
## 1345       Minnesota MN
## 1347       Minnesota MN
## 1358       Minnesota MN
## 1431           Texas TX
## 1470            IOWA IA
## 1506       Minnesota MN
## 1557        Missouri MO
## 1633           Texas TX
## 1656         Arizona AZ
## 1660      California CA
## 1661      California CA
## 1692         Indiana IN
## 1693         Indiana IN
## 1738         Alabama AL
## 1766         Alabama AL
## 1837      California CA
## 1844      California CA
## 1853      California CA
## 1857      New Jersey NJ
## 1877        Illinois IL
## 1902         Florida FL
## 1906      California CA
## 1907      California CA
## 1921            Utah UT
## 1922            Utah UT
## 1932        Missouri MO
## 1940            Utah UT
## 1952            Utah UT
## 1971         Arizona AZ
## 1972      CALIFORNIA CA
## 1974      CALIFORNIA CA
## 1987            Utah UT
## 1989            Utah UT
## 1992            Utah UT
## 2008        Virginia VA
## 2014         Arizona AZ
## 2016        Virginia VA
## 2017        Virginia VA
## 2020        Virginia VA
## 2027         Florida FL
## 2034         Florida FL
## 2036         Alabama AL
## 2038         Alabama AL
## 2054        Maryland MD
## 2057           Texas TX
## 2060         Georgia GA
## 2061         Alabama AL
## 2067      California CA
## 2160          Nevada NV
## 2162      California CA
## 2163      California CA
## 2194      CALIFORNIA CA
## 2195      California CA
## 2210        Illinois IL
## 2212        Illinois IL
## 2213        Illinois IL
## 2219         Arizona AZ
## 2230            Utah UT
## 2236        Virginia VA
## 2242            UTAH UT
## 2251            Utah UT
## 2252            Utah UT
## 2253         Arizona AZ
## 2254         Arizona AZ
## 2266            Utah UT
## 2268            Utah UT
## 2269         Arizona AZ
## 2270         ARIZONA AZ
## 2271         ARIZONA AZ
## 2272         ARIZONA AZ
## 2273         Arizona AZ
## 2274         Arizona AZ
## 2275         ARIZONA AZ
## 2279            Utah UT
## 2280            Utah UT
## 2281            Utah UT
## 2282            UTAH UT
## 2283            UTAH UT
## 2284            Utah UT
## 2288         Florida FL
## 2297         Arizona AZ
## 2298         Arizona AZ
## 2299         Arizona AZ
## 2300         Arizona AZ
## 2310   Massachusetts MA
## 2334         FLORIDA FL
## 2335         Florida FL
## 2342         Florida FL
## 2343         Florida FL
## 2348         Florida FL
## 2350         Florida FL
## 2351         Florida FL
## 2352         Florida FL
## 2355         Florida FL
## 2440         Florida FL
## 2442      New Jersey NJ
## 2552        Illinois IL
## 2669      New Jersey NJ
## 2682         Florida FL
## 2704      New Jersey NJ
## 2720            Utah UT
## 2724       Minnesota MN
## 2743        Maryland MD
## 2786         Alabama AL
## 2832      California CA
## 2842            Utah UT
## 2846      California CA
## 2847      California CA
## 2857   West Virginia WV
## 2886            Utah UT
## 2887      California CA
## 2888      California CA
## 2926         Arizona AZ
## 2927         Arizona AZ
## 2928         Arizona AZ
## 2929         Arizona AZ
## 2930         Arizona AZ
## 2931         Arizona AZ
## 2932         Arizona AZ
## 2941         Arizona AZ
## 2943         Arizona AZ
## 3000      CALIFORNIA CA
## 3009      California CA
## 3049        Virginia VA
## 3129         Florida FL
## 3130         Florida FL
## 3155            Utah UT
## 3274         Arizona AZ
## 3275         ARIZONA AZ
## 3276         Arizona AZ
## 3277         Arizona AZ
## 3278         Arizona AZ
## 3279         ARIZONA AZ
## 3280         ARIZONA AZ
## 3281         Arizona AZ
## 3282         Arizona AZ
## 3284         Arizona AZ
## 3287         Arizona AZ
## 3288         Arizona AZ
## 3289         Arizona AZ
## 3290         Arizona AZ
## 3291         Arizona AZ
## 3295         Arizona AZ
## 3296         Arizona AZ
## 3297         ARIZONA AZ
## 3299         Arizona AZ
## 3300         Arizona AZ
## 3301         Arizona AZ
## 3330       LOUISIANA LA
## 3512            Utah UT
## 3544            Utah UT
## 3613         Arizona AZ
## 3646      California CA
## 3666            Utah UT
## 3667            UTAH UT
## 3668            UTAH UT
## 3673         Arizona AZ
## 3674         Arizona AZ
## 3675         Arizona AZ
## 3763      California CA
## 3770            Utah UT
## 3771            Utah UT
## 3772            Utah UT
## 3780        Illinois IL
## 3781        Illinois IL
## 3782        Illinois IL
## 3791        Illinois IL
## 3796         Arizona AZ
## 3797         Arizona AZ
## 3798         Arizona AZ
## 3799         Arizona AZ
## 3800         Arizona AZ
## 3801         Arizona AZ
## 3802         Arizona AZ
## 3803         Arizona AZ
## 3804         Arizona AZ
## 3825            Utah UT
## 3834        ILLINOIS IL
## 3835        ILLINOIS IL
## 3837         Florida FL
## 3841        VIRGINIA VA
## 3898      California CA
## 3914         ARIZONA AZ
## 3915         Arizona AZ
## 3916         ARIZONA AZ
## 3917         ARIZONA AZ
## 3918         Arizona AZ
## 3919         Arizona AZ
## 3920         Arizona AZ
## 3921         Arizona AZ
## 3922         ARIZONA AZ
## 3931           Texas TX
## 3934           Texas TX
## 3953            UTAH UT
## 3986       MINNESOTA MN
## 3987            UTAH UT
## 4006      CALIFORNIA CA
## 4034      New Jersey NJ
## 4042         Florida FL
## 4051      New Jersey NJ
## 4053      New Jersey NJ
## 4196         Georgia GA
## 4204         ARIZONA AZ
## 4283           TEXAS TX
## 4308         Alabama AL
## 4309         Alabama AL
## 4332         Arizona AZ
## 4384      California CA
## 4472           Texas TX
## 4497         Arizona AZ
## 4513         Arizona AZ
## 4514      New Mexico NM
## 4534        ILLINOIS IL
## 4547        Missouri MO
## 4557       Louisiana LA
## 4576         Florida FL
## 4592            Utah UT
## 4622        Virginia VA
## 4623        Virginia VA
## 4626      California CA
## 4635       Minnesota MN
## 4644          Nevada NV
## 4690         Florida FL
## 4695         Florida FL
## 4727         Florida FL
## 4728         Florida FL
## 4800      California CA
## 4807         Arizona AZ
## 4948        Illinois IL
## 4949      California CA
## 4950      California CA
## 4952      California CA
## 5054   West Virginia WV
## 5128   West Virginia WV
## 5137            Utah UT
## 5164      California CA
## 5174            Utah UT
## 5189   Massachusetts MA
## 5305         Arizona AZ
## 5306         Arizona AZ
## 5307         ARIZONA AZ
## 5308         ARIZONA AZ
## 5310         Arizona AZ
## 5311         ARIZONA AZ
## 5312         ARIZONA AZ
## 5313         Arizona AZ
## 5314         Arizona AZ
## 5315         ARIZONA AZ
## 5316         Arizona AZ
## 5317         ARIZONA AZ
## 5318         Arizona AZ
## 5319         Arizona AZ
## 5320         ARIZONA AZ
## 5321         ARIZONA AZ
## 5322         ARIZONA AZ
## 5323           TEXAS TX
## 5324           TEXAS TX
## 5325           Texas TX
## 5326         Arizona AZ
## 5327         ARIZONA AZ
## 5328         Arizona AZ
## 5329         Arizona AZ
## 5347            UTAH UT
## 5348           Texas TX
## 5375            Utah UT
## 5457         Florida FL
## 5532         Florida FL
## 5533         Florida FL
## 5534         Florida FL
## 5588      California CA
## 5623        Maryland MD
## 5670            Utah UT
## 5672         Florida FL
## 5735            Utah UT
## 5737            Utah UT
## 5738            Utah UT
## 5803      California CA
## 5809   Massachusetts MA
## 5825            Utah UT
## 5829       MINNESOTA MN
## 5834            Utah UT
## 5873   West Virginia WV
## 5885        Virginia VA
## 5908        Virginia VA
## 5937         Indiana IN
## 5967            Utah UT
## 5968            Utah UT
## 5989        ILLINOIS IL
## 6059            Utah UT
## 6075           Texas TX
## 6114            Utah UT
## 6122         ARIZONA AZ
## 6131            Utah UT
## 6152         Alabama AL
## 6156        Illinois IL
## 6184       MINNESOTA MN
## 6263      California CA
## 6397       Minnesota MN
## 6416   West Virginia WV
## 6426         Florida FL
## 6428         Florida FL
## 6441            Utah UT
## 6456        ILLINOIS IL
## 6463         Arizona AZ
## 6506      California CA
## 6508         Arizona AZ
## 6509         Arizona AZ
## 6510         Arizona AZ
## 6531         Arizona AZ
## 6541        Illinois IL
## 6574         Arizona AZ
## 6575         Arizona AZ
## 6616            Utah UT
## 6617            Utah UT
## 6684       MINNESOTA MN
## 6685       MINNESOTA MN
## 6687       Minnesota MN
## 6710         Arizona AZ
## 6723      New Jersey NJ
## 6729      New Jersey NJ
## 6753      California CA
## 6872      California CA
## 6933         Alabama AL
## 6965       Minnesota MN
## 7127           Texas TX
## 7128           Texas TX
## 7129           Texas TX
## 7130           Texas TX
## 7135           Texas TX
## 7146         Alabama AL
## 7166      California CA
## 7200      California CA
## 7211      California CA
## 7213       MINNESOTA MN
## 7214         Florida FL
## 7252      California CA
## 7263            Utah UT
## 7264            Utah UT
## 7280      California CA
## 7296           Texas TX
## 7338            Utah UT
## 7351            Utah UT
## 7424       Minnesota MN
## 7430         Florida FL
## 7470      California CA
## 7498        Illinois IL
## 7522            UTAH UT
## 7523       Wisconsin WI
## 7576            UTAH UT
## 7588           Texas TX
## 7659      California CA
## 7709            Utah UT
## 7752            Utah UT
## 7753            UTAH UT
## 7769        Illinois IL
## 7770        Illinois IL
## 7816       MINNESOTA MN
## 7825            Utah UT
## 7828            Utah UT
## 7829       Minnesota MN
## 7836      California CA
## 7839      California CA
## 7843         Alabama AL
## 7844         Alabama AL
## 7900            Utah UT
## 7922        Virginia VA
## 7931        Virginia VA
## 7963   WEST VIRGINIA WV
## 7976         Arizona AZ
## 7995            Utah UT
## 7996            Utah UT
## 8003            Utah UT
## 8030      California CA
## 8046   West Virginia WV
## 8068         Georgia GA
## 8084         Florida FL
## 8108      California CA
## 8136         Florida FL
## 8173       Louisiana LA
## 8252            UTAH UT
## 8255            Utah UT
## 8257            Utah UT
## 8260            Utah UT
## 8261            Utah UT
## 8262            Utah UT
## 8284            Utah UT
## 8313   West Virginia WV
## 8319        Illinois IL
## 8352        Missouri MO
## 8358        Missouri MO
## 8441        Virginia VA
## 8470            Utah UT
## 8480            Utah UT
## 8481         FLORIDA FL
## 8485            Utah UT
## 8486            Utah UT
## 8487            Utah UT
## 8604            Utah UT
## 8606            Utah UT
## 8663         Florida FL
## 8677         Florida FL
## 8679         Florida FL
## 8728         Florida FL
## 8729         Florida FL
## 8730         Florida FL
## 8735         Arizona AZ
## 8748      California CA
## 8768         Arizona AZ
## 8808       Minnesota MN
## 8859      California CA
## 8902           Texas TX
## 8905           Texas TX
## 8910           Texas TX
## 8928        Virginia VA
## 8942       MINNESOTA MN
## 9056         Florida FL
## 9063         Florida FL
## 9065         Florida FL
## 9066         Florida FL
## 9073           Texas TX
## 9107        Illinois IL
## 9201         FLORIDA FL
## 9218            Utah UT
## 9227         Florida FL
## 9228      California CA
## 9239            Utah UT
## 9271        Virginia VA
## 9272        VIRGINIA VA
## 9305         Arizona AZ
## 9327            Utah UT
## 9406       MINNESOTA MN
## 9491            Utah UT
## 9694       MINNESOTA MN
## 9787      California CA
## 9814            Utah UT
## 9863            Utah UT
## 9878         Florida FL
## 9879         Florida FL
## 9880         Florida FL
## 9885         Florida FL
## 9886         Florida FL
## 9887         Florida FL
## 10043        Florida FL
## 10044           Utah UT
## 10095       Illinois IL
## 10096       Illinois IL
## 10145           Utah UT
## 10159           Utah UT
## 10160           Utah UT
## 10174     California CA
## 10177       Missouri MO
## 10178       Virginia VA
## 10314     California CA
## 10330     California CA
## 10373           Utah UT
## 10402        Arizona AZ
## 10426     California CA
## 10432        Alabama AL
## 10487     California CA
## 10491           UTAH UT
## 10525        Arizona AZ
## 10538       Virginia VA
## 10565  West Virginia WV
## 10567     New Jersey NJ
## 10569     NEW JERSEY NJ
## 10591     New Jersey NJ
## 10597     NEW JERSEY NJ
## 10621     California CA
## 10644        Florida FL
## 10650      Minnesota MN
## 10655      Minnesota MN
## 10702       Virginia VA
## 10767        Alabama AL
## 10776       Illinois IL
## 10782       Virginia VA
## 10789           Utah UT
## 10793           Utah UT
## 10805     California CA
## 10816     California CA
## 10817           Utah UT
## 10823        Arizona AZ
## 10928       Illinois IL
## 10937       Illinois IL
## 10938        Alabama AL
## 10948       Illinois IL
## 10957        Alabama AL
## 10962           Utah UT
## 11016      Minnesota MN
## 11017           Utah UT
## 11021     CALIFORNIA CA
## 11030     California CA
## 11033  West Virginia WV
## 11059           Utah UT
## 11065           Utah UT
## 11125     California CA
## 11156      Minnesota MN
## 11192  MASSACHUSETTS MA
## 11230        Alabama AL
## 11231        Alabama AL
## 11255        FLORIDA FL
## 11256        Florida FL
## 11257        Florida FL
## 11258        Florida FL
## 11259  West Virginia WV
## 11263        Arizona AZ
## 11272     CALIFORNIA CA
## 11273     CALIFORNIA CA
## 11299     California CA
## 11300     California CA
## 11301     California CA
## 11302     California CA
## 11303     CALIFORNIA CA
## 11307     California CA
## 11308     California CA
## 11309     California CA
## 11310     CALIFORNIA CA
## 11312     CALIFORNIA CA
## 11313     CALIFORNIA CA
## 11314     CALIFORNIA CA
## 11351          Texas TX
## 11405           Utah UT
## 11422     California CA
## 11439        Arizona AZ
## 11440        Arizona AZ
## 11483     New Jersey NJ
## 11484     California CA
## 11512     New Jersey NJ
## 11513     New Jersey NJ
## 11514     New Jersey NJ
## 11522        Arizona AZ
## 11534       ILLINOIS IL
## 11535       Illinois IL
## 11539     California CA
## 11541          Texas TX
## 11543          Texas TX
## 11544          Texas TX
## 11546          Texas TX
## 11547          Texas TX
## 11551          Texas TX
## 11582        ARIZONA AZ
## 11589     NEW MEXICO NM
## 11591     California CA
## 11612        Arizona AZ
## 11621       Virginia VA
## 11683       VIRGINIA VA
## 11685        Florida FL
## 11728        Arizona AZ
## 11869           UTAH UT
## 11872           Utah UT
## 11876     California CA
## 11877     California CA
## 11881           Utah UT
## 11900        Arizona AZ
## 11908           Utah UT
## 11911        Arizona AZ
## 11912        ARIZONA AZ
## 11913           Utah UT
## 11914           Utah UT
## 11925           Utah UT
## 11926        ARIZONA AZ
## 11927           Utah UT
## 11928           Utah UT
## 11929           Utah UT
## 11930        Arizona AZ
## 11931           Utah UT
## 11932           Utah UT
## 11935           Utah UT
## 11936           Utah UT
## 11937           UTAH UT
## 11967     New Jersey NJ
## 11968     New Jersey NJ
## 11975  WEST VIRGINIA WV
## 12070           Utah UT
## 12083        Arizona AZ
## 12088     California CA
## 12114      MINNESOTA MN
## 12123    Mississippi MS
## 12131      MINNESOTA MN
## 12138  West Virginia WV
## 12149     California CA
## 12163        Arizona AZ
## 12164        Arizona AZ
## 12165        Arizona AZ
## 12166        Arizona AZ
## 12167        Alabama AL
## 12168        Alabama AL
## 12190       Virginia VA
## 12221       Illinois IL
## 12227           Utah UT
## 12228          Texas TX
## 12243       Illinois IL
## 12249         Nevada NV
## 12307     California CA
## 12310       Illinois IL
## 12316     California CA
## 12348        Arizona AZ
## 12427        Arizona AZ
## 12480     California CA
## 12501       Virginia VA
## 12523        Alabama AL
## 12540       Virginia VA
## 12567         Nevada NV
## 12591     CALIFORNIA CA
## 12677  West Virginia WV
## 12746       Illinois IL
## 12749       Illinois IL
## 12756        ARIZONA AZ
## 12764     California CA
## 12783     California CA
## 12806           Utah UT
## 12905           Utah UT
## 12912           Utah UT
## 12934           Utah UT
## 12965     California CA
## 12974       Illinois IL
## 12976       Illinois IL
## 12979        Florida FL
## 13071        Arizona AZ
## 13072        Arizona AZ
## 13073        ARIZONA AZ
## 13075        Arizona AZ
## 13076        Arizona AZ
## 13077        Arizona AZ
## 13079        Arizona AZ
## 13080        Arizona AZ
## 13081        Arizona AZ
## 13082        Arizona AZ
## 13085        Arizona AZ
## 13086        Arizona AZ
## 13087        Arizona AZ
## 13088        Arizona AZ
## 13089        Arizona AZ
## 13090        Arizona AZ
## 13091        Arizona AZ
## 13111       Virginia VA
## 13117       Illinois IL
## 13156           Utah UT
## 13176           Utah UT
## 13230       Virginia VA
## 13233           Utah UT
## 13240           Utah UT
## 13262           Utah UT
## 13269           UTAH UT
## 13270           Utah UT
## 13275           Utah UT
## 13290           Utah UT
## 13335     CALIFORNIA CA
## 13338     California CA
## 13340     CALIFORNIA CA
## 13424           Utah UT
## 13428           Utah UT
## 13442           UTAH UT
## 13448       Missouri MO
## 13467        Arizona AZ
## 13468        Arizona AZ
## 13469        Arizona AZ
## 13470        Arizona AZ
## 13471        Arizona AZ
## 13483       Virginia VA
## 13487        Arizona AZ
## 13588     California CA
## 13595           Utah UT
## 13602           Utah UT
## 13623  Massachusetts MA
## 13625        Florida FL
## 13677           Utah UT
## 13704       Illinois IL
## 13755     California CA
## 13816        Indiana IN
## 13964       Illinois IL
## 14045      Minnesota MN
## 14047      Minnesota MN
## 14061        Indiana IN
## 14062     New Mexico NM
## 14068     California CA
## 14102           Utah UT
## 14112           Utah UT
## 14118    Mississippi MS
## 14124       Delaware DE
## 14129     California CA
## 14136       Virginia VA
## 14142       Virginia VA
## 14161       Virginia VA
## 14205     California CA
## 14221     CALIFORNIA CA
## 14226      Minnesota MN
## 14229           Utah UT
## 14237     CALIFORNIA CA
## 14371          Texas TX
## 14373          Texas TX
## 14375          Texas TX
## 14377          Texas TX
## 14379        Arizona AZ
## 14387        Arizona AZ
## 14436        Alabama AL
## 14458        ARIZONA AZ
## 14464        ARIZONA AZ
## 14465        Arizona AZ
## 14516        Arizona AZ
## 14520       Illinois IL
## 14526           Utah UT
## 14531       Virginia VA
## 14618        Florida FL
## 14671        Florida FL
## 14768     New Jersey NJ
## 14876        Florida FL
## 14877        Florida FL
## 14880       Virginia VA
## 14882       Virginia VA
## 14883       Virginia VA
## 14899        Florida FL
## 14912     California CA
## 15111        Alabama AL
## 15116      Louisiana LA
## 15161           Utah UT
## 15172     New Jersey NJ
## 15173           Utah UT
## 15175     NEW JERSEY NJ
## 15212       Virginia VA
## 15213       Virginia VA
## 15215       Virginia VA
## 15297       VIRGINIA VA
## 15298       Virginia VA
## 15304       Virginia VA
## 15365        Florida FL
## 15370       Illinois IL
## 15371       Illinois IL
## 15373       Illinois IL
## 15376     California CA
## 15377     California CA
## 15395     California CA
## 15442       Illinois IL
## 15448           Utah UT
## 15451        Arizona AZ
## 15452        Arizona AZ
## 15454        Arizona AZ
## 15458     California CA
## 15473     New Mexico NM
## 15508        Alabama AL
## 15587      Minnesota MN
## 15666       ILLINOIS IL
## 15778         NEVADA NV
## 15789           Utah UT
## 15809        Indiana IN
## 15822       ILLINOIS IL
## 15823       ILLINOIS IL
## 15824       ILLINOIS IL
## 15825       ILLINOIS IL
## 15826       ILLINOIS IL
## 15828       ILLINOIS IL
## 15829       ILLINOIS IL
## 15830       ILLINOIS IL
## 15831       ILLINOIS IL
## 15832       ILLINOIS IL
## 15833       ILLINOIS IL
## 15834       ILLINOIS IL
## 15835       ILLINOIS IL
## 15843     California CA
## 15898           Utah UT
## 15899           Utah UT
## 15943        Florida FL
## 15950        FLORIDA FL
## 15957        FLORIDA FL
## 15958        Florida FL
## 15960           Utah UT
## 15966        Alabama AL
## 15970        Arizona AZ
## 15981        Florida FL
## 16010     California CA
## 16141         Nevada NV
## 16190     NEW JERSEY NJ
## 16218           Utah UT
## 16247     CALIFORNIA CA
## 16271     California CA
## 16273     California CA
## 16307        Georgia GA
## 16308       Illinois IL
## 16332      Minnesota MN
## 16357        Florida FL
## 16359        Florida FL
## 16360        Florida FL
## 16403           Utah UT
## 16411     California CA
## 16483           Utah UT
## 16498       Illinois IL
## 16525        ALABAMA AL
## 16526        Alabama AL
## 16623           Utah UT
## 16633        Florida FL
## 16767           Utah UT
## 16805       Illinois IL
## 16811      Minnesota MN
## 16816     California CA
## 16828          Idaho ID
## 16913       Illinois IL
## 16918     California CA
## 16926         Nevada NV
## 16948     CALIFORNIA CA
## 16950          Texas TX
## 16952          Texas TX
## 16953     California CA
## 16963     California CA
## 17019       VIRGINIA VA
## 17046     California CA
## 17116     California CA
## 17160        ARIZONA AZ
## 17231        Alabama AL
## 17232     California CA
## 17282     California CA
## 17334        Florida FL
## 17335        Florida FL
## 17344          Texas TX
## 17345          Texas TX
## 17347          Texas TX
## 17447       Virginia VA
## 17510     California CA
## 17538     California CA
## 17599           Utah UT
## 17600           Utah UT
## 17611        Florida FL
## 17612        Florida FL
## 17613        Florida FL
## 17639          Texas TX
## 17641        Indiana IN
## 17651           Utah UT
## 17775       Virginia VA
## 17787        Florida FL
## 17793       Virginia VA
## 17800     CALIFORNIA CA
## 17802     CALIFORNIA CA
## 17803     CALIFORNIA CA
## 17805     California CA
## 17815     California CA
## 17823       Missouri MO
## 17845     California CA
## 17850      MINNESOTA MN
## 17856     California CA
## 17895     CALIFORNIA CA
## 17896     CALIFORNIA CA
## 17897     California CA
## 17901        Arizona AZ
## 17907      Minnesota MN
## 17925     California CA
## 17936           Utah UT
## 17977        Arizona AZ
## 17978        Arizona AZ
## 18066     California CA
## 18067     CALIFORNIA CA
## 18074       ILLINOIS IL
## 18168     California CA
## 18169     CALIFORNIA CA
## 18170       Missouri MO
## 18171   South Dakota SD
## 18173        FLORIDA FL
## 18174        Florida FL
## 18176        Florida FL
## 18177        Florida FL
## 18178           Utah UT
## 18216       Illinois IL
## 18232           Utah UT
## 18254        Arizona AZ
## 18273       Illinois IL
## 18285     California CA
## 18338        Alabama AL
## 18375        Arizona AZ
## 18378           Utah UT
## 18379           Utah UT
## 18386           Utah UT
## 18387           Utah UT
## 18392           Utah UT
## 18393        ARIZONA AZ
## 18408           Utah UT
## 18423         Nevada NV
## 18424         Nevada NV
## 18425         NEVADA NV
## 18431           Utah UT
## 18432           Utah UT
## 18468     California CA
## 18490     California CA
## 18508           Utah UT
## 18553           Utah UT
## 18557      Minnesota MN
## 18567        Arizona AZ
## 18574       Virginia VA
## 18614     California CA
## 18642     CALIFORNIA CA
## 18677     California CA
## 18719     New Jersey NJ
## 18726     CALIFORNIA CA
## 18762     California CA
## 18787           Utah UT
## 18792     CALIFORNIA CA
## 18795           Utah UT
## 18796           Utah UT
## 18840        Arizona AZ
## 18861           Utah UT
## 18877     CALIFORNIA CA
## 18878     California CA
## 18879     California CA
## 18881          Texas TX
## 18890        Florida FL
## 18891        Florida FL
## 18900       Virginia VA
## 18932        Indiana IN
## 18973         Nevada NV
## 18994     CALIFORNIA CA
## 19047       Virginia VA
## 19102        ARIZONA AZ
## 19111   RHODE ISLAND RI
## 19115       Virginia VA
## 19147        ARIZONA AZ
## 19169     California CA
## 19183     California CA
## 19190     California CA
## 19232       Illinois IL
## 19238           Utah UT
## 19246           Utah UT
## 19257       Missouri MO
## 19258        Alabama AL
## 19288           Utah UT
## 19292     California CA
## 19293     CALIFORNIA CA
## 19294     California CA
## 19295     CALIFORNIA CA
## 19296     California CA
## 19354        Arizona AZ
## 19388           Utah UT
## 19389           Utah UT
## 19451           Utah UT
## 19461        Georgia GA
## 19474       Missouri MO
## 19486     California CA
## 19492          Texas TX
## 19568          Texas TX
## 19612       Maryland MD
## 19626       Virginia VA
## 19649        Florida FL
## 19659        ALABAMA AL
## 19664      MINNESOTA MN
## 19690       Illinois IL
## 19712        Arizona AZ
## 19719        Arizona AZ
## 19748       Illinois IL
## 19756       Illinois IL
## 19776        Arizona AZ
## 19777        Arizona AZ
## 19778        Arizona AZ
## 19779        Arizona AZ
## 19781        Arizona AZ
## 19782        Arizona AZ
## 19783        Arizona AZ
## 19784        Arizona AZ
## 19785        Arizona AZ
## 19786        Arizona AZ
## 19788        Florida FL
## 19832        Alabama AL
## 19833        Alabama AL
## 19835        Alabama AL
## 19837        Alabama AL
## 19860     New Jersey NJ
## 19892     New Jersey NJ
## 19900     NEW JERSEY NJ
## 19928     California CA
## 20031        Arizona AZ
## 20032        Arizona AZ
## 20033        Arizona AZ
## 20034        ARIZONA AZ
## 20035        Arizona AZ
## 20036        Arizona AZ
## 20061        FLORIDA FL
## 20099          Texas TX
## 20101           Utah UT
## 20161     CALIFORNIA CA
## 20167        GEORGIA GA
## 20175        Florida FL
## 20182          Texas TX
## 20196           Utah UT
## 20223      Minnesota MN
## 20247           Utah UT
## 20266          Texas TX
## 20268        Alabama AL
## 20272          Texas TX
## 20273          Texas TX
## 20335           Utah UT
## 20413       Illinois IL
## 20424           UTAH UT
## 20545     California CA
## 20590           Utah UT
## 20654           Utah UT
## 20662       Virginia VA
## 20695           Utah UT
## 20712           Utah UT
## 20715     California CA
## 20719  West Virginia WV
## 20764          Texas TX
## 20770       Virginia VA
## 20774           Utah UT
## 20775  West Virginia WV
## 20826   Rhode Island RI
## 20887       Illinois IL
## 20927        Alabama AL
## 21008       Illinois IL
## 21027       Illinois IL
## 21040        Arizona AZ
## 21073           Utah UT
## 21095     California CA
## 21101        Alabama AL
## 21115        Georgia GA
## 21117        Alabama AL
## 21137     California CA
## 21140     California CA
## 21143     California CA
## 21161     California CA
## 21251        Florida FL
## 21283     California CA
## 21287        Florida FL
## 21309           Utah UT
## 21325           Utah UT
## 21329           Utah UT
## 21331           Utah UT
## 21374     California CA
## 21440          Texas TX
## 21446          Texas TX
## 21451          Texas TX
## 21479        Georgia GA
## 21480        Georgia GA
## 21490        Indiana IN
## 21549        Arizona AZ
## 21551        Arizona AZ
## 21554           Utah UT
## 21555        Arizona AZ
## 21556           Utah UT
## 21563        Arizona AZ
## 21569        Arizona AZ
## 21580        Arizona AZ
## 21585        Arizona AZ
## 21591     California CA
## 21596        Arizona AZ
## 21602        Arizona AZ
## 21607        ARIZONA AZ
## 21608        Arizona AZ
## 21610        Arizona AZ
## 21618        Arizona AZ
## 21619        Arizona AZ
## 21633         Nevada NV
## 21638        Arizona AZ
## 21641         Nevada NV
## 21646        Alabama AL
## 21647        Alabama AL
## 21656     CALIFORNIA CA
## 21680        FLORIDA FL
## 21681        Florida FL
## 21693        Arizona AZ
## 21698        Florida FL
## 21827       Missouri MO
## 21837           Utah UT
## 21849           UTAH UT
## 21850           Utah UT
## 21855           Utah UT
## 21859      MINNESOTA MN
## 21913     CALIFORNIA CA
## 21914     California CA
## 21916     CALIFORNIA CA
## 21917     California CA
## 21975           Utah UT
## 22012       Illinois IL
## 22028     California CA
## 22029     California CA
## 22033     California CA
## 22041         Nevada NV
## 22049     California CA
## 22088        Arizona AZ
## 22096           Utah UT
## 22097           Utah UT
## 22101      Minnesota MN
## 22109       Illinois IL
## 22113       Illinois IL
## 22114        Florida FL
## 22115        Florida FL
## 22117      Minnesota MN
## 22125        Florida FL
## 22133        Florida FL
## 22134        Florida FL
## 22135        Florida FL
## 22136        Florida FL
## 22137        Florida FL
## 22138        Florida FL
## 22139        Florida FL
## 22157        Florida FL
## 22168           Utah UT
## 22172           Utah UT
## 22174           Utah UT
## 22175           Utah UT
## 22176        FLORIDA FL
## 22177        Florida FL
## 22178        FLORIDA FL
## 22179        Florida FL
## 22180        Florida FL
## 22199           Utah UT
## 22202     California CA
## 22218        Arizona AZ
## 22386  West Virginia WV
## 22450        GEORGIA GA
## 22538     California CA
## 22554        Alabama AL
## 22573         Nevada NV
## 22583         NEVADA NV
## 22596       ILLINOIS IL
## 22626       Illinois IL
## 22627           Utah UT
## 22646       Virginia VA
## 22699     New Jersey NJ
## 22736     CALIFORNIA CA
## 22752           Utah UT
## 22913  MASSACHUSETTS MA
## 22991           Utah UT
## 22992           Utah UT
## 23002       ILLINOIS IL
## 23004       Illinois IL
## 23059        Florida FL
## 23060      Wisconsin WI
## 23087           UTAH UT
## 23115           Utah UT
## 23144       Illinois IL
## 23161           Utah UT
## 23162           Utah UT
## 23167         Nevada NV
## 23195           UTAH UT
## 23204     New Mexico NM
## 23228        Florida FL
## 23337     California CA
## 23364        Alabama AL
## 23444        Florida FL
## 23446        FLORIDA FL
## 23447        FLORIDA FL
## 23448        FLORIDA FL
## 23449        FLORIDA FL
## 23450        Florida FL
## 23452        Florida FL
## 23455        Florida FL
## 23456        Florida FL
## 23458        Florida FL
## 23578        Arizona AZ
## 23579        Arizona AZ
## 23580        Arizona AZ
## 23581        Arizona AZ
## 23582        Arizona AZ
## 23583        Arizona AZ
## 23584        Arizona AZ
## 23656           Utah UT
## 23667        Arizona AZ
## 23668        Arizona AZ
## 23669        ARIZONA AZ
## 23670        ARIZONA AZ
## 23673     California CA
## 23737         Nevada NV
## 23762           Utah UT
## 23768           Utah UT
## 23773           Utah UT
## 23858         Nevada NV
## 23861      Minnesota MN
## 23872        Arizona AZ
## 23891      MINNESOTA MN
## 23895           Utah UT
## 23932       Illinois IL
## 23935       MISSOURI MO
## 23938     California CA
## 23939     CALIFORNIA CA
## 23949     CALIFORNIA CA
## 23951       ILLINOIS IL
## 23952      MINNESOTA MN
## 23953      Minnesota MN
## 23959     California CA
## 23964        Florida FL
## 23965      Minnesota MN
## 23971         Nevada NV
## 23972     NEW JERSEY NJ
## 23974     NEW JERSEY NJ
## 23975     New Jersey NJ
## 23979      Minnesota MN
## 23980      Minnesota MN
## 23985      Minnesota MN
## 23988      Minnesota MN
## 23991      MINNESOTA MN
## 24066       Illinois IL
## 24073       Illinois IL
## 24074           Utah UT
## 24088     California CA
## 24093           Utah UT
## 24101      MINNESOTA MN
## 24122  Massachusetts MA
## 24128       Illinois IL
## 24186          Texas TX
## 24379           Utah UT
## 24396       Illinois IL
## 24412           Utah UT
## 24467           Utah UT
## 24500           Utah UT
## 24521           Utah UT
## 24546     New Jersey NJ
## 24564      LOUISIANA LA
## 24599       Missouri MO
## 24600       Missouri MO
## 24634     California CA
## 24636           Utah UT
## 24639           Utah UT
## 24642           Utah UT
## 24701        Arizona AZ
## 24706        Arizona AZ
## 24756        Florida FL
## 24757        Florida FL
## 24794        Arizona AZ
## 24819       Virginia VA
## 24852           Utah UT
## 24866        Georgia GA
## 24871           Utah UT
## 24899        Arizona AZ
## 24994           Utah UT
## 25047     California CA
## 25049        ARIZONA AZ
## 25075           Utah UT
## 25090      MINNESOTA MN
## 25107        Florida FL
## 25125     California CA
## 25126        Alabama AL
## 25167        Arizona AZ
## 25168        Arizona AZ
## 25191           Utah UT
## 25192           Utah UT
## 25335       Virginia VA
## 25364           Utah UT
## 25372          Maine ME
## 25375           Utah UT
## 25389        Arizona AZ
## 25390        Arizona AZ
## 25391        Arizona AZ
## 25392        ARIZONA AZ
## 25440       Illinois IL
## 25444     New Jersey NJ
## 25445       Illinois IL
## 25458        Arizona AZ
## 25459        Arizona AZ
## 25465       Illinois IL
## 25475        Arizona AZ
## 25478     CALIFORNIA CA
## 25482        Florida FL
## 25483        Florida FL
## 25486        Arizona AZ
## 25487        Arizona AZ
## 25488        Arizona AZ
## 25498        ALABAMA AL
## 25520      Louisiana LA
## 25578       Illinois IL
## 25653       Illinois IL
## 25693           Utah UT
## 25748     California CA
## 25797     CALIFORNIA CA
## 25808     California CA
## 25842        Alabama AL
## 25858        Georgia GA
## 25867        Florida FL
## 25868       ILLINOIS IL
## 25877          Texas TX
## 25917     California CA
## 25932       Missouri MO
## 25958     CALIFORNIA CA
## 26038       Illinois IL
## 26092     California CA
## 26097           Utah UT
## 26112           Utah UT
## 26114      Minnesota MN
## 26118           Utah UT
## 26166     California CA
## 26172  West Virginia WV
## 26286           Utah UT
## 26289           Utah UT
## 26327      Louisiana LA
## 26389        Alabama AL
## 26433        ARIZONA AZ
## 26530       Oklahoma OK
## 26532       Oklahoma OK
## 26590           Utah UT
## 26602           Utah UT
## 26606     California CA
## 26632      Minnesota MN
## 26677       Illinois IL
## 26701        Arizona AZ
## 26702        ARIZONA AZ
## 26703     CALIFORNIA CA
## 26707       Virginia VA
## 26728         Nevada NV
## 26748           Utah UT
## 26753     California CA
## 26761           Utah UT
## 26774          Texas TX
## 26776          Texas TX
## 26777          Texas TX
## 26778          Texas TX
## 26780          Texas TX
## 26797        Alabama AL
## 26838           Utah UT
## 26844       Illinois IL
## 26851      MINNESOTA MN
## 26852      MINNESOTA MN
## 26856           Utah UT
## 26860       Virginia VA
## 26875           Utah UT
## 26886           Utah UT
## 26888     California CA
## 26889           Utah UT
## 26890           Utah UT
## 26892           Utah UT
## 26907        Arizona AZ
## 26915           Utah UT
## 26916           Utah UT
## 26924       OKLAHOMA OK
## 26930     CALIFORNIA CA
## 26947        Alabama AL
## 27064     New Jersey NJ
## 27066           Utah UT
## 27069           Utah UT
## 27070           Utah UT
## 27071           Utah UT
## 27073     California CA
## 27076        Florida FL
## 27078        Alabama AL
## 27082        Florida FL
## 27083        Florida FL
## 27085        Florida FL
## 27086        Florida FL
## 27087        Florida FL
## 27089        Alabama AL
## 27098     California CA
## 27106     California CA
## 27111        Florida FL
## 27115        Florida FL
## 27121           Utah UT
## 27151           Utah UT
## 27157     New Jersey NJ
## 27175     New Jersey NJ
## 27176     NEW JERSEY NJ
## 27188     New Mexico NM
## 27229        Arizona AZ
## 27238        Florida FL
## 27266        ARIZONA AZ
## 27283        Alabama AL
## 27390           Utah UT
## 27478       Illinois IL
## 27487        Alabama AL
## 27489       Virginia VA
## 27524       Illinois IL
## 27577           Utah UT
## 27606        Arizona AZ
## 27607        Arizona AZ
## 27608        ARIZONA AZ
## 27609        Arizona AZ
## 27610        Arizona AZ
## 27611        Arizona AZ
## 27612        Arizona AZ
## 27613        ARIZONA AZ
## 27614        Arizona AZ
## 27615        Arizona AZ
## 27616        Arizona AZ
## 27617        Arizona AZ
## 27618        Arizona AZ
## 27619        Arizona AZ
## 27620        Arizona AZ
## 27621        Arizona AZ
## 27622        Arizona AZ
## 27623        Arizona AZ
## 27625        ARIZONA AZ
## 27627        Arizona AZ
## 27628        Arizona AZ
## 27629        Arizona AZ
## 27630        Arizona AZ
## 27631        Arizona AZ
## 27632        Arizona AZ
## 27633        Arizona AZ
## 27634        Arizona AZ
## 27635        Arizona AZ
## 27636        Arizona AZ
## 27637        Arizona AZ
## 27638        Arizona AZ
## 27639        Arizona AZ
## 27640        Arizona AZ
## 27641        Arizona AZ
## 27642        Arizona AZ
## 27643        Arizona AZ
## 27644        Arizona AZ
## 27645        Arizona AZ
## 27646        Arizona AZ
## 27647        Arizona AZ
## 27648        Arizona AZ
## 27650        Arizona AZ
## 27651        Arizona AZ
## 27652        Arizona AZ
## 27653        Arizona AZ
## 27654        Arizona AZ
## 27656        Arizona AZ
## 27657        Arizona AZ
## 27658        Arizona AZ
## 27671       Maryland MD
## 27689          Texas TX
## 27690          Texas TX
## 27691       Illinois IL
## 27692       ILLINOIS IL
## 27693       ILLINOIS IL
## 27697          TEXAS TX
## 27728           Utah UT
## 27730        Florida FL
## 27737        Florida FL
## 27749        Indiana IN
## 27756     California CA
## 27804        Florida FL
## 27805       Maryland MD
## 27851       Delaware DE
## 27896      LOUISIANA LA
## 27913        Arizona AZ
## 27935       Virginia VA
## 27937       Virginia VA
## 27942        Alabama AL
## 27946        Alabama AL
## 27977           Utah UT
## 27998     California CA
## 28085          Texas TX
## 28086          Texas TX
## 28087          TEXAS TX
## 28089          Texas TX
## 28090          Texas TX
## 28091          Texas TX
## 28093          Texas TX
## 28095          Texas TX
## 28101          Texas TX
## 28107      Minnesota MN
## 28120       Illinois IL
## 28198      Minnesota MN
## 28202           Utah UT
## 28204          Texas TX
## 28205      MINNESOTA MN
## 28209          Texas TX
## 28211          Texas TX
## 28213          Texas TX
## 28230        ARIZONA AZ
## 28248           Utah UT
## 28304       Virginia VA
## 28335        Alabama AL
## 28336        Alabama AL
## 28338       Virginia VA
## 28339           Utah UT
## 28340     California CA
## 28341        Florida FL
## 28346       Missouri MO
## 28348     California CA
## 28354        FLORIDA FL
## 28400     California CA
## 28432       Missouri MO
## 28445           Utah UT
## 28450           Utah UT
## 28454       Missouri MO
## 28472           Utah UT
## 28475       Illinois IL
## 28508           Utah UT
## 28547  West Virginia WV
## 28574        Arizona AZ
## 28579        Florida FL
## 28585      MINNESOTA MN
## 28606       Illinois IL
## 28628      Wisconsin WI
## 28659      Minnesota MN
## 28660      Minnesota MN
## 28661      Minnesota MN
## 28730           Utah UT
## 28754           Utah UT
## 28781       ILLINOIS IL
## 28791           Utah UT
## 28830      MINNESOTA MN
## 28842           Utah UT
## 28843           Utah UT
## 28921      MINNESOTA MN
## 28922      MINNESOTA MN
## 28932          Texas TX
## 28933          Texas TX
## 28989        Florida FL
## 28991       ILLINOIS IL
## 28994     California CA
## 28995     California CA
## 28996     California CA
## 29010        FLORIDA FL
## 29013        Arizona AZ
## 29016        Arizona AZ
## 29022      Wisconsin WI
## 29026           Utah UT
## 29100       Illinois IL
## 29101       Maryland MD
## 29105      MINNESOTA MN
## 29128      Minnesota MN
## 29178        Alabama AL
## 29195        Arizona AZ
## 29207          Texas TX
## 29208          Texas TX
## 29216        Florida FL
## 29218        Florida FL
## 29230     California CA
## 29251     California CA
## 29300          Texas TX
## 29311        Florida FL
## 29318      MINNESOTA MN
## 29395     New Mexico NM
## 29398     CALIFORNIA CA
## 29406           Utah UT
## 29407           Utah UT
## 29410        Arizona AZ
## 29411        ARIZONA AZ
## 29422           Utah UT
## 29423           Utah UT
## 29428           Utah UT
## 29527        Florida FL
## 29546        Indiana IN
## 29569       Virginia VA
## 29587       Illinois IL
## 29596     California CA
## 29652     California CA
## 29669       Illinois IL
## 29702          Texas TX
## 29757           Utah UT
## 29795        Arizona AZ
## 29818     California CA
## 29871     California CA
## 29882           Utah UT
## 29937           Utah UT
## 29939        Arizona AZ
## 29953        Arizona AZ
## 29977     New Jersey NJ
## 30024           Utah UT
## 30028           Utah UT
## 30029           Utah UT
## 30031      Wisconsin WI
## 30058           Utah UT
## 30153     NEW JERSEY NJ
## 30256        Florida FL
## 30260      MINNESOTA MN
## 30325        Alabama AL
## 30333        Florida FL
## 30347           UTAH UT
## 30349  Massachusetts MA
## 30489        Arizona AZ
## 30490        ARIZONA AZ
## 30502           Utah UT
## 30505           Utah UT
## 30521        Florida FL
## 30590       Delaware DE
## 30609       Illinois IL
## 30616  West Virginia WV
## 30721        Arizona AZ
## 30723        Arizona AZ
## 30781     New Jersey NJ
## 30783           Utah UT
## 30784           UTAH UT
## 30787           Utah UT
## 30788           Utah UT
## 30849       Illinois IL
## 30870           Utah UT
## 30872     California CA
## 30875       Illinois IL
## 30876       Illinois IL
## 30886           Utah UT
## 30900     California CA
## 30920       Virginia VA
## 30928     California CA
## 30929     California CA
## 30933     California CA
## 30957        Arizona AZ
## 31043           Utah UT
## 31107     California CA
## 31115        Florida FL
## 31168     California CA
## 31197       Missouri MO
## 31223        Arizona AZ
## 31250       Illinois IL
## 31252          Texas TX
## 31298         Nevada NV
## 31299         Nevada NV
## 31314        Alabama AL
## 31327        FLORIDA FL
## 31328        Florida FL
## 31357        Georgia GA
## 31388       Illinois IL
## 31390       Illinois IL
## 31395       Illinois IL
## 31463          Texas TX
## 31464          Texas TX
## 31465          Texas TX
## 31467          Texas TX
## 31559     New Jersey NJ
## 31645     California CA
## 31699           Utah UT
## 31709  WEST VIRGINIA WV
## 31733     NEW JERSEY NJ
## 31740           Utah UT
## 31751           Utah UT
## 31829     CALIFORNIA CA
## 31831       Virginia VA
## 31845     California CA
## 31850        Arizona AZ
## 31852       Missouri MO
## 31883           Utah UT
## 31888       Illinois IL
## 31910     California CA
## 31941       Illinois IL
## 31942       Illinois IL
## 31957     California CA
## 31968           Utah UT
## 31973        Florida FL
## 31989        Arizona AZ
## 32006  West Virginia WV
## 32010       Virginia VA
## 32014     California CA
## 32036       Virginia VA
## 32054        Arizona AZ
## 32060        ALABAMA AL
## 32081        ALABAMA AL
## 32082           Utah UT
## 32142    MISSISSIPPI MS
## 32176        Arizona AZ
## 32179        Alabama AL
## 32273     New Jersey NJ
## 32297        ARIZONA AZ
## 32298           Utah UT
## 32349           Utah UT
## 32366       New York NY
## 32474       Illinois IL
## 32573        Arizona AZ
## 32574        Arizona AZ
## 32576        Arizona AZ
## 32577        Arizona AZ
## 32578        Arizona AZ
## 32579        Arizona AZ
## 32580        Arizona AZ
## 32581        Arizona AZ
## 32639        Florida FL
## 32640        FLORIDA FL
## 32641        Florida FL
## 32642        Florida FL
## 32651       Virginia VA
## 32710     CALIFORNIA CA
## 32733     CALIFORNIA CA
## 32738        Arizona AZ
## 32753     California CA
## 32768        ARIZONA AZ
## 32779        Florida FL
## 32784        Florida FL
## 32785        Florida FL
## 32786        FLORIDA FL
## 32787        Florida FL
## 32805      MINNESOTA MN
## 32822     California CA
## 32879       Illinois IL
## 32984           Utah UT
## 33021     California CA
## 33083        Arizona AZ
## 33104     New Mexico NM
## 33122       Illinois IL
## 33198     California CA
## 33228       Illinois IL
## 33263     California CA
## 33281     California CA
## 33292           UTAH UT
## 33293     California CA
## 33317     California CA
## 33337     California CA
## 33343     CALIFORNIA CA
## 33344     California CA
## 33360           Utah UT
## 33388       Illinois IL
## 33416           Utah UT
## 33473        Alabama AL
## 33496      Wisconsin WI
## 33499   PENNSYLVANIA PA
## 33536     California CA
## 33562           Utah UT
## 33591       Virginia VA
## 33592       Virginia VA
## 33614       VIRGINIA VA
## 33620        Arizona AZ
## 33666     California CA
## 33701       Illinois IL
## 33758           Utah UT
## 33804           Utah UT
## 33805           Utah UT
## 33829       COLORADO CO
## 33945           Utah UT
## 33950           Utah UT
## 33956           Utah UT
## 33971           Utah UT
## 33973           UTAH UT
## 33976           Utah UT
## 33979           Utah UT
## 33994        Indiana IN
## 34050           Utah UT
## 34077           Utah UT
## 34078           Utah UT
## 34079           Utah UT
## 34124     California CA
## 34145     California CA
## 34152     California CA
## 34183       Illinois IL
## 34190       Illinois IL
## 34193       Illinois IL
## 34197       Virginia VA
## 34227        Arizona AZ
## 34235        Arizona AZ
## 34236        ARIZONA AZ
## 34237        Arizona AZ
## 34238        Arizona AZ
## 34239        Arizona AZ
## 34240        ARIZONA AZ
## 34241        Arizona AZ
## 34242        Arizona AZ
## 34243        ARIZONA AZ
## 34244        Arizona AZ
## 34245        Arizona AZ
## 34246        Arizona AZ
## 34247        Arizona AZ
## 34248        Arizona AZ
## 34249        Arizona AZ
## 34250        ARIZONA AZ
## 34251        Arizona AZ
## 34252        Arizona AZ
## 34253        Arizona AZ
## 34254        Arizona AZ
## 34255        Arizona AZ
## 34256        Arizona AZ
## 34302     California CA
## 34303     CALIFORNIA CA
## 34323        Indiana IN
## 34329       VIRGINIA VA
## 34331     California CA
## 34336       Illinois IL
## 34341       Illinois IL
## 34359           Utah UT
## 34365       ILLINOIS IL
## 34369           UTAH UT
## 34436     California CA
## 34439     New Jersey NJ
## 34445           Utah UT
## 34525  WEST VIRGINIA WV
## 34559       Virginia VA
## 34560        Alabama AL
## 34583        Indiana IN
## 34719           Utah UT
## 34743           UTAH UT
## 34752       Illinois IL
## 34754       Illinois IL
## 34797           Utah UT
## 34855      Louisiana LA
## 34870     New Jersey NJ
## 34968           Utah UT
## 34969           Utah UT
## 34971     California CA
## 35001           Utah UT
## 35040     CALIFORNIA CA
## 35065      Minnesota MN
## 35069     New Mexico NM
## 35075     CALIFORNIA CA
## 35076           Utah UT
## 35077     California CA
## 35096     California CA
## 35134        Florida FL
## 35143        Florida FL
## 35152        Florida FL
## 35167           Utah UT
## 35168           Utah UT
## 35169           Utah UT
## 35252           Utah UT
## 35261       Illinois IL
## 35271           Utah UT
## 35289       Illinois IL
## 35294          Texas TX
## 35338        GEORGIA GA
## 35339        Arizona AZ
## 35428        Florida FL
## 35457          Texas TX
## 35479        Alabama AL
## 35494       Virginia VA
## 35595     California CA
## 35694        Florida FL
## 35695        Florida FL
## 35696        Florida FL
## 35697        Florida FL
## 35875           Utah UT
## 35962     California CA
## 35972        Arizona AZ
## 35973        Arizona AZ
## 36024        Florida FL
## 36025        Florida FL
## 36026        Florida FL
## 36038          Texas TX
## 36065       Missouri MO
## 36116     New Jersey NJ
## 36316     CALIFORNIA CA
## 36382          Texas TX
## 36383          Texas TX
## 36384          Texas TX
## 36385          Texas TX
## 36402           Utah UT
## 36449  WEST VIRGINIA WV
## 36458        Indiana IN
## 36510     NEW JERSEY NJ
## 36557     California CA
## 36571           Utah UT
## 36588     California CA
## 36661           Utah UT
## 36680       Illinois IL
## 36691     California CA
## 36692        Arizona AZ
## 36693        ARIZONA AZ
## 36694        Arizona AZ
## 36696     California CA
## 36699           Utah UT
## 36752        Florida FL
## 36807     California CA
## 36808        Arizona AZ
## 36809        Arizona AZ
## 36821        Arizona AZ
## 36893           UTAH UT
## 36894           Utah UT
## 36966           Utah UT
## 36988           Utah UT
## 37076       Illinois IL
## 37138       Virginia VA
## 37158           Utah UT
## 37197        Arizona AZ
## 37227           Utah UT
## 37243       Maryland MD
## 37265           Utah UT
## 37373           Utah UT
## 37421           Utah UT
## 37447     California CA
## 37458          TEXAS TX
## 37522        Florida FL
## 37523        FLORIDA FL
## 37542       Virginia VA
## 37575        Alabama AL
## 37581        ARIZONA AZ
## 37638     NEW JERSEY NJ
## 37668       Illinois IL
## 37731        Florida FL
## 37751        Arizona AZ
## 37754        ARIZONA AZ
## 37759        ARIZONA AZ
## 37790        Arizona AZ
## 37795        Arizona AZ
## 37841     California CA
## 37866       Missouri MO
## 37869           Utah UT
## 37871           Utah UT
## 37872           Utah UT
## 37877           Utah UT
## 37892       Illinois IL
## 37932        Arizona AZ
## 37933     California CA
## 37934     California CA
## 37940        Florida FL
## 37941        Florida FL
## 37947        Florida FL
## 37950        Florida FL
## 37951        Florida FL
## 37952        Florida FL
## 37981           Utah UT
## 37982           Utah UT
## 38055        Florida FL
## 38057        Florida FL
## 38127       Illinois IL
## 38149          Texas TX
## 38151          Texas TX
## 38153          Texas TX
## 38154          Texas TX
## 38160          Texas TX
## 38169           Utah UT
## 38212         Nevada NV
## 38214         Nevada NV
## 38238          Texas TX
## 38251          Texas TX
## 38340        INDIANA IN
## 38349     California CA
## 38427        Arizona AZ
## 38433           Utah UT
## 38453           Utah UT
## 38522           Utah UT
## 38526        ARIZONA AZ
## 38541           Utah UT
## 38560     CALIFORNIA CA
## 38561        Florida FL
## 38562        Florida FL
## 38596       Virginia VA
## 38607        Florida FL
## 38608        Florida FL
## 38609        FLORIDA FL
## 38622           Utah UT
## 38626          Texas TX
## 38627          TEXAS TX
## 38628          TEXAS TX
## 38629          TEXAS TX
## 38631          Texas TX
## 38632          Texas TX
## 38688          Texas TX
## 38690          Texas TX
## 38711           Utah UT
## 38736       Missouri MO
## 38787           Utah UT
## 38799           Utah UT
## 38809           Utah UT
## 38810           Utah UT
## 38815           Utah UT
## 38895        Florida FL
## 38916           Utah UT
## 38933     CALIFORNIA CA
## 38962           Utah UT
## 38970           Utah UT
## 39085        Arizona AZ
## 39089        Florida FL
## 39124           Utah UT
## 39138     New Jersey NJ
## 39173     California CA
## 39213           Utah UT
## 39289    Mississippi MS
## 39457        Florida FL
## 39458        Florida FL
## 39459        Florida FL
## 39466        Arizona AZ
## 39480           Utah UT
## 39511       Maryland MD
## 39525      Minnesota MN
## 39526          TEXAS TX
## 39534        Alabama AL
## 39535        Alabama AL
## 39536        Florida FL
## 39585     California CA
## 39592     California CA
## 39600       Illinois IL
## 39636     California CA
## 39638     California CA
## 39672           Utah UT
## 39677  MASSACHUSETTS MA
## 39739        Alabama AL
## 39743        Florida FL
## 39772        ALABAMA AL
## 39775        Arizona AZ
## 39777        Arizona AZ
## 39778   RHODE ISLAND RI
## 39780     CALIFORNIA CA
## 39781       Illinois IL
## 39795        Arizona AZ
## 39874     California CA
## 39915           Utah UT
## 39933     California CA
## 39959        Alabama AL
## 39961        ARIZONA AZ
## 39962        Arizona AZ
## 39976           Utah UT
## 39978           Utah UT
## 39979           Utah UT
## 39980       ILLINOIS IL
## 40009           Utah UT
## 40025        Indiana IN
## 40044        Arizona AZ
## 40065        Florida FL
## 40068        Florida FL
## 40070        Florida FL
## 40071        Florida FL
## 40073        Florida FL
## 40074        Florida FL
## 40075        FLORIDA FL
## 40077        Florida FL
## 40078        Florida FL
## 40079          Texas TX
## 40081        Florida FL
## 40138    MISSISSIPPI MS
## 40145        Alabama AL
## 40146        Alabama AL
## 40243      Minnesota MN
## 40253           Utah UT
## 40255      Louisiana LA
## 40354       Illinois IL
## 40383     New Jersey NJ
## 40402        Florida FL
## 40421     NEW JERSEY NJ
## 40449       Illinois IL
## 40520        Arizona AZ
## 40521        Arizona AZ
## 40522        Arizona AZ
## 40534         NEVADA NV
## 40537     California CA
## 40561     California CA
## 40592           Utah UT
## 40595           Utah UT
## 40598           Utah UT
## 40657           Utah UT
## 40730           Utah UT
## 40732           Utah UT
## 40733           Utah UT
## 40735           Utah UT
## 40762      Minnesota MN
## 40763      Minnesota MN
## 40789     California CA
## 40808       Illinois IL
## 40832         Nevada NV
## 40851           Utah UT
## 40918          Idaho ID
## 41002        Florida FL
## 41005      Minnesota MN
## 41020       Illinois IL
## 41021       Illinois IL
## 41034     CALIFORNIA CA
## 41035     California CA
## 41036     CALIFORNIA CA
## 41038       Illinois IL
## 41053       Illinois IL
## 41054       ILLINOIS IL
## 41097        Arizona AZ
## 41098        Arizona AZ
## 41099        Arizona AZ
## 41100        Arizona AZ
## 41101        Arizona AZ
## 41109        Arizona AZ
## 41110        Arizona AZ
## 41111        Arizona AZ
## 41112        Arizona AZ
## 41113        Arizona AZ
## 41114        Arizona AZ
## 41115        Arizona AZ
## 41123        Arizona AZ
## 41124        Arizona AZ
## 41125        Arizona AZ
## 41126        Arizona AZ
## 41139        Arizona AZ
## 41140        Arizona AZ
## 41141        Arizona AZ
## 41142        Arizona AZ
## 41143        Arizona AZ
## 41146        Florida FL
## 41186     California CA
## 41198        ARIZONA AZ
## 41241           Utah UT
## 41257         NEVADA NV
## 41277       Virginia VA
## 41301       Illinois IL
## 41307       Illinois IL
## 41310       Illinois IL
## 41316     California CA
## 41331     California CA
## 41342           Utah UT
## 41344           Utah UT
## 41395        Florida FL
## 41402     California CA
## 41486     California CA
## 41488     California CA
## 41542     California CA
## 41545        Florida FL
## 41574           Utah UT
## 41577           Utah UT
## 41599       OKLAHOMA OK
## 41600       OKLAHOMA OK
## 41607     CALIFORNIA CA
## 41608     CALIFORNIA CA
## 41609     CALIFORNIA CA
## 41611     CALIFORNIA CA
## 41612     CALIFORNIA CA
## 41616          Texas TX
## 41626        Florida FL
## 41629           Utah UT
## 41633    Connecticut CT
## 41637        Arizona AZ
## 41640        Arizona AZ
## 41641        Arizona AZ
## 41642        Arizona AZ
## 41643        Arizona AZ
## 41644      MINNESOTA MN
## 41652       Virginia VA
## 41685        Arizona AZ
## 41686        Arizona AZ
## 41704     California CA
## 41716     California CA
## 41719        Florida FL
## 41720        Florida FL
## 41725        FLORIDA FL
## 41735       Illinois IL
## 41753     California CA
## 41792     California CA
## 41847           Utah UT
## 41854           Utah UT
## 41907       Illinois IL
## 42016      Minnesota MN
## 42029       Illinois IL
## 42040     NEW JERSEY NJ
## 42054        Arizona AZ
## 42062       Virginia VA
## 42121      LOUISIANA LA
## 42142           Utah UT
## 42154      Minnesota MN
## 42157      Minnesota MN
## 42173        Florida FL
## 42180     California CA
## 42183       Illinois IL
## 42252          Texas TX
## 42338     California CA
## 42388        Arizona AZ
## 42409      Louisiana LA
## 42424  West Virginia WV
## 42429           Utah UT
## 42448       Illinois IL
## 42485        Arizona AZ
## 42490           Utah UT
## 42495         Nevada NV
## 42523        Indiana IN
## 42525      Wisconsin WI
## 42526        Alabama AL
## 42636       Virginia VA
## 42637       Virginia VA
## 42644        Florida FL
## 42652        FLORIDA FL
## 42653        FLORIDA FL
## 42654        Florida FL
## 42661       ILLINOIS IL
## 42704        Arizona AZ
## 42705        Arizona AZ
## 42706        Arizona AZ
## 42707        Arizona AZ
## 42708        Arizona AZ
## 42803           Utah UT
## 42845  West Virginia WV
## 42911        Arizona AZ
## 42913           Utah UT
## 42961  West Virginia WV
## 42992        Florida FL
## 43046     California CA
## 43053       Illinois IL
## 43163          IDAHO ID
## 43164          Idaho ID
## 43165          Idaho ID
## 43181           Utah UT
## 43220           Utah UT
## 43239          Texas TX
## 43244          Texas TX
## 43245          Texas TX
## 43248        Florida FL
## 43249    Mississippi MS
## 43250        Alabama AL
## 43251        Alabama AL
## 43253        Florida FL
## 43302       Illinois IL
## 43366     California CA
## 43500       Illinois IL
## 43509        ARIZONA AZ
## 43531        FLORIDA FL
## 43532        FLORIDA FL
## 43533        Florida FL
## 43564        ALABAMA AL
## 43637           Utah UT
## 43638           Utah UT
## 43667       Illinois IL
## 43668       Illinois IL
## 43673       Illinois IL
## 43674       Illinois IL
## 43786          Texas TX
## 43794     California CA
## 43800           Utah UT
## 43833          Texas TX
## 43839          Texas TX
## 43840          Texas TX
## 43841          Texas TX
## 43843          Texas TX
## 43858        Florida FL
## 43909           Utah UT
## 43914     California CA
## 43941     California CA
## 43942     CALIFORNIA CA
## 43943     CALIFORNIA CA
## 43945     CALIFORNIA CA
## 44002      Wisconsin WI
## 44016           Utah UT
## 44041  West Virginia WV
## 44043 South Carolina SC
## 44151           Utah UT
## 44166     California CA
## 44189       Illinois IL
## 44227           Utah UT
## 44236     CALIFORNIA CA
## 44246        Florida FL
## 44271       Virginia VA
## 44319  WEST VIRGINIA WV
## 44347     California CA
## 44393        Florida FL
## 44425       Illinois IL
## 44435       ILLINOIS IL
## 44557          Texas TX
## 44649     California CA
## 44763           UTAH UT
## 44764           Utah UT
## 44766        Arizona AZ
## 44768      Minnesota MN
## 44778           Utah UT
## 44781           Utah UT
## 44786           Utah UT
## 44791           Utah UT
## 44829       Virginia VA
## 44955          Texas TX
## 44961     California CA
## 44993           Utah UT
## 44994           Utah UT
## 44995     CALIFORNIA CA
## 45101     California CA
## 45145     California CA
## 45174     California CA
## 45183        Florida FL
## 45188     California CA
## 45207     CALIFORNIA CA
## 45226       Illinois IL
## 45241     New Jersey NJ
## 45243          Texas TX
## 45244          Texas TX
## 45245          Texas TX
## 45247          Texas TX
## 45249        Indiana IN
## 45252       Missouri MO
## 45255     New Jersey NJ
## 45256     New Jersey NJ
## 45259        INDIANA IN
## 45260          Texas TX
## 45266       Illinois IL
## 45314           Utah UT
## 45316     CALIFORNIA CA
## 45322        Arizona AZ
## 45323        Arizona AZ
## 45324        Arizona AZ
## 45325        Arizona AZ
## 45326        Arizona AZ
## 45327        Arizona AZ
## 45328        Arizona AZ
## 45351      MINNESOTA MN
## 45383           Utah UT
## 45384           Utah UT
## 45385           Utah UT
## 45389          Texas TX
## 45393           Utah UT
## 45401           Utah UT
## 45449           Utah UT
## 45467     California CA
## 45549           Utah UT
## 45550     California CA
## 45558           UTAH UT
## 45562           Utah UT
## 45563           Utah UT
## 45566     California CA
## 45568          Texas TX
## 45591           Utah UT
## 45592           Utah UT
## 45646     California CA
## 45706        ARIZONA AZ
## 45803         Nevada NV
## 45907           Utah UT
## 45918  West Virginia WV
## 45946      WISCONSIN WI
## 46044     California CA
## 46105     California CA
## 46107     California CA
## 46166       Illinois IL
## 46187        Florida FL
## 46203        Florida FL
## 46226        Arizona AZ
## 46233        Arizona AZ
## 46234        Arizona AZ
## 46289          Texas TX
## 46375     CALIFORNIA CA
## 46430           Utah UT
## 46455        Arizona AZ
## 46456        Arizona AZ
## 46457        Arizona AZ
## 46458        Arizona AZ
## 46468     California CA
## 46471     California CA
## 46472     California CA
## 46473     California CA
## 46475       Virginia VA
## 46476       Illinois IL
## 46492           Utah UT
## 46500     CALIFORNIA CA
## 46501     CALIFORNIA CA
## 46641       ILLINOIS IL
## 46672       ILLINOIS IL
## 46673       ILLINOIS IL
## 46752       ILLINOIS IL
## 46925          Texas TX
## 46926          Texas TX
## 46956     California CA
## 46970     California CA
## 46978     California CA
## 47007           Utah UT
## 47096     California CA
## 47101           Utah UT
## 47254          Texas TX
## 47256       Illinois IL
## 47270          Texas TX
## 47303     California CA
## 47324     California CA
## 47326     California CA
## 47344     California CA
## 47427     California CA
## 47433        Arizona AZ
## 47434        Arizona AZ
## 47435        Arizona AZ
## 47459     California CA
## 47466           Utah UT
## 47477        Arizona AZ
## 47478     California CA
## 47498     California CA
## 47515        Florida FL
## 47568       Illinois IL
## 47580        Alabama AL
## 47581       Illinois IL
## 47583       MISSOURI MO
## 47603        Indiana IN
## 47659        Florida FL
## 47660        Florida FL
## 47661        Florida FL
## 47662        Florida FL
## 47682     California CA
## 47693     California CA
## 47730       Illinois IL
## 47732       Illinois IL
## 47761       Illinois IL
## 47770        Florida FL
## 47775     California CA
## 47820       Illinois IL
## 47924      Minnesota MN
## 47937           Utah UT
## 47938           Utah UT
## 47959           Utah UT
## 48017           Utah UT
## 48020        Florida FL
## 48021        Florida FL
## 48022        Florida FL
## 48034        Florida FL
## 48096           Utah UT
## 48136     CALIFORNIA CA
## 48187           Utah UT
## 48189       Oklahoma OK
## 48192       Illinois IL
## 48195           Utah UT
## 48200        Florida FL
## 48275      Minnesota MN
## 48277           Utah UT
## 48279           Utah UT
## 48315      Wisconsin WI
## 48389        Alabama AL
## 48400          Texas TX
## 48509        Florida FL
## 48515         NEVADA NV
## 48534           Utah UT
## 48594       Virginia VA
## 48634       Illinois IL
## 48661        Florida FL
## 48677           Utah UT
## 48737           Utah UT
## 48748     California CA
## 48779        ARIZONA AZ
## 48786       Illinois IL
## 48802     California CA
## 48813     California CA
## 48835        Florida FL
## 48863     California CA
## 48945     California CA
## 48956     California CA
## 48987           Utah UT
## 49000           Utah UT
## 49040        Alabama AL
## 49052       Illinois IL
## 49123           Utah UT
## 49124           Utah UT
## 49126     California CA
## 49177           UTAH UT
## 49179           Utah UT
## 49180           UTAH UT
## 49192        Arizona AZ
## 49193        Arizona AZ
## 49194        Arizona AZ
## 49195        Arizona AZ
## 49196        Arizona AZ
## 49197        Arizona AZ
## 49232       ILLINOIS IL
## 49240       Illinois IL
## 49247         Nevada NV
## 49255     California CA
## 49256        Arizona AZ
## 49257        Arizona AZ
## 49258        Arizona AZ
## 49259        ARIZONA AZ
## 49262        Arizona AZ
## 49263     CALIFORNIA CA
## 49269     California CA
## 49353       Virginia VA
## 49355     New Mexico NM
## 49429        Florida FL
## 49430        Florida FL
## 49480    MISSISSIPPI MS
## 49511           Utah UT
## 49519           Utah UT
## 49523           Utah UT
## 49524           Utah UT
## 49526        Arizona AZ
## 49527        Arizona AZ
## 49529        Arizona AZ
## 49530        ARIZONA AZ
## 49531        Arizona AZ
## 49533        ARIZONA AZ
## 49534        Arizona AZ
## 49535        ARIZONA AZ
## 49536        Arizona AZ
## 49537        ARIZONA AZ
## 49538        ARIZONA AZ
## 49539        ARIZONA AZ
## 49540       Illinois IL
## 49557           Utah UT
## 49558           Utah UT
## 49559           Utah UT
## 49591         Nevada NV
## 49618        ARIZONA AZ
## 49620        ARIZONA AZ
## 49621        ARIZONA AZ
## 49623        ARIZONA AZ
## 49645     California CA
## 49646     CALIFORNIA CA
## 49682     California CA
## 49726        Florida FL
## 49742        Florida FL
## 49743        Florida FL
## 49890        Florida FL
## 49892        Florida FL
## 49893        FLORIDA FL
## 49894        Florida FL
## 49895        Florida FL
## 49982     California CA
## 50014           Utah UT
## 50039     California CA
## 50092  MASSACHUSETTS MA
## 50097       Missouri MO
## 50099        Arizona AZ
## 50223        Arizona AZ
## 50289           Utah UT
## 50290           Utah UT
## 50295        Arizona AZ
## 50296        Arizona AZ
## 50303        Florida FL
## 50304        Florida FL
## 50305        Florida FL
## 50315       Illinois IL
## 50355        Arizona AZ
## 50366     California CA
## 50368     California CA
## 50370        Arizona AZ
## 50400           Utah UT
## 50403          Texas TX
## 50465        Alabama AL
## 50478  New Hampshire NH
## 50479  New Hampshire NH
## 50493           Utah UT
## 50495         NEVADA NV
## 50522         NEVADA NV
## 50561       Illinois IL
## 50830       Illinois IL
## 50899           Utah UT
## 50901           Utah UT
## 50911           Utah UT
## 50916           Utah UT
## 50951     CALIFORNIA CA
## 50952     California CA
## 50965        Florida FL
## 50966        Florida FL
## 51003     CALIFORNIA CA
## 51022     New Jersey NJ
## 51083           Utah UT
## 51093       Illinois IL
## 51196       ILLINOIS IL
## 51203       Illinois IL
## 51222      MINNESOTA MN
## 51237        ARIZONA AZ
## 51243     California CA
## 51284       Illinois IL
## 51321     California CA
## 51326           Utah UT
## 51358     California CA
## 51374      LOUISIANA LA
## 51419     California CA
## 51459       ILLINOIS IL
## 51461           Utah UT
## 51476       Illinois IL
## 51502          Texas TX
## 51573           UTAH UT
## 51590           Utah UT
## 51594       Illinois IL
## 51613        Indiana IN
## 51637       Maryland MD
## 51686           Utah UT
## 51712        Arizona AZ
## 51720           Utah UT
## 51722           Utah UT
## 51728          Texas TX
## 51735          Texas TX
## 51736          Texas TX
## 51737          Texas TX
## 51738          Texas TX
## 51739          Texas TX
## 51740          Texas TX
## 51741        Florida FL
## 51765     California CA
## 51809        Alabama AL
## 51811     CALIFORNIA CA
## 51910           Utah UT
## 51936       COLORADO CO
## 51963    Mississippi MS
## 52033  West Virginia WV
## 52055     California CA
## 52063     California CA
## 52069     California CA
## 52092     California CA
## 52129        Indiana IN
## 52139          Texas TX
## 52154       Virginia VA
## 52155       Virginia VA
## 52204        Alabama AL
## 52210     California CA
## 52219      Louisiana LA
## 52222      Louisiana LA
## 52285      Minnesota MN
## 52375    MISSISSIPPI MS
## 52420      Louisiana LA
## 52433          Texas TX
## 52434          Texas TX
## 52462     California CA
## 52512     California CA
## 52544        Arizona AZ
## 52568           UTAH UT
## 52677       Illinois IL
## 52705     California CA
## 52711       Virginia VA
## 52713       Virginia VA
## 52714       VIRGINIA VA
## 52752       Illinois IL
## 52763       Illinois IL
## 52785         NEVADA NV
## 52794       Illinois IL
## 52828       Illinois IL
## 52837     New Jersey NJ
## 52847           Utah UT
## 52875       Illinois IL
## 52988        ALABAMA AL
## 52998        Georgia GA
## 53039       Illinois IL
## 53054       Virginia VA
## 53072        Florida FL
## 53073        Alabama AL
## 53075        Alabama AL
## 53176        ARIZONA AZ
## 53239        Florida FL
## 53242        Florida FL
## 53243        Florida FL
## 53244        FLORIDA FL
## 53297           Utah UT
## 53314       Virginia VA
## 53319           Utah UT
## 53341     California CA
## 53392     California CA
## 53407      Minnesota MN
## 53461   RHODE ISLAND RI
## 53472           UTAH UT
## 53473           Utah UT
## 53474           Utah UT
## 53589           Utah UT
## 53620        Florida FL
## 53705     California CA
## 53730           Utah UT
## 53733           Utah UT
## 53734           Utah UT
## 53846        ARIZONA AZ
## 53862           Utah UT
## 53863           Utah UT
## 53922     California CA
## 53978           Utah UT
## 53985           UTAH UT
## 54026           Utah UT
## 54028           Utah UT
## 54138     NEW JERSEY NJ
## 54154       Illinois IL
## 54186     New Jersey NJ
## 54231           Utah UT
## 54252        ARIZONA AZ
## 54264     NEW JERSEY NJ
## 54265     NEW JERSEY NJ
## 54288        Georgia GA
## 54296     California CA
## 54301     California CA
## 54336          TEXAS TX
## 54347  WEST VIRGINIA WV
## 54357  West Virginia WV
## 54405        Florida FL
## 54414        Florida FL
## 54416        Florida FL
## 54426         Nevada NV
## 54637        Alabama AL
## 54646      MINNESOTA MN
## 54683       Virginia VA
## 54691      MINNESOTA MN
## 54721        Alabama AL
## 54743          Texas TX
## 54765        Georgia GA
## 54791        Florida FL
## 54907     California CA
## 54946     California CA
## 54972     California CA
## 54976     CALIFORNIA CA
## 55018       Illinois IL
## 55110           Utah UT
## 55121       Illinois IL
## 55164       Missouri MO
## 55166        Arizona AZ
## 55187  West Virginia WV
## 55203       Illinois IL
## 55238       Virginia VA
## 55239       Virginia VA
## 55291        Florida FL
## 55298        Florida FL
## 55299        Florida FL
## 55300        Florida FL
## 55306        Florida FL
## 55307        Florida FL
## 55309        Florida FL
## 55312        Florida FL
## 55314        Florida FL
## 55317        Florida FL
## 55323        Arizona AZ
## 55331       Illinois IL
## 55369  MASSACHUSETTS MA
## 55412     California CA
## 55413     California CA
## 55414     California CA
## 55530        Florida FL
## 55677           Utah UT
## 55748       Illinois IL
## 55754       Illinois IL
## 55901      Minnesota MN
## 55902      Minnesota MN
## 55903      Minnesota MN
## 56099      MINNESOTA MN
## 56102           Utah UT
## 56123     California CA
## 56133     California CA
## 56183           Utah UT
## 56184        Florida FL
## 56213      WISCONSIN WI
## 56232           Utah UT
## 56233       Maryland MD
## 56243        Florida FL
## 56295           UTAH UT
## 56337           Utah UT
## 56358     New Jersey NJ
## 56361     California CA
## 56384           Utah UT
## 56419           Utah UT
## 56428     California CA
## 56619      Minnesota MN
## 56678          Texas TX
## 56739     New Jersey NJ
## 56817     California CA
## 56838     California CA
## 56863        Alabama AL
## 56873       Missouri MO
## 56880     California CA
## 56904  West Virginia WV
## 56918     NEW JERSEY NJ
## 56931       Illinois IL
## 56932       Illinois IL
## 56933       Illinois IL
## 56982           Utah UT
## 57060        Arizona AZ
## 57140     CALIFORNIA CA
## 57141     CALIFORNIA CA
## 57144     CALIFORNIA CA
## 57152      Minnesota MN
## 57160        Georgia GA
## 57161       Virginia VA
## 57167        FLORIDA FL
## 57171        Arizona AZ
## 57198        Arizona AZ
## 57199        Arizona AZ
## 57226        Florida FL
## 57228        Florida FL
## 57230        Florida FL
## 57231        Florida FL
## 57234        Florida FL
## 57238        Florida FL
## 57252        Florida FL
## 57264        Florida FL
## 57270        Florida FL
## 57276        Florida FL
## 57278        Florida FL
## 57287        Florida FL
## 57288        Florida FL
## 57289        Florida FL
## 57297        Florida FL
## 57298        Florida FL
## 57354  West Virginia WV
## 57379           Utah UT
## 57385           Utah UT
## 57420       Virginia VA
## 57472       Illinois IL
## 57478     New Jersey NJ
## 57533        Alabama AL
## 57571           Utah UT
## 57595        Arizona AZ
## 57596        Arizona AZ
## 57603           Utah UT
## 57604           Utah UT
## 57609           Utah UT
## 57656           Utah UT
## 57665      Minnesota MN
## 57685       Illinois IL
## 57688        Arizona AZ
## 57689        Arizona AZ
## 57690        Arizona AZ
## 57691        Arizona AZ
## 57692        Arizona AZ
## 57694        Arizona AZ
## 57695        Arizona AZ
## 57696     CALIFORNIA CA
## 57778        Arizona AZ
## 57780         Nevada NV
## 57788       ILLINOIS IL
## 57791           Utah UT
## 57800           Utah UT
## 57848           Utah UT
## 57882           Utah UT
## 57904       Illinois IL
## 57907       Illinois IL
## 57912           Utah UT
## 57913           Utah UT
## 57925     California CA
## 57927     California CA
## 57966     California CA
## 57984       Missouri MO
## 57993        Arizona AZ
## 58065           Utah UT
## 58141      Wisconsin WI
## 58185  West Virginia WV
## 58204           Utah UT
## 58205           Utah UT
## 58219  West Virginia WV
## 58222        Arizona AZ
## 58355     California CA
## 58359     CALIFORNIA CA
## 58363     California CA
## 58371        Arizona AZ
## 58373         NEVADA NV
## 58383        Arizona AZ
## 58393     California CA
## 58400     California CA
## 58405     California CA
## 58420       Missouri MO
## 58432     CALIFORNIA CA
## 58489        Florida FL
## 58492       Illinois IL
## 58502      Minnesota MN
## 58505      Minnesota MN
## 58506      Minnesota MN
## 58520           Utah UT
## 58530        Alabama AL
## 58536       Missouri MO
## 58537       Missouri MO
## 58554     California CA
## 58555     California CA
## 58571        Arizona AZ
## 58572        Arizona AZ
## 58573        Arizona AZ
## 58600     California CA
## 58635           Utah UT
## 58658     California CA
## 58701     New Jersey NJ
## 58702     New Jersey NJ
## 58707     California CA
## 58741        Alabama AL
## 58747  West Virginia WV
## 58800        Florida FL
## 58813           Utah UT
## 58814           Utah UT
## 58817       Virginia VA
## 58821        FLORIDA FL
## 58822        Florida FL
## 58823        Florida FL
## 58824        Florida FL
## 58843           Utah UT
## 58848     California CA
## 58930           Utah UT
## 58953  Massachusetts MA
## 58954     California CA
## 58981        Arizona AZ
## 58985        Arizona AZ
## 58987        Arizona AZ
## 58988        Arizona AZ
## 58989        Arizona AZ
## 58991        Arizona AZ
## 58992        Arizona AZ
## 58995        Arizona AZ
## 59000       Illinois IL
## 59006        Arizona AZ
## 59007        Arizona AZ
## 59016           Utah UT
## 59031       Virginia VA
## 59035        ALABAMA AL
## 59038          Texas TX
## 59076        ALABAMA AL
## 59081           Utah UT
## 59091           Utah UT
## 59108           Utah UT
## 59129     NEW JERSEY NJ
## 59158           Utah UT
## 59205        Florida FL
## 59331        Alabama AL
## 59335        Alabama AL
## 59346           Utah UT
## 59351           Utah UT
## 59355           Utah UT
## 59359           Utah UT
## 59360           Utah UT
## 59416           Utah UT
## 59421           Utah UT
## 59447     New Jersey NJ
## 59472     New Jersey NJ
## 59477         Nevada NV
## 59478     New Jersey NJ
## 59482       ILLINOIS IL
## 59489       Illinois IL
## 59491       Illinois IL
## 59534       Illinois IL
## 59564        Florida FL
## 59677           Utah UT
## 59716          Texas TX
## 59758           Utah UT
## 59759           Utah UT
## 59770           Utah UT
## 59848       COLORADO CO
## 59861           Utah UT
## 59864     California CA
## 59865     California CA
## 59868     California CA
## 59870           Utah UT
## 59875           Utah UT
## 59877           Utah UT
## 59881     California CA
## 59886     California CA
## 59901        Arizona AZ
## 59917           Utah UT
## 59922        Arizona AZ
## 59924        Arizona AZ
## 59928           Utah UT
## 59933           Utah UT
## 59967     California CA
## 60008           Utah UT
## 60040           Utah UT
## 60041           Utah UT
## 60043           Utah UT
## 60058     California CA
## 60068           Utah UT
## 60081           Utah UT
## 60084     New Jersey NJ
## 60089           Utah UT
## 60098       ILLINOIS IL
## 60099      Minnesota MN
## 60113           Utah UT
## 60118     CALIFORNIA CA
## 60162      MINNESOTA MN
## 60254     California CA
## 60255     California CA
## 60276           Utah UT
## 60285           Utah UT
## 60289           Utah UT
## 60300           Utah UT
## 60329       Virginia VA
## 60346           Utah UT
## 60368           Utah UT
## 60375     California CA
## 60464           Utah UT
## 60517           Utah UT
## 60528           Utah UT
## 60558        Alabama AL
## 60606        FLORIDA FL
## 60658           Utah UT
## 60662       Illinois IL
## 60679     California CA
## 60682       Missouri MO
## 60683      Minnesota MN
## 60689       Virginia VA
## 60721       Illinois IL
## 60755  MASSACHUSETTS MA
## 60764     California CA
## 60765     California CA
## 60768     California CA
## 60787           Utah UT
## 60859        Florida FL
## 60860        Florida FL
## 60862        Florida FL
## 60863        Florida FL
## 60864        Florida FL
## 60865        Florida FL
## 60932     CALIFORNIA CA
## 60938     CALIFORNIA CA
## 60940        Arizona AZ
## 60941        Arizona AZ
## 60942        Arizona AZ
## 60943        Arizona AZ
## 60944        Arizona AZ
## 60945        Arizona AZ
## 60946        Arizona AZ
## 60947        Arizona AZ
## 60948        Arizona AZ
## 60956     California CA
## 60994           Utah UT
## 61018           Utah UT
## 61021        Arizona AZ
## 61022        Arizona AZ
## 61023        Arizona AZ
## 61024        Arizona AZ
## 61025        Arizona AZ
## 61027        Arizona AZ
## 61028        Arizona AZ
## 61029        Arizona AZ
## 61030        Arizona AZ
## 61031        Arizona AZ
## 61032        Arizona AZ
## 61051 North Carolina NC
## 61054      MINNESOTA MN
## 61055      MINNESOTA MN
## 61065       Illinois IL
## 61070        Alabama AL
## 61073           Utah UT
## 61077           Utah UT
## 61140           Utah UT
## 61161          TEXAS TX
## 61222       ILLINOIS IL
## 61225           Utah UT
## 61229       Illinois IL
## 61270       Illinois IL
## 61284     California CA
## 61296         NEVADA NV
## 61298         NEVADA NV
## 61356       Illinois IL
## 61357       Illinois IL
## 61359       Illinois IL
## 61360       Illinois IL
## 61369          Texas TX
## 61376  Massachusetts MA
## 61378          Texas TX
## 61379          Texas TX
## 61380          Texas TX
## 61384       Virginia VA
## 61386           UTAH UT
## 61438          Texas TX
## 61450        Alabama AL
## 61453       ILLINOIS IL
## 61455       Virginia VA
## 61456       Virginia VA
## 61457       Virginia VA
## 61459       Illinois IL
## 61463      Minnesota MN
## 61464       Virginia VA
## 61563       Virginia VA
## 61586        Alabama AL
## 61588     California CA
## 61591        Arizona AZ
## 61600       Virginia VA
## 61611     New Jersey NJ
## 61612     New Jersey NJ
## 61637      Wisconsin WI
## 61697     California CA
## 61699      Louisiana LA
## 61754       Virginia VA
## 61766        Arizona AZ
## 61767        Arizona AZ
## 61781       Virginia VA
## 61802       Illinois IL
## 61803       Illinois IL
## 61843     California CA
## 61845        Arizona AZ
## 61866       ILLINOIS IL
## 61868       ILLINOIS IL
## 61876     New Jersey NJ
## 62013           Utah UT
## 62051       Virginia VA
## 62125        Arizona AZ
## 62139           Utah UT
## 62140           Utah UT
## 62141     California CA
## 62144       Illinois IL
## 62147  West Virginia WV
## 62185        Florida FL
## 62192     California CA
## 62266       Illinois IL
## 62267          Texas TX
## 62269          TEXAS TX
## 62305       Illinois IL
## 62309     New Mexico NM
## 62310     New Mexico NM
## 62312           Utah UT
## 62315           Utah UT
## 62316        Arizona AZ
## 62317        ARIZONA AZ
## 62339       ILLINOIS IL
## 62340       ILLINOIS IL
## 62341       ILLINOIS IL
## 62342       ILLINOIS IL
## 62343       ILLINOIS IL
## 62344       ILLINOIS IL
## 62345       ILLINOIS IL
## 62346       ILLINOIS IL
## 62347       ILLINOIS IL
## 62348       ILLINOIS IL
## 62349       ILLINOIS IL
## 62350       ILLINOIS IL
## 62351       ILLINOIS IL
## 62352       ILLINOIS IL
## 62353       ILLINOIS IL
## 62354       ILLINOIS IL
## 62355       ILLINOIS IL
## 62373       Virginia VA
## 62408        Florida FL
## 62409        Florida FL
## 62410     California CA
## 62414        Florida FL
## 62415        Florida FL
## 62445       Virginia VA
## 62446       Virginia VA
## 62450       Virginia VA
## 62453       Virginia VA
## 62456     California CA
## 62523     California CA
## 62531     California CA
## 62557        Florida FL
## 62574        Alabama AL
## 62644           Utah UT
## 62678        Arizona AZ
## 62679       Missouri MO
## 62687       Illinois IL
## 62693        Indiana IN
## 62731     California CA
## 62755           Utah UT
## 62756           Utah UT
## 62788          Texas TX
## 62803       Illinois IL
## 62866        FLORIDA FL
## 62978     California CA
## 63014     California CA
## 63041       ILLINOIS IL
## 63042       ILLINOIS IL
## 63044           Utah UT
## 63058      Louisiana LA
## 63094        Florida FL
## 63111       New York NY
## 63144           Utah UT
## 63145           Utah UT
## 63151     California CA
## 63152    Mississippi MS
## 63169        Florida FL
## 63173           Utah UT
## 63174           Utah UT
## 63175           Utah UT
## 63206           Utah UT
## 63211        Arizona AZ
## 63239           Utah UT
## 63240           Utah UT
## 63279           Utah UT
## 63280           Utah UT
## 63291           Utah UT
## 63292           Utah UT
## 63344           Utah UT
## 63363         NEVADA NV
## 63365           Utah UT
## 63379           Utah UT
## 63380           Utah UT
## 63381           Utah UT
## 63382           Utah UT
## 63397        Florida FL
## 63509       ILLINOIS IL
## 63511       ILLINOIS IL
## 63519        Florida FL
## 63615         NEVADA NV
## 63616     New Mexico NM
## 63622        ARIZONA AZ
## 63623        Arizona AZ
## 63672      MINNESOTA MN
## 63674      MINNESOTA MN
## 63685       VIRGINIA VA
## 63686       Virginia VA
## 63687       Virginia VA
## 63698       Virginia VA
## 63703       Virginia VA
## 63711       ILLINOIS IL
## 63741           Utah UT
## 63749      Minnesota MN
## 63756        Arizona AZ
## 63780        Arizona AZ
## 63802           Utah UT
## 63818           Utah UT
## 63821      MINNESOTA MN
## 63822      LOUISIANA LA
## 63834         Nevada NV
## 63903       Illinois IL
## 64038           Utah UT
## 64095     New Mexico NM
## 64146       Illinois IL
## 64246        Arizona AZ
## 64284     California CA
## 64285     California CA
## 64321          Texas TX
## 64322          Texas TX
## 64323          Texas TX
## 64327     California CA
## 64334        Arizona AZ
## 64368       Missouri MO
## 64381     New Mexico NM
## 64460           Utah UT
## 64502       Illinois IL
## 64599           Utah UT
## 64601           Utah UT
## 64612     California CA
## 64629       Illinois IL
## 64646     California CA
## 64679       Illinois IL
## 64684           Utah UT
## 64733           Utah UT
## 64739       Illinois IL
## 64753       Illinois IL
## 64766           Utah UT
## 64783      Wisconsin WI
## 64796     California CA
## 64797     California CA
## 64911           Utah UT
## 64913          Texas TX
## 64984           Utah UT
## 65028     NEW JERSEY NJ
## 65030     California CA
## 65046     New Jersey NJ
## 65056     California CA
## 65063     New Jersey NJ
## 65064     New Jersey NJ
## 65072        Florida FL
## 65075     NEW JERSEY NJ
## 65076     California CA
## 65129     New Jersey NJ
## 65134        Florida FL
## 65136        Florida FL
## 65172     California CA
## 65175           Utah UT
## 65186        Arizona AZ
## 65193           UTAH UT
## 65194           Utah UT
## 65211       Illinois IL
## 65214           Utah UT
## 65219           Utah UT
## 65220           Utah UT
## 65281        Florida FL
## 65282        Florida FL
## 65285        Florida FL
## 65286        FLORIDA FL
## 65287        Florida FL
## 65288        Florida FL
## 65309        FLORIDA FL
## 65310        Florida FL
## 65311        FLORIDA FL
## 65323       Oklahoma OK
## 65324       OKLAHOMA OK
## 65325       OKLAHOMA OK
## 65329       OKLAHOMA OK
## 65330       OKLAHOMA OK
## 65333       Oklahoma OK
## 65334       Oklahoma OK
## 65335       Oklahoma OK
## 65336       Oklahoma OK
## 65389     CALIFORNIA CA
## 65404           Utah UT
## 65405           UTAH UT
## 65429  MASSACHUSETTS MA
## 65430     California CA
## 65485     California CA
## 65559       Illinois IL
## 65575       Illinois IL
## 65602        Florida FL
## 65622           Utah UT
## 65623           Utah UT
## 65636        Arizona AZ
## 65637        Arizona AZ
## 65638        Arizona AZ
## 65639        Arizona AZ
## 65640        Arizona AZ
## 65641        Arizona AZ
## 65642        Arizona AZ
## 65643       Illinois IL
## 65644        Arizona AZ
## 65687     California CA
## 65711      MINNESOTA MN
## 65712           Utah UT
## 65755        Alabama AL
## 65761           Utah UT
## 65768        Arizona AZ
## 65793     California CA
## 65794     California CA
## 65795     California CA
## 65796     California CA
## 65797     California CA
## 65799        Alabama AL
## 65800        ALABAMA AL
## 65821     California CA
## 65822     CALIFORNIA CA
## 65823     California CA
## 65824     California CA
## 65825     California CA
## 65833           Utah UT
## 65834           Utah UT
## 65835           Utah UT
## 65837        Arizona AZ
## 65859     CALIFORNIA CA
## 65861     New Jersey NJ
## 65899     California CA
## 65905        Arizona AZ
## 65919        Arizona AZ
## 65956           Utah UT
## 65980           Utah UT
## 65981           Utah UT
## 66018      WISCONSIN WI
## 66035           Utah UT
## 66036           Utah UT
## 66037           Utah UT
## 66044     California CA
## 66049     California CA
## 66059           Utah UT
## 66083     California CA
## 66089      Minnesota MN
## 66186           Utah UT
## 66187           Utah UT
## 66188        Florida FL
## 66220        Florida FL
## 66221        Florida FL
## 66222        Florida FL
## 66228      Wisconsin WI
## 66242      Minnesota MN
## 66267       Illinois IL
## 66370           Utah UT
## 66397           Utah UT
## 66455       Illinois IL
## 66470     California CA
## 66471     California CA
## 66496         Nevada NV
## 66509        Alabama AL
## 66543     CALIFORNIA CA
## 66544     California CA
## 66558       OKLAHOMA OK
## 66560       OKLAHOMA OK
## 66569       Missouri MO
## 66592          Texas TX
## 66593          Texas TX
## 66594          Texas TX
## 66595          Texas TX
## 66601          Texas TX
## 66602          Texas TX
## 66620        Florida FL
## 66631        Florida FL
## 66632       Virginia VA
## 66640        FLORIDA FL
## 66641        Florida FL
## 66643        FLORIDA FL
## 66648        Florida FL
## 66651        Florida FL
## 66653        Florida FL
## 66660        Arizona AZ
## 66669     California CA
## 66681     California CA
## 66687     California CA
## 66691           Utah UT
## 66698     California CA
## 66705     California CA
## 66706     California CA
## 66747       Virginia VA
## 66758        Arizona AZ
## 66775           Utah UT
## 66794        ARIZONA AZ
## 66822     California CA
## 66844     New Jersey NJ
## 66852        Florida FL
## 66855        Florida FL
## 66859        Florida FL
## 66871        Florida FL
## 66876     California CA
## 66902        Florida FL
## 66908        ARIZONA AZ
## 66966        Florida FL
## 66967 South Carolina SC
## 67008     California CA
## 67038        Arizona AZ
## 67043        Florida FL
## 67056           Utah UT
## 67057           Utah UT
## 67058           Utah UT
## 67063     California CA
## 67078           Utah UT
## 67110  Massachusetts MA
## 67116           Utah UT
## 67117     California CA
## 67119     California CA
## 67121        Arizona AZ
## 67132        Arizona AZ
## 67138     CALIFORNIA CA
## 67151        Arizona AZ
## 67155        Arizona AZ
## 67158     CALIFORNIA CA
## 67230           Utah UT
## 67295           Utah UT
## 67326           Utah UT
## 67339           Utah UT
## 67340           Utah UT
## 67360        Arizona AZ
## 67361           Utah UT
## 67366        Florida FL
## 67487           Utah UT
## 67488           Utah UT
## 67558           Utah UT
## 67620           Utah UT
## 67621           Utah UT
## 67642           Utah UT
## 67643           Utah UT
## 67681     California CA
## 67693     California CA
## 67703        Florida FL
## 67709        Florida FL
## 67715     CALIFORNIA CA
## 67733          Texas TX
## 67743     New Jersey NJ
## 67756        Arizona AZ
## 67773        FLORIDA FL
## 67774        Arizona AZ
## 67802     CALIFORNIA CA
## 67803     CALIFORNIA CA
## 67806     California CA
## 67812         NEVADA NV
## 67818        ARIZONA AZ
## 67822       Illinois IL
## 67831      MINNESOTA MN
## 67861      Louisiana LA
## 68022        Arizona AZ
## 68038        ARIZONA AZ
## 68039        ARIZONA AZ
## 68053       Illinois IL
## 68057       Illinois IL
## 68079       ILLINOIS IL
## 68080       ILLINOIS IL
## 68113           Utah UT
## 68115           Utah UT
## 68118        Arizona AZ
## 68119        Arizona AZ
## 68120        Arizona AZ
## 68121        Arizona AZ
## 68122        Arizona AZ
## 68123        Arizona AZ
## 68124        Arizona AZ
## 68125        Arizona AZ
## 68126        Arizona AZ
## 68127        Arizona AZ
## 68128        Arizona AZ
## 68130        Arizona AZ
## 68131        Arizona AZ
## 68132        Arizona AZ
## 68133        Arizona AZ
## 68134        Arizona AZ
## 68135        Arizona AZ
## 68136        Arizona AZ
## 68137        Arizona AZ
## 68138        Arizona AZ
## 68139        Arizona AZ
## 68140        Arizona AZ
## 68141        Arizona AZ
## 68142        Arizona AZ
## 68143        Arizona AZ
## 68144        Arizona AZ
## 68145        Arizona AZ
## 68146        Arizona AZ
## 68147        Arizona AZ
## 68148        Arizona AZ
## 68149        Arizona AZ
## 68150        Arizona AZ
## 68151        Arizona AZ
## 68152        Arizona AZ
## 68153        Arizona AZ
## 68154        Arizona AZ
## 68155        Arizona AZ
## 68156        Arizona AZ
## 68157        ARIZONA AZ
## 68158        ARIZONA AZ
## 68209     California CA
## 68303       Illinois IL
## 68304       Illinois IL
## 68307       Illinois IL
## 68338     California CA
## 68449        Arizona AZ
## 68464      WISCONSIN WI
## 68468     California CA
## 68474     New Mexico NM
## 68501     CALIFORNIA CA
## 68568        ARIZONA AZ
## 68579        Arizona AZ
## 68580       Illinois IL
## 68597       Maryland MD
## 68598          Texas TX
## 68698    Mississippi MS
## 68774         NEVADA NV
## 68782       Illinois IL
## 68801       ILLINOIS IL
## 68802       ILLINOIS IL
## 68803       ILLINOIS IL
## 68804       ILLINOIS IL
## 68811           Utah UT
## 68839        Alabama AL
## 68870       Virginia VA
## 68940       Missouri MO
## 69031           Utah UT
## 69060        Arizona AZ
## 69064       VIRGINIA VA
## 69066     CALIFORNIA CA
## 69068        Arizona AZ
## 69070        Arizona AZ
## 69071        Arizona AZ
## 69072        ARIZONA AZ
## 69073        ARIZONA AZ
## 69096      MINNESOTA MN
## 69099        Alabama AL
## 69100      Minnesota MN
## 69117     California CA
## 69153           Iowa IA
## 69157        FLORIDA FL
## 69161       Virginia VA
## 69170       Virginia VA
## 69184     California CA
## 69186       Virginia VA
## 69232      Minnesota MN
## 69244        Alabama AL
## 69289        Arizona AZ
## 69290        Arizona AZ
## 69314        ARIZONA AZ
## 69324        Arizona AZ
## 69330        Arizona AZ
## 69331        Arizona AZ
## 69332        ARIZONA AZ
## 69333        Arizona AZ
## 69334        Arizona AZ
## 69394        Arizona AZ
## 69420     California CA
## 69518           Utah UT
## 69519           Utah UT
## 69533        Florida FL
## 69551        FLORIDA FL
## 69552        FLORIDA FL
## 69576     New Jersey NJ
## 69581        Florida FL
## 69583        Florida FL
## 69594        FLORIDA FL
## 69595        Florida FL
## 69596        Florida FL
## 69688           Utah UT
## 69689        Arizona AZ
## 69690        Arizona AZ
## 69695        Arizona AZ
## 69696        Arizona AZ
## 69698        ARIZONA AZ
## 69699        Arizona AZ
## 69701        Arizona AZ
## 69766     California CA
## 69774           Utah UT
## 69792       Illinois IL
## 69794        Arizona AZ
## 69802           Utah UT
## 69803           Utah UT
## 69957       Virginia VA
## 69958           Utah UT
## 69963     California CA
## 69964     California CA
## 69965     California CA
## 69970        Florida FL
## 69971        Florida FL
## 69973      Minnesota MN
## 69986           Utah UT
## 70053       ILLINOIS IL
## 70059          Texas TX
## 70115       COLORADO CO
## 70143        Arizona AZ
## 70148           Utah UT
## 70157           Utah UT
## 70173           Utah UT
## 70177           Utah UT
## 70240     California CA
## 70286     California CA
## 70351       Virginia VA
## 70365     California CA
## 70366     California CA
## 70367     California CA
## 70397           Utah UT
## 70469       Virginia VA
## 70504        Arizona AZ
## 70505           Utah UT
## 70524        Florida FL
## 70528        Florida FL
## 70529           Utah UT
## 70535        Florida FL
## 70536        Florida FL
## 70586        Florida FL
## 70658           Utah UT
## 70674     California CA
## 70755     New Jersey NJ
## 70769        Florida FL
## 70808        Indiana IN
## 70809        Indiana IN
## 70851     California CA
## 70883           Utah UT
## 70889       Maryland MD
## 70895        Florida FL
## 71038       Virginia VA
## 71047        Arizona AZ
## 71048        Arizona AZ
## 71049        Arizona AZ
## 71050        Arizona AZ
## 71051        Arizona AZ
## 71053        Arizona AZ
## 71064      MINNESOTA MN
## 71161       Illinois IL
## 71180        Florida FL
## 71182       Illinois IL
## 71226      MINNESOTA MN
## 71238       Illinois IL
## 71260        Florida FL
## 71263       Virginia VA
## 71264          TEXAS TX
## 71267        Arizona AZ
## 71271        FLORIDA FL
## 71272        Florida FL
## 71273        Florida FL
## 71278      MINNESOTA MN
## 71279       Maryland MD
## 71280        Florida FL
## 71281      MINNESOTA MN
## 71285        Arizona AZ
## 71337     California CA
## 71338     California CA
## 71339           Utah UT
## 71344     CALIFORNIA CA
## 71345     California CA
## 71368        Arizona AZ
## 71380     California CA
## 71384        Arizona AZ
## 71389  West Virginia WV
## 71390  WEST VIRGINIA WV
## 71468     California CA
## 71473        Arizona AZ
## 71482       Virginia VA
## 71491       Virginia VA
## 71499  WEST VIRGINIA WV
## 71500      MINNESOTA MN
## 71507      MINNESOTA MN
## 71527      MINNESOTA MN
## 71577     NEW JERSEY NJ
## 71586        Alabama AL
## 71588       Virginia VA
## 71595       Illinois IL
## 71598       Virginia VA
## 71599          Texas TX
## 71600          Texas TX
## 71602       Virginia VA
## 71603       Virginia VA
## 71608        Florida FL
## 71609      MINNESOTA MN
## 71611       ILLINOIS IL
## 71613        Alabama AL
## 71614     New Jersey NJ
## 71615     New Jersey NJ
## 71616     New Jersey NJ
## 71617     New Jersey NJ
## 71618     New Jersey NJ
## 71619     New Jersey NJ
## 71627           Utah UT
## 71669        Arizona AZ
## 71696           Utah UT
## 71700           Utah UT
## 71715           Utah UT
## 71716           Utah UT
## 71717           Utah UT
## 71718           Utah UT
## 71719           Utah UT
## 72527       VIRGINIA VA
## 72555       Virginia VA
## 72606  West Virginia WV
## 72618        Florida FL
## 72637        Florida FL
## 72638        Florida FL
## 72639        Florida FL
## 72651        Arizona AZ
## 72671           Utah UT
## 72684     California CA
## 72695       Virginia VA
## 72756           Utah UT
## 72762       Virginia VA
## 72814    Mississippi MS
## 72922     California CA
## 72923     California CA
## 72959      Wisconsin WI
## 72980       ILLINOIS IL
## 72981       Illinois IL
## 72983       ILLINOIS IL
## 72986     NEW JERSEY NJ
## 72991     California CA
## 73021     California CA
## 73095  West Virginia WV
## 73146     California CA
## 73180     California CA
## 73185           Utah UT
## 73220        ARIZONA AZ
## 73300  West Virginia WV
## 73303        Alabama AL
## 73304        Alabama AL
## 73355       Virginia VA
## 73356      MINNESOTA MN
## 73395     CALIFORNIA CA
## 73437        Arizona AZ
## 73473      Wisconsin WI
## 73489     California CA
## 73527        ARIZONA AZ
## 73528        Arizona AZ
## 73537     California CA
## 73551       Missouri MO
## 73554     NEW JERSEY NJ
## 73573           Utah UT
## 73582           Utah UT
## 73601       ILLINOIS IL
## 73603           UTAH UT
## 73604       Virginia VA
## 73643     California CA
## 73656           Utah UT
## 73676           Utah UT
## 73688      MINNESOTA MN
## 73712           Utah UT
## 73781     CALIFORNIA CA
## 73782     CALIFORNIA CA
## 73790      Wisconsin WI
## 73792       Virginia VA
## 73816        Florida FL
## 73846           Utah UT
## 73862     California CA
## 73901     California CA
## 73908           Utah UT
## 73927       Virginia VA
## 73928       Virginia VA
## 73931       Illinois IL
## 73933       Illinois IL
## 73954       Virginia VA
## 73955       Virginia VA
## 73956       Illinois IL
## 73957     New Jersey NJ
## 73958       Virginia VA
## 73959       Virginia VA
## 73965     New Jersey NJ
## 73968       Virginia VA
## 73971       VIRGINIA VA
## 73988        Arizona AZ
## 73989        Arizona AZ
## 74028           Utah UT
## 74032           Utah UT
## 74068     California CA
## 74094       Virginia VA
## 74122     California CA
## 74159        Florida FL
## 74161  MASSACHUSETTS MA
## 74198        Arizona AZ
## 74199     California CA
## 74294           Utah UT
## 74298           Utah UT
## 74300           Utah UT
## 74369        Florida FL
## 74414       ILLINOIS IL
## 74432          TEXAS TX
## 74444           Utah UT
## 74447           Utah UT
## 74462          Texas TX
## 74476     California CA
## 74511       Virginia VA
## 74515     California CA
## 74516     CALIFORNIA CA
## 74522       VIRGINIA VA
## 74529     California CA
## 74531      Wisconsin WI
## 74538       Illinois IL
## 74552       Virginia VA
## 74554       Virginia VA
## 74558        Florida FL
## 74562       Virginia VA
## 74563       Illinois IL
## 74634        Florida FL
## 74659           Utah UT
## 74676        Arizona AZ
## 74677           UTAH UT
## 74680           Utah UT
## 74681       Illinois IL
## 74751        Florida FL
## 74784       Illinois IL
## 74800           Utah UT
## 74805        Arizona AZ
## 74809     CALIFORNIA CA
## 74912          Texas TX
## 74940        Indiana IN
## 74993     CALIFORNIA CA
## 75052        FLORIDA FL
## 75053        Florida FL
## 75078           Utah UT
## 75084     CALIFORNIA CA
## 75087     California CA
## 75109        Florida FL
## 75122           UTAH UT
## 75141     California CA
## 75194        Arizona AZ
## 75213       Illinois IL
## 75237       Illinois IL
## 75241           Utah UT
## 75244       Illinois IL
## 75268           Utah UT
## 75272      Minnesota MN
## 75283      Louisiana LA
## 75295     California CA
## 75400           Utah UT
## 75407           Utah UT
## 75408           Utah UT
## 75421        Montana MT
## 75422        Montana MT
## 75429           Utah UT
## 75439           Utah UT
## 75483           Utah UT
## 75499           Utah UT
## 75500           Utah UT
## 75530      Minnesota MN
## 75536     California CA
## 75545  West Virginia WV
## 75554       Virginia VA
## 75555       Virginia VA
## 75563     California CA
## 75581      Minnesota MN
## 75637       Illinois IL
## 75694           Utah UT
## 75725          Idaho ID
## 75745  West Virginia WV
## 75922     California CA
## 75976           Utah UT
## 76028       Illinois IL
## 76076        Georgia GA
## 76137     California CA
## 76138     California CA
## 76139     California CA
## 76174           Utah UT
## 76226           Utah UT
## 76227           Utah UT
## 76235           Utah UT
## 76239     California CA
## 76257      Minnesota MN
## 76286       Illinois IL
## 76287       Illinois IL
## 76288       Illinois IL
## 76291       Illinois IL
## 76405       Missouri MO
## 76435           Utah UT
## 76488  West Virginia WV
## 76530       Illinois IL
## 76670           Utah UT
## 76683        Florida FL
## 76703           Utah UT
## 76704           Utah UT
## 76721           UTAH UT
## 76728     California CA
## 76771           Utah UT
## 76793           Utah UT
## 76795       Illinois IL
## 76820           Utah UT
## 76824           Utah UT
## 76849           Utah UT
## 76996     CALIFORNIA CA
## 77018     New Mexico NM
## 77091       Virginia VA
## 77094       Illinois IL
## 77111     California CA
## 77151           Utah UT
## 77156           Utah UT
## 77167           Utah UT
## 77194        Florida FL
## 77218       Illinois IL
## 77242        Arizona AZ
## 77264        Alabama AL
## 77417       Virginia VA
## 77448        ALABAMA AL
## 77612     California CA
## 77625       Missouri MO
## 77651        Arizona AZ
## 77656        ARIZONA AZ
## 77683     California CA
## 77686     California CA
## 77696        Arizona AZ
## 77698        Arizona AZ
## 77731        Arizona AZ
## 77733     California CA
## 77738           Utah UT
## 77745           Utah UT
## 77831      MINNESOTA MN
## 77833          TEXAS TX
## 77892           Utah UT
## 77894           Utah UT
## 77903           Utah UT
## 77928           Utah UT
## 77972           Utah UT
## 78005           Utah UT
## 78006           Utah UT
## 78008           Utah UT
## 78009           Utah UT
## 78010        Arizona AZ
## 78011        Arizona AZ
## 78066  West Virginia WV
## 78095        Florida FL
## 78160     California CA
## 78168     CALIFORNIA CA
## 78176     California CA
## 78179     California CA
## 78183     California CA
## 78193     California CA
## 78198     California CA
## 78202     California CA
## 78203     CALIFORNIA CA
## 78217     California CA
## 78228     California CA
## 78243     California CA
## 78245     California CA
## 78255        Florida FL
## 78263        Florida FL
## 78265     California CA
## 78272           Utah UT
## 78279     CALIFORNIA CA
## 78296     California CA
## 78306     California CA
## 78311     California CA
## 78312     California CA
## 78313     California CA
## 78332        Arizona AZ
## 78340           Utah UT
## 78346     CALIFORNIA CA
## 78348        Arizona AZ
## 78351        ARIZONA AZ
## 78399           Utah UT
## 78400      Wisconsin WI
## 78405           Utah UT
## 78408       Illinois IL
## 78436        Georgia GA
## 78482           Utah UT
## 78492       Illinois IL
## 78494       Illinois IL
## 78522           Utah UT
## 78570     California CA
## 78584     California CA
## 78585     California CA
## 78586     California CA
## 78587     California CA
## 78588     California CA
## 78591     CALIFORNIA CA
## 78595     California CA
## 78597     California CA
## 78601           Utah UT
## 78603     California CA
## 78606     CALIFORNIA CA
## 78609     California CA
## 78652          Texas TX
## 78663     CALIFORNIA CA
## 78670     CALIFORNIA CA
## 78671     California CA
## 78685        Florida FL
## 78686        Arizona AZ
## 78689        Florida FL
## 78690        Florida FL
## 78699     California CA
## 78702        Florida FL
## 78708           Utah UT
## 78744     NEW JERSEY NJ
## 78787        Florida FL
## 78788        Florida FL
## 78797           Utah UT
## 78841       Illinois IL
## 78842        Arizona AZ
## 78908        Georgia GA
## 78926     California CA
## 78955 South Carolina SC
## 78956 South Carolina SC
## 78963     CALIFORNIA CA
## 79001           Utah UT
## 79055           Utah UT
## 79162       Illinois IL
## 79249        Florida FL
## 79257     CALIFORNIA CA
## 79413       Virginia VA
## 79443           Utah UT
## 79478        Arizona AZ
## 79484        Florida FL
## 79485        Florida FL
## 79544        Florida FL
## 79545  New Hampshire NH
## 79573       ILLINOIS IL
## 79582        FLORIDA FL
## 79583        Florida FL
## 79610     California CA
## 79634        Florida FL
## 79638       Virginia VA
## 79644        Florida FL
## 79645        Florida FL
## 79646        Florida FL
## 79647        Florida FL
## 79672        Arizona AZ
## 79673        Arizona AZ
## 79681          Texas TX
## 79689           Utah UT
## 79698     California CA
## 79700          Texas TX
## 79722     California CA
## 79723        ARIZONA AZ
## 79724        Arizona AZ
## 79770        Florida FL
## 79789        Florida FL
## 79795        Florida FL
## 79817      Wisconsin WI
## 79825      Wisconsin WI
## 79834      Wisconsin WI
## 79850      MINNESOTA MN
## 79864        Arizona AZ
## 79875        Arizona AZ
## 79887        ARIZONA AZ
## 79889        Arizona AZ
## 79891        ARIZONA AZ
## 79892        Arizona AZ
## 79894     New Mexico NM
## 79942           Utah UT
## 79945       ILLINOIS IL
## 79946     CALIFORNIA CA
## 79959           Utah UT
## 79974      MINNESOTA MN
## 80014     California CA
## 80015           UTAH UT
## 80073       Illinois IL
## 80104           Utah UT
## 80225  MASSACHUSETTS MA
## 80241           Utah UT
## 80273     California CA
## 80286     California CA
## 80443           Utah UT
## 80474     CALIFORNIA CA
## 80477       Virginia VA
## 80479       Virginia VA
## 80480       Virginia VA
## 80569        Florida FL
## 80570        Florida FL
## 80603     California CA
## 80604     California CA
## 80605     CALIFORNIA CA
## 80615     California CA
## 80653     California CA
## 80752        Arizona AZ
## 80789     California CA
## 80834     CALIFORNIA CA
## 80835        Florida FL
## 80885     California CA
## 80889           Utah UT
## 80891     California CA
## 80892     California CA
## 80893     CALIFORNIA CA
## 80900     California CA
## 80920     California CA
## 80928     California CA
## 80929         Nevada NV
## 80944     California CA
## 80969        ARIZONA AZ
## 80990        Florida FL
## 80991       Illinois IL
## 81005     California CA
## 81039           Utah UT
## 81041     California CA
## 81048           Utah UT
## 81067           Utah UT
## 81093           UTAH UT
## 81094           UTAH UT
## 81149     NEW JERSEY NJ
## 81217     California CA
## 81306        Arizona AZ
## 81307     California CA
## 81314           Utah UT
## 81328        Arizona AZ
## 81346           Utah UT
## 81359        Arizona AZ
## 81364           UTAH UT
## 81376        Arizona AZ
## 81384        Arizona AZ
## 81401           Utah UT
## 81411     California CA
## 81434     California CA
## 81621       Virginia VA
## 81653           Utah UT
## 81654           Utah UT
## 81665           Utah UT
## 81669           Utah UT
## 81670           Utah UT
## 81681           Utah UT
## 81702      MINNESOTA MN
## 81709          Texas TX
## 81761           Utah UT
## 81771     California CA
## 81772     California CA
## 81778      Minnesota MN
## 81817        Florida FL
## 81818        Florida FL
## 81848        Florida FL
## 81854        Florida FL
## 81855        Florida FL
## 81857        Florida FL
## 81882        Florida FL
## 81894        FLORIDA FL
## 81917     California CA
## 81918     California CA
## 81919     California CA
## 81920     California CA
## 81938        Arizona AZ
## 81941        Arizona AZ
## 81942        Arizona AZ
## 81943        Arizona AZ
## 81944        Arizona AZ
## 81945        Arizona AZ
## 81978        Arizona AZ
## 82019        Florida FL
## 82029        Alabama AL
## 82053  West Virginia WV
## 82064       NEW YORK NY
## 82078           Utah UT
## 82096       Missouri MO
## 82123           Utah UT
## 82125     California CA
## 82138     California CA
## 82159           Utah UT
## 82186  Massachusetts MA
## 82297        Indiana IN
## 82353           Utah UT
## 82355     California CA
## 82372         Oregon OR
## 82376           Utah UT
## 82377           Utah UT
## 82381           Utah UT
## 82472        Arizona AZ
## 82487           Utah UT
## 82497           Utah UT
## 82525        Arizona AZ
## 82548        Arizona AZ
## 82549        Arizona AZ
## 82575           Utah UT
## 82576           Utah UT
## 82581        Arizona AZ
## 82606           Utah UT
## 82618           Utah UT
## 82619           Utah UT
## 82677           Utah UT
## 82678           Utah UT
## 82679           Utah UT
## 82680           Utah UT
## 82683     California CA
## 82694        Florida FL
## 82717        Arizona AZ
## 82718           Utah UT
## 82742           Utah UT
## 82752       Illinois IL
## 82787  Massachusetts MA
## 82788       ILLINOIS IL
## 82793       Missouri MO
## 82848        Arizona AZ
## 82877       Virginia VA
## 82880        Arizona AZ
## 82888     California CA
## 82928     California CA
## 82949     New Mexico NM
## 82958     NEW JERSEY NJ
## 82967       Illinois IL
## 82975        Arizona AZ
## 82996           Utah UT
## 83016           Utah UT
## 83040          Texas TX
## 83041      Louisiana LA
## 83045        Arizona AZ
## 83058     California CA
## 83096       Virginia VA
## 83107       Illinois IL
## 83111       Virginia VA
## 83142           Utah UT
## 83179           Utah UT
## 83189          Texas TX
## 83192        Arizona AZ
## 83199        Florida FL
## 83223        Arizona AZ
## 83233       Virginia VA
## 83254       Virginia VA
## 83255       Virginia VA
## 83288          Texas TX
## 83297        Alabama AL
## 83305           Utah UT
## 83306           Utah UT
## 83313           Utah UT
## 83315        Florida FL
## 83322     CALIFORNIA CA
## 83337         Nevada NV
## 83387           Utah UT
## 83389           Utah UT
## 83393      Minnesota MN
## 83395      Minnesota MN
## 83398      MINNESOTA MN
## 83408     CALIFORNIA CA
## 83409     CALIFORNIA CA
## 83410     California CA
## 83411     California CA
## 83412     California CA
## 83416     California CA
## 83417     California CA
## 83419          Texas TX
## 83425      Minnesota MN
## 83430          Texas TX
## 83436           Utah UT
## 83437           UTAH UT
## 83446      Minnesota MN
## 83485     California CA
## 83527       Missouri MO
## 83549        Florida FL
## 83550        FLORIDA FL
## 83555        Florida FL
## 83562       Virginia VA
## 83589           Utah UT
## 83615           Utah UT
## 83617           Utah UT
## 83621       COLORADO CO
## 83644       Illinois IL
## 83675     California CA
## 83693           Utah UT
## 83694        Florida FL
## 83695           Utah UT
## 83774           Utah UT
## 83775     New Mexico NM
## 83781       Illinois IL
## 83783     California CA
## 83805       Illinois IL
## 83816       Illinois IL
## 83835       Illinois IL
## 83841  MASSACHUSETTS MA
## 83867           UTAH UT
## 83886           Utah UT
## 83888           Utah UT
## 83912           Utah UT
## 83927     California CA
## 83947       Illinois IL
## 83957      Minnesota MN
## 83958      Wisconsin WI
## 83995        Florida FL
## 84024       Illinois IL
## 84061        Florida FL
## 84094           UTAH UT
## 84100      LOUISIANA LA
## 84121        Florida FL
## 84122        Florida FL
## 84128        Florida FL
## 84129        Florida FL
## 84130        FLORIDA FL
## 84132       Missouri MO
## 84135      Minnesota MN
## 84138        Florida FL
## 84141        Florida FL
## 84289      Wisconsin WI
## 84314           Utah UT
## 84315           Utah UT
## 84316           Utah UT
## 84364        Arizona AZ
## 84381           Utah UT
## 84414           Iowa IA
## 84442        Arizona AZ
## 84521        ARIZONA AZ
## 84524        ARIZONA AZ
## 84525        ARIZONA AZ
## 84526        ARIZONA AZ
## 84527        ARIZONA AZ
## 84528        ARIZONA AZ
## 84529        ARIZONA AZ
## 84530        ARIZONA AZ
## 84535        INDIANA IN
## 84591       VIRGINIA VA
## 84599       VIRGINIA VA
## 84624        Arizona AZ
## 84679        Arizona AZ
## 84684         NEVADA NV
## 84717           UTAH UT
## 84791       Illinois IL
## 84822           Utah UT
## 84857      Minnesota MN
## 84910     California CA
## 84912     California CA
## 84913     California CA
## 84940     California CA
## 85144       Virginia VA
## 85152     California CA
## 85280          Texas TX
## 85282          Texas TX
## 85283          Texas TX
## 85289        INDIANA IN
## 85292          Texas TX
## 85295        Arizona AZ
## 85296        Arizona AZ
## 85301        Florida FL
## 85305        Florida FL
## 85353       ILLINOIS IL
## 85356          TEXAS TX
## 85357       ILLINOIS IL
## 85362        ALABAMA AL
## 85365       ILLINOIS IL
## 85398       ILLINOIS IL
## 85399        Arizona AZ
## 85400        Arizona AZ
## 85402        Arizona AZ
## 85403        Arizona AZ
## 85404           UTAH UT
## 85412      MINNESOTA MN
## 85413           Utah UT
## 85435        Arizona AZ
## 85534     CALIFORNIA CA
## 85589           UTAH UT
## 85590           Utah UT
## 85591           UTAH UT
## 85606           Utah UT
## 85630     CALIFORNIA CA
## 85642           Utah UT
## 85660     California CA
## 85688           Utah UT
## 85689         Nevada NV
## 85692     CALIFORNIA CA
## 85697           Utah UT
## 85733        Florida FL
## 85738        Florida FL
## 85741        Florida FL
## 85757        Arizona AZ
## 85768        Arizona AZ
## 85785        FLORIDA FL
## 85790        Florida FL
## 85791        Florida FL
## 85795           Utah UT
## 85831        Florida FL
## 85969     California CA
## 85970           Utah UT
## 85971           Utah UT
## 85973           Utah UT
## 85974           Utah UT
## 86024           Utah UT
## 86049           Utah UT
## 86051           Utah UT
## 86052           Utah UT
## 86065           Utah UT
## 86067       Missouri MO
## 86081      Minnesota MN
## 86096        Arizona AZ
## 86101       VIRGINIA VA
## 86180       Delaware DE
## 86205     CALIFORNIA CA
## 86233        Florida FL
## 86234        Florida FL
## 86235        Florida FL
## 86254      MINNESOTA MN
## 86342        ARIZONA AZ
## 86438     California CA
## 86494        ARIZONA AZ
## 86498           Utah UT
## 86499           UTAH UT
## 86503           Utah UT
## 86504           Utah UT
## 86506           Utah UT
## 86511        ARIZONA AZ
## 86522       Illinois IL
## 86533        Georgia GA
## 86570           Utah UT
## 86584           Utah UT
## 86585           Utah UT
## 86593    MISSISSIPPI MS
## 86616       Illinois IL
## 86640     California CA
## 86691        Alabama AL
## 86693        Alabama AL
## 86781        FLORIDA FL
## 86782        Arizona AZ
## 86788        Florida FL
## 86827          Texas TX
## 86828          Texas TX
## 86829          Texas TX
## 86831          Texas TX
## 86832          Texas TX
## 86834          Texas TX
## 86835          Texas TX
## 86839          Texas TX
## 86892     California CA
## 86893     California CA
## 86898           Utah UT
## 86906          Texas TX
## 86917  West Virginia WV
## 86966           Utah UT
## 86967           Utah UT
## 86970        Florida FL
## 86971        Florida FL
## 86984           Utah UT
## 86985           Utah UT
## 86991       Virginia VA
## 87055       Virginia VA
## 87058       Virginia VA
## 87061  West Virginia WV
## 87097        Florida FL
## 87099        Florida FL
## 87101        Florida FL
## 87107     California CA
## 87125        Arizona AZ
## 87126        Arizona AZ
## 87127        GEORGIA GA
## 87148     CALIFORNIA CA
## 87151     California CA
## 87152     California CA
## 87158        Arizona AZ
## 87243           UTAH UT
## 87251           Utah UT
## 87284        GEORGIA GA
## 87331          Texas TX
## 87332          Texas TX
## 87341          Texas TX
## 87342          Texas TX
## 87343          Texas TX
## 87346          Texas TX
## 87347          Texas TX
## 87401        Florida FL
## 87407       Virginia VA
## 87430      Minnesota MN
## 87447           UTAH UT
## 87456        Florida FL
## 87457     CALIFORNIA CA
## 87465       VIRGINIA VA
## 87487        Florida FL
## 87501        Alabama AL
## 87505          TEXAS TX
## 87511        ARIZONA AZ
## 87519       Virginia VA
## 87521        Arizona AZ
## 87523       Virginia VA
## 87525        ARIZONA AZ
## 87532       Virginia VA
## 87535     California CA
## 87542        ARIZONA AZ
## 87555        Alabama AL
## 87570        Florida FL
## 87590          Texas TX
## 87603        Arizona AZ
## 87604        Arizona AZ
## 87605        Arizona AZ
## 87608        Florida FL
## 87611        Arizona AZ
## 87617        Arizona AZ
## 87618   RHODE ISLAND RI
## 87623        Florida FL
## 87636        Florida FL
## 87639       Virginia VA
## 87640       Virginia VA
## 87648        ARIZONA AZ
## 87662        FLORIDA FL
## 87663        Arizona AZ
## 87664       Illinois IL
## 87676       Virginia VA
## 87749        Alabama AL
## 87752        Florida FL
## 87775       Virginia VA
## 87828     California CA
## 87832           Utah UT
## 87833           Utah UT
## 87880       Illinois IL
## 87915           Utah UT
## 87931       Illinois IL
## 87963           Utah UT
## 87997           Utah UT
## 88027      Wisconsin WI
## 88044       Illinois IL
## 88153           Utah UT
## 88164           Utah UT
## 88171       Illinois IL
## 88172           Utah UT
## 88173           Utah UT
## 88191       Illinois IL
## 88212           Utah UT
## 88265        Arizona AZ
## 88266        Arizona AZ
## 88281       Virginia VA
## 88283       Virginia VA
## 88314        Florida FL
## 88394           Utah UT
## 88418           Utah UT
## 88419           Utah UT
## 88420           UTAH UT
## 88421           Utah UT
## 88423           Utah UT
## 88445           Utah UT
## 88446           Utah UT
## 88449     California CA
## 88500        Florida FL
## 88509        Alabama AL
## 88586        Arizona AZ
## 88590           Utah UT
## 88595        Arizona AZ
## 88640          Texas TX
## 88672           Utah UT
## 88706           Utah UT
## 88707           Utah UT
## 88708           Utah UT
## 88709           Utah UT
## 88753     California CA
## 88760     California CA
## 88893           Utah UT
## 88894           Utah UT
## 88918      MINNESOTA MN
## 88926        Florida FL
## 88928       Virginia VA
## 88931      Minnesota MN
## 88932      Minnesota MN
## 88957           Utah UT
## 88966          Texas TX
## 88969          Texas TX
## 89013           Utah UT
## 89016        Florida FL
## 89023     California CA
## 89025           UTAH UT
## 89065     New Jersey NJ
## 89069     California CA
## 89105     California CA
## 89106        Arizona AZ
## 89107       Illinois IL
## 89108       Illinois IL
## 89109       Illinois IL
## 89130     California CA
## 89153     California CA
## 89210     CALIFORNIA CA
## 89211     California CA
## 89212     California CA
## 89247       Virginia VA
## 89274        Arizona AZ
## 89353        Alabama AL
## 89406           Utah UT
## 89414          Texas TX
## 89417           Utah UT
## 89433        Indiana IN
## 89447        Arizona AZ
## 89448        Arizona AZ
## 89449        Arizona AZ
## 89450        Arizona AZ
## 89451        Arizona AZ
## 89453        Arizona AZ
## 89454        Arizona AZ
## 89480     California CA
## 89481     California CA
## 89531     California CA
## 89533    Mississippi MS
## 89554       Virginia VA
## 89569        Georgia GA
## 89601        Florida FL
## 89604        Florida FL
## 89609       Virginia VA
## 89636        Alabama AL
## 89638        Alabama AL
## 89744          IDAHO ID
## 89769     California CA
## 89778           Utah UT
## 89783     California CA
## 89788        Indiana IN
## 89826           Utah UT
## 89890       Illinois IL
## 89900        Florida FL
## 89902        Alabama AL
## 89919           Utah UT
## 89920           Utah UT
## 89921           Utah UT
## 89922           Utah UT
## 89923           Utah UT
## 89924           Utah UT
## 89925           Utah UT
## 89950     New Jersey NJ
## 89973     California CA
## 90028        Florida FL
## 90050        Florida FL
## 90102           Utah UT
## 90115     California CA
## 90117     California CA
## 90134           Utah UT
## 90154     NEW JERSEY NJ
## 90167     California CA
## 90175        Florida FL
## 90176        FLORIDA FL
## 90177        Florida FL
## 90204  WEST VIRGINIA WV
## 90207      Minnesota MN
## 90221  West Virginia WV
## 90249     CALIFORNIA CA
## 90255       ILLINOIS IL
## 90256       ILLINOIS IL
## 90257       ILLINOIS IL
## 90258       ILLINOIS IL
## 90281     California CA
## 90325       Illinois IL
## 90347     California CA
## 90348     California CA
## 90383           Utah UT
## 90385     CALIFORNIA CA
## 90386     CALIFORNIA CA
## 90387     CALIFORNIA CA
## 90405          TEXAS TX
## 90414          TEXAS TX
## 90520     California CA
## 90531       Illinois IL
## 90532       Illinois IL
## 90533       Illinois IL
## 90541       ILLINOIS IL
## 90569           Utah UT
## 90570           Utah UT
## 90571           Utah UT
## 90572           Utah UT
## 90573           UTAH UT
## 90574           UTAH UT
## 90575           Utah UT
## 90576           Utah UT
## 90578           Utah UT
## 90615       Virginia VA
## 90619        Arizona AZ
## 90620        Arizona AZ
## 90621        Arizona AZ
## 90622        Arizona AZ
## 90623        Arizona AZ
## 90627           Utah UT
## 90689        ARIZONA AZ
## 90690        Arizona AZ
## 90694     CALIFORNIA CA
## 90720           Utah UT
## 90726       Virginia VA
## 90748           Utah UT
## 90787           Utah UT
## 90802           Utah UT
## 90807           Utah UT
## 90810     California CA
## 90825     California CA
## 90831     California CA
## 90835     California CA
## 90846        Arizona AZ
## 90855     California CA
## 90856           Utah UT
## 90858           Utah UT
## 90879     CALIFORNIA CA
## 90951           Utah UT
## 90952           Utah UT
## 90953           Utah UT
## 90981          Idaho ID
## 91064           IOWA IA
## 91146           UTAH UT
## 91180         Nevada NV
## 91223        Arizona AZ
## 91266     California CA
## 91274     California CA
## 91277           Utah UT
## 91293       Illinois IL
## 91298        Arizona AZ
## 91322          Texas TX
## 91345           Utah UT
## 91367       Illinois IL
## 91377           Utah UT
## 91425     California CA
## 91468       Missouri MO
## 91481  West Virginia WV
## 91528        ARIZONA AZ
## 91537        Arizona AZ
## 91543          TEXAS TX
## 91544          TEXAS TX
## 91586           Utah UT
## 91587           Utah UT
## 91607        Arizona AZ
## 91622     California CA
## 91682     California CA
## 91709     NEW JERSEY NJ
## 91724           Utah UT
## 91761     California CA
## 91781       Virginia VA
## 91813       Virginia VA
## 91827     California CA
## 91841        Arizona AZ
## 91868           Utah UT
## 91872        ARIZONA AZ
## 91873        ARIZONA AZ
## 91898        Arizona AZ
## 91899           Utah UT
## 91923     California CA
## 91928           Utah UT
## 91950       Missouri MO
## 91975        Florida FL
## 91979        FLORIDA FL
## 91988     New Jersey NJ
## 91998           Utah UT
## 92024        Alabama AL
## 92100       Illinois IL
## 92120       Illinois IL
## 92183       Virginia VA
## 92189        Indiana IN
## 92217      Minnesota MN
## 92258     California CA
## 92275           Utah UT
## 92365        Florida FL
## 92369        Florida FL
## 92385           Utah UT
## 92422        Alabama AL
## 92423        Alabama AL
## 92489          Texas TX
## 92490          Texas TX
## 92493          Texas TX
## 92494          Texas TX
## 92495          Texas TX
## 92519          Texas TX
## 92526           UTAH UT
## 92547          Texas TX
## 92555     California CA
## 92632          Texas TX
## 92693       ILLINOIS IL
## 92700     California CA
## 92754        Florida FL
## 92763        Florida FL
## 92771        Florida FL
## 92791     New Jersey NJ
## 92792     NEW JERSEY NJ
## 92870         NEVADA NV
## 92972     NEW JERSEY NJ
## 92974     New Jersey NJ
## 93049   RHODE ISLAND RI
## 93051           Utah UT
## 93052           Utah UT
## 93053           Utah UT
## 93054           Utah UT
## 93055           Utah UT
## 93056           Utah UT
## 93057           Utah UT
## 93058           Utah UT
## 93059           UTAH UT
## 93068      Minnesota MN
## 93116       Virginia VA
## 93117        Alabama AL
## 93120      Wisconsin WI
## 93154       Illinois IL
## 93349       Illinois IL
## 93394       Illinois IL
## 93416           Utah UT
## 93433           Utah UT
## 93434           Utah UT
## 93438           Utah UT
## 93457           Utah UT
## 93459        Arizona AZ
## 93466        Florida FL
## 93490         Nevada NV
## 93519           UTAH UT
## 93520           UTAH UT
## 93521          Texas TX
## 93680      Minnesota MN
## 93685       Illinois IL
## 93696       Illinois IL
## 93722      Wisconsin WI
## 93746        Arizona AZ
## 93747        Arizona AZ
## 93748        Arizona AZ
## 93749        Arizona AZ
## 93750        Arizona AZ
## 93752        Arizona AZ
## 93757        Florida FL
## 93816        Georgia GA
## 93861           Utah UT
## 93873           Utah UT
## 93967     California CA
## 93976          Texas TX
## 94003           Utah UT
## 94004           UTAH UT
## 94006           Utah UT
## 94007           Utah UT
## 94113           Utah UT
## 94114     California CA
## 94142           Utah UT
## 94191        Florida FL
## 94200           Utah UT
## 94227         Nevada NV
## 94241        GEORGIA GA
## 94249      MINNESOTA MN
## 94257           Utah UT
## 94289           Utah UT
## 94324        Florida FL
## 94349       Illinois IL
## 94362  Massachusetts MA
## 94369       Illinois IL
## 94396        Florida FL
## 94403           Utah UT
## 94460      Minnesota MN
## 94467       Illinois IL
## 94468      Minnesota MN
## 94501           Utah UT
## 94534           Utah UT
## 94535           Utah UT
## 94696           Utah UT
## 94701      Minnesota MN
## 94719           Utah UT
## 94738           Utah UT
## 94742     California CA
## 94782           Utah UT
## 94783           Utah UT
## 94784           Utah UT
## 94790           Utah UT
## 94798           Utah UT
## 94800        Indiana IN
## 94948          Texas TX
## 94976        Arizona AZ
## 94997           Utah UT
## 95001           Utah UT
## 95007       Virginia VA
## 95064           Utah UT
## 95100     New Jersey NJ
## 95109     California CA
## 95116     California CA
## 95141        Florida FL
## 95151      MINNESOTA MN
## 95176           Utah UT
## 95198  West Virginia WV
## 95199  West Virginia WV
## 95200  West Virginia WV
## 95206           Utah UT
## 95232        Arizona AZ
## 95233        Arizona AZ
## 95234        Arizona AZ
## 95235        Arizona AZ
## 95236        Arizona AZ
## 95237        Arizona AZ
## 95238        Arizona AZ
## 95240        Arizona AZ
## 95241        Arizona AZ
## 95242        Arizona AZ
## 95243        Arizona AZ
## 95244        Arizona AZ
## 95245        Arizona AZ
## 95246        Arizona AZ
## 95247        Arizona AZ
## 95248        Arizona AZ
## 95249        Arizona AZ
## 95250        Arizona AZ
## 95251        Arizona AZ
## 95252        Arizona AZ
## 95254        Arizona AZ
## 95255        Arizona AZ
## 95256        Arizona AZ
## 95257        Arizona AZ
## 95258        Arizona AZ
## 95259        Arizona AZ
## 95261        Arizona AZ
## 95262        Arizona AZ
## 95263        Arizona AZ
## 95264        Arizona AZ
## 95265        Arizona AZ
## 95266        Arizona AZ
## 95267        Arizona AZ
## 95268        Arizona AZ
## 95269        Arizona AZ
## 95270        Arizona AZ
## 95271        Arizona AZ
## 95272        Arizona AZ
## 95273        Arizona AZ
## 95275        Arizona AZ
## 95276        Arizona AZ
## 95277        Arizona AZ
## 95278        Arizona AZ
## 95279        Arizona AZ
## 95303           Utah UT
## 95335      Louisiana LA
## 95343   RHODE ISLAND RI
## 95401           Utah UT
## 95413       Missouri MO
## 95417     New Mexico NM
## 95429       Missouri MO
## 95430       Missouri MO
## 95442        ARIZONA AZ
## 95444     CALIFORNIA CA
## 95446       Virginia VA
## 95486           Utah UT
## 95534           Utah UT
## 95549           Utah UT
## 95550        Arizona AZ
## 95551        ARIZONA AZ
## 95593           Utah UT
## 95670           Utah UT
## 95748           Utah UT
## 95752           Utah UT
## 95806       Illinois IL
## 95886  West Virginia WV
## 95930     California CA
## 96039        Arizona AZ
## 96120           Utah UT
## 96180     California CA
## 96209           Utah UT
## 96241           Utah UT
## 96369       Illinois IL
## 96399     California CA
## 96408           Utah UT
## 96409           Utah UT
## 96426          Texas TX
## 96450       Maryland MD
## 96498        Alabama AL
## 96502       Illinois IL
## 96541     California CA
## 96544        FLORIDA FL
## 96572        Florida FL
## 96689           Utah UT
## 96726     California CA
## 96834        Florida FL
## 96927           Utah UT
## 96945     California CA
## 97010     CALIFORNIA CA
## 97070       Illinois IL
## 97071       Illinois IL
## 97072       Illinois IL
## 97073          Texas TX
## 97074          Texas TX
## 97075       Illinois IL
## 97078          Texas TX
## 97080          Texas TX
## 97084          Texas TX
## 97085          Texas TX
## 97087          Texas TX
## 97091          Texas TX
## 97159     California CA
## 97166      MINNESOTA MN
## 97181           Utah UT
## 97187        Arizona AZ
## 97220     California CA
## 97244           Utah UT
## 97255           Utah UT
## 97258       ILLINOIS IL
## 97267           Utah UT
## 97335          Texas TX
## 97338          Texas TX
## 97339          Texas TX
## 97452           Utah UT
## 97453           Utah UT
## 97541  New Hampshire NH
## 97546  New Hampshire NH
## 97564           Utah UT
## 97614           Utah UT
## 97769     California CA
## 97803        Alabama AL
## 97824           Utah UT
## 97879        Florida FL
## 97908       Virginia VA
## 97909       Virginia VA
## 97960       ILLINOIS IL
## 98030      MINNESOTA MN
## 98031       Missouri MO
## 98032       Missouri MO
## 98034       Missouri MO
## 98051  West Virginia WV
## 98063       Illinois IL
## 98197       Illinois IL
## 98206       Illinois IL
## 98261       Illinois IL
## 98267       Illinois IL
## 98288       Illinois IL
## 98299     California CA
## 98309      Wisconsin WI
## 98310      Wisconsin WI
## 98359     New Jersey NJ
## 98435       Virginia VA
## 98437           Utah UT
## 98450           Utah UT
## 98454           Utah UT
## 98455           Utah UT
## 98471       Virginia VA
## 98485        Vermont VT
## 98506       Illinois IL
## 98511       Illinois IL
## 98512           Utah UT
## 98617       Illinois IL
## 98619       Illinois IL
## 98627      Minnesota MN
## 98628      Minnesota MN
## 98644       Illinois IL
## 98645       Illinois IL
## 98693      Minnesota MN
## 98711  West Virginia WV
## 98787  West Virginia WV
## 98807       Virginia VA
## 98885       ILLINOIS IL
## 98886       ILLINOIS IL
## 98887       ILLINOIS IL
## 98888       ILLINOIS IL
## 98889       ILLINOIS IL
## 98890       ILLINOIS IL
## 98891       ILLINOIS IL
## 98892       ILLINOIS IL
## 98893       ILLINOIS IL
## 98894       ILLINOIS IL
## 98895       ILLINOIS IL
## 98897       ILLINOIS IL
## 98898       ILLINOIS IL
## 98899       ILLINOIS IL
## 98901       ILLINOIS IL
## 98902       ILLINOIS IL
## 98903       ILLINOIS IL
## 98904       ILLINOIS IL
## 98905       Illinois IL
## 98965     California CA
## 99046     California CA
## 99047     CALIFORNIA CA
## 99056       Illinois IL
## 99070           Utah UT
## 99073          Texas TX
## 99074          Texas TX
## 99085        Arizona AZ
## 99086          Texas TX
## 99129           Utah UT
## 99148        Arizona AZ
## 99149     New Jersey NJ
## 99170     California CA
## 99174     CALIFORNIA CA
## 99175     California CA
## 99176     California CA
## 99181     California CA
## 99203        ARIZONA AZ
## 99265       COLORADO CO
## 99294        Florida FL
## 99333      Minnesota MN
##                                                        School.Name   NCES.SchID
## 3                                        112 ALC Independent Study 270819000000
## 4                                            112 ALC MIDDLE SCHOOL 270819000000
## 108                                        A J Katzenmaier Academy 170011000000
## 129                                       A O Marshall Elem School 172058000000
## 133                                                A Place to Grow  62827013394
## 163                               A. E. Phillips Laboratory School 220006000000
## 177                            A. Linwood Holton Governor's School 510003000000
## 209                                         AAEC - Paradise Valley  40010601892
## 210                                             AAEC - SMCC Campus  40041701588
## 212                     Aaron Cohn Regional Youth Detention Center 130003000000
## 263                                                 ABERNATHY DAEP 480741000000
## 283                               Abington Early Education Program 250165000000
## 397                                 ACADEMIR CHARTER SCHOOL MIDDLE 120039000000
## 398                            ACADEMIR CHARTER SCHOOL PREPARATORY 120039000000
## 399                                   ACADEMIR CHARTER SCHOOL WEST 120039000000
## 400                                   ACADEMIR PREPARATORY ACADEMY 120039000000
## 404                                                    Academy 360 510084000000
## 406                                     Academy Adventures Midtown  40081703191
## 407                              Academy Adventures Primary School  40061303135
## 413                                   Academy at Virginia Randolph 510189000000
## 421                                                Academy Del Sol  40079702994
## 422                                         Academy Del Sol - Hope  40079703230
## 427                                Academy for Academic Excellence  60001707296
## 432                                      Academy for Biotechnology 341072000000
## 446                              Academy for Environmental Science 341072000000
## 455                              Academy for Law and Public Safety 341072000000
## 457                         Academy for Math Engineering & Science 490002000000
## 458                Academy for Mathematics Science and Engineering 341072000000
## 496                                 Academy of Building Industries  40041402412
## 497                     Academy of Career Education Charter School 320048000000
## 499                              ACADEMY OF CAREERS AND TECHNOLOGY 540123000000
## 506                          Academy of Engineering and Technology 510225000000
## 508                                          Academy Of Excellence  40012801715
## 516                                    Academy of Math and Science  40036802037
## 517                          Academy of Math and Science Camelback  40094003499
## 518                       Academy of Mathematics and Science South  40089103399
## 535                            Academy of Tucson Elementary School  40020203141
## 536                                  Academy of Tucson High School  40020201959
## 537                                Academy of Tucson Middle School  40020202312
## 544                                            Academy Park School 490036000000
## 545                                   Academy Performing Preschool  64104013396
## 546                                         FAIRMONT YOUTH ACADEMY 540051000000
## 552                                Academy with Community Partners  40027601841
## 574                                    Accelerated Learning Center  40012101581
## 575                                Accelerated Learning Laboratory  40012901790
## 579                           Acceleration Day and Evening Academy  10019702432
## 584                                                         ACCESS 273381000000
## 591                                                ACCLAIM Academy  40012201585
## 637                        Achieve Charter School of Paradise Inc.  62982011571
## 661                             Achievement Integrity And Maturity 510126000000
## 680                                Acorn Montessori Charter School  40032002227
## 681                   Acorn Montessori Charter School  Inc. - West  40032002576
## 688                                                ACTIONS Program 170942000000
## 717                                       Ada W. Harris Elementary  60747000706
## 803                                                   Adams School 490021000000
## 805                                                   Adams School 490051000000
## 807                                      Adams Traditional Academy  40080503050
## 849                                                Adelaide School 490021000000
## 875                                  Adlai E Stevenson High School 173258000000
## 898                                          Adobe Mountain School  40973401517
## 899                                       Adolescent Day Treatment  10039001296
## 915                                Adult & Career Education Center 510111000000
## 919                          ADULT DIAGNOSTIC AND TREATMENT CENTER 340009000000
## 924                                                Adult Education 320012000000
## 925                                                ADULT EDUCATION 120102000000
## 929                                   ADULT EDUCATION - INDIANTOWN 120129000000
## 930                                         Adult Education Center 510189000000
## 932                                        ADULT EDUCATION PROGRAM 120003000000
## 933                                 ADULT EDUCATION-MARTIN CO HIGH 120129000000
## 936                                            Adult Learning Ctr. 510384000000
## 937                                           ADULT SATELLITE EAST 120153000000
## 938                                           ADULT SATELLITE WEST 120153000000
## 942                                          ADULT VIRTUAL ACADEMY 120150000000
## 943                                      ADULT/COMMUNITY EDUCATION 120195000000
## 950                  Advanced Career Education Center at Hermitage 510189000000
## 951           Advanced Career Education Center at Highland Springs 510189000000
## 952                          Advanced Community Experience Program 250708000000
## 959                                     Advanced Technology Center 510384000000
## 969                                               Adventure School  40061302553
## 1028                                             Aguila Pre-School  40048003445
## 1072                               AIM Higher College Prep Academy  40093903495
## 1105                                 Akimel O'Otham Pee Posh (3-5)  40040401993
## 1106                                 Akimel O'Otham Pee Posh (K-2)  40040301989
## 1139                                                      ALA Mesa  40011203340
## 1140                                                  ALA QC  Elem  40011203328
## 1141                                                   ALA San Tan  40011203279
## 1144                                               ALACHUA ACADEMY 120003000000
## 1145                                           ALACHUA COUNTY JAIL 120003000000
## 1150                    ALACHUA REGIONAL JUVENILE DETENTION CENTER 120003000000
## 1151                           ALACHUA VIRTUAL INSTRUCTION PROGRAM 120003000000
## 1160                             Alameda Community Learning Center  60177008673
## 1163                              Alameda County Special Education  69105108672
## 1247                                            Albers Elem School 170327000000
## 1252                         ALBERT C WAGNER CORRECTIONAL FACILITY 340009000000
## 1290                                        Albert R. Lyman Middle 490090000000
## 1318                                                 Albion Middle 490014000000
## 1335                                                 ALC at Bryant 510126000000
## 1336                                                  ALC at Burke 510126000000
## 1337                                               ALC at Montrose 510126000000
## 1338                                          ALC at Mountain View 510126000000
## 1345                                              ALC EXTENDED DAY 272124000000
## 1347                                         ALC INDEPENDENT STUDY 272520000000
## 1358                                               ALC SENIOR HIGH 272520000000
## 1431                                              ALDINE J J A E P 480771000000
## 1470                                          Alexander Elementary 191470000000
## 1506                                               Alexandra House 270318000000
## 1557                                     ALGOA CORRECTIONAL CENTER 290003000000
## 1633                                           ALIEF ISD J J A E P 480783000000
## 1656                                     All Aboard Charter School  40039602306
## 1660                                            All Tribes Charter  60004210387
## 1661                                 All Tribes Elementary Charter  60004212735
## 1692                                      Allen Co Juvenile Center 180363000000
## 1693                                Allen Co Youth Services Center 180825000000
## 1738                        Allen Thornton Career Technical Center  10201000762
## 1766                                    Allgood Alternative School  10042000670
## 1837                                                Alma Preschool  60780012607
## 1844                                   Almanor High (Continuation)  63117007824
## 1853                                  Almond Acres Charter Academy  63501013176
## 1857                                         Almond Road Preschool 341680000000
## 1877                                ALOP Academic Learning Program 170022000000
## 1902                                         ALPHABET LAND-MARGATE 120018000000
## 1906                                     Alpine County Opportunity  69105806965
## 1907                         Alpine County Secondary Community Day  60207006968
## 1921                                          Alpine Online School 490003000000
## 1922                                                 Alpine School 490003000000
## 1932                                            ALT. RESOURCE CTR. 292706000000
## 1940                                                     Alta High 490014000000
## 1952                                              Alta View School 490014000000
## 1971                                        Alta Vista High School  40061903097
## 1972                                    Alta Vista Innovation High  60001514154
## 1974                               Alta Vista South Public Charter  61686013808
## 1987                                                 Altamont High 490024000000
## 1989                                               Altamont School 490024000000
## 1992                                                 Altara School 490014000000
## 2008                  Altern Ed Prgm/Behav Disord Youth/Montgomery 510008000000
## 2014  Alternative Computerized Education (ACE) Charter High School  40007901008
## 2016                                  Alternative Education Center 510171000000
## 2017                                  Alternative Education Center 510246000000
## 2020                                  Alternative Education Center 510132000000
## 2027                 ALTERNATIVE EDUCATIONAL DEVELOPMENTAL PROGRAM 120105000000
## 2034                               ALTERNATIVE HIGH SCHOOL PROGRAM 120195000000
## 2036                                   Alternative Learning Center  10333001395
## 2038                                   Alternative Learning Center  10288001155
## 2054                                          Alternative Programs 240048000000
## 2057                                            ALTERNATIVE SCHOOL 484161000000
## 2060                                            Alternative School 130029000000
## 2061                                            Alternative School  10114000819
## 2067                                        Alternatives in Action  60177008674
## 2160                         Alyce Savage Taylor Elementary School 320048000000
## 2162                                             Amador County ROP  60008910738
## 2163                               Amador County Special Education  69100106970
## 2194               Ambassador Phillip V. Sanchez II Public Charter  63168014206
## 2195                  Ambassador Phillip V. Sanchez Public Charter  63168012984
## 2210                                     Amboy Central Elem School 170369000000
## 2212                                             Amboy High School 170369000000
## 2213                                          Amboy Jr High School 170369000000
## 2219                             AMCS at Anthem dba Caurus Academy  40041502414
## 2230                                         Amelia Earhart School 490081000000
## 2236                                       Amelia-Nottoway Voc Ctr 510001000000
## 2242                                American Academy of Innovation 490019000000
## 2251                                            American Fork High 490003000000
## 2252                                         American Fork Jr High 490003000000
## 2253                        American Heritage Academy - Camp Verde  40013002569
## 2254                        American Heritage Academy - Cottonwood  40013001803
## 2266                         American International School of Utah 490017000000
## 2268                                   American Leadership Academy 490003000000
## 2269                                   American Leadership Academy  40011201595
## 2270                          American Leadership Academy  Gilbert  40011203573
## 2271                           American Leadership Academy  Higley  40011203576
## 2272                        American Leadership Academy - Ironwood  40011203475
## 2273                     American Leadership Academy - Queen Creek  40011203179
## 2274               American Leadership Academy Anthem South Campus  40011203365
## 2275                      American Leadership Academy Signal Butte  40011203570
## 2279             American Preparatory Academy - Accelerated School 490001000000
## 2280                      American Preparatory Academy - Draper #1 490001000000
## 2281                      American Preparatory Academy - Draper #2 490001000000
## 2282                      American Preparatory Academy - Draper #3 490001000000
## 2283                          American Preparatory Academy - Salem 490001000000
## 2284   American Preparatory Academy - The School for New Americans 490001000000
## 2288                          AMERICAN SENIOR HIGH ADULT EDUCATION 120039000000
## 2297                              AmeriSchools Academy - Camelback  40013101781
## 2298                           AmeriSchools Academy - Country Club  40013102070
## 2299                                   AmeriSchools Academy - Yuma  40013101960
## 2300                                    Amerischools Academy North  40013103274
## 2310                                                 Amesbury High 250186000000
## 2334                           AMI KIDS CENTER FOR PERSONAL GROWTH 120156000000
## 2335                                        AMI KIDS EMERALD COAST 120138000000
## 2342                                                       AMIKIDS 120111000000
## 2343                                                       AMIKIDS 120003000000
## 2348                                          AMIKIDS JACKSONVILLE 120048000000
## 2350                                      AMIKIDS MIAMI-DADE NORTH 120039000000
## 2351                                      AMIKIDS MIAMI-DADE SOUTH 120039000000
## 2352                            AMIKIDS OF GREATER FORT LAUDERDALE 120018000000
## 2355                                               AMIKIDS VOLUSIA 120192000000
## 2440                                  ANCLOTE HIGH ADULT EDUCATION 120153000000
## 2442                                   Ancora Psychiatric Hospital 340009000000
## 2552                               Andrew Cooke Magnet Elem School 174125000000
## 2669                                     Ann Klein Forensic Center 340009000000
## 2682                                        ANN STORCK CENTER INC. 120018000000
## 2704                                                 ANNA L. KLEIN 340624000000
## 2720                                             Anna Smith School 490105000000
## 2724                                             ANNA WESTIN HOUSE 273384000000
## 2743                                     Anne Arundel Evening High 240006000000
## 2786                                Anniston City Boot Camp School  10009001246
## 2832                                        Antelope Community Day  60276008413
## 2842                                               Antelope School 490021000000
## 2846                              Antelope Valley Learning Academy  62958012022
## 2847                                           Antelope Valley ROP  60011210925
## 2857                                                ANTHONY CENTER 540051000000
## 2886                                               Antimony School 490030000000
## 2887                                       Antioch Charter Academy  60285007493
## 2888                                    Antioch Charter Academy II  60285011984
## 2926                 AOC-Cochise County Juvenile Dentention Centre  40045702585
## 2927                   AOC-Graham County Juvenile Detention Center  40045602578
## 2928                    AOC-Pinal County Juvenile Detention Center  40045302580
## 2929               AOC-Santa Cruz County Juvenile Detention Center  40046202572
## 2930                  AOC-Yavapai County Juvenile Detention Center  40046002581
## 2931                     AOC-Yuma County Juvenile Detention Center  40045802573
## 2932                     AOC_Gila County Juvenile Detention Center  40076702960
## 2941                                   Apache Junction High School  40079000043
## 2943                                      Apache Trail High School  40035701732
## 3000                                           Apple Pie Preschool  60753014185
## 3009              Apple Valley Unified Preschool Special Education  60001713290
## 3049                         Appomattox Regional Governor's School 510003000000
## 3129                                                   ARC BIRTH-3 120126000000
## 3130                                              ARC BROWARD INC. 120018000000
## 3155                                                Arcadia School 490036000000
## 3274                     Arizona Academy of Science and Technology  40016401726
## 3275             Arizona Agribusiness & Equine Center  Inc. - Mesa  40096903543
## 3276  Arizona Agribusiness & Equine Center  Inc. - Prescott Valley  40083803243
## 3277     Arizona Agribusiness & Equine Center  Inc. - Red Mountain  40042602528
## 3278               Arizona Agribusiness & Equine Center - Estrella  40082803199
## 3279                                 Arizona Autism Charter School  40091303455
## 3280            Arizona Autism Charter School  Upper School Campus  40091303512
## 3281                     Arizona Call-a-Teen Center for Excellence  40005700784
## 3282                                       Arizona Charter Academy  40032602162
## 3284                                  Arizona College Prep Academy  40086201783
## 3287                                Arizona Collegiate High School  40082103226
## 3288                                   Arizona Connections Academy  40042703160
## 3289                   Arizona Conservatory for Arts and Academics  40065303069
## 3290  Arizona Conservatory for Arts and Academics Elementary Schoo  40063702032
## 3291     Arizona Conservatory for Arts and Academics Middle School  40065303004
## 3295                                       Arizona Insight Academy  40043203324
## 3296                        Arizona iZone Institute Online Program  40237003299
## 3297                                  Arizona Language Preparatory  40091803426
## 3299                                   Arizona Preparatory Academy  40030302181
## 3300                                   Arizona School For The Arts  40005600781
## 3301                                       Arizona Virtual Academy  40043202200
## 3330                                             Meraux Elementary 220141000000
## 3512                                              Arrowhead School 490114000000
## 3544                                               Art City School 490063000000
## 3613                             Arts Academy at Estrella Mountain  40023902533
## 3646                                                   ASA Charter  63417011105
## 3666                           Ascent Academies of Utah Farmington 490017000000
## 3667                                 Ascent Academies of Utah Lehi 490017000000
## 3668                          Ascent Academies of Utah West Jordan 490017000000
## 3673                                       ASDB/Phoenix Day School  40046302884
## 3674                                      ASDB/Tucson Blind School  40046302918
## 3675                                       ASDB/Tucson Deaf School  40046302923
## 3763                                       Ashley Falls Elementary  61074007660
## 3770                                                 Ashley School 490108000000
## 3771                                      Ashley Valley Educ. Ctr. 490108000000
## 3772                                                 Ashman School 490093000000
## 3780                               Ashton-Franklin Center Elem Sch 170438000000
## 3781                                     Ashton-Franklin Center HS 170438000000
## 3782                               Ashton-Franklin Cntr Middle Sch 170438000000
## 3791                               Asian Human Srvcs-Passage Chrtr 170993000000
## 3796                                    ASP - Florence West/A.C.I.  40012001814
## 3797                                  ASP - Marana O.C.T.F./A.C.I.  40012001813
## 3798                                     ASP - Phoenix West/A.C.I.  40012001810
## 3799                                         ASPC - Douglas/A.C.I.  40012001646
## 3800                               ASPC - Safford/Ft. Grant/A.C.I.  40012001815
## 3801                                                    ASPC-Eyman  40012001647
## 3802                                                 ASPC-Florence  40012001641
## 3803                                            ASPC-Phoenix/Globe  40012001645
## 3804                                                  ASPC-Winslow  40012001812
## 3825                                                  Aspen School 490003000000
## 3834                             ASPIRA Charter - Early College Pr 170993000000
## 3835                                ASPIRA Charter - Haugan Campus 170993000000
## 3837                   ASPIRA RAUL ARNALDO MARTINEZ CHARTER SCHOOL 120039000000
## 3841                                                Aspire Academy 510324000000
## 3898                                    Assurance Learning Academy  60000113121
## 3914                      ASU Preparatory Academy - Casa Grande HS  40094703526
## 3915               ASU Preparatory Academy - Phoenix Middle School  40089003367
## 3916                               ASU Preparatory Academy Digital  40096503556
## 3917                                 ASU Preparatory Academy Tempe  40097103567
## 3918                   ASU Preparatory Academy- Phoenix Elementary  40076403051
## 3919                  ASU Preparatory Academy- Phoenix High School  40085803286
## 3920                ASU Preparatory Academy-Polytechnic Elementary  40085703260
## 3921               ASU Preparatory Academy-Polytechnic High School  40085903251
## 3922             ASU Preparatory Academy-Polytechnic Middle School  40088403264
## 3931                                             ATASCOSA CO ALTER 484074000000
## 3934                                     ATASCOSA CO JUVENILE UNIT 483552000000
## 3953                                             Athenian eAcademy 490018000000
## 3986                                 Athlos Academy of Saint Cloud 270043000000
## 3987                                        Athlos Academy of Utah 490019000000
## 4006                                      Atkinson Academy Charter  63462014017
## 4034                                       ATLANTIC CO JUV DET CTR 340009000000
## 4042                          ATLANTIC HIGH ADULT EDUCATION CENTER 120150000000
## 4051                                      Atlantic Regional School 340009000000
## 4053                        Atlantic Transitional Education Center 340009000000
## 4196                       Augusta Regional Youth Detention Center 130003000000
## 4204                                           AUHS Online Acadamy  40072003466
## 4283                           AUSTIN ISD CHILD DEVELOPMENT CENTER 480894000000
## 4308                             Autauga County Alternative School  10024000587
## 4309                              Autauga County Technology Center  10024000590
## 4332                                             Avalon Elementary  40023503157
## 4384                                      Aveson School of Leaders  62994011929
## 4472                                                AXTELL/BE DAEP 481173000000
## 4497                                        AZ Compass Prep School  40078502929
## 4513                                             AZTEC High School  40009401109
## 4514                                           AZTEC YOUTH ACADEMY 350001000000
## 4534                                        B H R A Cooperative HS 170143000000
## 4547                                            B W SHEPERD SCHOOL 290002000000
## 4557                 B. R. Foreign Language Acad. Immersion Magnet 220054000000
## 4576                                                    BABIES/TAP 120099000000
## 4592                                                Backman School 490087000000
## 4622                    Badger Vocational Education Center - North 510006000000
## 4623                    Badger Vocational Education Center - South 510006000000
## 4626                                         Baechtel Grove Middle  64256006966
## 4635                                                    BAGLEY ALP 270357000000
## 4644                                         Bailey Charter School 320048000000
## 4690                                     BAKER COUNTY ADULT CENTER 120006000000
## 4695                                BAKER COUNTY VIRTUAL FRANCHISE 120006000000
## 4727                             BAKER VIRTUAL INSTRUCTION PROGRAM 120006000000
## 4728         BAKER VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120006000000
## 4800                                                Baldy View ROP  60013111116
## 4807                              Ball Charter Schools (Val Vista)  40086703342
## 4948                                        Banner West Academy HS 170993000000
## 4949                                                  Banning High  60384000347
## 4950                                     Banning Independent Study  60384008555
## 4952                                                  Banning PreK  60384012834
## 5054                                          BARBOURSVILLE SCHOOL 540051000000
## 5128                                  BARNES LEARNING CENTER (ALC) 540072000000
## 5137                                                Barnett School 490063000000
## 5164                                         Barona Indian Charter  62079010631
## 5174                                                Barratt School 490003000000
## 5189                        Barrett Russell Early Childhood Center 250309000000
## 5305                                               BASIS Ahwatukee  40089703376
## 5306                                                BASIS Chandler  40083003253
## 5307                         BASIS Chandler Primary - North Campus  40095803534
## 5308                          BASIS Chandler Primary- South Campus  40093603484
## 5310                                               BASIS Flagstaff  40083103196
## 5311                                                BASIS Goodyear  40094103502
## 5312                                        BASIS Goodyear Primary  40094303498
## 5313                                                    BASIS Mesa  40089803393
## 5314                                              BASIS Oro Valley  40081803197
## 5315                                      BASIS Oro Valley Primary  40090503419
## 5316                                                  BASIS Peoria  40082903278
## 5317                                          BASIS Peoria Primary  40096303558
## 5318                                                 BASIS Phoenix  40084303351
## 5319                                 BASIS Phoenix Central Primary  40088103394
## 5320                                         BASIS Phoenix Primary  40096703560
## 5321                                   BASIS Phoenix South Primary  40096103550
## 5322                                                BASIS Prescott  40090303418
## 5323                  BASIS SAN ANTONIO PRI- MEDICAL CENTER CAMPUS 480144000000
## 5324                   BASIS SAN ANTONIO- PRI NORTH CENTRAL CAMPUS 480144000000
## 5325                             BASIS SAN ANTONIO- SHAVANO CAMPUS 480144000000
## 5326                                              BASIS Scottsdale  40060803115
## 5327                                      BASIS Scottsdale Primary  40093703482
## 5328                                            BASIS Tucson North  40087803350
## 5329                                          BASIS Tucson Primary  40013401786
## 5347                                                Bastian School 490042000000
## 5348                             BASTROP COUNTY JUVENILE BOOT CAMP 481836000000
## 5375                                                  Bates School 490120000000
## 5457                          BAUDHUIN ORAL SCHOOL-NOVA UNIVERSITY 120018000000
## 5532                                         BAY VIRTUAL FRANCHISE 120009000000
## 5533                    BAY VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120009000000
## 5534                               BAY VIRTUAL INSTRUCTION PROGRAM 120009000000
## 5588                                  Bayshore Preparatory Charter  63488011405
## 5623                                       BCDC Educational Center 240012000000
## 5670                                         Beacon Heights School 490087000000
## 5672                                            BEACON HIGH SCHOOL 120033000000
## 5735                                     Bear River Charter School 490015000000
## 5737                                               Bear River High 490009000000
## 5738                                             Bear River Middle 490009000000
## 5803                                        Beaumont USD Preschool  60429013598
## 5809                                       Beaver Brook Elementary 250165000000
## 5825                                                   Beaver High 490006000000
## 5829                                   Beaver Lake Voluntary Pre-K 272385000000
## 5834                                              Beaver Preschool 490006000000
## 5873                                                BECKLEY CENTER 540051000000
## 5885                   Bedford County Alternative Education Center 510036000000
## 5908                         Bedford Science And Technology Center 510036000000
## 5937                                    Beech Grove Sr High School 180045000000
## 5967                                                Beehive School 490036000000
## 5968                          Beehive Science & Technology Academy 490002000000
## 5989                                Behavior Disorder Program Coop 173267000000
## 6059                                                Belknap School 490006000000
## 6075                                              BELL COUNTY DAEP 483771000000
## 6114                                              Bell View School 490014000000
## 6122                                           Bella Vista Academy  40034403467
## 6131                                            Bella Vista School 490014000000
## 6152                             BellBrown Career Technical Center  10309001194
## 6156                                   Belle Alexander Elem School 172100000000
## 6184                           Belle Plaine Transitions/Work Exper 270405000000
## 6263                                     Bellevue-Santa Fe Charter  63480005868
## 6397                           BEMIDJI REGIONAL INTERDIST. COUNCIL 270005000000
## 6416                                    BEN FRANKLIN CAREER CENTER 540060000000
## 6426                                      BEN GAMLA CHARTER SCHOOL 120039000000
## 6428                         BEN GAMLA CHARTER SCHOOL NORTH CAMPUS 120018000000
## 6441                                               Ben Lomond High 490072000000
## 6456                                       Benavides Steam Academy 170468000000
## 6463                                              Benchmark School  40018101889
## 6506                                     Benjamin Foxen Elementary  60528000498
## 6508                    Benjamin Franklin Charter School - Crismon  40006501599
## 6509                    Benjamin Franklin Charter School - Gilbert  40006501600
## 6510                      Benjamin Franklin Charter School - Power  40006502685
## 6531                                 Benjamin Franklin High School  40006503395
## 6541                               Benjamin Franklin Middle School 173708000000
## 6574                                               Bennett Academy  40003700712
## 6575                                Bennett Academy - Venture Site  40003703168
## 6616                                               Bennion Jr High 490036000000
## 6617                                                Bennion School 490036000000
## 6684                           Benton Stearns Education District 1 270007000000
## 6685                                 BENTON-STEARNS ED DISTRICT EC 270007000000
## 6687                               BENTON-STEARNS EDUCATION CENTER 270007000000
## 6710                                                Berean Academy  40063203105
## 6723                           Bergen Co Juvenile Detention Center 340009000000
## 6729                                        Bergen Regional School 340009000000
## 6753                          Berkeley Special Education Preschool  60474012843
## 6872                                    Berryessa Union Elementary  60480010400
## 6933                                Bessemer Center For Technology  10033001267
## 6965                                        BETHANY CRISES SHELTER 271104000000
## 7127                                            BEXAR CO J J A E P 482247000000
## 7128                                            BEXAR CO J J A E P 482499000000
## 7129                                            BEXAR CO J J A E P 481785000000
## 7130                                            BEXAR CO J J A E P 480759000000
## 7135                 BEXAR COUNTY JUVENILE JUSTICE ACADEMY (BCJJA) 483006000000
## 7146                                    Bibb County Career Academy  10036000669
## 7166                             Bidwell Point High (Continuation)  63807009644
## 7200                                         Big Lagoon Elementary  60489000477
## 7211                               Big Picture Educational Academy  69100712427
## 7213                                       Big Picture Twin Cities 270042000000
## 7214                                              BIG PINE ACADEMY 120132000000
## 7252                                               Big Sur Charter  60003112240
## 7263                                                Big Water High 490048000000
## 7264                                              Big Water School 490048000000
## 7280                                 Biggs Secondary Community Day  60504008683
## 7296                                   BILL LOGUE DETENTION CENTER 484428000000
## 7338                                                  Bingham High 490042000000
## 7351                                            Birch Creek School 490012000000
## 7424                                             BIRTH TO TWO ECSE 272295000000
## 7430                                          BISCAYNE HIGH SCHOOL 120048000000
## 7470                                  Bitterwater-Tully Elementary  60519000492
## 7498                                        Black Hawk Elem School 173708000000
## 7522                                            Black Ridge School 490003000000
## 7523                               Black River Correctional Center 550004000000
## 7576                                             Blackridge School 490042000000
## 7588                                         BLACKSHEAR HEAD START 483870000000
## 7659                                              Blake Elementary  60525000497
## 7709                                               Blanding School 490090000000
## 7752                                                Blind Region 2 490007000000
## 7753                                                   Blind South 490007000000
## 7769                                             Bloom High School 170642000000
## 7770                                       Bloom Trail High School 170642000000
## 7816                           Bloomington Career and College Acad 270579000000
## 7825                                      Bloomington Hills School 490114000000
## 7828                                            Bloomington School 490114000000
## 7829                                       BLOOMINGTON SHARED TIME 270579000000
## 7836                                       Blosser Lane Elementary  64256009658
## 7839                                       Blossom Hill Elementary  62283003489
## 7843                         Blount County Career Technical Center  10042000682
## 7844                                 Blount County Learning Center  10042000676
## 7900                                                Blue Peak High 490105000000
## 7922                                  Blue Ridge Governor's School 510006000000
## 7931                            Blue Ridge Juvenile Detention Home 510004000000
## 7963                         BLUEFIELD ALTERNATIVE LEARNING CENTER 540084000000
## 7976                                         Blueprint High School  40063603011
## 7995                                            Bluff Ridge School 490021000000
## 7996                                                  Bluff School 490090000000
## 8003                                              Bluffdale School 490042000000
## 8030                                     Blythe District Preschool  62964013346
## 8046                                           BOARD OF CHILD CARE 540051000000
## 8068                  Bob Richards Regional Youth Detention Center 130003000000
## 8084                      BOCA RATON MIDDLE ADULT EDUCATION CENTER 120150000000
## 8108                                              Bogus Elementary  60549000500
## 8136                                         BOLD STEP INFANT CARE 120060000000
## 8173                                            Bolton High School 220129000000
## 8252                                            Bonneville Academy 490020000000
## 8255                                               Bonneville High 490120000000
## 8257                                            Bonneville Jr High 490036000000
## 8260                                             Bonneville School 490072000000
## 8261                                             Bonneville School 490087000000
## 8262                                             Bonneville School 490003000000
## 8284                                             Book Cliff School 490027000000
## 8313                                 BOONE CAREER-TECHNICAL CENTER 540009000000
## 8319                                           Boone County Center 170002000000
## 8352                                 BOONVILLE CORRECTIONAL CENTER 290003000000
## 8358                                    BOONVILLE TREATMENT CENTER 290003000000
## 8441                          Botetourt Technical Education Center 510042000000
## 8470                                                Boulder School 490030000000
## 8480                                                Boulton School 490021000000
## 8481                                      BOULWARE SPRINGS CHARTER 120003000000
## 8485                                                Bountiful High 490021000000
## 8486                                             Bountiful Jr High 490021000000
## 8487                                              Bountiful School 490021000000
## 8604                                                Box Elder High 490009000000
## 8606                                              Box Elder Middle 490009000000
## 8663                                 BOYNTON BEACH COMMUNITY ADULT 120150000000
## 8677                                                     BOYS TOWN 120171000000
## 8679                                                      BOYSTOWN 120039000000
## 8728                                    BRADFORD VIRTUAL FRANCHISE 120012000000
## 8729                          BRADFORD VIRTUAL INSTRUCTION PROGRAM 120012000000
## 8730      BRADFORD VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120012000000
## 8735                                 Bradley Academy of Excellence  40060903117
## 8748                                            Bradley Elementary  60573000519
## 8768                              Bradshaw Mountain Online Academy  40387002564
## 8808                              BRANCH OUT TRANSITIONAL SERVICES 274227000000
## 8859                                          Branscomb Elementary  64258010147
## 8902                                         BRAZORIA CO J J A E P 483444000000
## 8905                                         BRAZORIA CO J J A E P 480809000000
## 8910                                           BRAZOS COUNTY JJAEP 481179000000
## 8928                     Breaking Barriers Alternative Ed/Henry Co 510010000000
## 8942                            Breckenridge Area Learning Program 270615000000
## 9056                                    BREVARD ACHIEVEMENT CENTER 120015000000
## 9063                                       BREVARD VIRTUAL ESCHOOL 120015000000
## 9065                BREVARD VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120015000000
## 9066                           BREVARD VIRTUAL INSTRUCTION PROGRAM 120015000000
## 9073                                                BREWER ACADEMY 483873000000
## 9107                                         Briargate Elem School 170873000000
## 9201                               BRIDGEPREP ACADEMY DUVAL COUNTY 120048000000
## 9218                                                Bridger School 490051000000
## 9227                                               BRIDGES BTC INC 120015000000
## 9228                                               BRIDGES Charter  69104712617
## 9239                                Bridges Nebo Transition Center 490063000000
## 9271            Bridging Communities Reg Career & Technical Center 510026000000
## 9272                             Bridging Communities STEM Academy 510026000000
## 9305                                   Bright Beginnings School #1  40007100832
## 9327                                                 Brighton High 490014000000
## 9406                                              BRITTANY'S PLACE 273384000000
## 9491                                              Brockbank School 490063000000
## 9694                             BROOKLYN CENTER INDEPENDENT STUDY 270624000000
## 9787                                          Brookside Elementary  64256006967
## 9814                                              Brookside School 490063000000
## 9863                                              Brookwood School 490014000000
## 9878                               BROWARD CHILDREN'S CENTER NORTH 120018000000
## 9879                               BROWARD CHILDREN'S CENTER SOUTH 120018000000
## 9880                                      BROWARD DETENTION CENTER 120018000000
## 9885                           BROWARD VIRTUAL INSTRUCTION PROGRAM 120018000000
## 9886       BROWARD VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120018000000
## 9887                                BROWARD YOUTH TREATMENT CENTER 120018000000
## 10043                               BRUCIE BALL EDUCATIONAL CENTER 120039000000
## 10044                                           Bruin Point School 490015000000
## 10095                                        Brussels Grade School 170010000000
## 10096                                         Brussels High School 170010000000
## 10145                                                Bryant Middle 490087000000
## 10159                                            Bryce Valley High 490030000000
## 10160                                          Bryce Valley School 490030000000
## 10174                                                BSD Preschool  60648012580
## 10177                                         BUCHANAN CO. ACADEMY 292706000000
## 10178   Buchanan County Technology Career & Higher Learning Center 510051000000
## 10314                                    Buena Vista Community Day  63105011822
## 10330                              Buena Vista High (Continuation)  63873006510
## 10373                                         Buffalo Point School 490021000000
## 10402                           BUHSD Institute of Online Learning  40141003320
## 10426                                               Bullis Charter  69103511442
## 10432                       Bullock County Career Technical Center  10048000688
## 10487                                     Burbank Preschool Center  62805013483
## 10491                                           Burch Creek School 490120000000
## 10525                                           Burke Basic School  40021801913
## 10538                                                 Burke School 510126000000
## 10565                                            BURLINGTON CENTER 540051000000
## 10567                                  BURLINGTON CO JUVEN DET CTR 340009000000
## 10569                    Burlington County Alternative High School 340244000000
## 10591                                   Burlington Regional School 340009000000
## 10597                                   Burlington Trans Ed Center 340009000000
## 10621                              Burney Elementary Community Day  61347010417
## 10644                  BURNS SCIENCE AND TECHNOLOGY CHARTER SCHOOL 120192000000
## 10650                              BURNSVILLE AREA LEARNING CENTER 270729000000
## 10655                          Burnsville Sr High Extended Day Pro 270729000000
## 10702                        Burton Center for Arts and Technology 510333000000
## 10767                         Butler County Area Vocational School  10051000690
## 10776                                           Butler Elem School 173708000000
## 10782                              New Horizons Butler Farm Campus 510001000000
## 10789                                                Butler Middle 490014000000
## 10793                                                Butler School 490014000000
## 10805                                             Butte County ROP  60009010744
## 10816                                         Buttercup Pre-School  62100012838
## 10817                                    Butterfield Canyon School 490042000000
## 10823                                Butterfield Elementary School  40472002920
## 10928                                    C F Simmons Middle School 170468000000
## 10937                                      C I Johnson Elem School 170468000000
## 10938                                              C I T Y Program  10162001368
## 10948                                     C M Bardwell Elem School 170468000000
## 10957                            C P Carmichael Alternative School  10240001087
## 10962                                          C R Sundwall Center 490033000000
## 11016                                               C.O.M.P.A.S.S. 271137000000
## 11017                                           C.S. Lewis Academy 490007000000
## 11021 California Advancing Pathways for Students in Los Angeles Co  60144014016
## 11030                                           Cabazon Elementary  60384009305
## 11033                       CABELL COUNTY CAREER TECHNOLOGY CENTER 540018000000
## 11059                                                   Cache High 490012000000
## 11065                                              Cache Preschool 490012000000
## 11125                                            Cajon Valley Home  60681008590
## 11156                                              CALC TRANSITION 270810000000
## 11192                                  Caleb Dustin Hunking School 250597000000
## 11230                            Calhoun County Alternative School  10054000700
## 11231                       Calhoun County Career Technical Center  10054000708
## 11255     CALHOUN VIRTUAL  INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120021000000
## 11256                                    CALHOUN VIRTUAL FRANCHISE 120021000000
## 11257               CALHOUN VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120021000000
## 11258                          CALHOUN VIRTUAL INSTRUCTION PROGRAM 120021000000
## 11259                                 CALHOUN-GILMER CAREER CENTER 540021000000
## 11263                                     Calibre Academy Surprise  40031002370
## 11272                         California Academy of Sports Science  61071014197
## 11273                  California Academy of Sports Science Fresno  63168014207
## 11299               California Montessori Project - Capitol Campus  63384011732
## 11300             California Montessori Project - Elk Grove Campus  61233011727
## 11301                California Montessori Project-San Juan Campus  63462011733
## 11302         California Montessori Project-Shingle Springs Campus  60627011580
## 11303                       California Pacific Charter - San Diego  60004213918
## 11307                              California School for the Blind  60000210346
## 11308                       California School for the Deaf-Fremont  60000310347
## 11309                     California School for the Deaf-Riverside  60000710348
## 11310           California School of the Arts - San Gabriel Valley  61152014083
## 11312                               California STEAM Santa Barbara  60000914038
## 11313                                      California STEAM Sonoma  62154014011
## 11314                                   California Steam Sonoma II  61632014078
## 11351                         CALLIER CENTER PRE-SCHOOL DEAF (0-5) 481623000000
## 11405                                       Calvin S. Smith School 490036000000
## 11422                   Camarillo Academy of Progressive Education  62927011873
## 11439                                       Cambridge Academy East  40018201890
## 11440                                       Cambridge Academy East  40018202964
## 11483                                         CAMDEN CO  YOUTH CTR 340009000000
## 11484                                         Camden Community Day  60723010663
## 11512                             Camden Virtua Kids in Transition 340009000000
## 11513                                         Camden Virtua EXCEL? 340009000000
## 11514                                       Camden Virtua INSIGHT? 340009000000
## 11522                                            Camelback Academy  40039002289
## 11534                            Camelot Safe Acad - Garfield Park 170993000000
## 11535                                  Camelot Safe Academy School 170993000000
## 11539                                                      Cameron  63255012839
## 11541                                         CAMERON CO J J A E P 483879000000
## 11543                                         CAMERON CO J J A E P 482253000000
## 11544                                         CAMERON CO J J A E P 481168000000
## 11546                                         CAMERON CO J J A E P 482829000000
## 11547                                         CAMERON CO J J A E P 483525000000
## 11551                                         CAMERON COUNTY JJAEP 482604000000
## 11582                                            Camino Montessori  40088303411
## 11589                                           CAMINO NUEVO YOUTH 350001000000
## 11591                                           Camino Polytechnic  60717012702
## 11612                                Camp Mohave Elementary School  40519001758
## 11621                             Campbell County Technical Center 510060000000
## 11683                                                Campus at Lee 510180000000
## 11685                                        CAMPUS CHARTER SCHOOL 120015000000
## 11728                                                Candeo Peoria  40075802766
## 11869                                          Canyon Creek School 490021000000
## 11872                                          Canyon Crest School 490081000000
## 11876                                 Canyon Early Learning Center  62532013522
## 11877                                            Canyon Elementary  60735000680
## 11881                                         Canyon Grove Academy 490014000000
## 11900                                        Canyon Pointe Academy  40032702291
## 11908                                           Canyon Rim Academy 490007000000
## 11911                                          Canyon Rose Academy  40063303106
## 11912                                     Canyon Rose Academy-East  40063303536
## 11913                                                Canyon School 490012000000
## 11914                                                Canyon School 490063000000
## 11925                                             Canyon View High 490039000000
## 11926                                      Canyon View High School  40045003559
## 11927                                          Canyon View Jr High 490003000000
## 11928                                          Canyon View Jr High 490027000000
## 11929                                           Canyon View Middle 490039000000
## 11930                                     Canyon View Prep Academy  40020903364
## 11931                                        Canyon View Preschool 490120000000
## 11932                                           Canyon View School 490014000000
## 11935                           Canyons Technical Education Center 490014000000
## 11936                                   Canyons Transition Academy 490014000000
## 11937                                  Canyons Virtual High School 490014000000
## 11967                                     Cape May Regional School 340009000000
## 11968                       Cape May Transitional Education Center 340009000000
## 11975                       CAPERTON CENTER FOR APPLIED TECHNOLOGY 540162000000
## 12070                                                  Carbon High 490015000000
## 12083                                             Carden of Tucson  40025802079
## 12088                                           Cardiff Elementary  60747000707
## 12114                                                CARDS Program 270033000000
## 12123                            CAREER ACADEMIC PLACEMENT PROGRAM 280219000000
## 12131                           Career and Life Transition Program 272295000000
## 12138                                 CAREER AND TECHNOLOGY CENTER 540081000000
## 12149                                      Career Education Center  60014811540
## 12163                        Career Success High School - Glendale  40021902367
## 12164                     Career Success High School - Main Campus  40021902011
## 12165             Career Success Jr/Sr High School - North Phoenix  40021902328
## 12166                          Career Success School - Sage Campus  40021902338
## 12167                                      Career Technical Center  10138000853
## 12168                      Shelby County College and Career Center  10303001190
## 12190                                  Carl B. Hutcherson Building 510234000000
## 12221                                     Carl Sandburg Elementary 172058000000
## 12227                                         Carl Sandburg School 490036000000
## 12228                                               CARL SCHURZ EL 483237000000
## 12243                                  Carleton W Washburne School 174284000000
## 12249                                    Carlin Junior High School 320012000000
## 12307                                                      Carmack  63417007343
## 12310                                   Carman-Buckner Elem School 174125000000
## 12316                                    Carmel Del Mar Elementary  61074001171
## 12348                              Carmichael Elementary Preschool  40146003380
## 12427  Carpe Diem Collegiate High School dba Carpe Diem e-Learning  40038102319
## 12480                                          Carrillo Elementary  63488008314
## 12501                              Carroll County Education Center 510069000000
## 12523                            Carroll High School Career Center  10264001386
## 12540                    Carroll-Galax Reg Alt Ed Prgm/The RAE Ctr 510010000000
## 12567                                    Carson Adult Education RG 320039000000
## 12591                                                Carson School  62121014174
## 12677                                         CARVER CAREER CENTER 540060000000
## 12746                                          Cary Jr High School 170873000000
## 12749                             Cary-Grove Community High School 171137000000
## 12756                                                 CASA Academy  40091503422
## 12764   Casa Ramona Academy for Technology Community and Education  63417011985
## 12783                                                 Cascade High  60658002824
## 12806                                               Cascade School 490003000000
## 12905                                           Castle Dale School 490027000000
## 12912                                        Castle Heights School 490015000000
## 12934                                         Castle Valley Center 490015000000
## 12965                                      Caswell State Preschool  60813012599
## 12974                                  Catalyst Charter - Maria ES 170993000000
## 12976                              Catalyst Charter-Circle Rock ES 170993000000
## 12979                                             CATAPULT ACADEMY 120048000000
## 13071                                CAVIAT - Coconino High School  40034702470
## 13072                                             CAVIAT - eCampus  40034703268
## 13073               CAVIAT - Flagstaff Arts and Leadership Academy  40034703568
## 13075                               CAVIAT - Flagstaff High School  40034702471
## 13076                                CAVIAT - Fredonia High School  40034702270
## 13077                            CAVIAT - Grand Canyon High School  40034702240
## 13079                                    CAVIAT - Page High School  40034702269
## 13080                                CAVIAT - Williams High School  40034702271
## 13081                              CAVIAT-Williams Central Program  40034703270
## 13082                        CAVIT - Casa Grande Union High School  40034802279
## 13085                                 CAVIT - Coolidge High School  40034802278
## 13086                                     CAVIT - Florence Unified  40034802277
## 13087                                     CAVIT - Maricopa Unified  40034802276
## 13088                             CAVIT - Poston Butte High School  40034803019
## 13089                        CAVIT - San Tan Foothills High School  40034802917
## 13090                  CAVIT - Santa Cruz Valley Union High School  40034802275
## 13091                                         CAVIT - Vista Grande  40034803025
## 13111                  Commonwealth Ctr For Children & Adolescents 510007000000
## 13117                                      CCSI Alternative School 170020000000
## 13156                                              Cedar City High 490039000000
## 13176                                            Cedar East School 490039000000
## 13230                                            Cedar Lane School 510126000000
## 13233                                                 Cedar Middle 490039000000
## 13240                                           Cedar North School 490039000000
## 13262                                             Cedar Ridge High 490093000000
## 13269                                           Cedar Ridge School 490012000000
## 13270                                           Cedar Ridge School 490003000000
## 13275                                           Cedar South School 490039000000
## 13290                                          Cedar Valley School 490003000000
## 13335                                     Celerity Himalia Charter  60144612162
## 13338                                     Celerity Octavia Charter  62271012782
## 13340                                       Celerity Rolas Charter  60144812120
## 13424                                           Centennial Jr High 490021000000
## 13428                                            Centennial Middle 490081000000
## 13442                                            Centennial School 490024000000
## 13448                                           CENTER ALTERNATIVE 290825000000
## 13467                          Center for Academic Success  The #1  40001600476
## 13468                          Center for Academic Success  The #2  40001600481
## 13469                          Center for Academic Success  The #3  40001601942
## 13470                               Center for Academic Success #4  40001602442
## 13471                               Center for Academic Success #5  40001602443
## 13483                               Center for Diversified Studies 510189000000
## 13487                            Center for Educational Excellence  40011101594
## 13588                              Centerville High (Continuation)  63140007333
## 13595                                          Centerville Jr High 490021000000
## 13602                                           Centerville School 490021000000
## 13623                                                 Central Area 251115000000
## 13625                   CENTRAL AREA ADULT EDUCATION-NIGHT PROGRAM 120015000000
## 13677                                        Central Davis Jr High 490021000000
## 13704                                                 Central Elem 172100000000
## 13755                                           Central Elementary  60384000348
## 13816                                    Central Elementary School 180045000000
## 13964                                          Central Junior High 172100000000
## 14045                                       CENTRAL MN ALC SARTELL 270014000000
## 14047                                CENTRAL MN. ALC - SAUK RAPIDS 270014000000
## 14061                                   Central Nine Career Center 180147000000
## 14062                                        CENTRAL NM CORRECTION 350001000000
## 14068                 Central Orange County CTE Partnership (CTEp)  60012410999
## 14102                                          Central Region Deaf 490007000000
## 14112                                               Central School 490003000000
## 14118                                               CENTRAL SCHOOL 280303000000
## 14124                                         Central School (The) 100130000000
## 14129                                           Central Sierra ROP  60009610770
## 14136                                    Central St. Hosp. Ed. Pr. 510005000000
## 14142                                    Central Va. Training Ctr. 510005000000
## 14161                           Central Virginia Governor's School 510217000000
## 14205                               Century Academy for Excellence  62142011614
## 14221        Century High School An Integrated Global Studies Acad  63363014155
## 14226                           CENTURY MIDDLE SCHOOL WITHIN A SCH 272808000000
## 14229                                               Century School 490009000000
## 14237                                      Ceres Special Education  60813014023
## 14371                                            CHALLENGE ACADEMY 481497000000
## 14373                                            CHALLENGE ACADEMY 483064000000
## 14375                                            CHALLENGE ACADEMY 482628000000
## 14377                                            CHALLENGE ACADEMY 483741000000
## 14379                                     Challenge Charter School  40013501748
## 14387                                      Challenger Basic School  40035902292
## 14436                     Chambers County Career Technology Center  10060000738
## 14458                                            Champion Chandler  40019103434
## 14464                                             Champion San Tan  40019103557
## 14465                                             Champion Schools  40019101909
## 14516                                      Changemaker High School  40087203346
## 14520                                 Channahon Junior High School 170954000000
## 14526                                                Channing Hall 490004000000
## 14531                                Chantilly High School Academy 510126000000
## 14618                 CHAPMAN PARTNERSHIP EARLY CHILDHOOD CENTER N 120039000000
## 14671                                        CHARLES BRITT ACADEMY 120156000000
## 14768                        Charles R Smith Early Chilhood Center 341236000000
## 14876                                  CHARLOTTE VIRTUAL FRANCHISE 120024000000
## 14877                        CHARLOTTE VIRTUAL INSTRUCTION PROGRAM 120024000000
## 14880                                  Charlottesville Alternative 510078000000
## 14882                                    Charlottesville Hosp. Ep. 510004000000
## 14883                               Charlottesville-Albemarle Tech 510000000000
## 14899                          CHARTER HIGH SCHOOL OF THE AMERICAS 120039000000
## 14912                                Charter School of Morgan Hill  62583010405
## 15111                     Cherokee County Career Technology Center  10063000741
## 15116                                   Cherokee Elementary School 220129000000
## 15161                                          Cherry Creek School 490063000000
## 15172                                  Cherry Hill Regional School 340009000000
## 15173                                           Cherry Hill School 490003000000
## 15175                            Cherry Hill Tran-Education Center 340009000000
## 15212                                       Chesapeake Alternative 510081000000
## 15213                             Chesapeake Bay Governor's School 510003000000
## 15215                                     Chesapeake Career Center 510081000000
## 15297               Chesterfield Career & Technical Center at Hull 510084000000
## 15298       Chesterfield Career and Technical Center at Courthouse 510084000000
## 15304                         Chesterfield Juvenile Detention Home 510004000000
## 15365                                    CHI CHI RODRIQUEZ ACADEMY 120156000000
## 15370                            Chicago Collegiate Charter School 170993000000
## 15371                                     Chicago Excel Academy HS 170993000000
## 15373                                      Chicago HS for the Arts 170993000000
## 15376                               Chicago Park Community Charter  60834013003
## 15377                                      Chicago Park Elementary  60834000811
## 15395                                            Chico Country Day  60837005708
## 15442                               Child Service Center Preschool 170468000000
## 15448                               Children Behavior Therapy Unit 490087000000
## 15451                               Children First Academy - Tempe  40064102953
## 15452                            Children First Leadership Academy  40064102881
## 15454                    Children Reaching for the Sky Preparatory  40034302246
## 15458                                 Children's Community Charter  62982005717
## 15473                                         CHILDRENS PSYCHIATRY 350002000000
## 15508                            Chilton County Alternative School  10066002190
## 15587                           CHISAGO LAKES HS ALT LEARNING PROG 270002000000
## 15666                                        Chrismont Safe School 170017000000
## 15778                                       Churchill County Adult 320003000000
## 15789                                            Churchill Jr High 490036000000
## 15809                                 Churubusco Jr-Sr High School 181023000000
## 15822                                    CICS - Avalon/South Shore 170993000000
## 15823                                          CICS - Basil Campus 170993000000
## 15824                                           CICS - Bond Campus 170993000000
## 15825                                       CICS - Bucktown Campus 170993000000
## 15826                                    CICS - Irving Park Campus 170993000000
## 15828                                 CICS - Loomis Primary Campus 170993000000
## 15829                                     CICS - Northtown  Campus 170993000000
## 15830                                        CICS - Prairie Campus 170993000000
## 15831                                    CICS - Quest North Campus 170993000000
## 15832                                  CICS - Ralph Ellison Campus 170993000000
## 15833                                  CICS - Washington Pk Campus 170993000000
## 15834                                    CICS - West Belden Campus 170993000000
## 15835                                            CICS - Wrightwood 170993000000
## 15843                                           Cienega Elementary  60864000883
## 15898                                        Circleville Preschool 490078000000
## 15899                                           Circleville School 490078000000
## 15943                                    CITRUS HEALTH SIPP/CRISIS 120039000000
## 15950  CITRUS MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIES 120027000000
## 15957                CITRUS VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120027000000
## 15958                           CITRUS VIRTUAL INSTRUCTION PROGRAM 120027000000
## 15960                                                 City Academy 490001000000
## 15966                                              City Elementary  10039001270
## 15970                                             City High School  40040702404
## 15981                            CITY OF HIALEAH EDUCATION ACADEMY 120039000000
## 16010                                Civicorps Corpsmember Academy  62805012056
## 16141                                Clark County Detention Center 320006000000
## 16190                                        Clark Preschool Annex 340315000000
## 16218                                    Clarke N. Johnsen Jr High 490105000000
## 16247                                          Clarksville Charter  60627014165
## 16271                                            Classical Academy  61288008300
## 16273                                       Classical Academy High  61291011756
## 16307                      Claxton Regional Youth Detention Center 130003000000
## 16308                                                 Clay Academy 174333000000
## 16332                                  CLAY COUNTY OUTREACH CENTER 272142000000
## 16357                                         CLAY VIRTUAL ACADEMY 120030000000
## 16359                  CLAY VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120030000000
## 16360                             CLAY VIRTUAL INSTRUCTION PROGRAM 120030000000
## 16403                                               Clayton Middle 490087000000
## 16411                                  Clayton Valley Charter High  69100503940
## 16483                                              Clearfield High 490021000000
## 16498                                        Clearview Elem School 174125000000
## 16525                           Cleburne County Alternative School  10078002361
## 16526                      Cleburne County Career Technical School  10078000768
## 16623                                             Cleveland School 490027000000
## 16633                                       CLEWISTON ADULT SCHOOL 120078000000
## 16767                                               Clinton School 490021000000
## 16805                             Clnton/Mrn/Wshngtn Pre-Kind Prog 170017000000
## 16811                            CLOQUET EARLY CHILDHOOD EDUCATION 270942000000
## 16816                                              Cloud Preschool  61524012596
## 16828                                     CLOVER CREEK HIGH SCHOOL 160024000000
## 16913                                                      CM West 170612000000
## 16918                         Coachella Valley USD Special Ed PreK  60907012593
## 16926                                               Coal Canyon HS 320042000000
## 16948                                      Coastal Academy Charter  62825014145
## 16950                                  COASTAL ALTERNATIVE PROGRAM 483927000000
## 16952                            COASTAL ALTERNATIVE PROGRAM (CAP) 484251000000
## 16953                                               Coastal Buttes  69100407910
## 16963                                                Coastline ROP  60012310998
## 17019                                        CodeRVA Regional High 510026000000
## 17046                                      Coffee Creek Elementary  60924000938
## 17116                                       Cold Spring Elementary  60927000939
## 17160                                       Colegio Petite Arizona  40095203514
## 17231                                   College and Career Academy  10171000875
## 17232                                 College and Career Advantage  60012210997
## 17282                     College Preparatory Middle - East County  62610012759
## 17334                 COLLIER VIRTUAL INSTRUCTION COURSE OFFERINGS 120033000000
## 17335                          COLLIER VIRTUAL INSTRUCTION PROGRAM 120033000000
## 17344                                          COLLIN CO J J A E P 483600000000
## 17345                                          COLLIN CO J J A E P 482001000000
## 17347                                          COLLIN CO J J A E P 484653000000
## 17447                            Colonial Heights Technical Center 510096000000
## 17510                                  Colton-Redlands-Yucaipa ROP  60013011115
## 17538                                          Columbia Elementary  61470004514
## 17599                                              Columbia School 490042000000
## 17600                                              Columbia School 490021000000
## 17611                                   COLUMBIA VIRTUAL FRANCHISE 120036000000
## 17612                         COLUMBIA VIRTUAL INSTRUCTION PROGRAM 120036000000
## 17613     COLUMBIA VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120036000000
## 17639                                  COLUMBUS ALTERNATIVE SCHOOL 481470000000
## 17641                              Columbus Area Career Connection 180036000000
## 17651                                    Columbus Community Center 490087000000
## 17775                               Commonwealth Governor's School 510004000000
## 17787                              COMMUNITY BASE SERVICE STUDENTS 120183000000
## 17793                                    Community Based Education 510126000000
## 17800                              Community Collaborative Charter  60000113904
## 17802    Community Collaborative Virtual - Keppel Partnership Acad  61944014092
## 17803              Community Collaborative Virtual - Sage Oak Chtr  61686014107
## 17805                                                Community Day  61443008353
## 17815                                         Community Day Middle  62805010719
## 17823                                           COMMUNITY FOR KIDS 291176000000
## 17845                                 Community Montessori Charter  61071013054
## 17850                            Community of Peace Academy Middle 270012000000
## 17856                                      Community Roots Academy  60744012651
## 17895                            Compass Charter Schools of Fresno  62853013843
## 17896                       Compass Charter Schools of Los Angeles  60000114045
## 17897                         Compass Charter Schools of San Diego  62610013179
## 17901                                          Compass High School  40033002206
## 17907                                              COMPASS ON-LINE 270318000000
## 17925                                          Compton Unified ROP  60011310926
## 17936                                             Con Amore School 490024000000
## 17977                                     Concordia Charter School  40075102781
## 17978                     Concordia Charter School- Navajo Mission  40075103213
## 18066                                    Connecting Waters Charter  60006310698
## 18067                         Connecting Waters Charter - East Bay  69105114091
## 18074                                          Connections Program 170143000000
## 18168                                      Contra Costa County ROP  60009210761
## 18169                       Contra Costa School of Performing Arts  69100514059
## 18170                                                     CONTRACT 291640000000
## 18171                                                Contract - 02 460696000000
## 18173                              CONTRACTED RESIDENTIAL SERVICES 120015000000
## 18174                              CONTRACTED RESIDENTIAL SERVICES 120180000000
## 18176                                          CONTRACTED SERVICES 120081000000
## 18177                                          CONTRACTED SERVICES 120171000000
## 18178                                 Contracted Special Education 490072000000
## 18216                                    Jefferson Alt High School 170993000000
## 18232                                                  Cook School 490021000000
## 18254                                         Cooley Middle School  40378003381
## 18273                                                Coolidge RSSP 170020000000
## 18285                            Cooper (Sarah B.) Children Center  63441013393
## 18338                              Coosa County Career Tech Center  10090000798
## 18375                                        Copper Canyon Academy  40013301725
## 18378                                         Copper Canyon School 490105000000
## 18379                                         Copper Canyon School 490042000000
## 18386                                            Copper Hills High 490042000000
## 18387                                          Copper Hills School 490036000000
## 18392                                       Copper Mountain Middle 490042000000
## 18393                                     Copper Point High School  40091703433
## 18408                                            Copperview School 490014000000
## 18423                                     Coral Academy Elementary 320048000000
## 18424                                    Coral Academy High School 320048000000
## 18425                                  Coral Academy Middle School 320048000000
## 18431                                          Coral Canyon School 490114000000
## 18432                                          Coral Cliffs School 490114000000
## 18468                                             Corcoran Academy  60969011955
## 18490                                          Cordova Lane Center  61389013490
## 18508                                Corinne Early Learning Center 490009000000
## 18553                                           Corner Canyon High 490014000000
## 18557                                                  CORNERSTONE 271497000000
## 18567                                   Cornerstone Charter School  40040502053
## 18574                                  Cornerstone Learning Center 510060000000
## 18614                                            Corona Vista High  60985000905
## 18642                     Coronado Unified Special Education Pre-K  60987014121
## 18677                                                 Corte Madera  63147004881
## 18719                                                COSTELLO PREP 340009000000
## 18726                                Cotati-Rohnert Park Preschool  60994014180
## 18762                                     Cottonwood Creek Charter  60999012647
## 18787                                              Cottonwood High 490036000000
## 18792                                         Cottonwood Preschool  60999014148
## 18795                                            Cottonwood School 490036000000
## 18796                                            Cottonwood School 490027000000
## 18840                               Country Gardens Charter School  40042901994
## 18861                                          Country View School 490120000000
## 18877                                 County Collaborative Charter  62610013837
## 18878                                             County Community  69109003303
## 18879                                             County Community  69100109474
## 18881                                               COUNTY LINE EL 483237000000
## 18890                       COUNTY WIDE EXCEPTIONAL CHILD PROGRAMS 120108000000
## 18891                    COUNTY WIDE EXCEPTIONAL STUDENT EDUCATION 120078000000
## 18900                                   Courthouse Academy Program 510364000000
## 18932                                  Covered Bridge Spec Ed Dist 180242000000
## 18973                                    Cowan Sunset Southeast HS 320006000000
## 18994                                           Cox Bar Elementary  60133101109
## 19047                            Cradock Technical & Career Center 510300000000
## 19102                                      Crane iLearning Academy  40240003521
## 19111                               Cranston Early Learning Center 440024000000
## 19115                               Crater Juvenile Detention Home 510004000000
## 19147                                               Create Academy  40093803476
## 19169                                                   Credo High  60994012635
## 19183                                        Creek View Elementary  62622008914
## 19190                                            Creekside Charter  62712012515
## 19232                                      Creekside Middle School 174333000000
## 19238                                             Creekside School 490021000000
## 19246                                             Creekview School 490015000000
## 19257                               CREMER THERAPEUTIC COMM CENTER 290003000000
## 19258                              Crenshaw County Area Vocational  10096000801
## 19288                                              Crescent School 490014000000
## 19292                               Crescent Valley Public Charter  63804012734
## 19293                            Crescent Valley Public Charter II  63804014209
## 19294                                  Crescent View South Charter  64221012485
## 19295                                       Crescent View South II  64221014204
## 19296                            Crescent View West Public Charter  69100710789
## 19354                    Crestview College Preparatory High School  40038502016
## 19388                                             Crestview School 490021000000
## 19389                                             Crestview School 490036000000
## 19451                                          Crimson View School 490114000000
## 19461                                                   Crisp RYDC 130003000000
## 19474                                  CRITTENTON TREATMENT CENTER 291434000000
## 19486                                               Crocker Middle  61719002172
## 19492                                     CROCKETT EARLY HEADSTART 480744000000
## 19568                                               CROSBYTON DAEP 480000000000
## 19612                              Crossland Evening/Saturday High 240051000000
## 19626                          Crossroads Alternative/Bristol City 510009000000
## 19649                                      CROSSROADS HOPE ACADEMY 120024000000
## 19659                                            Crossroads School  10000702359
## 19664                                             CROSSROADS SOUTH 273354000000
## 19690                                      Crow Island Elem School 174284000000
## 19712                                         Crown Charter School  40032302159
## 19719                                      Crown Point High School  40033202165
## 19748                             Crystal Lake Central High School 171137000000
## 19756                               Crystal Lake South High School 171137000000
## 19776                                     CTD - Benson High School  40034502261
## 19777                                     CTD - Bisbee High School  40034503384
## 19778                                      CTD - Bowie High School  40034502262
## 19779                                      CTD - Buena High School  40034503390
## 19781                                    CTD - Douglas High School  40034502421
## 19782                                  CTD - San Simon High School  40034502259
## 19783                                  CTD - St. David High School  40034502258
## 19784                                  CTD - Tombstone High School  40034502260
## 19785                               CTD - Valley Union High School  40034502257
## 19786                                    CTD - Willcox High School  40034502256
## 19788                                           CTE VIRTUAL CENTER 120144000000
## 19832                              Cullman Area Resource Education  10102001567
## 19833                              Cullman Area Technology Academy  10102000803
## 19835                                     Cullman City Career Tech  10099001323
## 19837              Cullman Community Comprehensive Learning Center  10099002089
## 19860                                        CUMBERLAND CO JUV CTR 340009000000
## 19892                                   Cumberland Regional School 340009000000
## 19900                                   CUMBERLAND TRANS ED CENTER 340009000000
## 19928                                               Cupertino High  61443001695
## 20031                                     CVIT - Globe High School  40031602940
## 20032                                    CVIT - Hayden High School  40031602102
## 20033                                     CVIT - Miami High School  40031602101
## 20034                                       CVIT - Ray High School  40031603563
## 20035                                CVIT - San Carlos High School  40031602677
## 20036                                  CVIT - Superior High School  40031602103
## 20061                           CYPRESS CREEK HIGH ADULT EDUCATION 120153000000
## 20099                                  CYPRESS-FAIRBANKS J J A E P 481611000000
## 20101                                                  Cyprus High 490036000000
## 20161                                  Da Vinci Innovation Academy  60142813702
## 20167                        DAC (Dodge County Achievement Center) 130177000000
## 20175                           DADE JUVENILE RESIDENTIAL FACILITY 120039000000
## 20182                                                         DAEP 483591000000
## 20196                                            Daggett Preschool 490018000000
## 20223                          DAKOTA PRAIRIE AREA LEARNING CENTER 271182000000
## 20247                                    Dale Young Community High 490009000000
## 20266                        DALLAS CO SCHOOL FOR ACCELERATED LRNG 482442000000
## 20268                        Dallas County Career Technical Center  10111000818
## 20272                               DALLAS COUNTY JJAEP CFB CAMPUS 481305000000
## 20273                            DALLAS COUNTY JJAEP DESOTO CAMPUS 481686000000
## 20335                                              Dan W. Peterson 490003000000
## 20413                                 Daniel Webster Middle School 174125000000
## 20424                                        Daniels Canyon School 490111000000
## 20545                                      Daves Avenue Elementary  62283003490
## 20590                                         David Gourley School 490036000000
## 20654                                              Davinci Academy 490007000000
## 20662                                          Davis Career Center 510126000000
## 20695                                                   Davis High 490021000000
## 20712                                                 Davis School 490108000000
## 20715                           Davis Special Education Pre-School  61062013626
## 20719                                          DAVIS-STUART SCHOOL 540051000000
## 20764                                               DAY HEAD START 483870000000
## 20770                                        Day Treatment Program 510045000000
## 20774                                              Daybreak School 490042000000
## 20775                     DAYBROOK EARLY HEADSTART CENTER(CLSD 97) 540093000000
## 20826                                 DCYF Alternative Ed. Program 440001000000
## 20887                                      Dean Street Elem School 174333000000
## 20927                                   Decatur High Developmental  10117002175
## 21008                                    Deer Park C C Elem School 171191000000
## 21027                                        Deer Path Elem School 170873000000
## 21040                                          Deer Valley Academy  40027802168
## 21073                                             Deerfield School 490003000000
## 21095                                               Dehesa Charter  61071010626
## 21101                                          Dekalb Annex School  10114000830
## 21115                       DeKalb Regional Youth Detention Center 130003000000
## 21117                                      Dekalb Technical Center  10114000832
## 21137                                   Del Mar Heights Elementary  61074001189
## 21140                                     Del Mar Hills Elementary  61074001190
## 21143                                         Del Norte County ROP  60009310765
## 21161                                           Del Rey Elementary  62886004470
## 21251                            DELIA SANCHEZ FULL SERVICE SCHOOL 120087000000
## 21283                                           Delphic Elementary  61098001214
## 21287                          DELRAY FULL SERVICE ADULT EDUCATION 120150000000
## 21309                                                   Delta High 490054000000
## 21325                                                 Delta Middle 490054000000
## 21329                                           Delta North School 490054000000
## 21331                                           Delta South School 490054000000
## 21374                                            Denair Elementary  61104008653
## 21440                                          DENTON CO J J A E P 482772000000
## 21446                                          DENTON CO J J A E P 481674000000
## 21451                               DENTON COUNTY JJAEP CFB CAMPUS 481305000000
## 21479                                    Department of Corrections 130003000000
## 21480                                Department of Human Resources 130003000000
## 21490                             Dept of Correction Adult Schools 180001000000
## 21549                                Desert Heights Charter School  40061002056
## 21551                           Desert Heights Preparatory Academy  40061003363
## 21554                                            Desert Hills High 490114000000
## 21555                                     Desert Hills High School  40038401899
## 21556                                          Desert Hills Middle 490114000000
## 21563                                       Desert Marigold School  40036602302
## 21569                            Desert Mirage Preparatory Academy  40089403379
## 21580                                        Desert Pointe Academy  40013301888
## 21585                           Desert Rose Academy Charter School  40032202205
## 21591                                         Desert Sands Charter  60282008714
## 21596                                  Desert Sky Community School  40044802638
## 21602                                       Desert Springs Academy  40020602073
## 21607                                          Desert Star Academy  40092203458
## 21608                                 Desert Star Community School  40043902644
## 21610                                           Desert Sun Academy  40000100616
## 21618                                        DESERT VALLEYS REGION  40046302921
## 21619                                          Desert View Academy  40026802092
## 21633                                     Desert Willow Elementary 320006000000
## 21638                              Desert Willow Elementary School  40000101872
## 21641                                      Desert Willow Secondary 320006000000
## 21646                                   Deshler Alternative School  10342001656
## 21647                              Deshler Career Technical Center  10342001400
## 21656                                             Design Tech High  63498013774
## 21680                                     DESOTO VIRTUAL FRANCHISE 120042000000
## 21681                           DESOTO VIRTUAL INSTRUCTION PROGRAM 120042000000
## 21693                                               Destiny School  40033901939
## 21698                                  DETENTION FACILITY SERVICES 120186000000
## 21827                                              DIAGNOSTIC CTR. 291650000000
## 21837                                     Diamond Fork Junior High 490063000000
## 21849                                    Diamond Ridge High School 490014000000
## 21850                                         Diamond Ridge School 490036000000
## 21855                                        Diamond Valley School 490114000000
## 21859                                   Diamondhead Ready to Learn 270729000000
## 21913                           Diego Hills Central Public Charter  61071014199
## 21914                                          Diego Hills Charter  61071012509
## 21916                                        Diego Springs Academy  60570013845
## 21917                                         Diego Valley Charter  61914012880
## 21975                                              Dilworth School 490087000000
## 22012                                   Dirksen Junior High School 172058000000
## 22028                                            Discovery Charter  69103511792
## 22029                                            Discovery Charter  60004710393
## 22033                                         Discovery Charter II  69103513640
## 22041                          Discovery Charter School HillPointe 320000000000
## 22049                                         Discovery Elementary  61470010222
## 22088                                       Discovery Plus Academy  40014101657
## 22096                                             Discovery School 490009000000
## 22097                                             Discovery School 490108000000
## 22101                                              Discovery Woods 270037000000
## 22109                                        Disney II Elem School 170993000000
## 22113                             Dist 206 Alternative High School 170642000000
## 22114                                     DIST WIDE GIFTED PROGRAM 120096000000
## 22115                                  DIST WIDE HOMEBOUND PROGRAM 120096000000
## 22117                                    DISTANCE LEARNING PROGRAM 272382000000
## 22125                          DISTRICT INSTRUCTIONAL CENTER (DIC) 120039000000
## 22133                                     DISTRICT SUMMER CENTER C 120039000000
## 22134                                     DISTRICT SUMMER CENTER D 120039000000
## 22135                                     DISTRICT SUMMER CENTER E 120039000000
## 22136                                     DISTRICT SUMMER CENTER F 120039000000
## 22137                                     DISTRICT SUMMER CENTER G 120039000000
## 22138                                     DISTRICT SUMMER CENTER H 120039000000
## 22139                                     DISTRICT SUMMER CENTER L 120039000000
## 22157                                    DIXIE COUNTY ADULT CENTER 120045000000
## 22168                                                   Dixie High 490114000000
## 22172                                                 Dixie Middle 490114000000
## 22174                                     Dixie Montessori Academy 490017000000
## 22175                                             Dixie Sun School 490114000000
## 22176                                  DIXIE TEEN PARENT PRESCHOOL 120045000000
## 22177                                      DIXIE VIRTUAL FRANCHISE 120045000000
## 22178                 DIXIE VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120045000000
## 22179                            DIXIE VIRTUAL INSTRUCTION PROGRAM 120045000000
## 22180                            DIXIE VIRTUAL INSTRUCTION PROGRAM 120045000000
## 22199                                                 Dixon Middle 490081000000
## 22202                                     Dixon Montessori Charter  61128011473
## 22218                  Dobson Academy  The - A Ball Charter School  40018401713
## 22386                               DONALD R. KUHN JUVENILE CENTER 540051000000
## 22450                                    Dooly County Prep Academy 130180000000
## 22538                                      Dos Palos Carver Center  60003313609
## 22554                                     Dothan Technology Center  10123001349
## 22573                                   Douglas Alternative School 320009000000
## 22583                                  Douglas County Adult School 320009000000
## 22596                                    Douglas Elementary School 173267000000
## 22626                                               Douglas School 173708000000
## 22627                                    Douglas T. Orchard School 490036000000
## 22646                                              Douglass School 510225000000
## 22699                                                        DOVES 340009000000
## 22736                                     Downtown Charter Academy  62805013752
## 22752                                                 Doxey School 490021000000
## 22913                                Lowell Day School on Broadway 250702000000
## 22991                                           Draper Park Middle 490014000000
## 22992                                                Draper School 490014000000
## 23002                                                DREAM Academy 170019000000
## 23004                                                Dream Academy 171371000000
## 23059                                    DROPOUT PREVENTION SCHOOL 120156000000
## 23060                                           Drought Elementary 551080000000
## 23087                                             Dry Creek School 490003000000
## 23115                                       Dual Immersion Academy 490007000000
## 23144                                           Dubois Elem School 173708000000
## 23161                                                Duchesne High 490024000000
## 23162                                              Duchesne School 490024000000
## 23167                                      Duckwater Middle School 320036000000
## 23195                                                       Dugway 490105000000
## 23204                                                 DULCE MIDDLE 350081000000
## 23228                                      DUNBAR COMMUNITY SCHOOL 120108000000
## 23337                      Dunsmuir Joint Union High Community Day  61170007828
## 23364                                     Dupuy Alternative School  10039001288
## 23444                      DUVAL CHARTER HIGH SCHOOL AT BAYMEADOWS 120048000000
## 23446                              DUVAL CHARTER SCHOOL AT COASTAL 120048000000
## 23447                       DUVAL CHARTER SCHOOL AT FLAGLER CENTER 120048000000
## 23448                             DUVAL CHARTER SCHOOL AT MANDARIN 120048000000
## 23449                            DUVAL CHARTER SCHOOL AT SOUTHSIDE 120048000000
## 23450                             DUVAL CHARTER SCHOOL AT WESTSIDE 120048000000
## 23452   DUVAL MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIES 120048000000
## 23455                              DUVAL VIRTUAL ACADEMY FRANCHISE 120048000000
## 23456                 DUVAL VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120048000000
## 23458                            DUVAL VIRTUAL INSTRUCTION PROGRAM 120048000000
## 23578                                      E-Institute at Avondale  40031103292
## 23579                                       E-Institute at Buckeye  40031103186
## 23580                                       E-Institute at Grovers  40031103001
## 23581                                         E-Institute at Metro  40031102919
## 23582                                      E-Institute at Surprise  40031103144
## 23583                                       E-Institute at Taylion  40031103189
## 23584                                   E-Institute at Union Hills  40031102151
## 23656                                             Eagle Bay School 490021000000
## 23667                                           EAGLE College Prep  40076302915
## 23668                                   EAGLE College Prep Harmony  40084903266
## 23669                                  EAGLE College Prep Maryvale  40091603437
## 23670                       EAGLE College Preparatory School- Mesa  40091203443
## 23673                                                  Eagle Creek  60897011806
## 23737                                      Eagle Ridge High School 320030000000
## 23762                                          Eagle Valley School 490003000000
## 23768                                            Eagle View School 490108000000
## 23773                                            Eaglecrest School 490003000000
## 23858                                              Early Childhood 320051000000
## 23861                                              EARLY CHILDHOOD 272838000000
## 23872                              Early Childhood Campus - Cholla  40757003357
## 23891                                       Early Childhood Center 273009000000
## 23895                                       Early Childhood Center 490060000000
## 23932                                     Early Childhood Dev Cntr 170468000000
## 23935                               EARLY CHILDHOOD ED CENTER WEST 291869000000
## 23938                                    Early Childhood Education  62088012836
## 23939                                    Early Childhood Education  69102314210
## 23949             Early Childhood Education Center - Carver Campus  61488014187
## 23951                                     Early Childhood Facility 173499000000
## 23952                                Early Childhood Family Center 273333000000
## 23953                                 EARLY CHILDHOOD INTERVENTION 273180000000
## 23959                              Early Childhood Learning Center  68450012137
## 23964                            EARLY CHILDHOOD LEARNING SERVICES 120108000000
## 23965                                      EARLY CHILDHOOD PROGRAM 270405000000
## 23971                                       Early Childhood School 320012000000
## 23972                             Early Childhood School - Central 341134000000
## 23974                               Early Childhood School - North 341134000000
## 23975                               Early Childhood School - South 341134000000
## 23979                           EARLY CHILDHOOD SPECIAL ED PROGRAM 273327000000
## 23980                            EARLY CHILDHOOD SPECIAL EDUCATION 274216000000
## 23985                            EARLY CHILDHOOD SPECIAL EDUCATION 274146000000
## 23988                            EARLY CHILDHOOD SPECIAL EDUCATION 271104000000
## 23991                          EARLY CHILDHOOD SPECIAL EDUCATION ( 270624000000
## 24066                                        Early Learning Center 173708000000
## 24073                                        Early Learning Center 174125000000
## 24074                                        Early Learning Center 490105000000
## 24088                                       Early Learning Program  61218012841
## 24093                              Early Light Academy at Daybreak 490014000000
## 24101                          Early Wonders Preschool Partnership 270024000000
## 24122                                                    East Area 251115000000
## 24128                                          East Aurora HS RSSP 170019000000
## 24186                                   EAST CENTRAL CHOICE PROGAM 481785000000
## 24379                                                    East High 490087000000
## 24396                                             East High School 170468000000
## 24412                                          East Hollywood High 490004000000
## 24467                                           East Layton School 490021000000
## 24500                                          East Meadows School 490063000000
## 24521                                          East Midvale School 490014000000
## 24546                                    East Newark Public School 340420000000
## 24564                                   East Ouchita Middle School 220120000000
## 24599                               EAST RECEP/DIAG CORR CENT/ACAD 290003000000
## 24600                               EAST RECEP/DIAG CORR CENT/DIAG 290003000000
## 24634                                  East San Gabriel Valley ROP  60010510918
## 24636                                            East Sandy School 490014000000
## 24639                                                  East School 490024000000
## 24642                                            East Shore Online 490003000000
## 24701                                          East Valley Academy  40018901907
## 24706                                      East Valley High School  40042302525
## 24756          EASTER SEALS CHILD DEVELOPMENT CENTER DAYTONA BEACH 120192000000
## 24757                                    EASTER SEALS FLORIDA INC. 120015000000
## 24794                               Eastern Highlands Region (EHR)  40046302892
## 24819                                    Eastern St. Hosp. Ed. Prg 510005000000
## 24852                                              Eastlake School 490042000000
## 24866                      Eastman Regional Youth Detention Center 130003000000
## 24871                                              Eastmont Middle 490014000000
## 24899                                       Eastpointe High School  40026101916
## 24994                                              Eastwood School 490036000000
## 25047                                     eCademy Charter at Crane  60015812929
## 25049                                                   ECambridge  40855003423
## 25075                                            Ecker Hill Middle 490075000000
## 25090                                                     EC @ MSB 273180000000
## 25107                                    ED VENTURE CHARTER SCHOOL 120150000000
## 25125                                                Eden Area ROP  60008510732
## 25126                                   Eden Area Technical Center  10306201180
## 25167                               Edge High School - Himmel Park  40007801006
## 25168                                 EDGE High School - Northwest  40007802386
## 25191                                              Edgemont School 490081000000
## 25192                                              Edgemont School 490014000000
## 25335                                   Edison High School Academy 510126000000
## 25364                                                Edison School 490087000000
## 25372                                       Edith A Lombard School 231122000000
## 25375                                Edith Bowen Laboratory School 490007000000
## 25389              Edkey  Inc. - Pathfinder Academy - Sequoia Lehi  40063803360
## 25390                Edkey  Inc. - Sequoia Choice Precision School  40015703046
## 25391                            Edkey  Inc. - Sequoia Deaf School  40064002031
## 25392                  Edkey Inc. - Pathfinder Academy at Eastmark  40063803456
## 25440                                       Edna Keith Elem School 172058000000
## 25444                   EDNA MAHAN CORRECTIONAL FACILITY FOR WOMEN 340009000000
## 25445                                     Edna Rollins Elem School 170468000000
## 25458                                 EdOptions HS Learning Center  40081603219
## 25459                                EdOptions Preparatory Academy  40081602998
## 25465                                       Educare of West DuPage 174155000000
## 25475                               Educational Opportunity Center  40009501114
## 25478                   Educational Options Center State Preschool  63315014166
## 25482                            EDUCATIONAL SERVICES PROGRAM-EAST 120150000000
## 25483                            EDUCATIONAL SERVICES PROGRAM-WEST 120150000000
## 25486                  EduPreneurship Student Center (ESC) Phoenix  40005501731
## 25487                                              Eduprize School  40074602864
## 25488                                      EDUPRIZE SCHOOL Gilbert  40074600717
## 25498                          Edward Bell Career Technical Center  10321002364
## 25520                                  Edward Hynes Charter School 220117000000
## 25578                                Edwin A Lee Elementary School 173708000000
## 25653                                           Eisenhower Academy 172058000000
## 25693                                           Eisenhower Jr High 490036000000
## 25748                            El Centro District Wide Preschool  61203013544
## 25797                                            El Nido Preschool  61215014152
## 25808                                        El Potrero Pre-School  69113513435
## 25842                                  Elba Area Vocational School  10126001354
## 25858                  Elbert Shaw Regional Youth Detention Center 130003000000
## 25867                    PREK SPEECH AND LANGUAGE STUDENT SERVICES 120126000000
## 25868                                   ELC Winfield Primary Annex 174155000000
## 25877                                ELDER COOP ALTERNATIVE SCHOOL 484515000000
## 25917                  Eleanor Roosevelt Community Learning Center  69104510445
## 25932                                 ELEM. SPECIAL PROGRAMS DEPT. 291383000000
## 25958                                           Elevate Elementary  63432013795
## 26038                                 Elizabeth Graham Elem School 173708000000
## 26092                                         Elk Hills Elementary  61236001415
## 26097                                           Elk Meadows School 490042000000
## 26112                                             Elk Ridge Middle 490042000000
## 26114                          ELK RIVER DISTRICT SHARED TIME PROG 271137000000
## 26118                                           Elk Run Elementary 490036000000
## 26166                                            Elkins Elementary  61242001416
## 26172                                       ELKINS MOUNTAIN SCHOOL 540051000000
## 26286                                                 Ellis School 490051000000
## 26289                                          Ellison Park School 490021000000
## 26327                                  Elm Grove Elementary School 220027000000
## 26389                               Elmore County Technical Center  10129000834
## 26433               Elona P. Cooley Early Child Development Center  40378003417
## 26530                                 EMERSON ALTERNATIVE ED. (ES) 402277000000
## 26532                                 EMERSON ALTERNATIVE ED. (MS) 402277000000
## 26590                                               Emerson School 490087000000
## 26602                                                   Emery High 490027000000
## 26606                                Emeryville Preschool Students  61263013526
## 26632                                    EMINNESOTA ONLINE ACADEMY 271857000000
## 26677                                          Emmons Grade School 171425000000
## 26701                                         Empower College Prep  40087703354
## 26702                                   Empower Collegiate Academy  40087703522
## 26703                                          Empower Generations  60000114042
## 26707                                          Empowerment Academy 510189000000
## 26728                                            enCompass Academy 320048000000
## 26748                                                Endeavor Hall 490016000000
## 26753                                         Endeavour Elementary  61470004526
## 26761                                             Endeavour School 490021000000
## 26774                         ENERGIZED FOR EXCELLENCE ACADEMY ECC 482364000000
## 26776                  ENERGIZED FOR EXCELLENCE ACADEMY INC MIDDLE 482364000000
## 26777                     ENERGIZED FOR STEM ACADEMY SOUTHEAST H S 482364000000
## 26778                  ENERGIZED FOR STEM ACADEMY SOUTHEAST MIDDLE 482364000000
## 26780                  ENERGIZED FOR STEM ACADEMY SOUTHWEST MIDDLE 482364000000
## 26797                                          Engle Day Treatment  10039000079
## 26838                                                 Enoch School 490039000000
## 26844                                             Enos Elem School 173708000000
## 26851                                             Enrich Kingsland 270033000000
## 26852                                               Enrich Program 270033000000
## 26856                                                Ensign School 490087000000
## 26860                         Enterprise Academy/Newport News City 510007000000
## 26875                                              Enterprise High 490114000000
## 26886                                            Enterprise School 490114000000
## 26888                                         Enterprise Secondary  69101709021
## 26889                                       Entheos Academy Kearns 490004000000
## 26890                                        Entheos Academy Magna 490004000000
## 26892                                                      Entrada 490014000000
## 26907                                         Envision High School  40081402554
## 26915                                               Ephraim Middle 490096000000
## 26916                                               Ephraim School 490096000000
## 26924                                  EPIC BLENDED CHARTER OKC MS 400080000000
## 26930                                         EPIC de Cesar Chavez  69102313819
## 26947                                 Epruett Center Of Technology  10183000908
## 27064                                                  ESC Academy 348036000000
## 27066                                               Escalante High 490030000000
## 27069                                             Escalante School 490087000000
## 27070                                             Escalante School 490030000000
## 27071                                      Escalante Valley School 490039000000
## 27073                                      Escalon Charter Academy  61284013059
## 27076                                          ESCAMBIA BOYS' BASE 120051000000
## 27078                           Escambia County Alternative School  10135000840
## 27082                                  ESCAMBIA JUVENILE DETENTION 120051000000
## 27083                               ESCAMBIA SCH. DIST. JAIL PROG. 120051000000
## 27085              ESCAMBIA VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120051000000
## 27086                         ESCAMBIA VIRTUAL INSTRUCTION PROGRAM 120051000000
## 27087   ESCAMBIA VIRTUAL INSTRUCTIONAL PROGRAM (DISTRICT PROVIDED) 120051000000
## 27089                      EscambiaBrewton Career Technical Center  10135000841
## 27098                                       Escondido Charter High  61291006493
## 27106  Escuela Popular/Center for Training and Careers Family Lrng  61182011449
## 27111                                                ESE HOMEBOUND 120129000000
## 27115                                         ESE RELATED SERVICES 120192000000
## 27121                                                 Eskdale High 490054000000
## 27151                                             Esperanza School 490016000000
## 27157                                        ESSEX CO  YOUTH HOUSE 340009000000
## 27175                                                    ESSEX RGC 340009000000
## 27176                                        ESSEX REGIONAL SCHOOL 340009000000
## 27188                            ESTANCIA VALLEY CLASSICAL ACADEMY 350015000000
## 27229                                         Estrella High School  40035201898
## 27238                                            ESY SUMMER CENTER 120039000000
## 27266                Ethos Academy- A Challenge Foundation Academy  40094203497
## 27283              Etowah County Special Education Learning Center  10138000845
## 27390                                                Eureka School 490102000000
## 27478                                      Evelyn Alexander School 170011000000
## 27487                                  Evening Educational Options  10237002177
## 27489                                 Evening School of Excellence 510189000000
## 27524                                            Evergreen Academy 170020000000
## 27577                                            Evergreen Jr High 490036000000
## 27606                           EVIT - Apache Junction High School  40973102233
## 27607                                   EVIT - Arcadia High School  40973102501
## 27608                      EVIT - Arizona College Prep Erie Campus  40973103468
## 27609                                     EVIT - Basha High School  40973103081
## 27610                              EVIT - Brimhall Jr. High School  40973102791
## 27611                               EVIT - Campo Verde High School  40973102969
## 27612                                EVIT - Carson Jr. High School  40973102799
## 27613                                   EVIT - Casteel High School  40973103487
## 27614                                  EVIT - Chandler High School  40973101515
## 27615                                 EVIT - Chaparral High School  40973102504
## 27616                                     EVIT - Combs High School  40973103017
## 27617                                  EVIT - Compadre High School  40973102825
## 27618                            EVIT - Corona Del Sol High School  40973102465
## 27619                                  EVIT - Coronado High School  40973102502
## 27620                           EVIT - Desert Mountain High School  40973102505
## 27621                              EVIT - Desert Ridge High School  40973102887
## 27622                              EVIT - Desert Vista High School  40973102467
## 27623                                    EVIT - Dobson High School  40973102459
## 27625                                   EVIT - East Valley Academy  40973103548
## 27627                      EVIT - Fountain Hills Vocational Center  40973102235
## 27628                                   EVIT - Fremont Junior High  40973102967
## 27629                                   EVIT - Gilbert High School  40973102234
## 27630                                  EVIT - Hamilton High School  40973103087
## 27631                                   EVIT - Hendrix Junior High  40973102988
## 27632                                  EVIT - Highland High School  40973102890
## 27633                                    EVIT - Higley High School  40973102272
## 27634                                      EVIT - Kino Junior High  40973103027
## 27635                            EVIT - Marcos De Niza High School  40973102464
## 27636                                EVIT - McClintock High School  40973102463
## 27637                                      EVIT - Mesa High School  40973102456
## 27638                                      EVIT - Mesa Junior High  40973102983
## 27639                                  EVIT - Mesquite High School  40973102935
## 27640                           EVIT - Mountain Pointe High School  40973102466
## 27641                             EVIT - Mountain View High School  40973102458
## 27642                                     EVIT - Perry High School  40973102821
## 27643                                    EVIT - Poston Junior High  40973103043
## 27644                                EVIT - Powell Jr. High School  40973102816
## 27645                               EVIT - Queen Creek High School  40973102377
## 27646                              EVIT - Red Mountain High School  40973102460
## 27647                                    EVIT - Rhodes Junior High  40973102981
## 27648                                   EVIT - Saguaro High School  40973102503
## 27650                                  EVIT - Shepherd Junior High  40973103059
## 27651                                   EVIT - Skyline High School  40973102461
## 27652                                     EVIT - Smith Junior High  40973103060
## 27653                                   EVIT - Stapley Junior High  40973103056
## 27654                                    EVIT - Taylor Junior High  40973103058
## 27656                                     EVIT - Tempe High School  40973102462
## 27657                                  EVIT - Westwood High School  40973102457
## 27658                            EVIT - Williams Field High School  40973102785
## 27671                                                 Ewell School 240057000000
## 27689                                        EXCEL ACADEMY (JJAEP) 483432000000
## 27690                                     EXCEL ACADEMY (MURWORTH) 482115000000
## 27691                                 Excel Academy - Englewood HS 170993000000
## 27692                                 Excel Academy - Southwest HS 170993000000
## 27693                                  Excel Academy - Woodlawn HS 170993000000
## 27697                    EXCEL ACADEMY EDUCATION TRANSITION CENTER 480005000000
## 27728                                            Excelsior Academy 490014000000
## 27730                                    EXCELSIOR CHARTER ACADEMY 120039000000
## 27737                        EXCELSIOR LANGUAGE ACADEMY OF HIALEAH 120039000000
## 27749                           Exceptional Children's Cooperative 180396000000
## 27756                                         Exeter Community Day  60142308662
## 27804                            EXPRESSIONS LEARNING ARTS ACADEMY 120003000000
## 27805                                Extended Day Learning Program 240012000000
## 27851                       F. Niel Postlethwait Middle School ILC 100018000000
## 27896                                      Fair Park Middle School 220030000000
## 27913                                      Fairbanks Middle School  40532003369
## 27935                                  Fairfax High School Academy 510126000000
## 27937                              Fairfax Juvenile Detention Home 510004000000
## 27942                                 Fairfield Alternative School  10144001361
## 27946                             Fairfield Area Vocational School  10144001363
## 27977                                            Fairfield Jr High 490021000000
## 27998                    Fairfield-Suisun Elementary Community Day  61336011867
## 28085                                         FAIRVIEW ACCELERATED 482160000000
## 28086                                         FAIRVIEW ACCELERATED 484155000000
## 28087                                         FAIRVIEW ACCELERATED 483738000000
## 28089                                         FAIRVIEW ACCELERATED 480930000000
## 28090                                         FAIRVIEW ACCELERATED 484404000000
## 28091                                         FAIRVIEW ACCELERATED 481401000000
## 28093                                         FAIRVIEW ACCELERATED 480930000000
## 28095                        FAIRVIEW ACCELERATED EDUCATIONAL COOP 483398000000
## 28101                                                FAIRVIEW DAEP 481401000000
## 28107                                FAIRVIEW DAY TREATMENT CENTER 270002000000
## 28120                                         Fairview Elem School 173708000000
## 28198                                             FAIRVIEW PROGRAM 271137000000
## 28202                                              Fairview School 490066000000
## 28204                                       FAIRVIEW SCHOOL (DAEP) 483398000000
## 28205                               Fairview School Readiness Plus 273243000000
## 28209                                    FAIRVIEW SPECIAL PROGRAMS 484471000000
## 28211                                    FAIRVIEW SPECIAL PROGRAMS 483738000000
## 28213                                    FAIRVIEW SPECIAL PROGRAMS 483398000000
## 28230                  Faith North Early Childhood Learning Center  40630003554
## 28248                                          Falcon Ridge School 490042000000
## 28304                             Falls Church High School Academy 510126000000
## 28335                               Family Court Elementary School  10039000530
## 28336                                     Family Court High School  10039001761
## 28338                  Family Education Center For Parenting Teens 510027000000
## 28339                                     Family Enrichment Center 490021000000
## 28340                                         Family First Charter  60792013705
## 28341                                      FAMILY LEARNING CENTERS 120129000000
## 28346                                         FAMILY LITERACY CTR. 291941000000
## 28348                        Family Partnership Home Study Charter  60528011789
## 28354                                   FAMU DRS VIRTUAL FRANCHISE 120201000000
## 28400                                 Farjardo - La Seda Preschool  63375013361
## 28432                               FARMINGTON CORRECTIONAL CENTER 290003000000
## 28445                                           Farmington Jr High 490021000000
## 28450                                            Farmington School 490021000000
## 28454                                  FARMINGTON TREATMENT CENTER 290003000000
## 28472                                             Farr West School 490120000000
## 28475                                         Farragut Elem School 172058000000
## 28508                                            Fast Forward High 490002000000
## 28547                              FAYETTE INSTITUTE OF TECHNOLOGY 540030000000
## 28574                                                FBC-Preschool  40046303359
## 28579                             FEARNSIDE FAMILY SERVICES CENTER 120003000000
## 28585                                                    FEC Pre K 271176000000
## 28606                                           Feitshans Elem Sch 173708000000
## 28628                         Felmers O Chaney Correctional Center 550004000000
## 28659                           FERGUS FALLS EARLY CHILDHOOD SP ED 270004000000
## 28660                             FERGUS FALLS EC/ELEMENTARY SP ED 270004000000
## 28661                            FERGUS FALLS ELEMENTARY SP ED 5-8 270004000000
## 28730                                                Ferron School 490027000000
## 28754                                       Fiddlers Canyon School 490039000000
## 28781                                                 Field School 171845000000
## 28791                                              Fielding School 490009000000
## 28830                                         Fillmore Central ALP 270010000000
## 28842                                              Fillmore Middle 490054000000
## 28843                                              Fillmore School 490054000000
## 28921                                             First Step Adams 270033000000
## 28922                                             First Step Alden 270033000000
## 28932                                                    FISD DAEP 482544000000
## 28933                                                   FISD JJAEP 482544000000
## 28989                                   FIVAY HIGH ADULT EDUCATION 120153000000
## 28991                             Five County Regional Alternative 170019000000
## 28994                        Five Keys Adult School (SF Sheriff's)  63441012373
## 28995                             Five Keys Charter (SF Sheriff's)  63441011407
## 28996                     Five Keys Independence HS (SF Sheriff's)  63441012256
## 29010                FLAGLER VIRTUAL INSTRUCTION(COURSE OFFERINGS) 120054000000
## 29013                        Flagstaff Arts And Leadership Academy  40001900498
## 29016                                     Flagstaff Junior Academy  40009801180
## 29022                                 Flambeau Correctional Center 550004000000
## 29026                                         Flaming Gorge School 490018000000
## 29100                                                 FLEX Program 170018000000
## 29101                                     Flexible Student Support 240021000000
## 29105                                               Flight Program 270033000000
## 29128                              FLOODWOOD ALT. LEARNING PROGRAM 271221000000
## 29178                                     Florence Learning Center  10153001644
## 29195                                     Florence Virtual Academy  40292003195
## 29207                FLORESVILLE ALTERNATIVE CENTER CHOICE PROGRAM 483831000000
## 29208                              NIXON-SMILEY ALTERNATIVE CENTER 482631000000
## 29216                                FLORIDA CYBER CHARTER ACADEMY 120048000000
## 29218                     FLORIDA CYBER CHARTER ACADEMY AT OSCEOLA 120147000000
## 29230                              Florida Street Discovery Center  60384013223
## 29251                                          Flournoy Elementary  61386001564
## 29300                                            FLOYDADA ISD DAEP 481944000000
## 29311                                          FLVS FULL-TIME 6-12 120000000000
## 29318                                                    FOCUS ALP 270822000000
## 29395                                         FOOTHILL HIGH SCHOOL 350001000000
## 29398                                  Foothill Leadership Academy  69104613754
## 29406                                              Foothill School 490003000000
## 29407                                              Foothill School 490009000000
## 29410                                            Foothills Academy  40003600709
## 29411                                  Foothills Academy Connected  40003603421
## 29422                                             Foothills School 490063000000
## 29423                                             Foothills School 490042000000
## 29428                                                Forbes School 490003000000
## 29527                             FOREST HILL HIGH ADULT EDUCATION 120150000000
## 29546                                  Forest Hills Spec Educ Coop 180948000000
## 29569                                          Forest Park Academy 510330000000
## 29587                             Forest Park Individual Ed School 172058000000
## 29596                                         Forest Ranch Charter  60837012233
## 29652                                   Forks of Salmon Elementary  61404001607
## 29669                                        Forrestal Elem School 170011000000
## 29702                                           FORT BEND CO ALTER 482517000000
## 29757                                         Fort Herriman Middle 490042000000
## 29795                                Fort Mohave Elementary School  40519001415
## 29818                                         Fort Ross Elementary  61413001616
## 29871                                              Forty-Niner ROP  60008211008
## 29882                                    Fossil Ridge Intermediate 490114000000
## 29937                                        Fountain Green School 490066000000
## 29939                                Fountain Hills Charter School  40011301601
## 29953                                        Fountain.Hills Online  40304003240
## 29977                                     FOURTEENTH AVENUE SCHOOL 341134000000
## 30024                                             Fox Hills School 490036000000
## 30028                                            Fox Hollow School 490003000000
## 30029                                            Fox Hollow School 490042000000
## 30031                            Fox Lake Correctional Institution 550004000000
## 30058                                               Foxboro School 490021000000
## 30153                                 Francis X. McGraw Elementary 340264000000
## 30256                               FRANK W. SPRINGSTEAD HIGH/ADUL 120081000000
## 30260                                 Frank White Education Center 272808000000
## 30325                      Franklin County Career Technical Center  10159000860
## 30333              FRANKLIN COUNTY LEARNING CENTER (ADULT DIVISON) 120057000000
## 30347                                   Franklin Discovery Academy 490019000000
## 30349                  Franklin Early Childhood Development Center 250501000000
## 30489                             Franklin Phonetic Primary School  40009201075
## 30490                  Franklin Phonetic Primary School-Sunnyslope  40091403452
## 30502                                              Franklin School 490081000000
## 30505                                              Franklin School 490087000000
## 30521                         FRANKLIN VIRTUAL INSTRUCTION PROGRAM 120057000000
## 30590                             Fred Fifer III Middle School ILC 100018000000
## 30609                                     Fred Rodgers Magnet Acad 170468000000
## 30616                                    FRED W EBERLE TECH CENTER 540147000000
## 30721                                              Freedom Academy  40075502371
## 30723                                        Freedom Academy North  40075503029
## 30781                                  Freedom Prep Charter School 340008000000
## 30783                                  Freedom Preparatory Academy 490006000000
## 30784                       Freedom Preparatory Academy - Vineyard 490006000000
## 30787                                               Freedom School 490120000000
## 30788                                               Freedom School 490003000000
## 30849                                          Fremont Elem School 171593000000
## 30870                                                 Fremont High 490120000000
## 30872                                                 Fremont High  61443001696
## 30875                                  Fremont Intermediate School 171593000000
## 30876                                Fremont Jr High/Middle School 171593000000
## 30886                                               Fremont School 490021000000
## 30900                          French Gulch-Whiskeytown Elementary  61449001701
## 30920                                           Fresh Start Center 510360000000
## 30928                      Fresno City and Fresno State Preschools  61455013479
## 30929                           Fresno COE District-Wide Preschool  69100712597
## 30933                                                   Fresno ROP  60009810788
## 30957                      Friendly House Academia Del Pueblo Elem  40010201582
## 31043                                       Frontier Middle School 490003000000
## 31107                                        Fruitvale Junior High  61470008142
## 31115                                FSUS VIRTUAL SCHOOL FRANCHISE 120201000000
## 31168                                     Fulton Special Education  61455003024
## 31197                                FULTON RECEPTION AND DIAG CTR 290003000000
## 31223                              Future Investment Middle School  40034303003
## 31250                                    G N Dieterich Elem School 170468000000
## 31252                                            G O A L S PROGRAM 482212000000
## 31298                                            Gabbs High School 320036000000
## 31299                                          Gabbs Middle School 320036000000
## 31314                              Gadsden City Alternative School  10162001646
## 31327                                    GADSDEN VIRTUAL FRANCHISE 120060000000
## 31328                          GADSDEN VIRTUAL INSTRUCTION PROGRAM 120060000000
## 31357                  Gainesville Regional Youth Detention Center 130003000000
## 31388                                           Galena High School 171605000000
## 31390                                         Galena Middle School 171605000000
## 31395                                        Galena Primary School 171605000000
## 31463                                       GALVESTON CO J J A E P 481995000000
## 31464                                       GALVESTON CO J J A E P 481707000000
## 31465                                       GALVESTON CO J J A E P 483927000000
## 31467                                       GALVESTON CO J J A E P 482028000000
## 31559                           GARDEN STATE CORRECTIONAL FACILITY 340009000000
## 31645                                          Garfield Elementary  61491001890
## 31699                                               Garland School 490009000000
## 31709                                         GARNET CAREER CENTER 540060000000
## 31733                                       GARRETT MORGAN ACADEMY 341269000000
## 31740                                             Garrison 7 & 8th 490054000000
## 31751                                              Garrison School 490054000000
## 31829                                                      Gateway  60243014097
## 31831                                              Gateway Academy 510364000000
## 31845                           Gateway College and Career Academy  69102613730
## 31850                            Gateway Early College High School  40004100718
## 31852                                     GATEWAY EDUCATIONAL CTR. 293102000000
## 31883                                  Gateway Preparatory Academy 490012000000
## 31888                                               Gateway School 170387000000
## 31910                          Gateway to College at Laney College  62805012506
## 31941                              Gavin Central Elementary School 171629000000
## 31942                                    Gavin South Middle School 171629000000
## 31957                                           Gazelle Elementary  61497001902
## 31968                                         Gearld Wright School 490036000000
## 31973                                                  GED TESTING 120015000000
## 31989                                           Gem Charter School  40014501750
## 32006                        GENE SPARADO REGIONAL JUVENILE CENTER 540051000000
## 32010                                 General Academic Development 510189000000
## 32014                             General Davie Jr. Primary Center  63462013156
## 32036                    Generating Recovery of Academic Direction 510189000000
## 32054                                              Genesis Academy  40012401589
## 32060                                               Genesis School  10087002360
## 32081                      Geneva Regional Career Technical Center  10166002418
## 32082                                                Geneva School 490003000000
## 32142                                           Alternative School 280156000000
## 32176                                   George Gervin Prep Academy  40087603352
## 32179                George H Bryant VocationalAgricultural Center  10237001086
## 32273                              GEORGE W  HERLICH JUV  DET  CTR 340009000000
## 32297                                    George Washington Academy  40024603494
## 32298                                    George Washington Academy 490005000000
## 32349                                       George Washington High 490072000000
## 32366                                     GEORGE WASHINGTON SCHOOL 363126000000
## 32474                                       Germantown Elem School 171653000000
## 32573                                    GIFT - Duncan High School  40034902399
## 32574                                GIFT - Ft. Thomas High School  40034902254
## 32576                                GIFT - Mt. Graham High School  40034903080
## 32577                                      GIFT - Pima High School  40034902253
## 32578                                   GIFT - Safford High School  40034902252
## 32579                                  GIFT - Thatcher High School  40034902263
## 32580                                     GIFT-Morenci High School  40034903239
## 32581                                    GIFT-Mt. Turnbull Academy  40034903218
## 32639                                  GILCHRIST VIRTUAL FRANCHISE 120063000000
## 32640             GILCHRIST VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120063000000
## 32641                        GILCHRIST VIRTUAL INSTRUCTION PROGRAM 120063000000
## 32642    GILCHRIST VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120063000000
## 32651                                    Giles County Tech. Center 510159000000
## 32710                                  Gilroy Special Ed Preschool  61518014178
## 32733                     Girls Academic Leadership Academy (GALA)  62271013968
## 32738                          Girls Leadership Academy of Arizona  40014401717
## 32753                                  Glacier High School Charter  60016010541
## 32768                                     Gladden Farms Elementary  40463003516
## 32779                          GLADES CENTRAL H.S. ADULT EDUCATION 120150000000
## 32784                                     GLADES VIRTUAL FRANCHISE 120066000000
## 32785                           GLADES VIRTUAL INSTRUCTION PROGRAM 120066000000
## 32786       GLADES VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120066000000
## 32787                                                  GLADES WEST 120066000000
## 32805                                    Gladstone Voluntary Pre-K 272385000000
## 32822                               Glankler Early Learning Center  61440013675
## 32879                                       Glen Flora Elem School 174125000000
## 32984                                              Glendale Middle 490087000000
## 33021                                             Glenn County ROP  60009910791
## 33083                     Glenview College Preparatory High School  40014903386
## 33104                                          GLENWOOD ELEMENTARY 350222000000
## 33122                                   Glenwood Elementary School 174125000000
## 33198                                         Glorietta Elementary  62886004471
## 33228                               GOAL-Granting Opp for Alt Lrng 173027000000
## 33263                                 Goethe International Charter  62271012215
## 33281                                            Gold Rush Charter  63828011827
## 33292                                         Golden Fields School 490042000000
## 33293                                Golden Gate Community Charter  69100510472
## 33317                             Golden Oak Montessori of Hayward  61674012426
## 33337                                        Golden Valley Charter  62472010451
## 33343                                        Golden Valley Orchard  63462013910
## 33344                                          Golden Valley River  63462011902
## 33360                                         Goldminer's Daughter 490014000000
## 33388                                   Gompers Junior High School 172058000000
## 33416                                     Good Foundations Academy 490015000000
## 33473                    Goodwill Easter Seal Center Special Child  10237001597
## 33496                                   Gordon Correctional Center 550004000000
## 33499                                 Gordon Early Literacy Center 420624000000
## 33536                                            Gorman Elementary  61560001979
## 33562                                                Goshen School 490063000000
## 33591                               Governor's School for the Arts 510218000000
## 33592                      Governor's School of Southside Virginia 510003000000
## 33614                           Governor's Health Sciences Academy 510036000000
## 33620                                        Gowan Science Academy  40240003323
## 33666                                          Grace Yokley Middle  62622007789
## 33701                                          Grafton Elem School 172043000000
## 33758                                              Gramercy School 490072000000
## 33804                                            Grand County High 490033000000
## 33805                                          Grand County Middle 490033000000
## 33829                             GRAND MESA YOUTH SERVICES CENTER  80028606702
## 33945                                                 Granger High 490036000000
## 33950                                               Granger School 490036000000
## 33956                                      Granite Connection High 490036000000
## 33971                                         Granite Park Jr High 490036000000
## 33973                                            Granite Preschool 490036000000
## 33976                                               Granite School 490014000000
## 33979                                  Granite Technical Institute 490036000000
## 33994                                 Grant County Special Ed Coop 180687000000
## 34050                                                 Grant School 490060000000
## 34077                                             Grantsville High 490105000000
## 34078                                          Grantsville Jr High 490105000000
## 34079                                           Grantsville School 490105000000
## 34124                                       Grass Valley Preschool  61578013228
## 34145                                    Gravenstein Community Day  61584010684
## 34152                                            Graves Elementary  61587002002
## 34183                                         Graymont Elem School 173465000000
## 34190                                Grayslake Central High School 171755000000
## 34193                                  Grayslake North High School 171755000000
## 34197             Grayson County High Career & Technical Education 510169000000
## 34227                                   Great Expectations Academy  40020501963
## 34235                         Great Hearts Academies - Anthem Prep  40081903187
## 34236                       Great Hearts Academies - Archway Arete  40088803412
## 34237                    Great Hearts Academies - Archway Chandler  40083403244
## 34238                      Great Hearts Academies - Archway Cicero  40088603407
## 34239                    Great Hearts Academies - Archway Glendale  40086603356
## 34240                     Great Hearts Academies - Archway Lincoln  40092503464
## 34241               Great Hearts Academies - Archway North Phoenix  40087303353
## 34242                  Great Hearts Academies - Archway Scottsdale  40084103259
## 34243                Great Hearts Academies - Archway Trivium East  40093003462
## 34244                Great Hearts Academies - Archway Trivium West  40083203290
## 34245                     Great Hearts Academies - Archway Veritas  40083303283
## 34246                          Great Hearts Academies - Arete Prep  40075702820
## 34247                       Great Hearts Academies - Chandler Prep  40044002681
## 34248                         Great Hearts Academies - Cicero Prep  40090003404
## 34249                       Great Hearts Academies - Glendale Prep  40076002911
## 34250                        Great Hearts Academies - Lincoln Prep  40091903472
## 34251                       Great Hearts Academies - Maryvale Prep  40087503345
## 34252                  Great Hearts Academies - North Phoenix Prep  40086103344
## 34253                     Great Hearts Academies - Scottsdale Prep  40074702795
## 34254                         Great Hearts Academies - Teleos Prep  40079102963
## 34255                        Great Hearts Academies - Trivium Prep  40085103271
## 34256                        Great Hearts Academies - Veritas Prep  40065503096
## 34302                                         Great Valley Academy  69104112249
## 34303                                Great Valley Academy - Salida  63390012945
## 34323                                    Greater Lafayette Area SE 180540000000
## 34329                    Greater Peninsula Governor's STEM Academy 510001000000
## 34331                                    Greater San Diego Academy  61873008302
## 34336                                   Greeley Alternative School 170020000000
## 34341                                          Greeley Elem School 174284000000
## 34359                                           Green Acres School 490120000000
## 34365                             Green Bay Early Childhood Center 170011000000
## 34369                                     Green Canyon High School 490012000000
## 34436                                       Green Point Elementary  61599002003
## 34439                                                    GREEN RGC 340009000000
## 34445                                             Green River High 490027000000
## 34525                       GREENBRIER SCHOOL OF PRACTICAL NURSING 540039000000
## 34559                     Greene County Technical Education Center 510171000000
## 34560                                  Greene County Career Center  10168002181
## 34583                                    Greene-Sullivan Sp Ed Sch 180001000000
## 34719                                            Greenville School 490012000000
## 34743                                     Greenwood Charter School 490018000000
## 34752                                        Greenwood Elem School 174125000000
## 34754                                        Greenwood Elem School 174333000000
## 34797                                             Greenwood School 490003000000
## 34855                    Gretna No. 2 Academy for Advanced Studies 220084000000
## 34870                          Greystone Park Psychiatric Hospital 340009000000
## 34968                                      Grouse Creek Elementary 490009000000
## 34969                                       Grouse Creek Secondary 490009000000
## 34971                                                        Grove  63207008292
## 35001                                            Grovecrest School 490003000000
## 35040                                                Growth Public  63384014124
## 35065                               GUADALUPE ALTERNATIVE PROGRAMS 273384000000
## 35069                                  GUADALUPE COUNTY CORRECTION 350001000000
## 35075                                          Guadalupe Preschool  61626014201
## 35076                                             Guadalupe School 490007000000
## 35077                                      Guajome Learning Center  64119012930
## 35096                                             Guidance Charter  62958010531
## 35134                                    GULF HIGH ADULT EDUCATION 120153000000
## 35143                                       GULF VIRTUAL FRANCHISE 120069000000
## 35152                                  GULFSTREAM L.I.F.E. ACADEMY 120150000000
## 35167                                         Gunnison Valley High 490096000000
## 35168                                       Gunnison Valley Middle 490096000000
## 35169                                       Gunnison Valley School 490096000000
## 35252                                            H C Burton School 490021000000
## 35261                                            H E L P  Marshall 170002000000
## 35271                                           H Guy Child School 490120000000
## 35289                                       H R McCall Elem School 174125000000
## 35294                                                    H S POINT 481653000000
## 35338                        H.T. Edwards Learning Center Facility 130117000000
## 35339                       Ha:san Preparatory & Leadership School  40014701787
## 35428                                 HAINES CITY HEADSTART CENTER 120159000000
## 35457                                            HALE COUNTY JJAEP 483507000000
## 35479                              Haleyville Center Of Technology  10172001370
## 35494                                 Halifax County Career Center 510177000000
## 35595                                       Hamilton Community Day  60133908481
## 35694                                   HAMILTON VIRTUAL FRANCHISE 120072000000
## 35695                         HAMILTON VIRTUAL INSTRUCTION PROGRAM 120072000000
## 35696     HAMILTON VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120072000000
## 35697                                         HAMILTON VTAE SCHOOL 120072000000
## 35875                                            Hanksville School 490117000000
## 35962                                      Happy Valley Elementary  61656002088
## 35972                                          Happy Valley School  40040602036
## 35973                              Happy Valley School East Campus  40086403315
## 36024                                     HARDEE VIRTUAL FRANCHISE 120075000000
## 36025                           HARDEE VIRTUAL INSTRUCTION PROGRAM 120075000000
## 36026       HARDEE VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120075000000
## 36038                                          HARDIN CO J J A E P 482241000000
## 36065                                          HARDIN-CENTRAL HIGH 291368000000
## 36116                                          Harker-Wylie School 341281000000
## 36316                                                       Harper  62724014084
## 36382                                          HARRIS CO J J A E P 482364000000
## 36383                                          HARRIS CO J J A E P 484110000000
## 36384                                              HARRIS CO JJAEP 482574000000
## 36385                                              HARRIS CO JJAEP 481428000000
## 36402                                          Harris Intermediate 490009000000
## 36449                          HARRISON CO EVOLUTION MIDDLE SCHOOL 540051000000
## 36458                                 Harrison County Spec Ed Coop 181036000000
## 36510                                              Harrison School 340258000000
## 36557                                             Harry P B Carden  69104809261
## 36571                                       Harry S. Truman School 490036000000
## 36588                                                     Hart ROP  60011110924
## 36661                                            Hartvigsen School 490036000000
## 36680                                     Harvard Park Elem School 173708000000
## 36691                                Harvest Park Preschool Center  60002013494
## 36692                                  Harvest Preparatory Academy  40028202232
## 36693                        Harvest Preparatory Academy  Goodyear  40028203457
## 36694                     Harvest Preparatory Academy  San Luis AZ  40028202993
## 36696             Harvest Ridge Cooperative Charter/Placer Academy  62712012790
## 36699                                               Harvest School 490003000000
## 36752                               HASTINGS JUVENILE CORRECTIONAL 120174000000
## 36807                             Havard (Leona M) Early Education  63441013585
## 36808                                   Havasu Preparatory Academy  40085203257
## 36809                                                 Havasuonline  40428002538
## 36821                              Haven Montessori Charter School  40078202954
## 36893                                Hawthorn Academy South Jordan 490014000000
## 36894                                 Hawthorn Academy West Jordan 490014000000
## 36966                                             Hawthorne School 490087000000
## 36988                                           Hayden Peak School 490042000000
## 37076                                       Hazel Dell Elem School 173708000000
## 37138                                HB Woodlawn Secondary Program 510027000000
## 37158                        Headstart Preschool Special Education 490036000000
## 37197                   Hearn Academy  The - A Ball Charter School  40010001714
## 37227                                             Heartland School 490042000000
## 37243                                    Heather Ridge High School 240033000000
## 37265                                          Heber Valley School 490111000000
## 37373                                       Helen M. Knight School 490033000000
## 37421                                                Helper Middle 490015000000
## 37447                                        Hemmerling Elementary  60384000350
## 37458                        HEMPSTEAD ALTERNATIVE LEARNING CENTER 482292000000
## 37522                           HENDRY VIRTUAL INSTRUCTION PROGRAM 120078000000
## 37523         HENDRY VIRTUAL INSTRUCTION PROGRAM DISTRICT PROVIDED 120078000000
## 37542                Henrico Juvenile Detention Home - James River 510004000000
## 37575                                  Henry County Virtual Campus  10174002120
## 37581                             Henry Dunkerson Pathways Academy  40724003507
## 37638                               Henry L. Bonsall Family School 340264000000
## 37668                                Henry W Cowherd Middle School 170468000000
## 37731                                                  HERE'S HELP 120039000000
## 37751                                             Heritage Academy  40005300754
## 37754                                      Heritage Academy Laveen  40092603451
## 37759                                 Heritage Academy Queen Creek  40091103440
## 37790                               Heritage Elementary - Williams  40064902846
## 37795                                   Heritage Elementary School  40064903114
## 37841                                         Heritage K-8 Charter  61288011228
## 37866                                FRANKLIN EARLY CHILDHOOD CTR. 293150000000
## 37869                                              Heritage School 490072000000
## 37871                                              Heritage School 490021000000
## 37872                                              Heritage School 490114000000
## 37877                                              Heritage School 490012000000
## 37892                                              Herman E Dummer 173537000000
## 37932                                   Hermosa Montessori Charter  40011501617
## 37933                                    Hermosa Valley Elementary  61704002162
## 37934                                      Hermosa View Elementary  61704002103
## 37940                              HERNANDO COUNTY ADULT EDUCATION 120081000000
## 37941                                         HERNANDO COUNTY JAIL 120081000000
## 37947                         HERNANDO HIGH SCHOOL/ADULT EDUCATION 120081000000
## 37950                                 HERNANDO VIRTUAL INSTRUCTION 120081000000
## 37951              HERNANDO VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120081000000
## 37952                         HERNANDO VIRTUAL INSTRUCTION PROGRAM 120081000000
## 37981                                                Herriman High 490042000000
## 37982                                              Herriman School 490042000000
## 38055                   HIALEAH SENIOR HIGH ADULT EDUCATION CENTER 120039000000
## 38057                             HIALEAH-MIAMI LAKES SENIOR ADULT 120039000000
## 38127                                    Hickory Point Elem School 171785000000
## 38149                                         HIDALGO CO J J A E P 484496000000
## 38151                                         HIDALGO CO J J A E P 483104000000
## 38153                                         HIDALGO CO J J A E P 481739000000
## 38154                                         HIDALGO CO J J A E P 481806000000
## 38160                                            HIDALGO J J A E P 482310000000
## 38169                                         Hidden Hollow School 490003000000
## 38212                        High Desert Montessori Charter School 320048000000
## 38214                                     High Desert State Prison 320006000000
## 38238                                              HIGH POINT EAST 483999000000
## 38251                                            HIGH POINT SCHOOL 482115000000
## 38340                              Higher Institute of Arts & Tech 180018000000
## 38349                                             Highland Academy  60429013150
## 38427                                         Highland Free School  40027502077
## 38433                                                Highland High 490087000000
## 38453                                         Highland Junior High 490072000000
## 38522                                         Highland Park School 490087000000
## 38526                                                Highland Prep  40096603572
## 38541                                              Highland School 490003000000
## 38560                                  Highlands Community Charter  60133213830
## 38561                  HIGHLANDS COUNTY HOSPITAL/HOMEBOUND PROGRAM 120084000000
## 38562                        HIGHLANDS COUNTY SCHOOLS JAIL PROGRAM 120084000000
## 38596                            Highlands Juvenile Detention Home 510004000000
## 38607                                  HIGHLANDS VIRTUAL FRANCHISE 120084000000
## 38608                        HIGHLANDS VIRTUAL INSTRUCTION PROGRAM 120084000000
## 38609                                     HIGHLANDS VIRTUAL SCHOOL 120084000000
## 38622                                      Highmark Charter School 490016000000
## 38626                                                    HIGHPOINT 480771000000
## 38627                                                    HIGHPOINT 480945000000
## 38628                                             HIGHPOINT - DAEP 482619000000
## 38629                                               HIGHPOINT EAST 482391000000
## 38631                               HIGHPOINT SCHOOL EAST (CROSBY) 481575000000
## 38632                                 HIGHPOINT SCHOOL EAST (DAEP) 482025000000
## 38688                                            HILL CO J J A E P 482328000000
## 38690                                            HILL CO J J A E P 484572000000
## 38711                                            Hill Field School 490021000000
## 38736                                   HILLCREST EDUCATION CENTER 291827000000
## 38787                                               Hillcrest High 490014000000
## 38799                                            Hillcrest Jr High 490060000000
## 38809                                             Hillcrest School 490003000000
## 38810                                             Hillcrest School 490051000000
## 38815                                             Hillcrest School 490072000000
## 38895            HILLSBOROUGH ESE CONTRACTED RESIDENTIAL PLACEMENT 120087000000
## 38916                                             Hillsdale School 490036000000
## 38933                                          Hillside Elementary  63753013873
## 38962                                              Hillside Middle 490087000000
## 38970                                              Hillside School 490036000000
## 39085                        Hirsch Academy A Challenge Foundation  40089303382
## 39089                                                    HIS HOUSE 120039000000
## 39124                                          Hobble Creek School 490063000000
## 39138                                       Hoboken Charter School 340003000000
## 39173                                            Hoffer Elementary  60384000351
## 39213                                              Holbrook School 490021000000
## 39289                               HOLLANDALE ALTERNATIVE PROGRAM 280189000000
## 39457                                             HOLMES EDGENUITY 120090000000
## 39458                                     HOLMES VIRTUAL FRANCHISE 120090000000
## 39459                           HOLMES VIRTUAL INSTRUCTION PROGRAM 120090000000
## 39466                               Holsteiner Agricultural School  40085403249
## 39480                                                  Holt School 490021000000
## 39511                                   Home Assignments-Secondary 240012000000
## 39525                                    HOME/HOSPITAL INSTRUCTION 273384000000
## 39526                                            HOMEBASED COMP ED 483294000000
## 39534                                  Homebound Elementary School  10039001764
## 39535                                        Homebound High School  10039001765
## 39536                                            HOMEBOUND PROGRAM 120177000000
## 39585                                               Homestead High  61443001697
## 39592                                             HomeTech Charter  62982004345
## 39600                               Homewood-Flossmoor High School 171956000000
## 39636                                 Honey Run Academy Elementary  62982012238
## 39638                                          Honeydew Elementary  60003809400
## 39672                                                Hooper School 490120000000
## 39677                                  Hoosac Valley Middle School 250178000000
## 39739                                                 Hope Academy  10141001874
## 39743                                                 HOPE ACADEMY 120060000000
## 39772                                             Hope High School  10177002358
## 39775                                             Hope High School  40063603108
## 39777                                      Hope High School Online  40063603163
## 39778                                 Hope Highlands Middle School 440024000000
## 39780                        HOPE Infant-Toddler Special Education  69103014068
## 39781                            Hope Inst Lrning Acad Elem School 170993000000
## 39795                                                  Hope School  40078402933
## 39874                                                  Horace Mann  60645012591
## 39915                                           Horace Mann School 490072000000
## 39933                                              Horizon Charter  64214003557
## 39959                                          Horizon High School  10117002090
## 39961                             Horizon Honors Elementary School  40092103428
## 39962                              Horizon Honors Secondary School  40022501887
## 39976                                               Horizon School 490003000000
## 39978                                               Horizon School 490114000000
## 39979                                               Horizon School 490060000000
## 39980                            Horizon Sci Acad - Southwest Chtr 170993000000
## 40009                      Horizonte Instruction & Training Center 490087000000
## 40025                                Hornet Park Elementary School 180045000000
## 40044                           Horseshoe Trails Elementary School  40000102484
## 40065                                         HOSPITAL & HOMEBOUND 120051000000
## 40068                                           HOSPITAL HOMEBOUND 120159000000
## 40070                                           HOSPITAL HOMEBOUND 120003000000
## 40071                                           HOSPITAL HOMEBOUND 120111000000
## 40073                               HOSPITAL HOMEBOUND INSTRUCTION 120123000000
## 40074                                   HOSPITAL HOMEBOUND PROGRAM 120171000000
## 40075                                  HOSPITAL HOMEBOUND SERVICES 120018000000
## 40077                                           HOSPITAL/HOMEBOUND 120033000000
## 40078                                           HOSPITAL/HOMEBOUND 120156000000
## 40079                                           HOSPITAL/HOMEBOUND 483510000000
## 40081                                   HOSPITAL/HOMEBOUND PROGRAM 120147000000
## 40138                                   HOUSTON ALTERNATIVE SCHOOL 280201000000
## 40145                            Houston County Alternative School  10177000882
## 40146                        Houston County Area Vocational Center  10177000885
## 40243                             HOWARD LAKE WAVERLY WINSTED ECSE 270012000000
## 40253                                      Howard R. Driggs School 490036000000
## 40255                                                Howard School 220015000000
## 40354                                    Hubbard Woods Elem School 174284000000
## 40383                                       HUDSON CO  YOUTH HOUSE 340009000000
## 40402                                  HUDSON HIGH ADULT EDUCATION 120153000000
## 40421                                       HUDSON REGIONAL SCHOOL 340009000000
## 40449                                   Hufford Junior High School 172058000000
## 40520                   Humanities and Science High School - Tempe  40010802146
## 40521                      Humanities and Sciences Academy Arizona  40010803162
## 40522                Humanities and Sciences High School - Phoenix  40010701590
## 40534                                       Humboldt Adult Program 320021000000
## 40537                                          Humboldt County ROP  60010010802
## 40561      Humphreys College Academy of Business Law and Education  62703013064
## 40592                                                  Hunter High 490036000000
## 40595                                               Hunter Jr High 490036000000
## 40598                                                Hunter School 490036000000
## 40657                                            Huntington School 490027000000
## 40730                                               Hurricane High 490114000000
## 40732                                       Hurricane Intermediate 490114000000
## 40733                                             Hurricane Middle 490114000000
## 40735                                             Hurricane School 490114000000
## 40762                              HUTCHINSON MIDDLE SCHOOL A.L.C. 271497000000
## 40763                            HUTCHINSON NIGHT ALT LEARNING CTR 271497000000
## 40789                               Hyampom Arts Magnet Elementary  60001809109
## 40808                                        Hyde Park Elem School 174125000000
## 40832                        I Can Do Anything Charter High School 320048000000
## 40851                                                Ibapah School 490105000000
## 40918                         IDAHO YOUTH CHALLENGE ACADEMY SPRING 160252000000
## 41002                                   IFLAGLER-VIRTUAL FRANCHISE 120054000000
## 41005                                  IGH EARLY CHILDHOOD PROGRAM 271503000000
## 41020                                    IHSCA Charter High School 170993000000
## 41021                                     IJLA Charter High School 170993000000
## 41034                                                 iLEAD Hybrid  60000113859
## 41035                                      iLEAD Lancaster Charter  62088013037
## 41036                                                 iLEAD Online  60000114203
## 41038                                             Iles Elem School 173708000000
## 41053                             Il Mathematics & Science Academy 170010000000
## 41054                                    Illinois Park Elem School 171371000000
## 41097                                  Imagine Avondale Elementary  40078002928
## 41098                                      Imagine Avondale Middle  40080202962
## 41099                                          Imagine Bell Canyon  40037402169
## 41100                                 Imagine Camelback Elementary  40044502676
## 41101                                     Imagine Camelback Middle  40075602813
## 41109                                  Imagine Coolidge Elementary  40076602901
## 41110                               Imagine Cortez Park Elementary  40023002171
## 41111                                   Imagine Cortez Park Middle  40037602313
## 41112                               Imagine Desert West Elementary  40043802653
## 41113                                   Imagine Desert West Middle  40075402819
## 41114                                 Imagine East Mesa Elementary  40042502527
## 41115                                     Imagine East Mesa Middle  40044202683
## 41123                                        Imagine Prep Coolidge  40076902956
## 41124                                    Imagine Prep Superstition  40078302932
## 41125                                        Imagine Prep Surprise  40077002903
## 41126                                            Imagine Rosefield  40042402526
## 41139                                  Imagine Superstition Middle  40081003026
## 41140                                      Imagine Surprise Middle  40044102658
## 41141                                                Imagine Tempe  40044602659
## 41142                              Imagine West Gilbert Elementary  40027902170
## 41143                                  Imagine West Gilbert Middle  40037702314
## 41146                                               IMATER ACADEMY 120039000000
## 41186                                          Imperial Valley ROP  60010110803
## 41198                                               Incito Schools  40088503410
## 41241                                            Independence High 490081000000
## 41257                                     Independence High School 320002000000
## 41277                                             Independent Hill 510313000000
## 41301                               Indian Creek Elementary School 173597000000
## 41307                                     Indian Creek High School 173597000000
## 41310                                   Indian Creek Middle School 173597000000
## 41316                                   Indian Diggings Elementary  61824002245
## 41331                               Indian Hills Continuation High  62100002521
## 41342                                          Indian Hills Middle 490014000000
## 41344                                          Indian Hills School 490087000000
## 41395                     INDIAN RIVER VIRTUAL INSTRUCTION PROGRAM 120093000000
## 41402                                    Indian Springs Elementary  61827002246
## 41486                                 Infant and Preschool Program  62805012842
## 41488                                                   INFANT Pre  63513013249
## 41542                                       Inland Leaders Charter  64356011884
## 41545                                       INLET GROVE HIGH ADULT 120150000000
## 41574                                      Innovations High School 490087000000
## 41577                                              Innovations K-8 490087000000
## 41599                                INSIGHT SCHOOL OF OKLAHOMA HS 400079000000
## 41600                                INSIGHT SCHOOL OF OKLAHOMA MS 400079000000
## 41607                                              Inspire Charter  60000113764
## 41608                                       Inspire Charter - Kern  62382014020
## 41609                                      Inspire Charter - South  61071013913
## 41611                               Inspire Charter School - North  64290014025
## 41612                            Inspire Charter Schools - Central  64221014019
## 41616                          INSPIRED FOR EXCELLENCE ACADEMY INC 482364000000
## 41626                             INSTRUCTIONAL CENTER SYSTEM WIDE 120039000000
## 41629                                Intech Collegiate High School 490004000000
## 41633                                Integrated Day Charter School  90001000775
## 41637                                   Integrity Education Centre  40065001846
## 41640                                               Intelli-School  40036302300
## 41641                                Intelli-School - Metro Center  40036400804
## 41642                             Intelli-School - Paradise Valley  40006101742
## 41643                                      Intelli-School Glendale  40036402985
## 41644                                         Intensive DCD  - SNW 270041000000
## 41652                     Interagency Alternative Secondary Center 510126000000
## 41685                 International Commerce High School - Phoenix  40010702650
## 41686                   International Commerce High School - Tempe  40010802145
## 41704                               International Polytechnic High  69107804580
## 41716                             International School of Monterey  62553008744
## 41719                    INTERNATIONAL STUDIES CHARTER HIGH SCHOOL 120039000000
## 41720                  INTERNATIONAL STUDIES CHARTER MIDDLE SCHOOL 120039000000
## 41725                                INTERNATIONAL STUDIES VIRTUAL 120039000000
## 41735                                Intrinsic Charter High School 170993000000
## 41753                      Inyo County Special Education Preschool  69101112832
## 41792                               Ipakanni Early College Charter  61371012613
## 41847                                        Iron County Preschool 490039000000
## 41854                                          Iron Springs School 490039000000
## 41907                                           Irving Elem School 172100000000
## 42016                             IS THE ALTERNATIVE PROGRAM (TAP) 274216000000
## 42029                                     Isaac Singleton Elem Sch 172058000000
## 42040                                                Isaiah Haines 341281000000
## 42054                                                  iSchool2020  40038102866
## 42062                                                ISEAP Program 510189000000
## 42121                                         Istrouma High School 220054000000
## 42142                                  Itineris Early College High 490007000000
## 42154                          IVAN SAND AFTER SCHOOL CREDIT RECOV 271137000000
## 42157                               IVAN SAND COMMUNITY SCHOOL- IS 271137000000
## 42173                          IVY HAWN CHARTER SCHOOL OF THE ARTS 120192000000
## 42180                                              IvyTech Charter  62569012564
## 42183                                                  IYC Kewanee 170001000000
## 42252                                                    J J A E P 481818000000
## 42338                                             J. C. Montgomery  69101309227
## 42388                                    J. O. Combs Middle School  40399000320
## 42409                               J.B. Nachman Elementary School 220129000000
## 42424                         J.M. "CHICK" BUCKBEE JUVENILE CENTER 540051000000
## 42429                                            J.R. Smith School 490111000000
## 42448                                     Jack Benny Middle School 174125000000
## 42485 Jack Thoman Air and Space Academy and Performing Arts Studio  40082603207
## 42490                                              Jackling School 490036000000
## 42495                                   Jackpot Junior High School 320012000000
## 42523                           Jackson Co Juvenile Detention Cntr 180105000000
## 42525                             Jackson Correctional Institution 550004000000
## 42526                            Jackson County Alternative School  10183000888
## 42636                              Jackson River Governor's School 510006000000
## 42637                                       Jackson River Tech Ctr 510000000000
## 42644                                    JACKSON SIPP/CHILD CRISIS 120039000000
## 42652                                    JACKSON VIRTUAL FRANCHISE 120096000000
## 42653                 JACKSON VIRTUAL INSTRUCTION COURSE OFFERINGS 120096000000
## 42654                          JACKSON VIRTUAL INSTRUCTION PROGRAM 120096000000
## 42661                                       Jackson/Perry MS TAOEP 170019000000
## 42704                             Jail-Gila County Sheriffs Office  40076502958
## 42705                           Jail-Graham County Sheriffs Office  40076202955
## 42706                         Jail-Greenlee County Sheriffs Office  40077902952
## 42707                         Jail-Maricopa County Sheriffs Office  40045902575
## 42708                       Jail-Santa Cruz County Sheriffs Office  40077702937
## 42803                                         James E. Moss School 490036000000
## 42845                      JAMES H. "TIGER" MORTON JUVENILE CENTER 540051000000
## 42911                             James Madison Preparatory School  40023102021
## 42913                                         James Madison School 490072000000
## 42961                             JAMES RUMSEY TECHNICAL INSTITUTE 540006000000
## 42992                       JAMES W. MITCHELL HIGH ADULT EDUCATION 120153000000
## 43046                                           Jan Work Community  69105206046
## 43053                                      Jane Addams Elem School 173708000000
## 43163                                               JCC - LEWISTON 160002000000
## 43164                                                  JCC - NAMPA 160002000000
## 43165                                             JCC - ST ANTHONY 160002000000
## 43181                             Jean Massieu School for the Deaf 490007000000
## 43220                                            Jefferson Academy 490014000000
## 43239                                       JEFFERSON CO J J A E P 483543000000
## 43244                                      JEFFERSON CO YOUTH ACAD 483540000000
## 43245                                      JEFFERSON CO YOUTH ACAD 480967000000
## 43248                                JEFFERSON COUNTY ADULT SCHOOL 120099000000
## 43249                          JEFFERSON COUNTY ALTERNATIVE SCHOOL 280222000000
## 43250                  Jefferson County Couns And Learning CtrWest  10192001862
## 43251              Jefferson County Counseling Learning CenterEast  10192000466
## 43253                                  JEFFERSON COUNTY ESE SCHOOL 120099000000
## 43302                                        Jefferson Elem School 173267000000
## 43366                                         Jefferson Elementary  61881002276
## 43500                                      Jefferson Middle School 173708000000
## 43509                            Jefferson Preparatory High School  40080503444
## 43531                                  JEFFERSON VIRTUAL FRANCHISE 120099000000
## 43532               JEFFERSON VIRTUAL INSTRUCTION COURSE OFFERINGS 120099000000
## 43533                        JEFFERSON VIRTUAL INSTRUCTION PROGRAM 120099000000
## 43564                                  Jemison Intermediate School  10066002437
## 43637                                       Jeremy Ranch Preschool 490075000000
## 43638                                          Jeremy Ranch School 490075000000
## 43667                                      Jersey Comm High School 172043000000
## 43668                                         Illini Middle School 172043000000
## 43673                                 Jerseyville East Elem School 172043000000
## 43674                                 Jerseyville West Elem School 172043000000
## 43786                               JHW INSPIRE ACADEMY - GRANBURY 480005000000
## 43794                                          Jill Kinmont Boothe  69101100411
## 43800                                           Jim Bridger School 490036000000
## 43833                                                        JJAEP 484590000000
## 43839                                                        JJAEP 483873000000
## 43840                                                 JJAEP CAMPUS 482391000000
## 43841                                    JJAEP DISCIPLINARY SCHOOL 482619000000
## 43843                                  JJAEP-SOUTHWEST KEY PROGRAM 483025000000
## 43858                                        JOANN BRIDGES ACADEMY 120120000000
## 43909                                        Joel P. Jensen Middle 490042000000
## 43914                                            Johanna Boss High  60142207737
## 43941                                           John Adams Academy  62256012569
## 43942                         John Adams Academy - El Dorado Hills  69100614072
## 43943                                 John Adams Academy - Lincoln  64214014071
## 43945                   John Adams Early Childhood Learning Center  61111014129
## 44002                             John C Burke Correctional Center 550004000000
## 44016                                       John C. Fremont School 490036000000
## 44041                            JOHN D. ROCKEFELLER CAREER CENTER 540045000000
## 44043                                       John De La Howe School 450390000000
## 44151                                      John F. Kennedy Jr High 490036000000
## 44166                                                 John F. Land  64215012589
## 44189                                       John Gates Elem School 170468000000
## 44227                                  John Hancock Charter School 490001000000
## 44236                                              John Henry High  63255013892
## 44246                        JOHN I LEONARD ADULT EDUCATION CENTER 120150000000
## 44271               John J. Wright Educational And Cultural Center 510364000000
## 44319                                     JOHN MARSHALL ADULT PREP 540075000000
## 44347                                            John Muir Charter  69102308230
## 44393                                 JOHN POLK ALTERNATIVE SCHOOL 120171000000
## 44425                                     John S Clark Elem School 174125000000
## 44435                            John Schroder Early Childhood Ctr 172346000000
## 44557                                         JOHNSON COUNTY JJAEP 481218000000
## 44649                                 Joli Ann Leichtag Elementary  63488012201
## 44763                Jordan Academy for Technology & Careers South 490042000000
## 44764            Jordan Academy for Technology and Careers - North 490042000000
## 44766                            Jordan Center for Early Education  40497003377
## 44768                                       JORDAN EARLY CHILDHOOD 271575000000
## 44778                                                  Jordan High 490014000000
## 44781                                          Jordan Hills School 490042000000
## 44786                                          Jordan Ridge School 490042000000
## 44791                                         Jordan Valley School 490014000000
## 44829                            Joseph B. Johnson Learning Center 510236000000
## 44955                                              JOURDANTON DAEP 482496000000
## 44961                                                      Journey  60744008542
## 44993                                                    Juab High 490045000000
## 44994                                                 Juab Jr High 490045000000
## 44995                                Juan Bautista de Anza Charter  60570014156
## 45101                                               Julian Charter  61914008596
## 45145                                          Junction Elementary  61923002309
## 45174                                     Juniper Ridge Elementary  63183004912
## 45183                          JUPITER HIGH ADULT EDUCATION CENTER 120150000000
## 45188                        Jurupa Unified Pre-K Readiness Center  61926013411
## 45207                                Justin Early Learners Academy  63684013955
## 45226                                    Juvenile Detention Center 170017000000
## 45241                                  JUVENILE FEMALE SECURE UNIT 340009000000
## 45243                                         JUVENILE JUSTICE AEP 481623000000
## 45244                                         JUVENILE JUSTICE AEP 482025000000
## 45245                                 JUVENILE JUSTICE ALTERNATIVE 480001000000
## 45247                JUVENILE JUSTICE ALTERNATIVE ED PROGRAM/VENUS 484401000000
## 45249                                      Juvenile Justice Center 181029000000
## 45252                                        JUVENILE JUSTICE CTR. 291854000000
## 45255                              JUVENILE MEDIUM SECURE FACILITY 340009000000
## 45256                        JUVENILE MEDIUM SECURE FACILITY SOUTH 340009000000
## 45259                                     Juvenile Services Center 180765000000
## 45260                        JUVENILLE JUSTICE ALTERNATIVE PROGRAM 484365000000
## 45266                                      K D Waldo Middle School 170468000000
## 45314                                               Kairos Academy 490017000000
## 45316                       Kairos Public School Vacaville Academy  64059013743
## 45322        Kaizen Education Foundation dba El Dorado High School  40014901897
## 45323         Kaizen Education Foundation dba Gilbert Arts Academy  40079902943
## 45324             Kaizen Education Foundation dba Maya High School  40038901737
## 45325            Kaizen Education Foundation dba Quest High School  40038701735
## 45326 Kaizen Education Foundation dba South Pointe Elementary Scho  40022101921
## 45327           Kaizen Education Foundation dba Summit High School  40038601894
## 45328 Kaizen Education Foundation dba Vista Grove Preparatory Acad  40078702898
## 45351                                   Kaleidoscope Middle School 270036000000
## 45383                                                   Kanab High 490048000000
## 45384                                                 Kanab Middle 490048000000
## 45385                                                 Kanab School 490048000000
## 45389                                         KANDY STRIPE ACADEMY 482364000000
## 45393                                               Kane Preschool 490048000000
## 45401                                            Kanesville School 490120000000
## 45449                           Karl G. Maeser Preparatory Academy 490006000000
## 45467                                            Kashia Elementary  63234004985
## 45549                                           Kauri Sue Hamilton 490042000000
## 45550                                     Kavod Elementary Charter  63432013201
## 45558                                       Kay's Creek Elementary 490021000000
## 45562                                            Kaysville Jr High 490021000000
## 45563                                             Kaysville School 490021000000
## 45566                                           KC KIDS Pre-School  61970013511
## 45568                                                 KCISD - DAEP 482514000000
## 45591                                                  Kearns High 490036000000
## 45592                                               Kearns Jr High 490036000000
## 45646                                   Keiller Leadership Academy  63432005492
## 45706                                                        KELLY  40064003569
## 45803                                     Kendyl Depoali Preschool 320048000000
## 45907                                       Kenneth Burdett School 490007000000
## 45918                                                 DAVIS CENTER 540051000000
## 45946                                          Kenosha Pike School 550732000000
## 46044                                           Kenwood Elementary  61941002330
## 46105                                              Kern County ROP  60007510813
## 46107                                                Kern High ROC  60007610814
## 46166                                          Kewanee High School 172100000000
## 46187                                   KEY WEST COLLEGIATE SCHOOL 120132000000
## 46203                                     KEYS GATE CHARTER SCHOOL 120039000000
## 46226                           Keystone Montessori Charter School  40016501755
## 46233                Khalsa Montessori Elementary School - Phoenix  40006900826
## 46234                                                Khalsa School  40031702202
## 46289                                                KILLEEN JJAEP 482566000000
## 46375                                              Kinetic Academy  61803014050
## 46430                                                  King School 490021000000
## 46455                    Kingman Academy of Learning - High School  40007402185
## 46456            Kingman Academy of Learning - Intermediate School  40007401605
## 46457                  Kingman Academy of Learning - Middle School  40007401759
## 46458                 Kingman Academy of Learning - Primary School  40007401604
## 46468         Kings Canyon Unified School District Wide Preschools  61970013620
## 46471                                             Kings County ROP  60007710817
## 46472                                 Kings County SELPA Preschool  69101313429
## 46473                               Kings County Special Education  69101309228
## 46475                                    Kings Daughters Hosp. Ep. 510004000000
## 46476                                      Kings Elementary School 172113000000
## 46492                                            Kings Peak School 490024000000
## 46500                                         Kings Valley Academy  61989013950
## 46501                                      Kings Valley Academy II  61989014205
## 46641                                  KIPP Academy Chicago Campus 170993000000
## 46672                            KIPP Chicago Chrtrs  Bloom Campus 170993000000
## 46673                            KIPP Chicago Chrtrs - Ascend Acad 170993000000
## 46752                                             KIPP One Academy 170993000000
## 46925                                                KLEIN ROAD EL 483237000000
## 46926                                                   KLEIN SEMS 482574000000
## 46956                                          Kneeland Elementary  61998002395
## 46970                                     Knights Ferry Elementary  62001002396
## 46978                                         Knob Hill Elementary  63488009439
## 47007                                              Knowlton School 490021000000
## 47096                                            Konocti Preschool  62007013500
## 47101                                             Koosharem School 490093000000
## 47254                                                      L C Y C 481518000000
## 47256                                        L D Brady Elem School 170468000000
## 47270                                              L ISD J J A E P 482667000000
## 47303                         L.A. County High School for the Arts  69107809663
## 47324                                         La Canada Elementary  62013002407
## 47326                                               La Canada High  62013002408
## 47344                                  La Costa Meadows Elementary  63488008974
## 47427                                     Alvin M. Dunn Elementary  63488005889
## 47433                                            La Paloma Academy  40036102299
## 47434                                 La Paloma Academy (Lakeside)  40036103165
## 47435                                      La Paloma Academy-South  40036103312
## 47459                                         La Puente Valley ROP  60010310916
## 47466                                                La Sal School 490090000000
## 47477                                   La Tierra Community School  40084403285
## 47478                             La Tierra Early Childhood Center  63386013659
## 47498                                              La Vida Charter  64256011686
## 47515                                         LABELLE ADULT SCHOOL 120078000000
## 47568                                           Ladd Comm Cons Sch 172151000000
## 47580                                       Ladow Technical Center  10273001131
## 47581                                        Ladse Learning Center 172159000000
## 47583                                 LADUE EARLY CHILDHOOD CENTER 291782000000
## 47603                             Lafayette Early Childhood Center 181029000000
## 47659                                  LAFAYETTE VIRTUAL FRANCHISE 120102000000
## 47660               LAFAYETTE VIRTUAL INSTRUCTION COURSE OFFERINGS 120102000000
## 47661                   LAFAYETTE VIRTUAL INSTRUCTION K-5 FULLTIME 120102000000
## 47662                        LAFAYETTE VIRTUAL INSTRUCTION PROGRAM 120102000000
## 47682                                            Laguna Elementary  62043002457
## 47693                                          Lagunita Elementary  62049002472
## 47730                                          Lake Bluff Elem Sch 172172000000
## 47732                                     Lake Bluff Middle School 172172000000
## 47761                                   Lake Co Collaborative Alop 170019000000
## 47770                                     LAKE COUNTY ACER PROGRAM 120105000000
## 47775                                              Lake County ROP  60007810820
## 47820                                      Lake Forest High School 172178000000
## 47924                                             LAKE PARK SCHOOL 274272000000
## 47937                                      Lake Powell High School 490048000000
## 47938                                           Lake Powell School 490048000000
## 47959                                            Lake Ridge School 490036000000
## 48017                                             Lake View School 490009000000
## 48020                    LAKE VIRTUAL INSTRUCTION COURSE OFFERINGS 120105000000
## 48021                             LAKE VIRTUAL INSTRUCTION PROGRAM 120105000000
## 48022         LAKE VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120105000000
## 48034                       LAKE WORTH HIGH ADULT EDUCATION CENTER 120150000000
## 48096                                            Lakeridge Jr High 490003000000
## 48136                           Lakeside Early Advantage Preschool  62079014081
## 48187                                              Lakeside School 490021000000
## 48189                                              LAKESIDE SCHOOL 400006000000
## 48192                                         Laketown Elem School 173708000000
## 48195                                             Lakeview Academy 490004000000
## 48200                                  LAKEVIEW DROPOUT PREVENTION 120051000000
## 48275                                              LAKEVIEW SCHOOL 274272000000
## 48277                                              Lakeview School 490081000000
## 48279                                              Lakeview School 490120000000
## 48315                                          Lakewood Elementary 551509000000
## 48389                            Lamar County School Of Technology  10195000941
## 48400                                                     LAMAR EL 483237000000
## 48509                           LAND O' LAKES HIGH ADULT EDUCATION 120153000000
## 48515                                                 Lander Adult 320024000000
## 48534                                                Landmark High 490063000000
## 48594                           Langston High Continuation Program 510027000000
## 48634                                         Lanphier High School 173708000000
## 48661                        LANTANA MIDDLE ADULT EDUCATION CENTER 120150000000
## 48677                                               Lapoint School 490108000000
## 48737                                                Larsen School 490063000000
## 48748                                 Las Americas Children Center  63441013328
## 48779                                 Las Puertas Community School  40090703427
## 48786                                LaSalle County Detention Home 170019000000
## 48802                                               LASD Preschool  62265013549
## 48813                                                   Lassen ROP  60007910822
## 48835 LATIN BUILDERS ASSOCIATION CONSTRUCTION AND BUSINESS MANAGEM 120039000000
## 48863                                             Launch Preschool  63942013629
## 48945                                   Laurel Preparatory Academy  63432013681
## 48956                                          Laurel Tree Charter  60303012960
## 48987                                      Lava Ridge Intermediate 490114000000
## 49000                                             La Verkin School 490114000000
## 49040                            Lawrence County Center Technology  10204000958
## 49052                                    Lawrence Education Center 173708000000
## 49123                                                  Layton High 490021000000
## 49124                                                Layton School 490021000000
## 49126                                Laytonville Continuation High  64258000666
## 49177                                   Leadership Academy of Utah 490020000000
## 49179                                  Leadership Learning Academy 490016000000
## 49180                          Leadership Learning Academy - Ogden 490016000000
## 49192                            Leading Edge Academy at East Mesa  40039502826
## 49193                   Leading Edge Academy Gilbert Early College  40039502536
## 49194                      Leading Edge Academy Gilbert Elementary  40039502305
## 49195                                Leading Edge Academy Maricopa  40082403178
## 49196                           Leading Edge Academy Mountain View  40084503242
## 49197                                  Leading Edge Academy Online  40039503335
## 49232                                      LEARN 10 Charter School 170011000000
## 49240                            LEARN Chtr Sch 6 N Chicago Campus 170011000000
## 49247                                              Learning Bridge 320000000000
## 49255                                    Learning for Life Charter  62553010560
## 49256                                          Learning Foundation  40039703119
## 49257            Learning Foundation and Performing Arts Alta Mesa  40079602645
## 49258              Learning Foundation and Performing Arts Gilbert  40080302667
## 49259               Learning Foundation and Performing Arts Warner  40080303416
## 49262                                      Learning Institute  The  40015301902
## 49263                                   Learning Latitudes Charter  61071014103
## 49269                                      Learning Tree Preschool  61551013306
## 49353                             Lee County Career & Tech. Center 510219000000
## 49355                                          LEE CTY CORRECTIONS 350001000000
## 49429                   LEE VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120108000000
## 49430                              LEE VIRTUAL INSTRUCTION PROGRAM 120108000000
## 49480                            LEFLORE COUNTY ALTERNATIVE SCHOOL 280258000000
## 49511                                               Legacy Jr High 490021000000
## 49519                                   Legacy Preparatory Academy 490005000000
## 49523                                                Legacy School 490003000000
## 49524                                                Legacy School 490114000000
## 49526                  Legacy Traditional Charter School - Gilbert  40089903392
## 49527           Legacy Traditional Charter School - Laveen Village  40087103310
## 49529                         Legacy Traditional School - Avondale  40084703301
## 49530                      Legacy Traditional School - Casa Grande  40089203012
## 49531                         Legacy Traditional School - Chandler  40085503275
## 49533                         Legacy Traditional School - Glendale  40094803523
## 49534                         Legacy Traditional School - Maricopa  40074502856
## 49535                   Legacy Traditional School - North Chandler  40095403513
## 49536                 Legacy Traditional School - Northwest Tucson  40084203300
## 49537                           Legacy Traditional School - Peoria  40095103532
## 49538                      Legacy Traditional School - Queen Creek  40092703190
## 49539                         Legacy Traditional School - Surprise  40093303496
## 49540                                Legal Prep Academy Charter HS 170993000000
## 49557                                                    Lehi High 490003000000
## 49558                                                 Lehi Jr High 490003000000
## 49559                                                  Lehi School 490003000000
## 49591                            Leighton Hall (Dentention Center) 320021000000
## 49618                                  Leman Academy of Excellence  40094403503
## 49620               Leman Academy of Excellence-Oro Valley Arizona  40094403504
## 49621                     Leman Academy of Excellence-Sierra Vista  40094403542
## 49623                                        Leman Virtual Academy  40094403547
## 49645                                  Lemoore Middle College High  62140011607
## 49646                      Lemoore Online College Preparatory High  62140014163
## 49682            Lennox Mathematics Science and Technology Academy  62142011328
## 49726                      LEON COUNTY VIRTUAL INSTRUCTION PROGRAM 120111000000
## 49742                                         LEON VIRTUAL ACADEMY 120111000000
## 49743                  LEON VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120111000000
## 49890                                        LEVY LEARNING ACADEMY 120114000000
## 49892                                       LEVY VIRTUAL FRANCHISE 120114000000
## 49893                  LEVY VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120114000000
## 49894                             LEVY VIRTUAL INSTRUCTION PROGRAM 120114000000
## 49895         LEVY VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120114000000
## 49982                                            Lewis Opportunity  63583011807
## 50014                                              Lewiston School 490012000000
## 50039                                         Lexington Elementary  62283003491
## 50092                              Libertas Academy Charter School 250059000000
## 50097                                              LIBERTY ACADEMY 291854000000
## 50099                                         Liberty Arts Academy  40078902931
## 50223                                          Liberty High School  40009901182
## 50289                                               Liberty School 490060000000
## 50290                                               Liberty School 490087000000
## 50295                           Liberty Traditional Charter School  40019001908
## 50296              Liberty Traditional Charter School - Saddleback  40019003247
## 50303                                    LIBERTY VIRTUAL FRANCHISE 120117000000
## 50304                          LIBERTY VIRTUAL INSTRUCTION PROGRAM 120117000000
## 50305                                LIBERTY WILDERNESS CROSSROADS 120117000000
## 50315                                     Libertyville High School 172283000000
## 50355                                Life Skills Center of Arizona  40038302353
## 50366                            Life Source International Charter  62088012650
## 50368                                   Lifeline Education Charter  60132312119
## 50370                                    Lifelong Learning Academy  40039302297
## 50400                                              Lighthouse High 490015000000
## 50403                           LIGHTHOUSE LEARNING CENTER - JJAEP 481119000000
## 50465                  Limestone County Area Vocational Technology  10210000959
## 50478                                Lin-Wood Public School (High) 330426000000
## 50479                              Lin-Wood Public School (Middle) 330426000000
## 50493                                              Lincoln Academy 490002000000
## 50495                                                Lincoln Adult 320027000000
## 50522                              Lincoln County Adult Correction 320027000000
## 50561                                          Lincoln Elem School 173267000000
## 50830                                        Lincoln Magnet School 173708000000
## 50899                                               Lincoln School 490021000000
## 50901                                               Lincoln School 490012000000
## 50911                                               Lincoln School 490036000000
## 50916                                               Lincoln School 490072000000
## 50951                                    Lincoln Unified Preschool  62169014125
## 50952                                           Lincoln Elementary  62166002574
## 50965                  LINCOLN-MARTI CHARTER SCHOOL HIALEAH CAMPUS 120039000000
## 50966            LINCOLN-MARTI CHARTER SCHOOL LITTLE HAVANA CAMPUS 120039000000
## 51003                                 Linda Mar Educational Center  62046014110
## 51022                                  Lindbergh Elementary School 341236000000
## 51083                                                Lindon School 490003000000
## 51093                                               Lindsay School 173708000000
## 51196                                               Lisbon CCSD 90 170143000000
## 51203                                          Lisbon Grade School 172316000000
## 51222                           Litchfield Early Childhood Special 271821000000
## 51237                                         Litchfield Preschool  40438003450
## 51243                                       Literacy First Charter  69103010374
## 51284                                      Little Fort Elem School 174125000000
## 51321                                     Little Shasta Elementary  62196002609
## 51326                                         Little Valley School 490114000000
## 51358                                             Live Oak Charter  63023010431
## 51374                                         Live Oak Junior High 220102000000
## 51419                         Livingston Stepping Stones Preschool  62217013575
## 51459                                                LMP ROE TAOEP 170019000000
## 51461                                                   Loa School 490117000000
## 51476                                 Locke A Elem Charter Academy 170993000000
## 51502                                                 LOCKNEY DAEP 482789000000
## 51573                                 Logan Early Childhood Center 490051000000
## 51590                                                   Logan High 490051000000
## 51594                                         Logan Jr High School 173267000000
## 51613                                  Logansport Area Jnt Spec Ed 180603000000
## 51637                                    Lois T. Murray Elementary 240009000000
## 51686                                           Lomond View School 490120000000
## 51712                              Lone Mountain Elementary School  40000102344
## 51720                                               Lone Peak High 490003000000
## 51722                                             Lone Peak School 490014000000
## 51728                             LONE STAR EARLY CHILDHOOD CENTER 483237000000
## 51735                                        LONE STAR H S CENTRAL 480143000000
## 51736                                   LONE STAR H S EAST CENTRAL 480143000000
## 51737                                          LONE STAR H S NORTH 480143000000
## 51738                                          LONE STAR H S SOUTH 480143000000
## 51739                                      LONE STAR H S SOUTHEAST 480143000000
## 51740                                           LONE STAR H S WEST 480143000000
## 51741                                        LONE STAR HIGH SCHOOL 120048000000
## 51765                       Long Beach Unified School District ROP  60010810921
## 51809                                               Long Term Case  10117001631
## 51811                             Long Valley Charter - Susanville  63183014096
## 51910                                              Longview School 490060000000
## 51936                                             LOOKOUT MOUNTAIN  80028606668
## 51963                                                 LOPEZ SCHOOL 280063000000
## 52033                                LORRIE YEAGER JUVENILE CENTER 540051000000
## 52055                                       Los Angeles County ROP  60011010923
## 52063                     Los Angeles Unified School District ROCP  60010910922
## 52069                        Los Banos Special Education Preschool  62274013550
## 52092                                    Los Molinos Community Day  62286007462
## 52129                                Lost River Career Cooperative 180004000000
## 52139                               LOTT JUVENILE DETENTION CENTER 484228000000
## 52154                                   Loudoun Academy of Science 510225000000
## 52155                          Loudoun Co. Juvenile Detention Home 510004000000
## 52204                            Louise M Smith Development Center  10024001550
## 52210                                  Louise Van Meter Elementary  62283003492
## 52219                 Louisiana School for Math Science & the Arts 220002000000
## 52222                           Louisiana Special Education Center 220002000000
## 52285                                   LOVEWORKS ACADEMY FOR ARTS 270027000000
## 52375                                       LOWNDES CO VOC COMPLEX 280273000000
## 52420                                        LSU Laboratory School 220002000000
## 52433                                         LUBBOCK CO J J A E P 484044000000
## 52434                                         LUBBOCK CO J J A E P 481983000000
## 52462                                 Lucerne Valley Community Day  60001506466
## 52512                                             Ludlow Preschool  63474013589
## 52544                                       Luke Elementary School  40269000200
## 52568                                      Lumen Scholar Institute 490018000000
## 52677                                                  Lyle School 172100000000
## 52705                                                Lynbrook High  61443001698
## 52711                         Lynchburg City Secondary Alternative 510007000000
## 52713                            Lynchburg Juvenile Detention Home 510004000000
## 52714                   Lynchburg Regional Governor's STEM Academy 510234000000
## 52752                              Lynn G Haskin Elementary School 173537000000
## 52763                                    Lynne Thigpen Elem School 172058000000
## 52785                                  Lyon County Adult Education 320030000000
## 52794                                Lyon Magnet Elementary School 174125000000
## 52828                                      M J Cunningham Elem Sch 172058000000
## 52837                                          M S U at New Lisbon 340009000000
## 52847                                       M. Lynn Bennion School 490087000000
## 52875                                  Mabel O Donnell Elem School 170468000000
## 52988                          Macon County Area Vocational School  10219002353
## 52998                        Macon Regional Youth Detention Center 130003000000
## 53039                                         Mades-Johnstone RSSP 170019000000
## 53054                                   Madison Alternative Center 510267000000
## 53072                                  MADISON COUNTY ADULT CENTER 120120000000
## 53073                            Madison County Alternative School  10222000978
## 53075                       Madison County Career Technical Center  10222000984
## 53176                                        Madison Highland Prep  40090903461
## 53239                                          MADISON TAP PROGRAM 120120000000
## 53242                                    MADISON VIRTUAL FRANCHISE 120120000000
## 53243                          MADISON VIRTUAL INSTRUCTION PROGRAM 120120000000
## 53244                          MADISON VIRTUAL INSTRUCTION PROGRAM 120120000000
## 53297                                                Maeser School 490108000000
## 53314                           Maggie L. Walker Governor's School 510006000000
## 53319                                                 Magna School 490036000000
## 53341                                          Magnolia Elementary  62346003566
## 53392                          Mahler (Theresa S.) Children Center  63441013281
## 53407                                          MAHTOMEDI PRESCHOOL 271875000000
## 53461                                       Maisie E. Quinn School 440114000000
## 53472                                       Majestic Fields School 490114000000
## 53473                                              Majestic School 490042000000
## 53474                                              Majestic School 490120000000
## 53589                                  Mana Academy Charter School 490017000000
## 53620          MANATEE VIRTUAL FRANCHISE (ETECH SCHOOL OF MANATEE) 120123000000
## 53705                                    Manhattan Beach Preschool  60002513480
## 53730                                                  Manila High 490018000000
## 53733                                                Manila School 490018000000
## 53734                                                Manila School 490003000000
## 53846                                      Manson Mesa High School  40582003492
## 53862                                                   Manti High 490096000000
## 53863                                                 Manti School 490096000000
## 53922                                       Maple Creek Elementary  62373003593
## 53978                                          Maple Mountain High 490063000000
## 53985                                           Maple Ridge School 490063000000
## 54026                                         Mapleton Junior High 490063000000
## 54028                                              Mapleton School 490063000000
## 54138                                 Marcus Newcomb Middle School 341281000000
## 54154                                          Marengo High School 172457000000
## 54186                                            Margaret L Vetter 340441000000
## 54231                                     Maria Montessori Academy 490014000000
## 54252                             Maricopa Institute of Technology  40095503519
## 54264    Marie H Katzenbach Elementary/ Middle School for the Deaf 340078000000
## 54265                               Marie H Katzenbach High School 340078000000
## 54288                     Marietta Regional Youth Detention Center 130003000000
## 54296                                             Marin County ROP  60011710955
## 54301                                      Marina Childrens Center  62553013547
## 54336                                    MARION ALTERNATIVE CENTER 482910000000
## 54347                      MARION CO. ADULT & COMMUNITY ED. CENTER 540072000000
## 54357                               MARION COUNTY TECHNICAL CENTER 540072000000
## 54405                        MARION REG. JUVENILE DETENTION CENTER 120126000000
## 54414                           MARION VIRTUAL INSTRUCTION PROGRAM 120126000000
## 54416                                         MARION YOUTH ACADEMY 120126000000
## 54426                Mariposa Dual Language Academy Charter School 320048000000
## 54637                                  Marshall Alternative School  10000600986
## 54646                                   Marshall EC Voluntary PreK 271894000000
## 54683                                 Marshall High School Academy 510126000000
## 54691                                     Marshall Learning Center 271894000000
## 54721                                    Marshall Technical School  10000600987
## 54743                             MART ACADEMIC ALERNATIVE PROGRAM 482919000000
## 54765              Martha K. Glaze Regional Youth Detention Center 130003000000
## 54791                                           MARTIN COUNTY JAIL 120129000000
## 54907        Martinez Early Intervention Preschool Program (MEIPP)  62403012601
## 54946              Marvin Marshall Preschool and Children's Center  63462011080
## 54972                                           Mary B. Perry High  60142207920
## 54976                   Mary Bird Early Childhood Education Center  61336014130
## 55018                                Mary Endres Elementary School 174333000000
## 55110                                       Mary W. Jackson School 490087000000
## 55121                             Marycrest Early Childhood Center 172058000000
## 55164                                   MARYVILLE TREATMENT CENTER 290003000000
## 55166                                        Masada Charter School  40028102187
## 55187                                   MASON COUNTY CAREER CENTER 540078000000
## 55203                                            Mason Elem School 170993000000
## 55238                       Massanutten Regional Governor's School 510011000000
## 55239                                         Massanutten Tech Ctr 510001000000
## 55291                                 MATER ACADEMY AT MOUNT SINAI 120039000000
## 55298                                   MATER ACADEMY EAST CHARTER 120039000000
## 55299                       MATER ACADEMY EAST CHARTER HIGH SCHOOL 120039000000
## 55300           MATER ACADEMY HIGH SCHOOL OF INTERNATIONAL STUDIES 120039000000
## 55306                       MATER ACADEMY OF INTERNATIONAL STUDIES 120039000000
## 55307                           MATER BRICKELL PREPARATORY ACADEMY 120039000000
## 55309                             MATER EAST ACADEMY MIDDLE SCHOOL 120039000000
## 55312                                          MATER GROVE ACADEMY 120039000000
## 55314         MATER ACADEMY MIDDLE SCHOOL OF INTERNATIONAL STUDIES 120039000000
## 55317             MATER VIRTUAL ACADEMY CHARTER MIDDLE/HIGH SCHOOL 120039000000
## 55323                             Math and Science Success Academy  40078102910
## 55331                                     Matheny-Withrow Elem Sch 173708000000
## 55369                             Mattapan Early Elementary School 250279000000
## 55412                                           Mattole Elementary  60003803640
## 55413                                 Mattole Triple Junction High  60003801994
## 55414                                Mattole Valley Charter (#159)  60003807500
## 55530                                  MAY SANDS MONTESSORI SCHOOL 120132000000
## 55677                                           Mc Polin Preschool 490075000000
## 55748                                  McClellan Elementary School 172526000000
## 55754                                       McClernand Elem School 173708000000
## 55901                                       MCF - OAK PARK HEIGHTS 270027000000
## 55902                                  MCF-MOOSE LAKE/WILLOW RIVER 270027000000
## 55903                             MCF-REDWING MAGINNIS HIGH SCHOOL 270027000000
## 56099                                                McKinley PreK 271176000000
## 56102                                              Mckinley School 490009000000
## 56123                                        McKittrick Elementary  62433003653
## 56133                              McLaren (John) Children Centers  63441013456
## 56183                                              Mcmillan School 490060000000
## 56184                                    MCMILLIAN LEARNING CENTER 120051000000
## 56213                               McNaughton Correctional Center 550004000000
## 56232                                               Mcpolin School 490075000000
## 56233                                      MCPS Transitions School 240048000000
## 56243                                                  MCSO ADULTS 120126000000
## 56295                                          Meadow Brook School 490063000000
## 56337                                                Meadow School 490003000000
## 56358                                                  Meadowbrook 340441000000
## 56361                                    Meadowbrook Community Day  60016007168
## 56384                                           Meadowbrook School 490021000000
## 56419                                            Meadowlark School 490087000000
## 56428                       Meadows Arts and Technology Elementary  69104712541
## 56619                                                      MELROSE 273378000000
## 56678                                                  MEMORIAL EL 483237000000
## 56739                                       Memorial Middle School 340441000000
## 56817                                         Mendocino County ROP  60011810959
## 56838                                            Menifee Preschool  62454013619
## 56863                                         Mental Health Center  10180001653
## 56873                                  MERAMEC VALLEY EARLY CHILD. 292346000000
## 56880                                            Merced County ROP  60011910964
## 56904                     MERCER COUNTY TECHNICAL EDUCATION CENTER 540084000000
## 56918                                       MERCER REGIONAL SCHOOL 340009000000
## 56931                              Meredosia-Chambersburg Elem Sch 172568000000
## 56932                              Meredosia-Chambersburg High Sch 172568000000
## 56933                               Meredosia-Chambersburg Jr High 172568000000
## 56982                            Merit College Preparatory Academy 490013000000
## 57060                                            Mesa Arts Academy  40003300703
## 57140                                          Method Schools High  60000113853
## 57141                                           Method Schools K-8  60000113867
## 57144                                                MethodSchools  61071013762
## 57152                                            METRO DEAF SCHOOL 270003000000
## 57160                        Metro Regional Youth Detention Center 130003000000
## 57161                                Metro Richmond Alternative Ed 510009000000
## 57167                                METRO WEST DETENTION FACILITY 120039000000
## 57171                                  Metropolitan Arts Institute  40023801854
## 57198                                           Mexicayotl Academy  40015003403
## 57199                                    Mexicayotl Charter School  40015001793
## 57226                                           MIAMI ARTS CHARTER 120039000000
## 57228                      MIAMI BEACH ADULT & COMMUNITY ED CENTER 120039000000
## 57230                                           MIAMI BRIDGE NORTH 120039000000
## 57231                                           MIAMI BRIDGE SOUTH 120039000000
## 57234                       MIAMI CHILDREN'S MUSEUM CHARTER SCHOOL 120039000000
## 57238                        MIAMI CORAL PARK HIGH ADULT EDUCATION 120039000000
## 57252                         MIAMI JACKSON SENIOR ADULT ED CENTER 120039000000
## 57264                             MIAMI PALMETTO SENIOR HIGH ADULT 120039000000
## 57270                          MIAMI SENIOR ADULT EDUCATION CENTER 120039000000
## 57276                              MIAMI SPRINGS SENIOR HIGH ADULT 120039000000
## 57278                          MIAMI SUNSET ADULT EDUCATION CENTER 120039000000
## 57287                                          MIAMI YOUTH ACADEMY 120039000000
## 57288       MIAMI-DADE ONLINE ACADEMY- VIRTUAL INSTRUCTION PROGRAM 120039000000
## 57289                     MIAMI-DADE VIRTUAL HIGH SCHOOL FRANCHISE 120039000000
## 57297                                  MICANOPY MIDDLE SCHOOL INC. 120003000000
## 57298                        MICANOPY AREA COOPERATIVE SCHOOL INC. 120003000000
## 57354                          MID OHIO VALLEY TECHNICAL INSTITUTE 540111000000
## 57379                                           Midas Creek School 490042000000
## 57385                                         Middle Canyon School 490105000000
## 57420                     Middle Peninsula Juvenile Detention Home 510004000000
## 57472                                       Middlefork School RSSP 170021000000
## 57478                                      MIDDLESEX CO  YOUTH CTR 340009000000
## 57533                          Midfield Area Vocational Department  10235001381
## 57571                                               Midland School 490120000000
## 57595                                          Midtown High School  40039103074
## 57596                                       Midtown Primary School  40037001597
## 57603                                               Midvale Middle 490014000000
## 57604                                               Midvale School 490014000000
## 57609                                             Midvalley School 490014000000
## 57656                                                Midway School 490111000000
## 57665                              MIDWEST SPECIAL EDUCATION COOP. 270004000000
## 57685                                  Miguel Juarez Middle School 174125000000
## 57688                                 MIJTED - Ashfork High School  40077202974
## 57689                                  MIJTED - Bagdad High School  40077202992
## 57690                       MIJTED - Bradshaw Mountain High School  40077203006
## 57691                            MIJTED - Chino Valley High School  40077202973
## 57692                                   MIJTED - Mayer High School  40077203013
## 57694                                MIJTED - Prescott High School  40077203015
## 57695                                MIJTED - Seligman High School  40077203010
## 57696                 Mike Choate Early Childhood Education Center  61350014137
## 57778                                    Milestones Charter School  40022901918
## 57780                                  Miley Achievement Center ES 320006000000
## 57788                             Milford Grade School East Campus 170142000000
## 57791                                                 Milford High 490006000000
## 57800                                               Milford School 490006000000
## 57848                                            Mill Creek School 490036000000
## 57882                                                 Millard High 490054000000
## 57904                                         Millburn Elem School 172610000000
## 57907                                       Millburn Middle School 172610000000
## 57912                                               Millcreek High 490114000000
## 57913                                            Millcreek Jr High 490021000000
## 57925                                           Millennium Charter  60004711426
## 57927                                      Millennium Charter High  69102113148
## 57966                                          Miller Fred C. Camp  69107812732
## 57984                                           MILLER PARK CENTER 291830000000
## 57993                                         Miller Valley School  40673000567
## 58065                                             Millville School 490012000000
## 58141                          Milwaukee Secure Detention Facility 550004000000
## 58185                              MINERAL COUNTY TECHNICAL CENTER 540087000000
## 58204                                           Minersville School 490006000000
## 58205                                           Minersville School 490006000000
## 58219                        MINGO COUNTY EXTENDED LEARNING CENTER 540090000000
## 58222                                Mingus Springs Charter School  40009001066
## 58355                                        Mission Community Day  60969012716
## 58359                                   Mission Early College High  63543014067
## 58363                                           Mission Elementary  62511003725
## 58371                      Mission Heights Preparatory High School  40082303296
## 58373                                          Mission High School 320006000000
## 58383                                   Mission Montessori Academy  40021702010
## 58393                                           Mission Trails ROP  60012010972
## 58400                                          Mission Valley ROCP  60008610733
## 58405                                          Mission View Public  64251011906
## 58420                                 MISSOURI EASTERN CORR CENTER 290003000000
## 58432                                   Mitchell Child Development  63531014142
## 58489                               MKY- HEAD START /DPP PK SCHOOL 120174000000
## 58492                                            MLK A R T Program 170020000000
## 58502                          MN CORRECTIONAL FACILITY-LINO LAKES 270027000000
## 58505                           MN CORRECTIONAL FACILITY-ST. CLOUD 270027000000
## 58506                          MN CORRECTIONAL FACILITY-STILLWATER 270027000000
## 58520                                          Moab Charter School 490004000000
## 58530                                  Mobile Mental Health Center  10237001605
## 58536                                           MOVIP ELEM. SCHOOL 290061000000
## 58537                                            MOVIP HIGH SCHOOL 290061000000
## 58554                                  Modoc County Juvenile Court  69109309063
## 58555                                             Modoc County ROP  60008110966
## 58571                         Mohave Accelerated Elementary School  40041302411
## 58572                    Mohave Accelerated Elementary School East  40041302986
## 58573                           Mohave Accelerated Learning Center  40028002186
## 58600                                         Mojave River Academy  62895011739
## 58635                                                  Mona School 490045000000
## 58658                                      Monarch Learning Center  63204008636
## 58701                                     Monmouth Regional School 340009000000
## 58702                       Monmouth Transitional Education Center 340009000000
## 58707                                              Mono County ROP  60015510968
## 58741                         Monroe County Careertechnical Center  10240001094
## 58747                              MONROE COUNTY VOCATIONAL CENTER 540096000000
## 58800                             MONROE JUVENILE DETENTION CENTER 120132000000
## 58813                                                Monroe School 490093000000
## 58814                                                Monroe School 490036000000
## 58817                                     Monroe Technology Center 510225000000
## 58821                   MONROE VIRTUAL ACADEMY  (COURSE OFFERINGS) 120132000000
## 58822                                     MONROE VIRTUAL FRANCHISE 120132000000
## 58823                           MONROE VIRTUAL INSTRUCTION PROGRAM 120132000000
## 58824       MONROE VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120132000000
## 58843                                           Mont Harmon Middle 490015000000
## 58848                                             Monta Vista High  61443001699
## 58930                                           Monte Vista School 490042000000
## 58953                                                     Monterey 251104000000
## 58954                                         Monterey Bay Charter  69102111695
## 58981                                           Montessori Academy  40039902325
## 58985              Montessori Charter School of Flagstaff - Campus  40002001179
## 58987       Montessori Day Public Schools Chartered - Mountainside  40006801745
## 58988              Montessori Day Public Schools Chartered - Tempe  40006800825
## 58989                    Montessori De Santa Cruz - St. Ann's Hall  40026402084
## 58991            Montessori Education Centre Charter School - Mesa  40007200834
## 58992    Montessori Education Centre Charter School - North Campus  40007202264
## 58995                              Montessori House Charter School  40028502173
## 59000                              Montessori of Englewood Chtr ES 170993000000
## 59006                                       Montessori Schoolhouse  40012601620
## 59007                                       Montessori Schoolhouse  40012601778
## 59016                                       Montezuma Creek School 490090000000
## 59031                                           Montgomery Central 510252000000
## 59035                        Montgomery Childrens Specialty Center  10018702371
## 59038                                      MONTGOMERY CO J J A E P 483126000000
## 59076       Montgomery Preparatory Academy for Career Technologies  10243002413
## 59081                                           Monticello Academy 490005000000
## 59091                                              Monticello High 490090000000
## 59108                                            Monticello School 490090000000
## 59129                          The Montrose Early Childhood Center 341533000000
## 59158                                         Monument Valley High 490090000000
## 59205                           MOORE HAVEN ADULT EDUCATION CENTER 120066000000
## 59331                                Morgan County Learning Center  10248001526
## 59335                            Albert P Brewer Vocational School  10248001121
## 59346                                                  Morgan High 490057000000
## 59351                                                Morgan Middle 490057000000
## 59355                                             Morgan Preschool 490057000000
## 59359                                                Morgan School 490021000000
## 59360                                                Morgan School 490057000000
## 59416                                           Morningside School 490036000000
## 59421                                                Moroni School 490066000000
## 59447                                         MORRIS CO  YOUTH CTR 340009000000
## 59472                                       Morris Regional School 340009000000
## 59477                               Morris Sunset East High School 320006000000
## 59478                         Morris Transitional Education Center 340009000000
## 59482                                Morrison Alt Learning Program 170020000000
## 59489                                         Morrison High School 172671000000
## 59491                                      Morrison Jr High School 172671000000
## 59534                                   Morton Alternative Schools 170022000000
## 59564  MOSAIC DIGITAL ACADEMY PT ST. LUCIE VIRTUAL INSTRUC (COURSE 120177000000
## 59677                                       Mound Fort Junior High 490072000000
## 59716                                         MOUNT CARMEL ACADEMY 482364000000
## 59758                                           Mount Logan Middle 490051000000
## 59759                                        Mount Mahogany School 490003000000
## 59770                                      Mount Ogden Junior High 490072000000
## 59848                             MOUNT VIEW YOUTH SERVICES CENTER  80028606703
## 59861                                          Mountain Crest High 490012000000
## 59864                                          Mountain Elementary  61077001196
## 59865                                          Mountain Elementary  62607009166
## 59868                  Mountain Empire Special Education Preschool  62610013510
## 59870                                        Mountain Green School 490057000000
## 59875                                     Mountain Heights Academy 490014000000
## 59877                                                Mountain High 490021000000
## 59881                          Mountain Home Charter (Alternative)  60016010251
## 59886                                    Mountain House Elementary  62613003910
## 59901                                  Mountain Oak Charter School  40020801970
## 59917                                       Mountain Ridge Jr High 490003000000
## 59922                                        Mountain Rose Academy  40020401962
## 59924                                              Mountain School  40009601174
## 59928                                      Mountain Shadows School 490042000000
## 59933                                       Mountain Trails School 490003000000
## 59967                                     Mountain View Elementary  62622003921
## 60008                                           Mountain View High 490003000000
## 60040                                         Mountain View School 490021000000
## 60041                                         Mountain View School 490087000000
## 60043                                         Mountain View School 490009000000
## 60058                            Mountain Vista Educational Center  62334012739
## 60068                             Mountain West Montessori Academy 490018000000
## 60081                                          Mountainside School 490012000000
## 60084                           MOUNTAINVIEW CORRECTIONAL FACILITY 340009000000
## 60089                                        Mountainville Academy 490005000000
## 60098                                Moving Everest Charter School 170993000000
## 60099                                               MOVING FORWARD 270741000000
## 60113                                               MPES Preschool 490075000000
## 60118                                              MPUSD Preschool  62553014161
## 60162                                              MSED Birth to 3 270007000000
## 60254                                   Mt. Baldy Joint Elementary  62634003932
## 60255                          Mt. Burney Special Education Center  61347001537
## 60276                                            Mt. Jordan Middle 490014000000
## 60285                                            Mt. Loafer School 490063000000
## 60289                                         Mt. Nebo Junior High 490063000000
## 60300                                          Mt. Pleasant School 490066000000
## 60329                             Mountain Vista Governor's School 510011000000
## 60346                                         Mueller Park Jr High 490021000000
## 60368                                                  Muir School 490021000000
## 60375                                          Mulberry Elementary  62643003992
## 60464                                             Municipal School 490120000000
## 60517                                      Murray Adult Transition 490060000000
## 60528                                                  Murray High 490060000000
## 60558                                 Muscle Shoals Career Academy  10252001382
## 60606                                    MYDISTRICT VIRTUAL SCHOOL 120078000000
## 60658                                                 Myton School 490024000000
## 60662                                     N B Galloway Elem School 170954000000
## 60679                                         N.A. Chaderjian High  60142207739
## 60682                                N.E. COMMUNITY TREATMENT CTR. 290001000000
## 60683                               N.E. REGIONAL CORRECTION CNTR. 273009000000
## 60689        N.W.  (Northwestern) Regional Juvenile Detention Home 510004000000
## 60721                                  Namaste Elem Charter School 170993000000
## 60755                                Nantucket Intermediate School 250825000000
## 60764                                      Napa County Opportunity  69102200721
## 60765                                              Napa County ROP  60008010978
## 60768                                       Napa Preschool Program  69102212072
## 60787                                                Naples School 490108000000
## 60859                                     NASSAU COMMUNITY ACADEMY 120135000000
## 60860                                   NASSAU COUNTY ADULT SCHOOL 120135000000
## 60862                                     NASSAU VIRTUAL FRANCHISE 120135000000
## 60863                NASSAU VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120135000000
## 60864                           NASSAU VIRTUAL INSTRUCTION PROGRAM 120135000000
## 60865       NASSAU VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120135000000
## 60932                           National School District Preschool  62667014173
## 60938                          National University Academy Sparrow  62025014132
## 60940                                  NATIVE - Chinle High School  40061203129
## 60941                                  NATIVE - Ganado High School  40061203130
## 60942                         NATIVE - Monument Valley High School  40061203127
## 60943                                   NATIVE - Pinon High School  40061203128
## 60944                                NATIVE - Red Mesa High School  40061203131
## 60945                         NATIVE - Red Valley/Cove High School  40061203265
## 60946                          NATIVE - Sanders Valley High School  40061203133
## 60947                               NATIVE - Tuba City High School  40061202545
## 60948                             NATIVE - Window Rock High School  40061203132
## 60956                                              Natomas Charter  60003607250
## 60994                                         Navajo Mountain High 490090000000
## 61018                                     Navigator Pointe Academy 490003000000
## 61021                                 NAVIT - Alchesay High School  40019703169
## 61022                               NAVIT - Blue Ridge High School  40019701945
## 61023                                 NAVIT - Holbrook High School  40019703070
## 61024                              NAVIT - Joseph City High School  40019703071
## 61025               NAVIT - Mogollon High School (Heber-Overgaard)  40019701947
## 61027                                   NAVIT - Payson High School  40019703170
## 61028                             NAVIT - Round Valley High School  40019701946
## 61029                                 NAVIT - Show Low High School  40019701944
## 61030                                NAVIT - Snowflake High School  40019701943
## 61031                                NAVIT - St. Johns High School  40019703065
## 61032                                  NAVIT - Winslow High School  40019703072
## 61051                                                        NCVPS 370036000000
## 61054                                               NE Metro North 270226000000
## 61055                                              NE Metro Tartan 270226000000
## 61065                                    Neal Math Science Academy 170011000000
## 61070                    NeavesDavis Detention Center for Children  10180001375
## 61073                                Nebo Advanced Learning Center 490063000000
## 61077                                             Nebo View School 490045000000
## 61140                                       Neil Armstrong Academy 490036000000
## 61161                                                NEISD - PK4SA 483294000000
## 61222                                 Neoga Early Childhood Center 172784000000
## 61225                                                 Neola School 490024000000
## 61229                                        Neponset Grade School 172100000000
## 61270                                     Nettle Creek Elem School 172793000000
## 61284                                        Nevada City Preschool  62682013542
## 61296                            Nevada State High School Downtown 320000000000
## 61298                           Nevada State High School Summerlin 320000000000
## 61356                            Gifford St Regional Safe Sch Prog 170019000000
## 61357                                 New Berlin Elementary School 172799000000
## 61359                                       New Berlin High School 172799000000
## 61360                                    New Berlin Jr High School 172799000000
## 61369                                              NEW BOSTON DAEP 482946000000
## 61376                                          New Braintree Grade 250000000000
## 61378                                            NEW BRAUNFELS H S 483237000000
## 61379                         NEW BRAUNFELS H S NINTH GRADE CENTER 483237000000
## 61380                                         NEW BRAUNFELS MIDDLE 483237000000
## 61384                                   New Bridge Learning Center 510189000000
## 61386                                            New Bridge School 490072000000
## 61438                                                NEW DEAL DAEP 483243000000
## 61450                                                New Direction  10303001418
## 61453                                      New Directions - Geneva 170019000000
## 61455                  New Directions Alternative Education Center 510313000000
## 61456                      New Directions Alternative H.S. Program 510027000000
## 61457                                        New Directions Center 510300000000
## 61459                                       New Directions Program 170019000000
## 61463                                         NEW DOMINION ACADEMY 270345000000
## 61464           New Dominion Alternative Center/Prince William Co. 510009000000
## 61563                                             New HOPE Academy 510198000000
## 61586                               New Horizon Alternative School  10033001264
## 61588                                             New Horizon High  60384000352
## 61591                   New Horizon School for the Performing Arts  40015101747
## 61600                               New Horizons Governor's School 510218000000
## 61611                                   NEW JERSEY TRAINING SCHOOL 340009000000
## 61612                                    New Jersey Virtual School 348024000000
## 61637                          New Lisbon Correctional Institution 550004000000
## 61697                                    New Opportunities Charter  60792013732
## 61699                         New Orleans Center for Creative Arts 220004000000
## 61754                     New River Valley Juvenile Detention Home 510004000000
## 61766                                      New School for the Arts  40004300733
## 61767                        New School for the Arts Middle School  40061603094
## 61781                         New Start - Basic Alternative Center 510189000000
## 61802                            New Trier Township H S Northfield 172820000000
## 61803                              New Trier Township H S Winnetka 172820000000
## 61843                                             New West Charter  60013411208
## 61845                                 New World Educational Center  40040101866
## 61866                                               Newark CCSD 66 170143000000
## 61868                                               Newark CHSD 18 170143000000
## 61876                                    NEWARK INNOVATION ACADEMY 341134000000
## 62013                                                Newman School 490087000000
## 62051                         Newport News Juvenile Detention Home 510004000000
## 62125                                 NFL YET College Prep Academy  40005200752
## 62139                                           Nibley Park School 490087000000
## 62140                                                Nibley School 490012000000
## 62141                                                      Nicasio  62730004135
## 62144                                Nicholas A Hermes Elem School 170468000000
## 62147                      NICHOLAS COUNTY CAREER/TECHNICAL CENTER 540102000000
## 62185                                 NICKLAUS CHILDREN'S HOSPITAL 120039000000
## 62192                                               Nicolet Middle  60384003574
## 62266                                     Nippersink Middle School 170022000000
## 62267                                        NISD BEXAR COUNTY JJA 483312000000
## 62269                                                    NISD PKSA 483312000000
## 62305                                   Nkrumah Academy Charter ES 170993000000
## 62309                NM SCHOOL FOR THE BLIND AND VISUALLY IMPAIRED 350001000000
## 62310                                       NM SCHOOL FOR THE DEAF 350001000000
## 62312                 No. UT. Acad. for Math Engineering & Science 490006000000
## 62315                                         Noah Webster Academy 490005000000
## 62316                                   Noah Webster Schools- Mesa  40034001940
## 62317                                    Noah Webster Schools-Pima  40092903406
## 62339                                     Noble St Chtr - Mansueto 170993000000
## 62340                            Noble St Chtr Rauner College Prep 170993000000
## 62341                                   Noble St Chtr-Baker Campus 170993000000
## 62342                               Noble St Chtr-Butler - Crimson 170993000000
## 62343                             Noble St Chtr-Chicago Bulls Prep 170993000000
## 62344                             Noble St Chtr-Comer College Prep 170993000000
## 62345                                Noble St Chtr-DRW Trading Col 170993000000
## 62346                            Noble St Chtr-Golder College Prep 170993000000
## 62347                            Noble St Chtr-Hansberry Prep Slvr 170993000000
## 62348                                 Noble St Chtr-ITW Speer Acad 170993000000
## 62349                              Noble St Chtr-Johnson Colg Prep 170993000000
## 62350                            Noble St Chtr-Muchin College Prep 170993000000
## 62351                                   Noble St Chtr-Noble Campus 170993000000
## 62352                              Noble St Chtr-Pritzker Col Prep 170993000000
## 62353                             Noble St Chtr-Rowe-Clark MS Acad 170993000000
## 62354                              Noble St Chtr-The Noble Academy 170993000000
## 62355                               Noble St Chtr-UIC College Prep 170993000000
## 62373                            Noel C. Taylor Academy At Oakland 510330000000
## 62408                                                NON SCHOOL PK 120105000000
## 62409                       NON-ENROLLED PK EXCEPTIONAL ED PROGRAM 120084000000
## 62410                                        Non-RIS Preschool CMS  60774013468
## 62414                                    NONSCHOOL ADULT EDUCATION 120105000000
## 62415                              NONSCHOOL EXCEPTIONAL EDUCATION 120105000000
## 62445                                     Norfolk Alternative High 510267000000
## 62446                                   Norfolk Alternative Middle 510267000000
## 62450                            Norfolk Juvenile Detention Center 510004000000
## 62453                                     Norfolk Technical Center 510267000000
## 62456                                      Noriega Children Center  63441013231
## 62523                                            Norris Elementary  62745004136
## 62531                                                Norris Middle  62745008920
## 62557                     NORTH AREA ADULT EDUCATION-NIGHT PROGRAM 120015000000
## 62574                          North Baldwin Center For Technology  10027000664
## 62644                                    North Cache Middle School 490012000000
## 62678                                         NORTH CENTRAL REGION  40046302927
## 62679                                       NORTH CENTRAL REGIONAL 292110000000
## 62687                             North Chicago Community High Sch 170011000000
## 62693                                     North Clay Middle School 180084000000
## 62731                   North County Regional Occupational Program  60134312546
## 62755                                          North Davis Jr High 490021000000
## 62756                              North Davis Preparatory Academy 490007000000
## 62788                                         NORTH EAST J J A E P 483294000000
## 62803                                            North Elem School 174125000000
## 62866                               NORTH FLORIDA AVIATION ACADEMY 120036000000
## 62978                                           North Hillsborough  61719009853
## 63014                        North Kern Vocational Training Center  60007410812
## 63041                            North Lawndale Prep Chtr - Christ 170993000000
## 63042                             North Lawndale Prep Chtr-Collins 170993000000
## 63044                                         North Layton Jr High 490021000000
## 63058                             North Live Oak Elementary School 220102000000
## 63094                           NORTH MIAMI SENIOR ADULT EDUCATION 120039000000
## 63111                                          NORTH MIDDLE SCHOOL 360528000000
## 63144                                          North Ogden Jr High 490120000000
## 63145                                           North Ogden School 490120000000
## 63151                                      North Orange County ROP  60012110996
## 63152                             NORTH PANOLA ACHIEVEMENT ACADEMY 280321000000
## 63169                                       NORTH PARK HIGH SCHOOL 120039000000
## 63173                                            North Park School 490120000000
## 63174                                            North Park School 490012000000
## 63175                                            North Park School 490009000000
## 63206                                           North Point School 490003000000
## 63211                                     North Pointe Preparatory  40032702163
## 63239                                           North Region Blind 490007000000
## 63240                                            North Rich School 490084000000
## 63279                                           North Sanpete High 490066000000
## 63280                                         North Sanpete Middle 490066000000
## 63291                                            North Sevier High 490093000000
## 63292                                          North Sevier Middle 490093000000
## 63344                                           North Star Academy 490003000000
## 63363                                     North Star Online School 320048000000
## 63365                                            North Star School 490087000000
## 63379                                            North Summit High 490069000000
## 63380                                          North Summit Middle 490069000000
## 63381                                       North Summit Preschool 490069000000
## 63382                                          North Summit School 490069000000
## 63397                             NORTH TECHNICAL EDUCATION CENTER 120150000000
## 63509                                       Northeast Academy East 170019000000
## 63511                                      Northeast Academy North 170019000000
## 63519                                          NORTHEAST COMMUNITY 120156000000
## 63615                          Northeastern Nevada Virtual Academy 320012000000
## 63616                        NORTHEASTERN NM CORRECTIONAL FACILITY 350001000000
## 63622                           Northern Arizona Distance Learning  40286003506
## 63623                 Northern AZ Academy for Career Dev. - Taylor  40007700943
## 63672                                      Northern Lights Academy 270044000000
## 63674                          Northern Lights Academy Cooperative 270044000000
## 63685      Northern Neck Gov Stem Academy/Agric & Maritime Studies 510001000000
## 63686                        Northern Neck Regional Alternative Ed 510010000000
## 63687                               Northern Neck Technical Center 510001000000
## 63698                                    Northern Va. Tr. Ctr. E.P 510005000000
## 63703                    Northern Virginia Juvenile Detention Home 510004000000
## 63711                             Northfield Community Nursery Sch 173840000000
## 63741                                             Northlake School 490105000000
## 63749                                NORTHLAND LEARNING CENTER 060 270022000000
## 63756                                Northland Preparatory Academy  40009701178
## 63780                    Northpoint Expeditionary Learning Academy  40082002672
## 63802                                              Northridge High 490021000000
## 63818                                            Northridge School 490003000000
## 63821                                      Northrop Readiness Plus 273180000000
## 63822                                    Northshore Charter School 220024000000
## 63834                              Northside Early Learning Center 320003000000
## 63903                                             Northside School 172671000000
## 64038                                             Northwest Middle 490087000000
## 64095                                        WESTERN NM CORRECTION 350001000000
## 64146                                      Northwood Middle School 174333000000
## 64246                                             Nosotros Academy  40035602287
## 64284                                               Novato Charter  62772006035
## 64285                                    Novato Early Intervention  62772013229
## 64321                                          NUECES CO J J A E P 481938000000
## 64322                                          NUECES CO J J A E P 481527000000
## 64323                                          NUECES CO J J A E P 484335000000
## 64327                                           Nuestro Elementary  62775004201
## 64334                  Nueva Vista School / Arizona State Hospital  40045502588
## 64368                                       NW MO SPECL. ED. COOP. 292049000000
## 64381                                          NYE EARLY CHILDHOOD 350237000000
## 64460                                           Oak Canyon Jr High 490003000000
## 64502                                        Oak Grove Elem School 172913000000
## 64599                                             Oak Hills School 490021000000
## 64601                                            Oak Hollow School 490014000000
## 64612                                     Oak Meadow Community Day  63680507971
## 64629                                         Oak Park Elem School 170468000000
## 64646                               Oak Park Neighborhood Learning  62785013539
## 64679                                               Oak Ridge RSSP 170019000000
## 64684                                           Oak Springs School 490081000000
## 64733                                              Oakcrest School 490042000000
## 64739                                          Oakdale Elem School 174125000000
## 64753                                         Oakdale Grade School 172931000000
## 64766                                               Oakdale School 490014000000
## 64783                             Oakhill Correctional Institution 550004000000
## 64796                                      Oakland Charter Academy  62805002893
## 64797                                         Oakland Charter High  62805012041
## 64911                                              Oakridge School 490036000000
## 64913                                                OAKRUN MIDDLE 483237000000
## 64984                                               Oakwood School 490036000000
## 65028                                 Ocean Academy Charter School 340079000000
## 65030                                                    Ocean Air  61074012091
## 65046                                         OCEAN CO JUV DET CTR 340009000000
## 65056                                          Ocean Grove Charter  63474011464
## 65063                                                    OCEAN RGC 340009000000
## 65064                                        Ocean Regional School 340009000000
## 65072                                        OCEAN STUDIES CHARTER 120132000000
## 65075                                        Ocean Trans Ed Center 340009000000
## 65076                                   Ocean View Early Education  62817013219
## 65129                     Octavio V. Catto Community Family School 340264000000
## 65134                                         OCVS DIGITAL ACADEMY 120144000000
## 65136                  OCVS VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120144000000
## 65172                                              Odyssey Charter  69107808012
## 65175                                       Odyssey Charter School 490002000000
## 65186     Odyssey Institute for Advanced and International Studies  40080003317
## 65193                                               Odyssey School 490021000000
## 65194                                               Odyssey School 490072000000
## 65211                                            Ogden Elem School 170993000000
## 65214                                                   Ogden High 490072000000
## 65219                                    Ogden Preparatory Academy 490006000000
## 65220                                              Ogden Preschool 490072000000
## 65281                               OKALOOSA ONLINE NON FRANCHISED 120138000000
## 65282                                  OKALOOSA REGIONAL DETENTION 120138000000
## 65285                                   OKALOOSA VIRTUAL FRANCHISE 120138000000
## 65286              OKALOOSA VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120138000000
## 65287                         OKALOOSA VIRTUAL INSTRUCTION PROGRAM 120138000000
## 65288                                       OKALOOSA YOUTH ACADEMY 120138000000
## 65309                                 OKEECHOBEE VIRTUAL FRANCHISE 120141000000
## 65310                       OKEECHOBEE VIRTUAL INSTRUCTION PROGRAM 120141000000
## 65311                       OKEECHOBEE VIRTUAL INSTRUCTION PROGRAM 120141000000
## 65323                                OKLA. VIRTUAL CHARTER ACAD ES 400078000000
## 65324                                OKLA. VIRTUAL CHARTER ACAD HS 400078000000
## 65325                                OKLA. VIRTUAL CHARTER ACAD MS 400078000000
## 65329                                 OKLAHOMA CONNECTIONS ACAD HS 400079000000
## 65330                                 OKLAHOMA CONNECTIONS ACAD MS 400079000000
## 65333                               OKLAHOMA SCHL FOR THE BLIND ES 400008000000
## 65334                               OKLAHOMA SCHL FOR THE BLIND HS 400008000000
## 65335                                 OKLAHOMA SCHOOL FOR THE DEAF 400008000000
## 65336                                 OKLAHOMA SCHOOL FOR THE DEAF 400008000000
## 65389                                                 Old Gallinas  63509014208
## 65404                                              Old Mill School 490111000000
## 65405                                              Old Mill School 490105000000
## 65429                 Old Sturbridge Academy Charter Public School 250059000000
## 65430                                 Old Town Academy K-8 Charter  63432012786
## 65485                                       Olive Drive Elementary  62745009595
## 65559                                    Olney C Allen Elem School 170468000000
## 65575                                      Olson Elementary School 174333000000
## 65602                       OLYMPIC HEIGHTS ADULT EDUCATION CENTER 120150000000
## 65622                                                 Olympus High 490036000000
## 65623                                              Olympus Jr High 490036000000
## 65636                                     Ombudsman - Charter East  40010301583
## 65637                                  Ombudsman - Charter East II  40010302855
## 65638                                    Ombudsman - Charter Metro  40010302008
## 65639                                Ombudsman - Charter Northeast  40010302139
## 65640                                Ombudsman - Charter Northwest  40010302329
## 65641                                 Ombudsman - Charter Valencia  40010302950
## 65642                                     Ombudsman - Charter West  40010301724
## 65643                                         Ombudsman Chicago HS 170993000000
## 65644                                   Omega Alpha Academy School  40028402095
## 65687                                                  one.Charter  69103112462
## 65711                                                   ONLINE 728 271137000000
## 65712                                                Online School 490021000000
## 65755                                      Opelika Learning Center  10258002098
## 65761                                               Open Classroom 490012000000
## 65768                                  Open Doors Community School  40086803332
## 65793                    Opportunities for Learning - Baldwin Park  60369008715
## 65794                 Opportunities For Learning - Baldwin Park II  60369012018
## 65795                      Opportunities for Learning - Capistrano  60744011221
## 65796                          Opportunities for Learning - Duarte  61152013697
## 65797                   Opportunities for Learning - Santa Clarita  64251008070
## 65799                                          Opportunity Academy  10264001385
## 65800                                          Opportunity Academy  10105002426
## 65821                                Options for Youth San Gabriel  63442507165
## 65822                                      Options for Youth-Acton  60000114202
## 65823                             Options for Youth-San Bernardino  63417012457
## 65824                                   Options for Youth-San Juan  63462008578
## 65825                        Options for Youth-Victorville Charter  63697202619
## 65833                                         Oquirrh Hills Middle 490042000000
## 65834                                         Oquirrh Hills School 490036000000
## 65835                                               Oquirrh School 490042000000
## 65837                                          Oracle Ridge School  40564001311
## 65859                      Orange County Workforce Innovation High  69102414040
## 65861                                Orange Early Childhood Center 341227000000
## 65899                                     Orange Unified Pre-K SDC  62865010986
## 65905                             Orangedale Early Learning Center  40105003374
## 65919                                            Orangewood School  40906000934
## 65956                                         Orchard Hills School 490063000000
## 65980                                               Orchard School 490003000000
## 65981                                               Orchard School 490021000000
## 66018                                   Oregon Correctional Center 550004000000
## 66035                                                    Orem High 490003000000
## 66036                                                 Orem Jr High 490003000000
## 66037                                                  Orem School 490003000000
## 66044                                             Orick Elementary  62883004469
## 66049                                          Orinda Intermediate  62886004472
## 66059                                                Orion Jr High 490120000000
## 66083                                         Ormondale Elementary  63147004882
## 66089                                       ORONO DISCOVERY CENTER 272508000000
## 66186                                           Oscarson Preschool 490078000000
## 66187                                              Oscarson School 490078000000
## 66188                            OSCEOLA CENTER FOR EARLY LEARNING 120147000000
## 66220                        OSCEOLA VIRTUAL FRANCHISE (SECONDARY) 120147000000
## 66221               OSCEOLA VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120147000000
## 66222                          OSCEOLA VIRTUAL INSTRUCTION PROGRAM 120147000000
## 66228                             Oshkosh Correctional Institution 550004000000
## 66242                               Osseo ALC Alternative Programs 272520000000
## 66267                                                  Oswego GOAL 170018000000
## 66370                                          Out of State School 490114000000
## 66397                                              Overlake School 490105000000
## 66455                                       Owen Marsh Elem School 173708000000
## 66470                                      Owens Valley Elementary  62919007097
## 66471                                            Owens Valley High  62919004500
## 66496              Owyhee Junior High School (all NV & Idaho only) 320012000000
## 66509                                Oxford Area Vocational School  10263501384
## 66543               Oxford Preparatory Academy - Saddleback Valley  69102414001
## 66544             Oxford Preparatory Academy - South Orange County  60744012855
## 66558                                  OYA CHARTER MANITOU 6TH-8TH 400079000000
## 66560                                 OYA CHARTER TECUMSEH 6TH-8TH 400079000000
## 66569                                    OZARK CORRECTIONAL CENTER 290003000000
## 66592                                         P A S S LEARNING CTR 482034000000
## 66593                                         P A S S LEARNING CTR 482142000000
## 66594                                         P A S S LEARNING CTR 483702000000
## 66595                                         P A S S LEARNING CTR 481764000000
## 66601                                                        P E P 483189000000
## 66602                                                  P E P ALTER 484176000000
## 66620                                P. K. YONGE VIRTUAL FRANCHISE 120202000000
## 66631                                                         PACE 120003000000
## 66632           Program for Academic and Career Enhancement (PACE) 510189000000
## 66640                                        PACE CENTER FOR GIRLS 120039000000
## 66641                                        PACE CENTER FOR GIRLS 120153000000
## 66643                                        PACE CENTER FOR GIRLS 120081000000
## 66648                                        PACE CENTER FOR GIRLS 120192000000
## 66651                                   PACE CENTER FOR GIRLS INC. 120018000000
## 66653                                    PACE CENTER FOR GIRLS-JAX 120048000000
## 66660                                     PACE Preparatory Academy  40026602089
## 66669                        Pacific Avenue - Early Bird Preschool  61524013437
## 66681                                    Pacific Community Charter  60309008155
## 66687                                           Pacific Elementary  62934004525
## 66691                                     Pacific Heritage Academy 490016000000
## 66698                   Pacific Lodge Residential Education Center  69107812649
## 66705                                        Pacific Valley (K-12)  60003109475
## 66706                                         Pacific View Charter  62825008313
## 66747                                 Page County Technical Center 510285000000
## 66758                                           Page Middle School  40582000468
## 66775                                               Pahvant School 490093000000
## 66794                               Painted Desert Montessori  LLC  40094903520
## 66822                          Palermo Special Education Preschool  62954013463
## 66844                             Palisades Park Jr-Sr High School 341236000000
## 66852                                PALM BAY HIGH ADULT EDUCATION 120015000000
## 66855                      PALM BEACH CENTRAL HIGH ADULT EDUCATION 120150000000
## 66859               PALM BEACH GARDENS HIGH ADULT EDUCATION CENTER 120150000000
## 66871            PALM BEACH VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120150000000
## 66876                                        Palm Crest Elementary  62013009386
## 66902                             PALM SPRINGS MIDDLE SCHOOL ADULT 120150000000
## 66908                                        Palm Valley Preschool  40438003435
## 66966                                       PALMETTO YOUTH ACADEMY 120123000000
## 66967                               Palmetto Youth Academy Charter 450213000000
## 67008                                            Paloma Elementary  63488010068
## 67038                                  Pan-American Charter School  40029002177
## 67043                                 PANAMA CITY MARINE INSTITUTE 120009000000
## 67056                                               Panguitch High 490030000000
## 67057                                             Panguitch Middle 490030000000
## 67058                                             Panguitch School 490030000000
## 67063                                           Panoche Elementary  62977004635
## 67078                                              Panorama School 490114000000
## 67110                  Pappas Rehabilitation Hospital for Children 251115000000
## 67116                                         Paradigm High School 490005000000
## 67117                                   Paradise Canyon Elementary  62013002409
## 67119                                      Paradise Charter Middle  62982004403
## 67121                                    Paradise Education Center  40024102029
## 67132                                  Paradise Honors High School  40024102957
## 67138                           Paradise Unified Special Education  62982014190
## 67151                                      Paragon Science Academy  40077802902
## 67155                                            Paramount Academy  40023701925
## 67158                                 Paramount Collegiate Academy  60143213940
## 67230                                               Park City High 490075000000
## 67295                                             Park Lane School 490014000000
## 67326                                                  Park School 490063000000
## 67339                                       Park Valley Elementary 490009000000
## 67340                                        Park Valley Secondary 490009000000
## 67360                                      Park View Middle School  40020901973
## 67361                                             Park View School 490063000000
## 67366                              PARK VISTA HIGH ADULT EDUCATION 120150000000
## 67487                                              Parkside School 490060000000
## 67488                                              Parkside School 490021000000
## 67558                                              Parkview School 490087000000
## 67620                                      Parley's Park Preschool 490075000000
## 67621                                          Parleys Park School 490075000000
## 67642                                                 Parowan High 490039000000
## 67643                                               Parowan School 490039000000
## 67681                   Partnerships for Student-Centered Learning  64214012754
## 67693                                     Pasadena Rosebud Academy  62994011918
## 67703                                   PASCO HIGH ADULT EDUCATION 120153000000
## 67709                            PASCO VIRTUAL INSTRUCTION PROGRAM 120153000000
## 67715                                         Paseo Grande Charter  63324013882
## 67733                                         P A S S LEARNING CTR 483039000000
## 67743                                      Passaic Regional School 340009000000
## 67756                                  Patagonia Montessori School  40026302083
## 67773                                                 PATH ACADEMY 120039000000
## 67774                                           Pathfinder Academy  40063801796
## 67802                                     Pathways Academy Charter  60142613961
## 67803                     Pathways Academy Charter Adult Education  60000114062
## 67806                                             Pathways Charter  61662010685
## 67812                            Pathways Elementary (Alternative) 320036000000
## 67818                                        Pathways in Education  40095003508
## 67822                                     Pathways in Education HS 170993000000
## 67831                                 Pathways Program Grades 8-12 279144000000
## 67861               Patrick F. Taylor Science & Technology Academy 220084000000
## 68022                                     Paulden Community School  40081503023
## 68038                       Paulo Freire Freedom School - Downtown  40040703448
## 68039                     Paulo Freire Freedom School - University  40040702558
## 68053                                          Paw Paw Elem School 172235000000
## 68057                                    Paw Paw Jr/Sr High School 172235000000
## 68079                                                         PAWS 170019000000
## 68080                                                 PAWS Academy 170019000000
## 68113                                                  Payson High 490063000000
## 68115                                               Payson Jr High 490063000000
## 68118                                     PCJTED - Ajo High School  40075202792
## 68119                            PCJTED - Amphitheater High School  40075202793
## 68120                     PCJTED - Andrada Polytechnic High School  40075203337
## 68121                                PCJTED - Aztec Middle College  40075202776
## 68122                   PCJTED - Aztec Middle College Desert Vista  40075202868
## 68123                           PCJTED - Aztec Middle College East  40075202852
## 68124                     PCJTED - Aztec Middle College North West  40075202860
## 68125                             PCJTED - Baboquivari High School  40075202767
## 68126                          PCJTED - Canyon Del Oro High School  40075202772
## 68127                      PCJTED - Catalina Foothills High School  40075202797
## 68128                                PCJTED - Catalina High School  40075202831
## 68130                                  PCJTED - Cholla High School  40075202774
## 68131                                 PCJTED - Cienega High School  40075202807
## 68132                             PCJTED - Desert View High School  40075202773
## 68133                                  PCJTED - Empire High School  40075202830
## 68134                           PCJTED - Flowing Wells High School  40075202817
## 68135                              PCJTED - Howenstine High School  40075202847
## 68136                          PCJTED - Ironwood Ridge High School  40075202841
## 68137                                  PCJTED - Marana High School  40075202843
## 68138                           PCJTED - Mountain View High School  40075202803
## 68139                              PCJTED - Palo Verde High School  40075202809
## 68140                                        PCJTED - Project MORE  40075202877
## 68141                                  PCJTED - Pueblo High School  40075202810
## 68142                                  PCJTED - Rincon High School  40075202815
## 68143                                PCJTED - Rio Rico High School  40075203192
## 68144                                  PCJTED - Sabino High School  40075202848
## 68145                               PCJTED - Sahuarita High School  40075202839
## 68146                                 PCJTED - Sahuaro High School  40075202801
## 68147                              PCJTED - San Manuel High School  40075203319
## 68148                              PCJTED - Santa Rita High School  40075202834
## 68149                          PCJTED - Southwest Alt. High School  40075203256
## 68150                               PCJTED - Sunnyside High School  40075202828
## 68151                            PCJTED - Tanque Verde High School  40075202814
## 68152                                    PCJTED - TAPP High School  40075203322
## 68153                                  PCJTED - Tucson High School  40075202778
## 68154                              PCJTED - University High School  40075202796
## 68155                                    PCJTED - Vail High School  40075202790
## 68156                            PCJTED - Walden Grove High School  40075203258
## 68157                                  PCJTED- Nogales High School  40075203540
## 68158                                  PCJTED- Pierson High School  40075203537
## 68209                                Peak to Peak Mountain Charter  62382013690
## 68303                                Pecatonica Comm Middle School 173105000000
## 68304                                       Pecatonica Elem School 173105000000
## 68307                                       Pecatonica High School 173105000000
## 68338                                               PEEP - PREPARE  63480012730
## 68449                        Pendergast Private Alternative School  40621002968
## 68464                                  Penfield Montessori Academy 550008000000
## 68468                                               Peninsula High  63498013476
## 68474                                                 PNM-SANTA FE 350001000000
## 68501                Penn Valley Union Special Education Preschool  60142713239
## 68568                                               Pensar Academy  40094503518
## 68579                               Peoria Accelerated High School  40035301896
## 68580                                  Peoria Cty Jvnl Det Ctr 6-8 172904000000
## 68597                                              PEP - Itinerant 240048000000
## 68598                                             PEP ALTER SCHOOL 484185000000
## 68698                              PERRY COUNTY ALTERNATIVE CENTER 280357000000
## 68774                                            Pershing Co Adult 320042000000
## 68782                                         Pershing Elem School 172058000000
## 68801                              Perspectives Chtr -  IIT Campus 170993000000
## 68802                               Perspectives Chtr - HS of Tech 170993000000
## 68803                            Perspectives Chtr - Joslin Campus 170993000000
## 68804                            Perspectives Chtr - Leadership Ac 170993000000
## 68811                                         Peruvian Park School 490014000000
## 68839                                Peter J Kirksey Career Center  10168000864
## 68870                              Petersburg Regional Alternative 510008000000
## 68940                                           PHELPS GIFTED CTR. 292886000000
## 69031                                   Philo T. Farnsworth School 490036000000
## 69060                             Phoenix Advantage Charter School  40010901592
## 69064                                               Phoenix Center 510084000000
## 69066                                      Phoenix Charter Academy  64242014159
## 69068                                    Phoenix CHIC - Morton Ave  40046303237
## 69070                          Phoenix College Preparatory Academy  40061403158
## 69071                    Phoenix Collegiate Academy Charter School  40078802999
## 69072                   Phoenix Collegiate Academy Elementary  LLC  40095603505
## 69073                       Phoenix Collegiate Academy High School  40094603375
## 69096                                    Phoenix Recovery Programs 279145000000
## 69099                                               Phoenix School  10297000540
## 69100                                               PHOENIX SCHOOL 273178000000
## 69117                              Picard Community Day Elementary  60658007454
## 69153                                  Ottumwa Community Preschool 192211000000
## 69157                          PICOLATA CROSSING ELEMENTARY SCHOOL 120174000000
## 69161                                         Piedmont Alternative 510010000000
## 69170                                   Piedmont Governor's School 510010000000
## 69184                                           Piedmont Preschool  63033013442
## 69186                  Piedmont Regional Juvenile Detention Center 510004000000
## 69232                                    PIERZ ALTERNATIVE PROGRAM 272832000000
## 69244                      Pike County Alternative Learning Center  10279002155
## 69289                         Pillar Academy of Business & Finance  40042002522
## 69290                                        Pillar Academy Online  40042003277
## 69314                                  Pima County at Walden Grove  40075203539
## 69324                                 Pima County JTED Cosmetology  40075203054
## 69330                                     Pima Partnership Academy  40076802913
## 69331                                 Pima Partnership School  The  40036702303
## 69332                           Pima Prevention Partnership-Tucson  40036703531
## 69333                                            Pima Rose Academy  40083903273
## 69334                                  Pima Vocational High School  40020102069
## 69394                                           Pine Forest School  40001800496
## 69420                           Pine Grove Youth Conservation Camp  60142207486
## 69518                                               Pine View High 490114000000
## 69519                                             Pine View Middle 490114000000
## 69533                             PINECREST ACADEMY (NORTH CAMPUS) 120039000000
## 69551                                     PINECREST GLADES ACADEMY 120039000000
## 69552      PINECREST GLADES PREPARATORY ACADEMY MIDDLE HIGH SCHOOL 120039000000
## 69576                                                    PINELANDS 340009000000
## 69581                                         PINELLAS COUNTY JAIL 120156000000
## 69583                                 PINELLAS JUVENILE DET CENTER 120156000000
## 69594                                   PINELLAS VIRTUAL FRANCHISE 120156000000
## 69595              PINELLAS VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120156000000
## 69596                         PINELLAS VIRTUAL INSTRUCTION PROGRAM 120156000000
## 69688                                      Pinnacle Canyon Academy 490001000000
## 69689                                 Pinnacle Charter High School  40032102155
## 69690                                 Pinnacle Charter High School  40062502157
## 69695                           Pinnacle High School - Casa Grande  40062601886
## 69696                                 Pinnacle High School - Tempe  40062100688
## 69698                                       Pinnacle Online - WMCB  40032103565
## 69699                                  Pinnacle Online High School  40062103161
## 69701                                      Pinnacle Pointe Academy  40032702372
## 69766                                            Pioneer Headstart  61632313509
## 69774                  Pioneer High School for the Performing Arts 490016000000
## 69792                                                 Pioneer Path 170954000000
## 69794                 Pioneer Preparatory - A Challenge Foundation  40079803021
## 69802                                               Pioneer School 490036000000
## 69803                                               Pioneer School 490120000000
## 69957                     Pittsylvania Vocational-Technical Center 510294000000
## 69958                                                   Piute High 490078000000
## 69963                             Pivot Charter School - San Diego  62610012823
## 69964                            Pivot Charter School North Valley  61548013032
## 69965                             Pivot Online Charter - North Bay  62784012484
## 69970                                        PK EARLY INTERVENTION 120129000000
## 69971                                PK EARLY INTERVENTION PROGRAM 120039000000
## 69973                                                        PLACE 273381000000
## 69986                                            Plain City School 490120000000
## 70053                                                Plano CUSD 88 170143000000
## 70059                                                  PLANO JJAEP 483510000000
## 70115                          PLATTE VALLEY YOUTH SERVICES CENTER  80028606704
## 70143                         PLC Arts Academy at Scottsdale  Inc.  40084803293
## 70148                         North Sanpete Special Purpose School 490066000000
## 70157                                        Pleasant Green School 490036000000
## 70173                                          Pleasant Grove High 490003000000
## 70177                                       Pleasant Grove Jr High 490003000000
## 70240                   Pleasant Ridge Special Education Preschool  63093013599
## 70286                                                Pleasant View  62814013419
## 70351                            Plum Center For Lifelong Learning 510126000000
## 70365                                      Plumas County Community  69110210576
## 70366                                    Plumas County Opportunity  69110211706
## 70367                                            Plumas County ROP  60008311011
## 70397                                              Plymouth School 490036000000
## 70469                              Point Option Alternative School 510264000000
## 70504                                          Polaris High School  40593001421
## 70505                                          Polaris High School 490003000000
## 70524                                       POLK FULL TIME ESCHOOL 120159000000
## 70528                                  POLK PRE-COLLEGIATE ACADEMY 120159000000
## 70529                                                  Polk School 490072000000
## 70535                  POLK VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120159000000
## 70536                             POLK VIRTUAL INSTRUCTION PROGRAM 120159000000
## 70586                               POMPANO YOUTH TREATMENT CENTER 120018000000
## 70658                                          Pony Express School 490003000000
## 70674                                       Pope Valley Elementary  63138004866
## 70755                                    Port Monmouth Road School 340786000000
## 70769                                 PORT SALERNO LEARNING CENTER 120129000000
## 70808                                  Porter County Career Center 181197000000
## 70809                             Porter County Education Services 180913000000
## 70851                                          Portola Opportunity  69110208554
## 70883                                            Post HS Self-Cont 490114000000
## 70889                                       Post Secondary Program 240021000000
## 70895       POSTSECONDARY ALTERNATIVES FOR SECONDARY STUDENTS-PASS 120018000000
## 71038                                         Powhatan Voc. Center 510303000000
## 71047                     PPEP TEC - Alice S. Paul Learning Center  40008301014
## 71048               PPEP TEC - Celestino Fernandez Learning Center  40008301011
## 71049                      PPEP TEC - Cesar Chavez Learning Center  40008301016
## 71050                   PPEP TEC - Colin L. Powell Learning Center  40008301018
## 71051                        PPEP TEC - Jose Yepez Learning Center  40008301017
## 71053                    PPEP TEC - Raul H. Castro Learning Center  40008301015
## 71064                                         Prairie Care Mankato 271878000000
## 71161                                    Prairie Ridge High School 171137000000
## 71180                                         PRAIRIE VIEW ACADEMY 120003000000
## 71182                                     Prairie View Elem School 173537000000
## 71226                                        PrairieCare Maplewood 272385000000
## 71238                                         Prairiewood Elem Sch 174333000000
## 71260                                PRE-K EARLY INTERVENTION PROG 120156000000
## 71263                                       Pre-School Dev. Center 510324000000
## 71264                              PRE/K FOR SA - EAST CENTRAL ISD 481785000000
## 71267                                            Precision Academy  40039402323
## 71271                                                     PREK ESE 120069000000
## 71272                                                     PREK ESE 120036000000
## 71273                                            PREK INTERVENTION 120039000000
## 71278                                        Prekindergarten North 272124000000
## 71279                                     Prekindergarten Offsites 240051000000
## 71280                                     PREKINDERGARTEN PROGRAMS 120129000000
## 71281                                        Prekindergarten South 272124000000
## 71285                                  Premier Charter High School  40028802176
## 71337                                                    Preschool  60002713213
## 71338                                                    Preschool  62586013375
## 71339                                            Preschool (Sp Ed) 490042000000
## 71344                       Preschool Early Education Program PEEP  63099014026
## 71345                                              Preschool Grasp  69102613302
## 71368                                       Prescott Valley School  40044402321
## 71380                                           Presidio Early Ed.  63441013488
## 71384                                              Presidio School  40008101010
## 71389                              PRESSLEY RIDGE AT GRANT GARDENS 540051000000
## 71390                                PRESSLEY RIDGE AT LAUREL PARK 540051000000
## 71468                                              Primary Charter  60004711425
## 71473                                           Primavera - Online  40032903159
## 71482                    Prince Edward County Vocational Technical 510306000000
## 71491                           Prince William Juv. Detention Home 510004000000
## 71499                        PRINCETON ALTERNATIVE LEARNING CENTER 540084000000
## 71500                               Princeton Area Learning Center 273003000000
## 71507                                PRINCETON EDUCATIONAL OPTIONS 273003000000
## 71527                                     Princeton Online Academy 273003000000
## 71577                                     Programs at Park Academy 341251000000
## 71586                    Progressive Academy of Creative Education  10243002157
## 71588                                    Project Bridge/Russell Co 510009000000
## 71595                                               Project Indian 170018000000
## 71598                                 Project Renew/Northampton Co 510008000000
## 71599                                              PROJECT RESTORE 483240000000
## 71600                                              PROJECT RESTORE 482874000000
## 71602                                   Project Return/Fluvanna Co 510008000000
## 71603                                   Project Return/Powhatan Co 510008000000
## 71608                                               PROJECT SEARCH 120129000000
## 71609                                   Project Search Mayo Clinic 273180000000
## 71611                                                 Project SOAR 170019000000
## 71613                              Project Success Learning Center  10216001578
## 71614                                     Project TEACH - Atlantic 340009000000
## 71615                                   Project TEACH - Burlington 340009000000
## 71616                                     Project TEACH - Cape May 340009000000
## 71617                                       Project TEACH - Mercer 340009000000
## 71618                                     Project TEACH - Monmouth 340009000000
## 71619                                       Project TEACH - Warren 340009000000
## 71627                  Promontory School of Expeditionary Learning 490016000000
## 71669                                              Prospect School  40593000613
## 71696                                              Providence Hall 490012000000
## 71700                                            Providence School 490012000000
## 71715                                        Provo Adult Education 490081000000
## 71716                                                Provo eSchool 490081000000
## 71717                                                   Provo High 490081000000
## 71718                                           Provo Peaks School 490081000000
## 71719                                               Provost School 490081000000
## 72527        Pulaski County Public Schools Governor's STEM Academy 510315000000
## 72555                                         Pulley Career Center 510126000000
## 72606                             PUTNAM CAREER & TECHNICAL CENTER 540120000000
## 72618                          PUTNAM COUNTY EXCEPTIONAL EDUCATION 120162000000
## 72637                                     PUTNAM VIRTUAL FRANCHISE 120162000000
## 72638                           PUTNAM VIRTUAL INSTRUCTION PROGRAM 120162000000
## 72639       PUTNAM VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120162000000
## 72651                                             PVHS AOI Program  40553003246
## 72671                                          Quail Hollow School 490014000000
## 72684                                         Quailwood Elementary  61470007722
## 72695                                          Quander Road School 510126000000
## 72756                                                Quest Academy 490013000000
## 72762                      Gates - Alternative High School Program 510364000000
## 72814                                   QUITMAN ALTERNATIVE SCHOOL 280378000000
## 72922                                     R. Roger Rowe Elementary  63174004910
## 72923                                         R. Roger Rowe Middle  63174004911
## 72959                              Racine Correctional Institution 550004000000
## 72980                                             RAES East Alt Ed 170019000000
## 72981                                            RAES Night School 170019000000
## 72983                                                    RAES West 170019000000
## 72986                      Rafael Cordero Molina Elementary School 340264000000
## 72991                               Rafer Johnson Childrens Center  60363000316
## 73021                                              Rainbow Springs  62580012835
## 73095                       RALPH R WILLIS CAREER/TECHNICAL CENTER 540069000000
## 73146                            Ramona Head Start/State Preschool  62769013602
## 73180                                        Ranch View Elementary  62622010302
## 73185                                              Ranches Academy 490006000000
## 73220                                    Rancho Santa Fe Preschool  40438003424
## 73300                                    RANDOLPH TECHNICAL CENTER 540126000000
## 73303                     RandolphRoanoke Career Technology Center  10285001387
## 73304                     RandolphRoanoke Career Technology Center  10282001139
## 73355                         Rappahannock Juvenile Detention Home 510004000000
## 73356                                               Raptor Program 279135000000
## 73395                          Ravenswood Child Development Center  63186014093
## 73437                                        Ray JR/SR High School  40685000576
## 73473                                           Raymond Elementary 551248000000
## 73489                                     Raymond J. Fisher Middle  62283003495
## 73527                              RCB College Preparatory Academy  40097003546
## 73528                                     RCB Medical Arts Academy  40027402020
## 73537                                                        REACH  63618012469
## 73551                                REACH ST. LOUIS DAY TREATMENT 290001000000
## 73554                       Reaching Individual Student Excellence 341812000000
## 73573                                               Reading School 490021000000
## 73582                                               Reagan Academy 490003000000
## 73601                                          Reagan Pre-k School 173267000000
## 73603                           Real Salt Lake Academy High School 490020000000
## 73604                                          Real Special Ed Ctr 510324000000
## 73643                                      Red Bluff Community Day  63198007464
## 73656                                             Red Cliff School 490045000000
## 73676                                             Red Hills Middle 490093000000
## 73688                            RED LAKE EC SPECIAL EDUCATION EXT 273051000000
## 73712                                          Red Mountain School 490114000000
## 73781                                   Redding School of the Arts  60945014024
## 73782                                         Redding STEM Academy  69103713960
## 73790                            Redgranite Correctional Institute 550004000000
## 73792                            Redirection Alternative Education 510282000000
## 73816                                             REDUCED SERVICES 120042000000
## 73846                                               Redwood School 490036000000
## 73862                                              Reed Elementary  63216004976
## 73901                            Reef-Sunset Primary Community Day  63227008000
## 73908                                                  Rees School 490063000000
## 73927            Regional Alternative Education Center/Buena Vista 510025000000
## 73928               Reg Alternative Plus Self Project/Roanoke City 510008000000
## 73931                             Reg'l Learning Center Star Boone 170017000000
## 73933                            Reg'l Safe School Program ROE #28 170017000000
## 73954                         Regional Alternative Ed/King William 510009000000
## 73955                          Regional Alternative Ed/Stafford Co 510009000000
## 73956                                  Regional Alternative School 170017000000
## 73957                                  Regional Alternative School 348024000000
## 73958                          Regional Alternative/Pittslvania Co 510008000000
## 73959                                Regional Alternative/Wythe Co 510009000000
## 73965                                          Regional Day School 348020000000
## 73968                            Regional Learning Academy/Wise Co 510010000000
## 73971                                  Regional/Alternative Center 510366000000
## 73988               Reid Traditional Schools' Painted Rock Academy  40085003341
## 73989                     Reid Traditional Schools' Valley Academy  40003400707
## 74028                                          Renaissance Academy 490004000000
## 74032                                          Renaissance Academy 490021000000
## 74068                                            Renaissance Court  69101407934
## 74094                                         Renaissance/Scott Co 510008000000
## 74122                                          Renu Hope Preschool  60384013269
## 74159                                         RESIDENTIAL SERVICES 120036000000
## 74161                               Resiliency Preparatory Academy 250483000000
## 74198                          Reyes Maria Ruiz Leadership Academy  40089502450
## 74199                            Reymouth Special Education Center  61389008576
## 74294                                                    Rich High 490084000000
## 74298                                           Rich Middle School 490084000000
## 74300                                               Rich Preschool 490084000000
## 74369                                      RICHARD MILBURN ACADEMY 120192000000
## 74414                                     Richardson Middle School 170993000000
## 74432                                               RICHEY ACADEMY 484122000000
## 74444                                               Richfield High 490093000000
## 74447                                          Richfield Preschool 490093000000
## 74462           RICHLAND COLLEGIATE H S OF MATH SCIENCE ENGINEERIN 480027000000
## 74476                                          Richland Elementary  63488005890
## 74511                                Richmond Acceleration Program 510324000000
## 74515                                     Richmond Charter Academy  63255013164
## 74516                    Richmond Charter Elementary-Benito Juarez  63255013753
## 74522                              Richmond County Learning Center 510327000000
## 74529                                          Richmond Elementary  63252005005
## 74531                                          Richmond Elementary 550813000000
## 74538                                        Richmond Grade School 170022000000
## 74552                                        Richmond Hospital Ep. 510004000000
## 74554                             Richmond Juvenile Detention Home 510004000000
## 74558                                    RICHMOND PERRINE OPTIMIST 120039000000
## 74562                                    Richmond Technical Center 510324000000
## 74563                                  Richmond-Burton High School 173351000000
## 74634                                    RIDGE TEEN PARENT PROGRAM 120159000000
## 74659                                            Ridgecrest School 490014000000
## 74676                                      Ridgeline Academy  Inc.  40003100689
## 74677                                        Ridgeline High School 490012000000
## 74680                                             Ridgeline School 490003000000
## 74681                                          Ridgely Elem School 173708000000
## 74751                               RIDGEWOOD HIGH ADULT EDUCATION 120153000000
## 74784                                       Riley Comm Cons School 173375000000
## 74800                                                 Riley School 490087000000
## 74805                                               Rillito Center  40068000030
## 74809                                                  Rim Virtual  63261013953
## 74912                                         RIO VISTA HEAD START 483870000000
## 74940                              Ripley-Ohio-Dearborn Sp Ed Coop 180013000000
## 74993                                        Rising Sun Montessori  60627013748
## 75052                       RIVER CITY SCIENCE ACADEMY AT MANDARIN 120048000000
## 75053                 RIVER CITY SCIENCE ACADEMY INNOVATION SCHOOL 120048000000
## 75078                                         River Heights School 490012000000
## 75084                          River Montessori Elementary Charter  62832012549
## 75087                                           River Oaks Academy  69104712801
## 75109                             RIVER RIDGE HIGH ADULT EDUCATION 120153000000
## 75122                                            River Rock School 490003000000
## 75141                                         River Valley Charter  62079007308
## 75194                                               Riverbend Prep  40078602885
## 75213                                        Riverdale Elem School 173393000000
## 75237                                      Riverdale Middle School 173393000000
## 75241                                             Riverdale School 490120000000
## 75244                                     Riverdale Sr High School 173393000000
## 75268                                           Rivers Edge School 490042000000
## 75272                                                    RIVERSIDE 273178000000
## 75283                            Riverside Alternative High School 220005000000
## 75295                                         Riverside County ROP  60009411035
## 75400                                          Riverside Preschool 490051000000
## 75407                                             Riverside School 490042000000
## 75408                                             Riverside School 490114000000
## 75421                                Riverside Youth Corr Facil El 300009000000
## 75422                                Riverside Youth Corr Facil HS 300009000000
## 75429                                                Riverton High 490042000000
## 75439                                              Riverton School 490042000000
## 75483                                            Riverview Jr High 490060000000
## 75499                                             Riverview School 490063000000
## 75500                                             Riverview School 490003000000
## 75530                                     RLCC ELEMENTARY AT OKLEE 270039000000
## 75536                 Road to Success Academy at Campus Kilpatrick  69107812802
## 75545                                 ROANE-JACKSON VO-TECH CENTER 540054000000
## 75554                             Roanoke Valley Governor's School 510218000000
## 75555                       Roanoke Valley Juvenile Detention Home 510004000000
## 75563                        Rob Reiner Children & Families Center  63018013280
## 75581                                ROBBINSDALE SHARED TIME PROG. 273178000000
## 75637                                Robert E Abbott Middle School 174125000000
## 75694                                          Robert Frost School 490036000000
## 75725                                          Robert Janss School 160002000000
## 75745                              ROBERT L. SHELL JUVENILE CENTER 540051000000
## 75922                                              Robla Preschool  63324013464
## 75976                                           Rock Canyon School 490081000000
## 76028                                         Rock River Challenge 170020000000
## 76076                                                Rockdale RYDC 130003000000
## 76137                                              Rocklin Academy  60001308762
## 76138                             Rocklin Academy at Meyers Street  60001312012
## 76139                                      Rocklin Academy Gateway  62712013641
## 76174                                 Rockwell Charter High School 490013000000
## 76226                                       Rocky Mountain Jr High 490120000000
## 76227                                        Rocky Mountain Middle 490111000000
## 76235                                        Rocky Mountain School 490003000000
## 76239                                          Rocky Point Charter  61495011927
## 76257                                                   ROCORI ALC 270944000000
## 76286                                ROE Adult Learning Ctr Jersey 170017000000
## 76287                              ROE Adult Learning Ctr Macoupin 170017000000
## 76288                              ROE Alternative Prog of Lake Co 170019000000
## 76291                            ROE20 Learning Alternative Branch 170018000000
## 76405                                         ROLLA TECHNICAL CTR. 292689000000
## 76435                                       Rolling Meadows School 490036000000
## 76488                      NORTHERN REG. JUVENILE DETENTION CENTER 540051000000
## 76530                                          Rondout Elem School 173462000000
## 76670                                            Roosevelt Jr High 490024000000
## 76683                      ROOSEVELT MIDDLE ADULT EDUCATION CENTER 120150000000
## 76703                                             Roosevelt School 490036000000
## 76704                                             Roosevelt School 490120000000
## 76721                                    Roots Charter High School 490018000000
## 76728                                                   ROP Center  62271012158
## 76771                                              Rosamond School 490042000000
## 76793                                            Rose Creek School 490042000000
## 76795                                      Rose E Krug Elem School 170468000000
## 76820                                             Rose Park School 490087000000
## 76824                                          Rose Springs School 490105000000
## 76849                                             Rosecrest School 490036000000
## 76996                                          Ross Valley Charter  60144414064
## 77018                                          ROSWELL CORRECTIONS 350001000000
## 77091                                  Rowanty Vocational Tech Ctr 510001000000
## 77094                                              Rowe Elementary 170993000000
## 77111                                Rowland Unified Community Day  63375005918
## 77151                                                     Roy High 490120000000
## 77156                                                  Roy Jr High 490120000000
## 77167                                                   Roy School 490120000000
## 77194                                  ROYAL PALM BEACH HIGH ADULT 120150000000
## 77218                                           ROYALS RSSP Macomb 170019000000
## 77242                                              RSD High School  40065603223
## 77264                               Ruben Yancy Alternative School  10306201590
## 77417                                          Russell County Voc. 510342000000
## 77448                         Russellville City Career Tech Center  10291002435
## 77612                                    S. William Abel Community  69100407491
## 77625                                  S.T.A.R. DAY TREATMENT CTR. 290001000000
## 77651                                          SABIS International  40018502147
## 77656                                                  SACA Online  40025403420
## 77683                                        Sacramento County ROP  60009511083
## 77686                                    Sacramento Valley Charter  64158012962
## 77696                                 Saddleback Elementary School  40472002922
## 77698                                         Saddleback Preschool  40472003396
## 77731                                                 Sage Academy  40074802870
## 77733                                                  Sage Canyon  61074008591
## 77738                                            Sage Creek School 490063000000
## 77745                                            Sage Hills School 490003000000
## 77831                                        Saints Guided Studies 273354000000
## 77833                                              SAISD - PK 4 SA 483873000000
## 77892                                             Salem Hills High 490063000000
## 77894                                            Salem Junior High 490063000000
## 77903                                                 Salem School 490063000000
## 77928                                                Salina School 490093000000
## 77972                                           Sally Mauro School 490015000000
## 78005                                       Salt Lake Arts Academy 490002000000
## 78006                       Salt Lake Center for Science Education 490012000000
## 78008                                         Salt Lake Head Start 490087000000
## 78009                     Salt Lake School for the Performing Arts 490005000000
## 78010                      Salt River Accelerated Learning Academy  40004703031
## 78011                                       Salt River High School  40004700744
## 78066                                   SAM PERDUE JUVENILE CENTER 540051000000
## 78095                                              SAMSULA ACADEMY 120192000000
## 78160                                              San Antonio ROP  60011410927
## 78168          San Benito County Regional Special Education Center  69102814074
## 78176                                    San Bernardino County ROP  60013211117
## 78179                           San Carlos Charter Learning Center  63429004029
## 78183                        San Carlos Student Services Preschool  63429013091
## 78193                                         San Diego County ROP  60013811406
## 78198                           San Diego Neighborhood Homeschools  62610012408
## 78202                                            San Diego Virtual  62610012767
## 78203                          San Diego Workforce Innovation High  60570014037
## 78217                                     San Francisco County ROP  60013911410
## 78228                 San Jacinto Early Childhood Education Center  63444013260
## 78243                         San Joaquin Building Futures Academy  69103112662
## 78245                                      San Joaquin County ROCP  60014011424
## 78255                                             SAN JOSE ACADEMY 120048000000
## 78263                             SAN JOSE PREPARATORY HIGH SCHOOL 120048000000
## 78265                            San Jose Valley Continuation High  60004206527
## 78272                                                San Juan High 490090000000
## 78279                                San Lorenzo Unified Preschool  63471014128
## 78296                                        San Marcos Elementary  63488005892
## 78306                                         San Mateo County ROP  60014211433
## 78311            San Mateo-Foster City Special Education Preschool  63492013289
## 78312                                                   San Miguel  62922007809
## 78313                                   San Miguel Children Center  63441013548
## 78332                                 San Pedro Valley High School  40021202444
## 78340                                     San Rafael Middle School 490027000000
## 78346                                       San Salvador Preschool  60939014182
## 78348                                       San Tan Charter School  40077502916
## 78351                                   San Tan Heights Elementary  40292003079
## 78399                                           Sand Ridge Jr High 490120000000
## 78400                           Sand Ridge Secure Treatment Center 550004000000
## 78405                                          Sand Springs School 490021000000
## 78408                                         Sandburg Elem School 173708000000
## 78436                 Sandersville Regional Youth Detention Center 130003000000
## 78482                                             Sandstone School 490114000000
## 78492                               Sandwich Community High School 173537000000
## 78494                                       Sandwich Middle School 173537000000
## 78522                                                 Sandy School 490014000000
## 78570                                               Sanhedrin High  64256006971
## 78584                               Santa Barbara County Community  69103410658
## 78585                          Santa Barbara County Juvenile Court  69103409249
## 78586                               Santa Barbara County ROP-North  60013311440
## 78587                               Santa Barbara County ROP-South  60013311439
## 78588                       Santa Barbara County Special Education  69103407192
## 78591                        Santa Barbara Unified Early Childhood  60141414138
## 78595                                 Santa Clara County ROP-South  60013711459
## 78597                                       Santa Clara Elementary  63549006057
## 78601                                           Santa Clara School 490114000000
## 78603                           Santa Clarita Valley International  64251012191
## 78606                 Santa Cruz County Career Advancement Charter  69103614200
## 78609                                        Santa Cruz County ROP  60014311465
## 78652                                             SANTA MARIA DAEP 483933000000
## 78663                                Santa Monica-Malibu Preschool  63570014126
## 78670                                             Santa Rita Pre-K  63579014170
## 78671                                           Santa Rosa Academy  62454011023
## 78685                SANTA ROSA ONLINE VIRTUAL INSTRUCTION PROGRAM 120165000000
## 78686                                         Santa Rosa Preschool  40472003378
## 78689                                 SANTA ROSA VIRTUAL FRANCHISE 120165000000
## 78690              SANTA ROSA VIRTUAL INSTRUCTION COURSE OFFERINGS 120165000000
## 78699                                    Santa Ynez Valley Charter  60933010398
## 78702                       SANTALUCES HIGH ADULT EDUCATION CENTER 120150000000
## 78708                                             Santaquin School 490063000000
## 78744                                      Sara M. Gilmore Academy 341638000000
## 78787              SARASOTA VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120168000000
## 78788                         SARASOTA VIRTUAL INSTRUCTION PROGRAM 120168000000
## 78797                                       Saratoga Shores School 490003000000
## 78841                                    Sator Sanchez Elem School 172058000000
## 78842                                        Satori Charter School  40040902406
## 78908                     Savannah Regional Youth Detention Center 130003000000
## 78926                                     Sawtooth Ridge Community  69105213701
## 78955                 SC Governor's School for Arts and Humanities 450390000000
## 78956             SC Governor's School for Science and Mathematics 450391000000
## 78963                                     SCALE Leadership Academy  60000113793
## 79001                                            Scera Park School 490003000000
## 79055                                              Scholar Academy 490017000000
## 79162                                        School Dist 133 Annex 173090000000
## 79249                                SCHOOL OF SUCCESS ACADEMY-SOS 120048000000
## 79257                          School of Universal Learning (SOUL)  69103014069
## 79413                     Scott County Career and Technical Center 510348000000
## 79443                                     Scott M Matheson Jr High 490036000000
## 79478                                Scottsdale Country Day School  40087903400
## 79484                                        SCPS CONSEQUENCE UNIT 120171000000
## 79485                                SCPS EARLY LEARNING COALITION 120171000000
## 79544                                     SEACOAST CHARTER ACADEMY 120048000000
## 79545                                      Seacoast Charter School 330003000000
## 79573                                                  SEAPCO RISE 170023000000
## 79582                                   SEASIDE CHARTER K-8 SCHOOL 120048000000
## 79583                             SEASIDE COMMUNITY CHARTER SCHOOL 120048000000
## 79610                               Sebastopol Independent Charter  63618005457
## 79634                             SECONDARY ADULT AND COMMUNITY ED 120150000000
## 79638                                 Secondary Head Start Centers 510126000000
## 79644                         SECONDARY STUDENT SUCCESS CENTER 801 120039000000
## 79645                         SECONDARY STUDENT SUCCESS CENTER 802 120039000000
## 79646                         SECONDARY STUDENT SUCCESS CENTER 803 120039000000
## 79647                         SECONDARY STUDENT SUCCESS CENTER-804 120039000000
## 79672                                        Sedona Charter School  40008901063
## 79673                                  Sedona Integrated Preschool  40973302219
## 79681                                                     SEELE EL 483237000000
## 79689                                             Sego Lily School 490003000000
## 79698                                             Seiad Elementary  63624006181
## 79700                                       SEIDEL LEARNING CENTER 483873000000
## 79722                             Select Community Day (Secondary)  62250011291
## 79723                             Self Development Academy-Phoenix  40093403493
## 79724                              Self Development Charter School  40023202022
## 79770                             SEMINOLE COUNTY DETENTION CENTER 120171000000
## 79789                          SEMINOLE RIDGE COMMUNITY HIGH ADULT 120150000000
## 79795                  SEMINOLE VIRTUAL INSTRUCTION PROGRAM (SVIP) 120171000000
## 79817                                            Seneca Elementary 551347000000
## 79825                                                  Seneca High 551347000000
## 79834                                           Seneca Junior High 551347000000
## 79850                                                       SENOPS 271426000000
## 79864       Sequoia Choice School Arizona Distance Learning School  40015701728
## 79875                                    Sequoia Elementary School  40024402153
## 79887                                      Sequoia Pathway Academy  40090403048
## 79889                                     Sequoia Secondary School  40024401855
## 79891                                  Sequoia Village High School  40024603028
## 79892                                       Sequoia Village School  40024601856
## 79894                                                     SEQUOYAH 350002000000
## 79942                                                 Serv By Appt 490003000000
## 79945                                                  SESE School 170031000000
## 79946                                                        Sespe  61380014162
## 79959                                     Settlement Canyon School 490105000000
## 79974                            Seven Hills Prep Academy Lower El 270028000000
## 80014                                     Sevick Special Education  60681011752
## 80015                 Sevier Career and Technical Education Center 490093000000
## 80073                                              Shabonee School 171785000000
## 80104                                         Shadow Valley School 490072000000
## 80225                                Sharon Early Childhood Center 251062000000
## 80241                                                Sharon School 490003000000
## 80273                                       Shasta Charter Academy  63660008391
## 80286                                           Shasta-Trinity ROP  60012511468
## 80443                                               Shelley School 490003000000
## 80474                                            Shenandoah Valley  69100113745
## 80477                          Shenandoah Valley Governor's School 510003000000
## 80479                    Shenandoah Valley Juvenile Detention Home 510004000000
## 80480                 Shenandoah Valley Reg Alternative Ed/Genesis 510010000000
## 80569                                   SHERIFF'S DETENTION CENTER 120153000000
## 80570                                        SHERIFF'S YOUTH VILLA 120159000000
## 80603                                       Sherman Thomas Charter  62334011160
## 80604                                  Sherman Thomas Charter High  62334012209
## 80605                                  Sherman Thomas STEM Academy  62334014101
## 80615                                                     Sherwood  64256008208
## 80653                                          Sherwood Montessori  60837012750
## 80752                    Shonto Preparatory Technology High School  40015401770
## 80789                                 Shoshone High (Continuation)  61068007981
## 80834                                        SIATech Academy South  60000113829
## 80835                                          SIATECH GAINESVILLE 120003000000
## 80885                     Sierra Academy of Expeditionary Learning  62688012922
## 80889                                     Sierra Bonita Elementary 490063000000
## 80891                              Sierra County Special Education  69112008098
## 80892                                               Sierra Del Oro  62910013250
## 80893                               Sierra Early Education Program  69105214150
## 80900                                Sierra Expeditionary Learning  63877012628
## 80920                             Sierra Madre High (Continuation)  60000901478
## 80928                                    Sierra Montessori Academy  69102311840
## 80929                         Sierra Nevada Academy Charter School 320048000000
## 80944                                Sierra Vista Education Center  63680013291
## 80969                                          Sierra Vista Online  40146003524
## 80990                                       SIGSBEE CHARTER SCHOOL 120132000000
## 80991                                           Sigwalt CLS Center 170417000000
## 81005                    Silicon Valley Career Technical Education  60013511457
## 81039                                          Silver Crest School 490042000000
## 81041                                       Silver Fork Elementary  63681006244
## 81048                                          Silver Hills School 490036000000
## 81067                                           Silver Mesa School 490014000000
## 81093                                        Silver Summit Academy 490099000000
## 81094                                         Silver Summit School 490099000000
## 81149                                          Simon Youth Academy 341804000000
## 81217                                          Siskiyou County ROP  60012711472
## 81306                                                  Sky Islands  40077102899
## 81307                                         Sky Mountain Charter  60001511860
## 81314                                                Sky View High 490012000000
## 81328                                                   Skyline D5  40080102941
## 81346                                                 Skyline High 490036000000
## 81359                                     Skyline Prep High School  40024302030
## 81364                                         Skyridge High School 490003000000
## 81376                                          Skyview High School  40038801736
## 81384                                               Skyview School  40009301086
## 81401                                                 Slate Canyon 490081000000
## 81411                           Slater Special Education Preschool  62628013301
## 81434                                     Sleepy Hollow Elementary  62886004473
## 81621                       Smyth County Career & Technical Center 510352000000
## 81653                                             Snow Canyon High 490114000000
## 81654                                           Snow Canyon Middle 490114000000
## 81665                                            Snow Horse School 490021000000
## 81669                                          Snow Springs School 490003000000
## 81670                                            Snowcrest Jr High 490120000000
## 81681                                             Snowville School 490009000000
## 81702                                                         SOAR 270002000000
## 81709                                                     SOAR CTR 482364000000
## 81761                                Soldier Hollow Charter School 490001000000
## 81771                                     Soledad Preschool Center  63705013613
## 81772                                    Soledad Transition Center  63705012813
## 81778                                                         SOLO 274074000000
## 81817                                         SOMERSET ACADEMY BAY 120039000000
## 81818                           SOMERSET ACADEMY BAY MIDDLE SCHOOL 120039000000
## 81848                                   SOMERSET ACADEMY HOLLYWOOD 120018000000
## 81854                     SOMERSET ACADEMY-ELEMENTARY EAGLE CAMPUS 120048000000
## 81855                         SOMERSET ACADEMY-MIDDLE EAGLE CAMPUS 120048000000
## 81857                                        SOMERSET ARTS ACADEMY 120039000000
## 81882                                        SOMERSET OAKS ACADEMY 120039000000
## 81894                                     SOMERSET VIRTUAL ACADEMY 120039000000
## 81917                 Sonoma County Alternative Education Programs  69104010682
## 81918                                          Sonoma County Court  69104009253
## 81919                                            Sonoma County ROP  60012911485
## 81920                              Sonoma County Special Education  69104007225
## 81938                                        Sonoran Desert School  40019201910
## 81941                           Sonoran Science Academy - Broadway  40077402934
## 81942                      Sonoran Science Academy - Davis Monthan  40080702976
## 81943                            Sonoran Science Academy - Phoenix  40077602387
## 81944                             Sonoran Science Academy - Tucson  40022302199
## 81945                               Sonoran Science Academy-Peoria  40082203221
## 81978                                       Sossaman Middle School  40378003401
## 82019                     SOUTH AREA ADULT EDUCATION-NIGHT PROGRAM 120015000000
## 82029                          South Baldwin Center For Technology  10027000665
## 82053                               SOUTH BRANCH VOCATIONAL SCHOOL 540036000000
## 82064             SOUTH BRONX EARLY COLLEGE ACADEMY CHARTER SCHOOL 360113000000
## 82078                                    South Cache Middle School 490012000000
## 82096                               SOUTH CENTRAL CORRECTIONAL CTR 290003000000
## 82123                                      South Clearfield School 490021000000
## 82125                                     South Coast Continuation  63123007331
## 82138                                   South County Community Day  63694011805
## 82159                                          South Davis Jr High 490021000000
## 82186                                               South Egremont 251104000000
## 82297                              South Grove Intermediate School 180045000000
## 82353                                           South Hills Middle 490042000000
## 82355                                           South Hillsborough  61719002174
## 82372                                      South Jetty High School 410004000000
## 82376                                          South Jordan Middle 490042000000
## 82377                                          South Jordan School 490042000000
## 82381                                          South Kearns School 490036000000
## 82472                           South Mountain Preparatory Academy  40088203409
## 82487                                          South Ogden Jr High 490120000000
## 82497                                           South Park Academy 490014000000
## 82525                          South Phoenix Prep and Arts Academy  40085303297
## 82548                                     South Pointe High School  40061803095
## 82549                              South Pointe Junior High School  40022702017
## 82575                                            South Region Deaf 490007000000
## 82576                                            South Rich School 490084000000
## 82581                                      South Ridge High School  40044702671
## 82606                       South Sanpete Education Support Center 490096000000
## 82618                                            South Sevier High 490093000000
## 82619                                          South Sevier Middle 490093000000
## 82677                                            South Summit High 490099000000
## 82678                                          South Summit Middle 490099000000
## 82679                                       South Summit Preschool 490099000000
## 82680                                          South Summit School 490099000000
## 82683                                         South Sutter Charter  62380011518
## 82694                              SOUTH TECHNICAL ADULT EDUCATION 120150000000
## 82717                            South Valley Prep and Arts School  40084603245
## 82718                                          South Valley School 490042000000
## 82742                                           South Weber School 490021000000
## 82752                                South Wilmington Grade School 173684000000
## 82787                                               Southeast Area 251115000000
## 82788                             Southeast Area Elementary School 170993000000
## 82793                                SOUTHEAST CORRECTIONAL CENTER 290003000000
## 82848                                             SOUTHEAST REGION  40046302900
## 82877                                    Southeastern Va Tr Ctr Ep 510006000000
## 82880                       Southern Arizona Community High School  40025402074
## 82888                                      Southern California ROC  60010710920
## 82928                                  Southern Humboldt Community  69100910795
## 82949                                       SOUTHERN NM CORRECTION 350001000000
## 82958                                                 SOUTHERN RGC 340009000000
## 82967                                    Southern View Elem School 173708000000
## 82975                                            Southgate Academy  40025902080
## 82996                                             Southland School 490042000000
## 83016                                       Southpointe Adult High 490042000000
## 83040                                          SOUTHSIDE ALTER CTR 484092000000
## 83041                            Southside Alternative High School 220005000000
## 83045                                   Southside Community School  40031802203
## 83058                                         Southside Elementary  63765006379
## 83096                      Southside L.I.N.K. Project/Brunswick Co 510009000000
## 83107                                             Southside School 172671000000
## 83111                                    Southside Va Training Ctr 510005000000
## 83142                                Southwest Educational Academy 490039000000
## 83179                                               Southwest High 490114000000
## 83189                                        SOUTHWEST KEY PROGRAM 482967000000
## 83192                                 Southwest Leadership Academy  40088003398
## 83199           SOUTHWEST MIAMI ADULT & COMMUNITY EDUCATION CENTER 120039000000
## 83223                                             SOUTHWEST REGION  40046302924
## 83233                         Southwest Virginia Governor's School 510217000000
## 83254                      Southwestern Va Mental Health Institute 510005000000
## 83255                                    Southwestern Va Tr Ctr Ep 510006000000
## 83288                                                  SP ED CO-OP 480000000000
## 83297                                                  Spain Rehab  10192001574
## 83305                                            Spanish Fork High 490063000000
## 83306                                         Spanish Fork Jr High 490063000000
## 83313                                          Spanish Oaks School 490063000000
## 83315                           SPANISH RIVER HIGH ADULT EDUCATION 120150000000
## 83322                                                Spark Charter  69103513854
## 83337                                  Sparks Integrated Preschool 320048000000
## 83387                                              Spec. Educ. ATC 490072000000
## 83389                                         Special Ed Preschool 490014000000
## 83393                                        SPECIAL ED-NON PUBLIC 271125000000
## 83395                                             SPECIAL ED. N.P. 271104000000
## 83398                                            Special Education 274227000000
## 83408                                 Special Education Pre-School  63667014088
## 83409                                  Special Education Preschool  60861014135
## 83410                                  Special Education Preschool  62199013374
## 83411                                  Special Education Preschool  61968013451
## 83412                              Special Education Preschool DIS  62169013335
## 83416                   Special Education-Infant/Preschool Program  62271012837
## 83417                           Special Education-Preschool-Laurel  61674013405
## 83419                                   SPECIAL PROG CTR/J J A E P 480834000000
## 83425                                             SPECIAL SERVICES 273300000000
## 83430                                             SPECIAL SERVICES 482855000000
## 83436                                       Spectrum Academy - NSL 490004000000
## 83437                            Spectrum Academy - Pleasant Grove 490004000000
## 83446                               SPEECH PROGRAM - SP ED PROGRAM 272295000000
## 83485                                    Spencer Valley Elementary  63768006380
## 83527                                    SPOFFORD TREATMENT CENTER 291434000000
## 83549 SPORTS LEADERSHIP AND MANAGEMENT (SLAM) CHARTER MIDDLE SCHOO 120039000000
## 83550 SPORTS LEADERSHIP AND MANAGEMENT (SLAM) MIDDLE SCHOOL - NORT 120039000000
## 83555               SPORTS LEADERSHIP OF MIAMI CHARTER HIGH SCHOOL 120039000000
## 83562                     Spotsylvania Career and Technical Center 510364000000
## 83589                                           Spring City School 490066000000
## 83615                                   Spring Creek Middle School 490012000000
## 83617                                          Spring Creek School 490081000000
## 83621                           SPRING CREEK YOUTH SERVICES CENTER  80028606705
## 83644                               Spring Grove Elementary School 170022000000
## 83675                                      Spring Hill Opportunity  69109000651
## 83693                                           Spring Lake School 490063000000
## 83694                                    SPRING LAKE YOUTH ACADEMY 120042000000
## 83695                                           Spring Lane School 490036000000
## 83774                                            Springdale School 490114000000
## 83775                               SPRINGER CORRECTIONAL FACILITY 350001000000
## 83781                              Springfield Ball Charter School 173708000000
## 83783                                    Springfield Community Day  60948008428
## 83805                                      Springfield High School 173708000000
## 83816                                 Springfield Learning Academy 173708000000
## 83835                               Springfield Southeast High Sch 173708000000
## 83841                               Springfield Vocational Academy 251113000000
## 83867                                            Springside School 490003000000
## 83886                                             Springville High 490063000000
## 83888                                          Springville Jr High 490063000000
## 83912                                            Sprucewood School 490014000000
## 83927                                     Squaw Valley Preparatory  62712013495
## 83947                             St Clair Co Juv Detention Center 171332000000
## 83957                          ST CLOUD HOSPITAL PROGS-RESIDENTIAL 273351000000
## 83958                                 St Croix Correctional Center 550004000000
## 83995                         ST JOHNS COUNTY JUVENILE RESIDENTIAL 120174000000
## 84024                               St Marys Adolescent Ed Program 170020000000
## 84061               ST. AUGUSTINE PUBLIC MONTESSORI SCHOOL (SAPMS) 120174000000
## 84094                                           St. George Academy 490019000000
## 84100                             St. Helena Early Learning Center 220147000000
## 84121                                   ST. JOHNS COMMUNITY CAMPUS 120174000000
## 84122                                  ST. JOHNS COUNTY JAIL (DJJ) 120174000000
## 84128                                  ST. JOHNS VIRTUAL FRANCHISE 120174000000
## 84129                    ST. JOHNS VIRTUAL INSTRUCTION PROGRAM K-8 120174000000
## 84130                      ST. JOHNS VIRTUAL INSTRUCTIONAL PROGRAM 120174000000
## 84132                                ST. LOUIS CHILDREN'S HOSPITAL 292928000000
## 84135                                 ST. LOUIS PARK MIDDLE SCHOOL 273378000000
## 84138               ST. LUCIE COUNTY SCHOOL BOARD-JAIL PROGRAM-ESE 120177000000
## 84141                        ST. LUCIE VIRTUAL INSTRUCTION PROGRAM 120177000000
## 84289                             Stanley Correctional Institution 550004000000
## 84314                                               Stansbury High 490105000000
## 84315                                        Stansbury Park School 490105000000
## 84316                                             Stansbury School 490036000000
## 84364                                          STAR Charter School  40021302100
## 84381                                              Star Transition 490021000000
## 84414                  Starmont Middle School Comm School District 192727000000
## 84442                                            StarShine Academy  40041602374
## 84521                                 STEDY- Antelope HS Satellite  40092003470
## 84524                          STEDY- Cibola High School Satellite  40092003469
## 84525                                   STEDY- Desert View Academy  40092003574
## 84526                               STEDY- Gila Ridge HS Satellite  40092003488
## 84527                                     STEDY- Kofa HS Satellite  40092003481
## 84528                                 STEDY- San Luis HS Satellite  40092003486
## 84529                                    STEDY- Vista HS Satellite  40092003465
## 84530                                     STEDY- Yuma HS Satellite  40092003473
## 84535                                           Steel City Academy 180017000000
## 84591                                        STEM - Health Academy 510042000000
## 84599                             STEM for LIFE Governor's Academy 510342000000
## 84624                                               STEP UP SCHOOL  40004003343
## 84679                                      Stepping Stones Academy  40018701906
## 84684                               Steptoe Valley Adult Education 320051000000
## 84717                                              Sterling School 490105000000
## 84791                                    Steward Elementary School 173780000000
## 84822                                               Stewart School 490021000000
## 84857                            STILLWATER DIST. SPECIAL SERVICES 273819000000
## 84910                         Stockton (Commodore) Children Center  63441013621
## 84912                 Stockton Collegiate International Elementary  63801012451
## 84913                  Stockton Collegiate International Secondary  63801012547
## 84940                                                 Stone Bridge  62664010975
## 85144                                            Stratford Program 510027000000
## 85152                                     Strathmore Community Day  63813010702
## 85280                                         STUBBLEFIELD LRN CTR 482855000000
## 85282                                         STUBBLEFIELD LRN CTR 481350000000
## 85283                                         STUBBLEFIELD LRN CTR 481704000000
## 85289                                            Studebaker Center 181029000000
## 85292                                           STUDENT ALTER PROG 483486000000
## 85295                                   Student Choice High School  40027303184
## 85296                                   Student Choice High School  40027302013
## 85301                               STUDENT SERV./SPECIAL PROGRAMS 120141000000
## 85305                                         STUDENT SERVICES/ESE 120126000000
## 85353                                              SUCCESS Academy 170019000000
## 85356                                              SUCCESS ACADEMY 482913000000
## 85357                                              Success Academy 170019000000
## 85362                                              Success Academy  10270002414
## 85365                                          Success Academy 4-5 170019000000
## 85398                                           Success Academy HS 170019000000
## 85399                                        Success Academy Lewis  40012001811
## 85400                                   Success Academy Perryville  40012001644
## 85402                                 Success Academy Tucson Adult  40012001643
## 85403                                         Success Academy Yuma  40012001642
## 85404                                                  Success DSU 490004000000
## 85412                                              Success Program 270033000000
## 85413                                                  Success SUU 490004000000
## 85435              Sue Sossaman Early Childhood Development Center  40378003361
## 85534                  Sulphur Springs Special Education Consortia  63822014133
## 85589                                   Summit Academy - Bluffdale 490007000000
## 85590                               Summit Academy - Draper Campus 490007000000
## 85591                                Summit Academy - Independence 490007000000
## 85606                                   Summit Academy High School 490015000000
## 85630                                            Summit Elementary  60243014022
## 85642                                                  Summit High 490003000000
## 85660                        Summit Leadership Academy-High Desert  60001411118
## 85688                                                Summit School 490012000000
## 85689                                                Summit School 320006000000
## 85692                                             Summit Secondary  60243014032
## 85697                                                  Summit View 490120000000
## 85733                                   SUMTER COUNTY ADULT CENTER 120180000000
## 85738                    SUMTER COUNTY VIRTUAL INSTRUCTION PROGRAM 120180000000
## 85741                                     SUMTER VIRTUAL FRANCHISE 120180000000
## 85757                                    Sun Valley Charter School  40079302984
## 85768                                       Sun Valley High School  40035401733
## 85785                         SUNCOAST HIGH ADULT EDUCATION CENTER 120150000000
## 85790     SUNCOAST TECHNICAL EDUCATIONAL CENTER - EXTENSION CAMPUS 120081000000
## 85791          SUNCOAST TECHNICAL EDUCATIONAL CENTER - MAIN CAMPUS 120081000000
## 85795                                              Suncrest School 490003000000
## 85831                                 SUNLAKE HIGH ADULT EDUCATION 120153000000
## 85969                                           Sunrise Pre-School  62970013461
## 85970                                            Sunrise Preschool 490081000000
## 85971                                   Sunrise Ridge Intermediate 490114000000
## 85973                                               Sunrise School 490014000000
## 85974                                               Sunrise School 490012000000
## 86024                                               Sunset Jr High 490021000000
## 86049                                          Sunset Ridge Middle 490042000000
## 86051                                                Sunset School 490021000000
## 86052                                                Sunset School 490114000000
## 86065                                           Sunset View School 490081000000
## 86067                                              SUNSHINE CENTER 291548000000
## 86081                                             SUPERIOR ACADEMY 271104000000
## 86096                      Superstition Mountain Elementary School  40079000042
## 86101       Superintendent's Region 8 Gov's Health/Science Academy 510108000000
## 86180                                    Sussex Orthopedic Program 100153000000
## 86205                                  Sutter Peak Charter Academy  62775013958
## 86233                                   SUWANNEE VIRTUAL FRANCHISE 120183000000
## 86234                         SUWANNEE VIRTUAL INSTRUCTION PROGRAM 120183000000
## 86235                                      SUWANNEE VIRTUAL SCHOOL 120183000000
## 86254                                     SW Metro Online Learning 270042000000
## 86342                                  Sweetwater Community School  40593003431
## 86438                                               Sycamore Ridge  61074011753
## 86494                                        Synergy Public School  40096403553
## 86498                             Syracuse Arts Academy - Antelope 490004000000
## 86499                                Syracuse Arts Academy - North 490004000000
## 86503                                                Syracuse High 490021000000
## 86504                                             Syracuse Jr High 490021000000
## 86506                                              Syracuse School 490021000000
## 86511                                               SySTEM Phoenix  40092303453
## 86522                                   T E Culbertson Elem School 172058000000
## 86533               T J Loftiss II Regional Youth Detention Center 130003000000
## 86570                                            T.H. Bell Jr High 490120000000
## 86584                                                 Tabiona High 490024000000
## 86585                                               Tabiona School 490024000000
## 86593                                       TAC ALTERNATIVE SCHOOL 280288000000
## 86616                                       Taft Elementary School 172058000000
## 86640                                              Taft Union High  63873006511
## 86691                            Talladega Career Technical Center  10315001390
## 86693                              Talladega County Genesis School  10318001206
## 86781                                                TAP PK BABIES 120051000000
## 86782                                                        TAPBI  40834002583
## 86788                                        TAPP CHILDCARE CENTER 120171000000
## 86827                                         TARRANT CO J J A E P 481770000000
## 86828                                         TARRANT CO J J A E P 481591000000
## 86829                                         TARRANT CO J J A E P 481302000000
## 86831                                         TARRANT CO J J A E P 481023000000
## 86832                                         TARRANT CO J J A E P 480870000000
## 86834                                         TARRANT CO J J A E P 482406000000
## 86835                                         TARRANT CO J J A E P 482526000000
## 86839                                         TARRANT COUNTY JJAEP 483318000000
## 86892                         Taylion High Desert Academy/Adelanto  60171013723
## 86893                                    Taylion San Diego Academy  64071013696
## 86898                                         Taylor Canyon School 490072000000
## 86906                                TAYLOR COUNTY LEARNING CENTER 480744000000
## 86917                              TAYLOR COUNTY VOCATIONAL CENTER 540138000000
## 86966                                                Taylor School 490063000000
## 86967                                                Taylor School 490021000000
## 86970                                     TAYLOR VIRTUAL FRANCHISE 120186000000
## 86971                           TAYLOR VIRTUAL INSTRUCTION PROGRAM 120186000000
## 86984                                            Taylorsville High 490036000000
## 86985                                          Taylorsville School 490036000000
## 86991                    Tazewell County Career & Technical Center 510381000000
## 87055                          Technical Education & Career Center 510027000000
## 87058                                  Technical & Career Ed. Ctr. 510384000000
## 87061                                   TECHNICAL EDUCATION CENTER 540093000000
## 87097                                       TEEN PARENT INDIANTOWN 120129000000
## 87099                                       TEEN PARENT PROGRAM PK 120072000000
## 87101                                       TEENAGE PARENT PROGRAM 120039000000
## 87107                                            Tehama County ROP  60014611524
## 87125                                          Telesis Preparatory  40024803089
## 87126                                  Telesis Preparatory Academy  40024801923
## 87127                Telfair Alternative Preparation School (TAPS) 130483000000
## 87148                               Temecula International Academy  69102614131
## 87151                                         Temecula Preparatory  60002808564
## 87152                                      Temecula Valley Charter  60002803648
## 87158                                    Tempe Preparatory Academy  40007000831
## 87243                                                Terra Academy 490018000000
## 87251                                           Terra Linda School 490042000000
## 87284                      Terrell Regional Youth Detention Center 130003000000
## 87331                                         TEXAS CITY J J A E P 484251000000
## 87332                         TEXAS CONNECTIONS ACADEMY AT HOUSTON 482364000000
## 87341                                  TEXAS ONLINE PREPARATORY EL 482403000000
## 87342                                 TEXAS ONLINE PREPARATORY H S 482403000000
## 87343                              TEXAS ONLINE PREPARATORY MIDDLE 482403000000
## 87346                                   TEXAS SCHOOL FOR THE BLIND 480025000000
## 87347                                    TEXAS SCHOOL FOR THE DEAF 480025000000
## 87401                               THE ACADEMY AT YOUTH CARE LANE 120084000000
## 87407             The Academy of International Studies at Rosemont 510267000000
## 87430                                                   THE BRIDGE 271104000000
## 87447           The Center for Creativity Innovation and Discovery 490019000000
## 87456                                           THE CHILES ACADEMY 120192000000
## 87457                                                     The City  62271013899
## 87465                     The College and Career Academy at Pruden 510371000000
## 87487            THE DOVE (DEVELOPING OPPORTUNITIES THRU VOC. ED.) 120096000000
## 87501                             Etowah County Alternative School  10138000849
## 87505                                THE EXCEL CENTER (FOR ADULTS) 480145000000
## 87511                       The Farm at Mission Montessori Academy  40090203413
## 87519                                        The Georgetown School 510183000000
## 87521                              The Gloria Dusek Compass School  40046102582
## 87523                      The Governor's School @ Innovation Park 510025000000
## 87525                                        The Grande Innovation  40095303527
## 87532                 The Hanover Center For Trades And Technology 510183000000
## 87535                                          The Heights Charter  61071013185
## 87542                                       The Innovation Academy  40068003517
## 87555                              The Judy Jester Learning Center  10204000777
## 87570          THE LEARNING CENTER AT THE ELS CENTER OF EXCELLENCE 120150000000
## 87590                                    THE NBISD LEARNING CENTER 483237000000
## 87603                              The Odyssey Preparatory Academy  40080003211
## 87604               The Odyssey Preparatory Academy - Sienna Hills  40080003368
## 87605                     The Odyssey Preparatory Academy Goodyear  40080003288
## 87608                                                  THE OUTPOST 120189000000
## 87611                         The Paideia Academy of South Phoenix  40086303355
## 87617                                              The Peak School  40035002286
## 87618                               The Pell Annex @ John F. Kenne 440072000000
## 87623                                THE PHOENIX PROGRAM-IMMOKALEE 120033000000
## 87636                                     THE READING EDGE ACADEMY 120192000000
## 87639              The Regional Community Alternative Ed Continuum 510008000000
## 87640                                      The Renaissance Academy 510384000000
## 87648                                            The Rising School  40088903459
## 87662                                     THE SEED SCHOOL OF MIAMI 120039000000
## 87663                                            The Shelby School  40021401980
## 87664                                            The Skokie School 174284000000
## 87676                                          The T.E.C.H. Center 510271000000
## 87749                                 Therapeutic Academic Program  10162001650
## 87752                                  THERAPEUTIC LEARNING CENTER 120174000000
## 87775                      Thirteen Acres Special Education Center 510324000000
## 87828                                  Thomas E. Mathews Community  69104811993
## 87832                                        Thomas Edison - North 490002000000
## 87833                                        Thomas Edison - South 490002000000
## 87880                                 Thomas Jefferson Elem School 172058000000
## 87915                                     Thomas Jefferson Jr High 490036000000
## 87931                               Thomas Jefferson Middle School 174125000000
## 87963                                       Thomas O. Smith School 490072000000
## 87997                                     Thomas W. Bacchus School 490036000000
## 88027                                 Thompson Correctional Center 550004000000
## 88044                                Thompson Instructional Center 172058000000
## 88153                                           Three Falls School 490114000000
## 88164                                      Three Mile Creek School 490009000000
## 88171                                            Three Oaks School 170873000000
## 88172                                       Three Peaks Pre School 490039000000
## 88173                                           Three Peaks School 490039000000
## 88191                                          Three Rivers School 170954000000
## 88212                                         Thunder Ridge School 490003000000
## 88265                                                     TIA East  40037302936
## 88266                                                     TIA West  40037302889
## 88281               Tidewater Juvenile Detention Home - Chesapeake 510004000000
## 88283                    Tidewater Regional Alternative Ed Project 510007000000
## 88314                                                TIGER ACADEMY 120048000000
## 88394                                            Timberline Middle 490003000000
## 88418                                           Timpanogos Academy 490002000000
## 88419                                              Timpanogos High 490003000000
## 88420                                     Timpanogos Middle School 490111000000
## 88421                                            Timpanogos School 490081000000
## 88423                                                Timpview High 490081000000
## 88445                                                  Tintic High 490102000000
## 88446                                             Tintic Preschool 490102000000
## 88449                                              TIOGA Community  69105213710
## 88500                            TITLE I MIGRANT EDUCATION PROGRAM 120039000000
## 88509                                          TL Faulkner  School  10237001083
## 88586                                                Tolleson #206  40852002975
## 88590                                                Tolman School 490021000000
## 88595                                        Toltecali High School  40038202331
## 88640                                     TOMBALL J J A E P CAMPUS 484296000000
## 88672                                       Tonaquint Intermediate 490114000000
## 88706                             Tooele Community Learning Center 490105000000
## 88707                                                  Tooele High 490105000000
## 88708                                               Tooele Jr High 490105000000
## 88709                                            Tooele Online K-8 490105000000
## 88753                                               Toro Preschool  64161013503
## 88760                                                 Torrey Hills  61074010627
## 88893                                          Trailside Preschool 490075000000
## 88894                                             Trailside School 490075000000
## 88918                                              Transition Plus 271167000000
## 88926                                            TRANSITION SCHOOL 120159000000
## 88928                   Transition Support Resource Center/Fairfax 510008000000
## 88931                                                  TRANSITIONS 273381000000
## 88932                                              TRANSITIONS 110 274146000000
## 88957                                     Traverse Mountain School 490003000000
## 88966                                          TRAVIS CO J J A E P 483483000000
## 88969                                      TRAVIS COUNTY J J A E P 480894000000
## 89013                             Treasure Mtn. Junior High School 490075000000
## 89016                   TREASURE VILLAGE MONTESSORI CHARTER SCHOOL 120132000000
## 89023                           Tree of Life International Charter  60768000736
## 89025                                      Treeside Charter School 490019000000
## 89065                                 Trenton Psychiatric Hospital 340009000000
## 89069                                        Tres Pinos Elementary  63969006601
## 89105                                               Tri-Cities ROP  60010610919
## 89106                            Tri-City College Prep High School  40021101975
## 89107                                         Tri-City Elem School 173945000000
## 89108                                         Tri-City High School 173945000000
## 89109                                      Tri-City Jr High School 173945000000
## 89130                                               Tri-County ROP  60014511522
## 89153                                               Tri-Valley ROP  60008410731
## 89210                                     Trinity County Community  69104413934
## 89211                                 Trinity County Juvenile Hall  69104410444
## 89212                             Trinity County Special Education  69104407233
## 89247                                    Triplett Business & Tech. 510351000000
## 89274                                   Triumphant Learning Center  40002800528
## 89353                               TroyPike Center For Technology  10279001137
## 89406                                     Tse'Bii'Nidzisgai School 490090000000
## 89414                                          TSU CHARTER LAB SCH 482364000000
## 89417                  Tuacahn High School for the Performing Arts 490001000000
## 89433                                  Tucker Area Voc Tech Center 180639000000
## 89447                                        Tucson CHIC Preschool  40046303236
## 89448                                       Tucson Collegiate Prep  40087403349
## 89449                                    Tucson Country Day School  40025502075
## 89450                                 Tucson International Academy  40037302311
## 89451                         Tucson International Academy Midvale  40037302397
## 89453                                    Tucson Preparatory School  40015901791
## 89454                                                   Tucson VIP  40046303358
## 89480                                       Tule Continuation High  60201001837
## 89481                                Tule Elk Park Children Center  63441012583
## 89531                  Tuolumne County Special Education Preschool  69104613617
## 89533                                    TUPELO ALTERNATIVE SCHOOL 280432000000
## 89554                                 Turlington Woods Alternative 510371000000
## 89569                               Turner County Specialty School 130519000000
## 89601                                       TURNER/GUILFORD/KNIGHT 120039000000
## 89604                                                TURNING POINT 120099000000
## 89609                          Turning Point Alternative Education 510282000000
## 89636                     Tuscaloosa Career and Technology Academy  10336001399
## 89638                  Tuscaloosa County Juvenile Detention Center  10339000233
## 89744                               TWIN FALLS VIRTUAL SCHOOLHOUSE 160324000000
## 89769                                         Twin Oaks Elementary  63488007719
## 89778                                            Twin Peaks School 490036000000
## 89783                      Twin Ridges Special Education Preschool  60001213453
## 89788                            Twin Rivers Career & Tech Ed Area 181160000000
## 89826                                              Two Rivers High 490120000000
## 89890                                      U S Grant Middle School 173708000000
## 89900                                         UCP EARLY BEGINNINGS 120018000000
## 89902                                            UCP Of Mobile Inc  10237001624
## 89919                                                  Uintah High 490108000000
## 89920                                         Uintah Middle School 490108000000
## 89921                                         Uintah Online School 490108000000
## 89922                                            Uintah River High 490001000000
## 89923                                                Uintah School 490087000000
## 89924                                                Uintah School 490120000000
## 89925                                 Uintah Specialized Preschool 490108000000
## 89950                                                  UMDNJ - CTR 340009000000
## 89973                                     Uncharted Shores Academy  69106311883
## 90028                               UNION COUNTY ADULT HIGH SCHOOL 120189000000
## 90050                     UNION COUNTY VIRTUAL INSTRUCTION PROGRAM 120189000000
## 90102                                                   Union High 490024000000
## 90115                                        Union Hill Elementary  64038006681
## 90117                                            Union Hill Middle  64038013728
## 90134                                                 Union Middle 490014000000
## 90154                                        UNION REGIONAL SCHOOL 340009000000
## 90167                                         Union Street Charter  60300011590
## 90175                                      UNION VIRTUAL FRANCHISE 120189000000
## 90176                 UNION VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120189000000
## 90177        UNION VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120189000000
## 90204                                           UNITED HIGH SCHOOL 540051000000
## 90207                           UNITED HOSPITAL ADOLESCENT PROGRAM 273384000000
## 90221                                      UNITED TECHNICAL CENTER 540051000000
## 90249                                    Unity Middle College High  69102414191
## 90255                               Univ of Chicago Chtr - Woodson 170993000000
## 90256                                Univ of Chicago Chtr-Donoghue 170993000000
## 90257                             Univ of Chicago Chtr-Nth Kenwood 170993000000
## 90258                                Univ of Chicago Chtr-Woodlawn 170993000000
## 90281                                  University Center Preschool  60964012840
## 90325                              University of Illinois High Sch 170010000000
## 90347                                       University Preparatory  63660011467
## 90348                       University Preparatory Academy Charter  69103512016
## 90383                                        Upland Terrace School 490036000000
## 90385                              Uplift California North Charter  60573014149
## 90386                              Uplift California Santa Barbara  60000914141
## 90387                              Uplift California South Charter  60573014153
## 90405                                                   UPLIFT LEE 482142000000
## 90414                                            UPLIFT PEAK PRE-K 480003000000
## 90520                      Urban Corps of San Diego County Charter  69105212994
## 90531                              Urban Prep Chtr  Bronzeville HS 170993000000
## 90532                            Urban Prep Chtr Acad Englewood HS 170993000000
## 90533                               Urban Prep Chtr West Campus HS 170993000000
## 90541                                         Urbana Gerber School 173996000000
## 90569                                 Utah Career Path High School 490017000000
## 90570                                     Utah Connections Academy 490015000000
## 90571                               Utah County Academy of Science 490002000000
## 90572                            Utah International Charter School 490017000000
## 90573                                        Utah Military Academy 490018000000
## 90574                        Utah Military Academy - Camp Williams 490018000000
## 90575                                             Utah Online 7-12 490114000000
## 90576                                               Utah Online K8 490114000000
## 90578                                         Utah Virtual Academy 490013000000
## 90615                           Virginia Randolph Education Center 510189000000
## 90619                   VACTE - Camp Verde Unified School District  40034102248
## 90620                     VACTE - Clarkdale Jerome School District  40034102858
## 90621         VACTE - Cottonwood-Oak Creek Unified School District  40034102853
## 90622                             VACTE - Mingus Union High School  40034102243
## 90623       VACTE - Sedona-Oak Creek Joint Unified School District  40034102249
## 90627                                              Vae View School 490021000000
## 90689                                              Valiant Academy  40082703252
## 90690                                              Valiant Academy  40082703309
## 90694                                        Valiant Santa Barbara  60000914212
## 90720                                               Valley Academy 490016000000
## 90726                           Valley Career and Technical Center 510001000000
## 90748                                          Valley Crest School 490036000000
## 90787                                                  Valley High 490048000000
## 90802                                           Valley High School 490042000000
## 90807                                               Valley Jr High 490036000000
## 90810                                          Valley Life Charter  69104512862
## 90825                                           Valley Oak Charter  62827010709
## 90831                                                  Valley Oaks  63462008195
## 90835                         Valley Oaks Elementary (Alternative)  63023005436
## 90846                                   Valley Preparatory Academy  40026702091
## 90855                                                   Valley ROP  60009710787
## 90856                                                Valley School 490120000000
## 90858                                                Valley School 490048000000
## 90879                                     Valley View Charter Prep  62703013797
## 90951                                           Valley View School 490120000000
## 90952                                           Valley View School 490021000000
## 90953                                           Valley View School 490003000000
## 90981                                     VALLIVUE VIRTUAL ACADEMY 160060000000
## 91064                                      Van Meter Middle School 192901000000
## 91146                                             Vanguard Academy 490018000000
## 91180                                               Variety School 320006000000
## 91223                                 Vector Prep and Arts Academy  40079202970
## 91266          Ventura Charter School of Arts and Global Education  69104711829
## 91274                                              Venture Academy  69103110651
## 91277                                              Venture Academy 490013000000
## 91293                             Verda Dierzen Early Learning Ctr 174333000000
## 91298 Verde Valley Montessori School - A Center for Creative Educa  40032802228
## 91322                                                VERIBEST PPCD 483398000000
## 91345                                                Vernal Middle 490108000000
## 91367                                     Vernon Hills High School 172283000000
## 91377                                                Vernon School 490105000000
## 91425                                          Veterans Elementary  62745011866
## 91468                                                         VICC 292928000000
## 91481                                VICKI DOUGLAS JUVENILE CENTER 540051000000
## 91528                                   Victory Collegiate Academy  40096803562
## 91537                                 Victory High School - Campus  40006701901
## 91543                            VICTORY PREPARATORY ACADEMY SOUTH 482364000000
## 91544                              VICTORY PREPARATORY K-8 ACADEMY 482364000000
## 91586                                                Viewmont High 490021000000
## 91587                                              Viewmont School 490060000000
## 91607                            Villa Montessori - Phoenix Campus  40005400756
## 91622                                              Village Charter  60003411882
## 91682                                    Vincent Children's Center  61005013207
## 91709                                 Vineland Preparatory Academy 340009000000
## 91724                                              Vineyard School 490003000000
## 91761                                        VIP Village Preschool  63738013370
## 91781                       Virginia Beach Juvenile Detention Home 510004000000
## 91813                                      Virginia Treatment Ctr. 510006000000
## 91827                                                  Virtual Pre  62955012602
## 91841                                        Vision Charter School  40016001779
## 91868    Vista at Entrada School of Performing Arts and Technology 490014000000
## 91872                                Vista College Prep - Maryvale  40088703561
## 91873                                    Vista College Preparatory  40088703415
## 91898                Vista Grove Preparatory Academy Middle School  40035102148
## 91899                                         Vista Heights Middle 490003000000
## 91923                                      Vista Real Charter High  69104711537
## 91928                                                 Vista School 490036000000
## 91950                                            VO. TECH. TUITION 292928000000
## 91975                   VOLUSIA COUNTY VIRTUAL INSTRUCTION PROGRAM 120192000000
## 91979        VOLUSIA VIRTUAL INSTRUCTION PROGRAM DISTRICT PROVIDED 120192000000
## 91988                                                 VOORHEES RGC 340009000000
## 91998                                               Voyage Academy 490016000000
## 92024                          W A Lecroy Career  Technical Center  10066000748
## 92100                                      W S Beaupre Elem School 170468000000
## 92120                                     W W Woodbury Elem School 173537000000
## 92183                       W.W. Moore Jr. Juvenile Detention Home 510004000000
## 92189                                 Wabash/Miami Area Prog Excpt 181218000000
## 92217                                Waconia Learning Center SS/AS 274146000000
## 92258                                      Wagner Ranch Elementary  62886007077
## 92275                                            Wahlquist Jr High 490120000000
## 92365                   WAKULLA COUNTY VIRTUAL INSTRUCTION PROGRAM 120195000000
## 92369                                    WAKULLA VIRTUAL FRANCHISE 120195000000
## 92385                                Walden School of Liberal Arts 490006000000
## 92422                           Walker County Center Of Technology  10345001237
## 92423                            Walker County Schools 180 Program  10345001225
## 92489                                                 WALL SP PROG 483738000000
## 92490                                       WALL SP PROG (FLC/BAC) 481401000000
## 92493                                        WALL SPECIAL PROGRAMS 483357000000
## 92494                                        WALL SPECIAL PROGRAMS 483398000000
## 92495                                        WALL SPECIAL PROGRAMS 484155000000
## 92519                                                  WALLACE H S 483786000000
## 92526                                      Wallace Stegner Academy 490018000000
## 92547                                             WALLER J J A E P 484443000000
## 92555                                        Wallis Annenberg High  62271011365
## 92632                                            WALNUT SPRINGS EL 483237000000
## 92693                               Walter Henri Dyett HS for Arts 170993000000
## 92700                              Walter J. Katnich Community Day  62223012737
## 92754                                   WALTON COUNTY JAIL PROGRAM 120198000000
## 92763            WALTON INITIATIVE FOR SUCCESS IN EDUCATION (WISE) 120198000000
## 92771                                     WALTON VIRTUAL FRANCHISE 120198000000
## 92791                                            Wanaque Preschool 340009000000
## 92792                                      WANAQUE REGIONAL SCHOOL 340009000000
## 92870                        Warm Springs Elementary/Middle School 320036000000
## 92972                                                   WARREN RGC 340009000000
## 92974                                       WARREN REGIONAL SCHOOL 340009000000
## 93049                                Warwick Veterans Jr. High Sch 440111000000
## 93051                                                 Wasatch High 490111000000
## 93052                                              Wasatch Jr High 490036000000
## 93053                                     Wasatch Learning Academy 490111000000
## 93054                                         Wasatch Peak Academy 490002000000
## 93055                                               Wasatch School 490021000000
## 93056                                               Wasatch School 490087000000
## 93057                                               Wasatch School 490081000000
## 93058                                               Wasatch School 490072000000
## 93059                               Wasatch Waldorf Charter School 490019000000
## 93068                                      WASECA MIDDLE LEVEL ALC 274188000000
## 93116        Washington County Career & Technical Education Center 510390000000
## 93117                    Washington County Career Technical Center  10348001242
## 93120             Washington County Head Start & West Bend Title I 551629000000
## 93154                                       Washington Elem School 174125000000
## 93349                            Washington Jr High & Academy Prgm 172058000000
## 93394                                     Washington Middle School 173708000000
## 93416                                         Washington Preschool 490114000000
## 93433                                            Washington School 490114000000
## 93434                                            Washington School 490087000000
## 93438                                            Washington School 490021000000
## 93457                                    Washington Terrace School 490120000000
## 93459                                Washington Traditional School  40673000571
## 93466                                 WASHINGTON VIRTUAL FRANCHISE 120201000000
## 93490                                       Washoe Inspire Academy 320048000000
## 93519                                            Water Canyon High 490114000000
## 93520                                          Water Canyon School 490114000000
## 93521                     WATER VALLEY / VERIBEST SPECIAL PROGRAMS 484471000000
## 93680                                                   WAUBUN ALC 274212000000
## 93685                                       Wauconda CUSD 118 ALOP 170019000000
## 93696                                         Waukegan High School 174125000000
## 93722                              Waupun Correctional Institution 550004000000
## 93746                                   WAVE - Kingman High School  40079402980
## 93747                               WAVE - Lake Havasu High School  40079403037
## 93748                                    WAVE - Mohave High School  40079403045
## 93749                                    WAVE - Parker High School  40079403030
## 93750                              WAVE - River Valley High School  40079403055
## 93752                               WAVE- Lee Williams High School  40079403217
## 93757                                              WAVERLY ACADEMY 120048000000
## 93816                     Waycross Regional Youth Detention Center 130003000000
## 93861                                                   Wayne High 490117000000
## 93873                                                 Wayne Middle 490117000000
## 93967                                             Weaver Preschool  64188013305
## 93976                                        WEBB COUNTY J J A E P 482679000000
## 94003                                                   Weber High 490120000000
## 94004                                 Weber Innovation High School 490120000000
## 94006                                             Weber Online K-6 490120000000
## 94007                       Weber State University Charter Academy 490017000000
## 94113                               Weilenmann School of Discovery 490015000000
## 94114                              Weill (Raphael) Children Center  63441013244
## 94142                                                 Welby School 490042000000
## 94191                       WELLINGTON HIGH ADULT EDUCATION CENTER 120150000000
## 94200                                            Wellington School 490015000000
## 94227                                     Wells Junior High School 320012000000
## 94241                                            Wellspring Living 130228000000
## 94249                                  Wellstone High School - SWS 272124000000
## 94257                                            Wellsville School 490012000000
## 94289                                                Wendover High 490105000000
## 94324                           WESLEY CHAPEL HIGH ADULT EDUCATION 120153000000
## 94349                                       West 40 ALOP Achievers 170022000000
## 94362                                                    West Area 251115000000
## 94369                                          West Aurora HS RSSP 170019000000
## 94396 WEST BOCA RATON COMMUNITY HIGH SCHOOL ADULT EDUCATION CENTER 120150000000
## 94403                                        West Bountiful School 490021000000
## 94460                                     CLAY COUNTY SHELTER CARE 272142000000
## 94467                                 West Central Early Childhood 170032000000
## 94468                          WEST CENTRAL EDUCATION DISTRICT B-2 279146000000
## 94501                                          West Clinton School 490021000000
## 94534                                      West Desert High School 490102000000
## 94535                                           West Desert School 490102000000
## 94696                                            West Haven School 490120000000
## 94701                                    WEST HEIGHTS EXTENDED DAY 270003000000
## 94719                                                    West High 490087000000
## 94738                                            West Hills Middle 490042000000
## 94742                                            West Hillsborough  61719002175
## 94782                                             West Jordan High 490042000000
## 94783                                           West Jordan Middle 490042000000
## 94784                                           West Jordan School 490042000000
## 94790                                           West Kearns School 490036000000
## 94798                                            West Lake Jr High 490036000000
## 94800                                       West Lake Spec Ed Coop 180545000000
## 94948                                           WEST OSO ISD JJAEP 484512000000
## 94976                                     West Phoenix High School  40035501734
## 94997                                           West Point Jr High 490021000000
## 95001                                            West Point School 490021000000
## 95007                             West Potomac High School Academy 510126000000
## 95064                                                  West School 490105000000
## 95100                                         WEST SIDE HIGH SCOOL 341134000000
## 95109                         West Side Valley High (Continuation)  62720007798
## 95116                                West Sonoma County Consortium  60267012473
## 95141                              WEST TECHNICAL EDUCATION CENTER 120150000000
## 95151                                              West Transition 270003000000
## 95176                                           West Valley School 490036000000
## 95198                           WEST VIRGINIA SCHOOL FOR THE BLIND 540162000000
## 95199                     WEST VIRGINIA SCHOOL FOR THE DEAF-SECOND 540162000000
## 95200                       WEST VIRGINIA SCHOOL FOR THE DEAF-ELEM 540162000000
## 95206                                            West Weber School 490120000000
## 95232                             West-MEC - Agua Fria High School  40061503152
## 95233                                West-MEC - Apollo High School  40061502514
## 95234                       West-MEC - Barry Goldwater High School  40061502516
## 95235                         West-MEC - Boulder Creek High School  40061502515
## 95236                         West-MEC - Buckeye Union High School  40061503153
## 95237                                West-MEC - Cactus High School  40061502391
## 95238                            West-MEC - Centennial High School  40061503148
## 95240                         West-MEC - Copper Canyon High School  40061503391
## 95241                                West-MEC - Cortez High School  40061502513
## 95242                           West-MEC - Deer Valley High School  40061502517
## 95243                           West-MEC - Desert Edge High School  40061502394
## 95244                                West-MEC - Dysart High School  40061503150
## 95245                    West-MEC - Estrella Foothills High School  40061502395
## 95246                              West-MEC - Glendale High School  40061502512
## 95247                              West-MEC - Greenway High School  40061502511
## 95248                               West-MEC - Horizon High School  40061502635
## 95249                          West-MEC - Independence High School  40061502510
## 95250                              West-MEC - Ironwood High School  40061502390
## 95251                               West-MEC - La Joya High School  40061503371
## 95252                               West-MEC - Liberty High School  40061502648
## 95254                            West-MEC - Millennium High School  40061503151
## 95255                           West-MEC - Moon Valley High School  40061502509
## 95256                        West-MEC - Mountain Ridge High School  40061502518
## 95257                          West-MEC - North Canyon High School  40061502686
## 95258                       West-MEC - Paradise Valley High School  40061502654
## 95259                                West-MEC - Peoria High School  40061503149
## 95261                              West-MEC - Pinnacle High School  40061502664
## 95262                                 West-MEC - Raymond S. Kellis  40061502441
## 95263                   West-MEC - Sandra Day O'Connor High School  40061502519
## 95264                       West-MEC - Shadow Mountain High School  40061502641
## 95265                          West-MEC - Shadow Ridge High School  40061503061
## 95266                          West-MEC - Sierra Linda High School  40061503372
## 95267                            West-MEC - Sunnyslope High School  40061502508
## 95268                      West-MEC - Sunrise Mountain High School  40061502392
## 95269                           West-MEC - Thunderbird High School  40061502507
## 95270                        West-MEC - Tolleson Union High School  40061503373
## 95271                        West-MEC - Tonopah Valley High School  40061502440
## 95272                          West-MEC - Valley Vista High School  40061502669
## 95273                               West-MEC - Verrado High School  40061502680
## 95275                            West-MEC - Washington High School  40061502506
## 95276                             West-MEC - West View High School  40061503366
## 95277                            West-MEC - Wickenburg High School  40061502520
## 95278                         West-MEC - Willow Canyon High School  40061502393
## 95279                              West-MEC - Youngker High School  40061502824
## 95303                                             Westbrook School 490036000000
## 95335                      Westdale Heights Academic Magnet School 220054000000
## 95343                               Westerly Inclusion Preschool P 440117000000
## 95401                                         Western Hills School 490036000000
## 95413                               WESTERN MO CORRECTIONAL CENTER 290003000000
## 95417                                        NM WOMEN'S CORRECTION 350001000000
## 95429                               WESTERN RECEPT/DIAG CORR CENTR 290003000000
## 95430                               WESTERN REGION TREATMENT CENTR 290003000000
## 95442                     Western School of Science and Technology  40092403436
## 95444                            Western Sierra Collegiate Academy  60001312390
## 95446                                    Western St. Hosp. Ed. Pr. 510005000000
## 95486                                             Westfield School 490003000000
## 95534                                                Westlake High 490003000000
## 95549                                              Westland School 490042000000
## 95550                                              Westland School  40040201860
## 95551                              Westland School Brighton Campus  40040203429
## 95593                                              Westmore School 490003000000
## 95670                                             Westridge School 490081000000
## 95748                                              Westside School 490063000000
## 95752                                              Westvale School 490042000000
## 95806                                         Westwood Elem School 174333000000
## 95886                      WETZEL CO. CTR. FOR CHILDREN & FAMILIES 540156000000
## 95930                                 Wheatland Community Day High  64235012741
## 96039                                       White Cone High School  40181002544
## 96120                                            White Pine School 490012000000
## 96180                 Whiteford (June) Special Education Preschool  62706013459
## 96209                                              Whitehorse High 490090000000
## 96241                                            Whitesides School 490021000000
## 96369                                         Whittier Elem School 174125000000
## 96399                                   Whittier Independent Study  64245013047
## 96408                                              Whittier School 490087000000
## 96409                                              Whittier School 490036000000
## 96426                                             WICHITA CO JJAEP 481212000000
## 96450                                 Wicomico County Evening High 240069000000
## 96498                             Wilcox County Alternative School  10351001419
## 96502                                           Wilcox Elem School 173708000000
## 96541                                    Wildflower Open Classroom  60837012755
## 96544                                         WILDLIGHT ELEMENTARY 120135000000
## 96572                                             WILES HEAD START 120003000000
## 96689                                               Willard School 490009000000
## 96726                                  William B. Bimat Elementary  62745008703
## 96834                            WILLIAM H. TURNER TECHNICAL ADULT 120039000000
## 96927                                          William Penn School 490036000000
## 96945                                         William R. Rouse ROP  60012611469
## 97010                                  Williams Educational Center  61527013812
## 97070                                    Williamsfield Elem School 174245000000
## 97071                                    Williamsfield High School 174245000000
## 97072                                  Williamsfield Middle School 174245000000
## 97073                                        WILLIAMSON CO ACADEMY 482742000000
## 97074                                        WILLIAMSON CO ACADEMY 482703000000
## 97075                                  School for Hearing Impaired 170012000000
## 97078                                      WILLIAMSON CO J J A E P 482460000000
## 97080                                          WILLIAMSON CO JJAEP 484228000000
## 97084                                    WILLIAMSON COUNTY ACADEMY 482410000000
## 97085                                 WILLIAMSON COUNTY CORE-JJAEP 483808000000
## 97087                           WILLIAMSON COUNTY DETENTION CENTER 482703000000
## 97091                         WILLIAMSON COUNTY JUVENILE DETENTION 483808000000
## 97159                                                 Willits High  64256006972
## 97166                                      Willmar Voluntary Pre-K 274272000000
## 97181                                         Willow Canyon School 490014000000
## 97187                                  Willow Creek Charter School  40021001974
## 97220                                      Willow Grove Elementary  64263006974
## 97244                                                Willow School 490105000000
## 97255                                        Willow Springs School 490014000000
## 97258                                        Willow Wood Preschool 174284000000
## 97267                                           Willowcreek Middle 490003000000
## 97335                                          WILSON CO J J A E P 481935000000
## 97338                                              WILSON CO JJAEP 482631000000
## 97339                                              WILSON CO JJAEP 484161000000
## 97452                                                Wilson School 490063000000
## 97453                                                Wilson School 490051000000
## 97541                                          Windham High School 330717000000
## 97546                                            Windham Preschool 330717000000
## 97564                                             Windridge School 490021000000
## 97614                                               Windsor School 490003000000
## 97769                                            Winship Community  64290006984
## 97803                              Winston County Technical Center  10358001243
## 97824                                         Winter Sports School 490017000000
## 97879                         WIREGRASS RANCH HIGH ADULT EDUCATION 120153000000
## 97908                                Wise Co. Alternative Ed. Ctr. 510408000000
## 97909                          Wise County Career-Technical Center 510408000000
## 97960                            Wm Nashold Early Childhood Center 173451000000
## 98030                                            Wolverine Program 270033000000
## 98031                               WOMEN E. RECEP/DIAG COR C/ACAD 290003000000
## 98032                               WOMEN E. RECEP/DIAG COR C/DIAG 290003000000
## 98034                                WOMEN'S EAST REGION TRTMT CTR 290003000000
## 98051                                         WOOD CO VOC TECH CTR 540162000000
## 98063                                     Wood Oaks Jr High School 171785000000
## 98197                                         Woodland Elem School 172058000000
## 98206                                          Woodland Elementary 174311000000
## 98261                                    Woodland Intermediate Sch 174311000000
## 98267                                       Woodland Middle School 174311000000
## 98288                                      Woodland Primary School 174311000000
## 98299                                        Woodland Star Charter  63720011484
## 98309                                             Woodlands School 550011000000
## 98310                                        Woodlands School East 550007000000
## 98359                                                     Woodmere 340441000000
## 98435                                     Woodrow Wilson Rehab Ctr 510005000000
## 98437                                        Woodrow Wilson School 490036000000
## 98450                                              Woodruff School 490051000000
## 98454                                             Woods Cross High 490021000000
## 98455                                           Woods Cross School 490021000000
## 98471                                 New Horizons Woodside Campus 510001000000
## 98485                      Woodside Juvenile Rehabilitation Center 500001000000
## 98506                                        Woodstock High School 174333000000
## 98511                                  Woodstock North High School 174333000000
## 98512                                             Woodstock School 490036000000
## 98617                                            Worth Elem School 174338000000
## 98619                                         Worth Jr High School 174338000000
## 98627                            WORTHINGTON 518 (VIRTUAL INSTRUCT 274416000000
## 98628                                        WORTHINGTON ALC NIGHT 274416000000
## 98644                                            Worthridge School 174338000000
## 98645                                       Worthwoods Elem School 174338000000
## 98693                           WRIGHT TECHNICAL CENTER ALC MIDDLE 270004000000
## 98711                                            WV CHILDRENS HOME 540051000000
## 98787                     WYOMING COUNTY CAREER & TECHNICAL CENTER 540165000000
## 98807                                     Wythe County Tech Center 510411000000
## 98885                                          YCCS Chtr - Chatham 170993000000
## 98886                              YCCS-Albizu Campus Puerto Rican 170993000000
## 98887                                   YCCS-ASPIRA Pantoja Alt HS 170993000000
## 98888                              YCCS-Assoc Hse El Cuarto Ano HS 170993000000
## 98889                                YCCS-Austin Career Ed Cntr HS 170993000000
## 98890                                          YCCS-CCA Academy HS 170993000000
## 98891                             YCCS-Community Youth Dev Inst HS 170993000000
## 98892                              YCCS-Innovations of Arts Integr 170993000000
## 98893                              YCCS-Jane Addams Alternative HS 170993000000
## 98894                             YCCS-Latino Youth Alternative HS 170993000000
## 98895                            YCCS-McKinley-Lakeside Leadership 170993000000
## 98897                             YCCS-Progressive Leadership Acad 170993000000
## 98898                               YCCS-Scholastic Achievement HS 170993000000
## 98899                                   YCCS-Sullivan House Alt HS 170993000000
## 98901                                              YCCS-Virtual HS 170993000000
## 98902                                YCCS-West Town Academy Alt HS 170993000000
## 98903                              YCCS-Westside Holistic Ldr Acad 170993000000
## 98904                             YCCS-Youth Connection Leadership 170993000000
## 98905                                                  YEA Program 170018000000
## 98965                                              Yolo County ROP  60014911544
## 99046                                                 Yosemite ROP  60014411499
## 99047                           Yosemite-Wawona Elementary Charter  60408013800
## 99056                                          Young Adult Program 170417000000
## 99070                                           Young Intermediate 490009000000
## 99073                                               YOUNG LEARNERS 482364000000
## 99074                                               YOUNG LEARNERS 480013000000
## 99085                                       Young Scholars Academy  40007500893
## 99086                        YOUNG SCHOLARS ACADEMY FOR EXCELLENCE 482364000000
## 99129                             Youth Educational Support School 490036000000
## 99148                              Youth Works Charter High School  40007903035
## 99149                                            YOUTHBUILD CAMDEN 340009000000
## 99170                                              Yu Ming Charter  69105112901
## 99174                        Yuba City Special Education Preschool  64347014094
## 99175                       Yuba County Career Preparatory Charter  69104805572
## 99176                                Yuba County Special Education  69104809262
## 99181                     Yucaipa Early Childhood Education Center  64356012831
## 99203                   Yuma District One Digital Learning Academy  40960003430
## 99265                                                 ZEBULON PIKE  80028606659
## 99294                             ZEPHYRHILLS HIGH ADULT EDUCATION 120153000000
## 99333                                    ZUMBRO EDUCATION DISTRICT 270005000000
##                                                        Agency_Name
## 3                              EASTERN CARVER COUNTY PUBLIC SCHOOL
## 4                              EASTERN CARVER COUNTY PUBLIC SCHOOL
## 108                                           North Chicago SD 187
## 129                                                  Joliet PSD 86
## 133                                                   Ojai Unified
## 163                                A.E. Phillips Laboratory School
## 177                                      A. LINWOOD HOLTON GOV SCH
## 209                    Arizona Agribusiness & Equine Center Inc. 1
## 210                    Arizona Agribusiness & Equine Center Inc. 2
## 212                                 Department of Juvenile Justice
## 263                                                  ABERNATHY ISD
## 283                                                       Abington
## 397                                                           DADE
## 398                                                           DADE
## 399                                                           DADE
## 400                                                           DADE
## 404                                      CHESTERFIELD CO PBLC SCHS
## 406                                                       Ed Ahead
## 407                                       Educational Impact  Inc.
## 413                                           HENRICO CO PBLC SCHS
## 421                                          Academy Del Sol  Inc.
## 422                                          Academy Del Sol  Inc.
## 427                                           Apple Valley Unified
## 432                       Morris County Vocational School District
## 446                       Morris County Vocational School District
## 455                       Morris County Vocational School District
## 457                         Academy for Math Engineering & Science
## 458                       Morris County Vocational School District
## 496                           Academy of Building Industries  Inc.
## 497                                  WASHOE COUNTY SCHOOL DISTRICT
## 499                                         RALEIGH COUNTY SCHOOLS
## 506                                           LOUDOUN CO PBLC SCHS
## 508                                    Academy Of Excellence  Inc.
## 516                      Academy of Mathematics and Science Inc. 1
## 517                      Academy of Mathematics and Science Inc. 2
## 518                 Academy of Mathematics and Science South  Inc.
## 535                                        Academy of Tucson  Inc.
## 536                                        Academy of Tucson  Inc.
## 537                                        Academy of Tucson  Inc.
## 544                                               Granite District
## 545                                              Victor Elementary
## 546                             INSTITUTIONAL EDUCATIONAL PROGRAMS
## 552                           Academy with Community Partners  Inc
## 574                              Accelerated Learning Center  Inc.
## 575                   Accelerated Elementary and Secondary Schools
## 579                           Acceleration Day and Evening Academy
## 584                            SOUTH WASHINGTON COUNTY SCHOOL DIST
## 591                                         Acclaim Charter School
## 637                                               Paradise Unified
## 661                                           FAIRFAX CO PBLC SCHS
## 680                                Acorn Montessori Charter School
## 681                                Acorn Montessori Charter School
## 688                                               Champaign CUSD 4
## 717                                             Cardiff Elementary
## 803                                                 Davis District
## 805                                            Logan City District
## 807                                         Choice Academies  Inc.
## 849                                                 Davis District
## 875                                      Adlai E Stevenson HSD 125
## 898                                AZ Dept of Juvenile Corrections
## 899                                                Birmingham City
## 915                                        DANVILLE CITY PBLC SCHS
## 919       OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 924                                    ELKO COUNTY SCHOOL DISTRICT
## 925                                                      LAFAYETTE
## 929                                                         MARTIN
## 930                                           HENRICO CO PBLC SCHS
## 932                                                        ALACHUA
## 933                                                         MARTIN
## 936                                        VA BEACH CITY PBLC SCHS
## 937                                                          PASCO
## 938                                                          PASCO
## 942                                                     PALM BEACH
## 943                                                        WAKULLA
## 950                                           HENRICO CO PBLC SCHS
## 951                                           HENRICO CO PBLC SCHS
## 952                                                      Lunenburg
## 959                                        VA BEACH CITY PBLC SCHS
## 969                                       Educational Impact  Inc.
## 1028                                    Aguila Elementary District
## 1072                                              Espiritu Schools
## 1105                 Akimel O'Otham Pee Posh Charter School Inc. 2
## 1106                 Akimel O'Otham Pee Posh Charter School Inc. 1
## 1139                             American Leadership Academy  Inc.
## 1140                             American Leadership Academy  Inc.
## 1141                             American Leadership Academy  Inc.
## 1144                                                       ALACHUA
## 1145                                                       ALACHUA
## 1150                                                       ALACHUA
## 1151                                                       ALACHUA
## 1160                                               Alameda Unified
## 1163                            Alameda County Office of Education
## 1247                                                  Albers SD 63
## 1252      OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 1290                                             San Juan District
## 1318                                              Canyons District
## 1335                                          FAIRFAX CO PBLC SCHS
## 1336                                          FAIRFAX CO PBLC SCHS
## 1337                                          FAIRFAX CO PBLC SCHS
## 1338                                          FAIRFAX CO PBLC SCHS
## 1345                            Minneapolis Public School District
## 1347                                  OSSEO PUBLIC SCHOOL DISTRICT
## 1358                                  OSSEO PUBLIC SCHOOL DISTRICT
## 1431                                                    ALDINE ISD
## 1470                                Iowa City Comm School District
## 1506                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 1557                                     DEPARTMENT OF CORRECTIONS
## 1633                                                     ALIEF ISD
## 1656                                     All Aboard Charter School
## 1660                                                Warner Unified
## 1661                                                Warner Unified
## 1692                                  Fort Wayne Community Schools
## 1693                                Northwest Allen County Schools
## 1738                                             Lauderdale County
## 1766                                                 Blount County
## 1837                                         Castro Valley Unified
## 1844                                                Plumas Unified
## 1853                                        San Miguel Joint Union
## 1857                               Vineland Public School District
## 1877                                     Region 06 West Cook ISC 2
## 1902                                                       BROWARD
## 1906                             Alpine County Office of Education
## 1907                                         Alpine County Unified
## 1921                                               Alpine District
## 1922                                               Alpine District
## 1932                                                    ST. JOSEPH
## 1940                                              Canyons District
## 1952                                              Canyons District
## 1971  American Charter Schools Foundation d.b.a. Alta Vista High S
## 1972                                        Lucerne Valley Unified
## 1974                                          Helendale Elementary
## 1987                                             Duchesne District
## 1989                                             Duchesne District
## 1992                                              Canyons District
## 2008                     ALT ED PRGM/BEHAV DISORD YOUTH/MONTGOMERY
## 2014              Tucson Youth Development/ACE Charter High School
## 2016                                           GREENE CO PBLC SCHS
## 2017                                      MECKLENBURG CO PBLC SCHS
## 2020                                         FAUQUIER CO PBLC SCHS
## 2027                                                          LAKE
## 2034                                                       WAKULLA
## 2036                                                     Troy City
## 2038                                                Russell County
## 2054                              Montgomery County Public Schools
## 2057                                                 STOCKDALE ISD
## 2060                                                 Barrow County
## 2061                                                 DeKalb County
## 2067                                               Alameda Unified
## 2160                                 WASHOE COUNTY SCHOOL DISTRICT
## 2162                                             Amador County ROP
## 2163                             Amador County Office of Education
## 2194                                        Raisin City Elementary
## 2195                                        Raisin City Elementary
## 2210                                                Amboy CUSD 272
## 2212                                                Amboy CUSD 272
## 2213                                                Amboy CUSD 272
## 2219                   Arizona Montessori Charter School at Anthem
## 2230                                                Provo District
## 2236                                       AMELIA-NOTTOWAY VOC CTR
## 2242                                American Academy of Innovation
## 2251                                               Alpine District
## 2252                                               Alpine District
## 2253                                     American Heritage Academy
## 2254                                     American Heritage Academy
## 2266                         American International School of Utah
## 2268                                   American Leadership Academy
## 2269                             American Leadership Academy  Inc.
## 2270                             American Leadership Academy  Inc.
## 2271                             American Leadership Academy  Inc.
## 2272                             American Leadership Academy  Inc.
## 2273                             American Leadership Academy  Inc.
## 2274                             American Leadership Academy  Inc.
## 2275                             American Leadership Academy  Inc.
## 2279                            American Preparatory Academy - LEA
## 2280                            American Preparatory Academy - LEA
## 2281                            American Preparatory Academy - LEA
## 2282                            American Preparatory Academy - LEA
## 2283                            American Preparatory Academy - LEA
## 2284                            American Preparatory Academy - LEA
## 2288                                                          DADE
## 2297                                  The Charter Foundation  Inc.
## 2298                                  The Charter Foundation  Inc.
## 2299                                  The Charter Foundation  Inc.
## 2300                                  The Charter Foundation  Inc.
## 2310                                                      Amesbury
## 2334                                                      PINELLAS
## 2335                                                      OKALOOSA
## 2342                                                          LEON
## 2343                                                       ALACHUA
## 2348                                                         DUVAL
## 2350                                                          DADE
## 2351                                                          DADE
## 2352                                                       BROWARD
## 2355                                                       VOLUSIA
## 2440                                                         PASCO
## 2442       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 2552                                              Waukegan CUSD 60
## 2669       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 2682                                                       BROWARD
## 2704                                    GUTTENBERG SCHOOL DISTRICT
## 2720                                               Tooele District
## 2724                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 2743                            Anne Arundel County Public Schools
## 2786                                                 Anniston City
## 2832                                           Antelope Elementary
## 2842                                                Davis District
## 2846                                           Palmdale Elementary
## 2847                                           Antelope Valley ROP
## 2857                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 2886                                             Garfield District
## 2887                                               Antioch Unified
## 2888                                               Antioch Unified
## 2926                             Cochise County Juvenile Detention
## 2927                              Graham County Juvenile Detention
## 2928                               Pinal County Juvenile Detention
## 2929                                          Ray of Light Academy
## 2930                        Yavapai County Juvenile Justice Center
## 2931                           Yuma County Juvenile Justice Center
## 2932                                Gila County Juvenile Detention
## 2941                              Apache Junction Unified District
## 2943  American Charter Schools Foundation d.b.a. Apache Trail High
## 3000                                                Carmel Unified
## 3009                                          Apple Valley Unified
## 3049                                   APPOMATTOX REGIONAL GOV SCH
## 3129                                                        MARION
## 3130                                                       BROWARD
## 3155                                              Granite District
## 3274               Arizona Academy of Science And Technology  Inc.
## 3275                   Arizona Agribusiness & Equine Center Inc. 6
## 3276                   Arizona Agribusiness & Equine Center Inc. 5
## 3277                   Arizona Agribusiness & Equine Center Inc. 3
## 3278                   Arizona Agribusiness & Equine Center Inc. 4
## 3279                          Arizona Autism Charter Schools  Inc.
## 3280                          Arizona Autism Charter Schools  Inc.
## 3281                     Arizona Call-a-Teen Youth Resources  Inc.
## 3282                                                Success School
## 3284                                  Collaborative Pathways  Inc.
## 3287                                   Pima Prevention Partnership
## 3288              Arizona Connections Academy Charter School  Inc.
## 3289     Edkey  Inc. - Arizona Conservatory for Arts and Academics
## 3290                                 Edkey  Inc. - Redwood Academy
## 3291     Edkey  Inc. - Arizona Conservatory for Arts and Academics
## 3295    Portable Practical Educational Preparation Inc. (PPEP In 2
## 3296                      Cottonwood-Oak Creek Elementary District
## 3297                                  Arizona Language Preparatory
## 3299                               North Star Charter School  Inc.
## 3300                                   Arizona School For The Arts
## 3301    Portable Practical Educational Preparation Inc. (PPEP In 2
## 3330                                            St. Bernard Parish
## 3512                                           Washington District
## 3544                                                 Nebo District
## 3613                                        P.L.C. Charter Schools
## 3646                                   San Bernardino City Unified
## 3666                                      Ascent Academies of Utah
## 3667                                      Ascent Academies of Utah
## 3668                                      Ascent Academies of Utah
## 3673                   Arizona State School for the Deaf and Blind
## 3674                   Arizona State School for the Deaf and Blind
## 3675                   Arizona State School for the Deaf and Blind
## 3763                                      Del Mar Union Elementary
## 3770                                               Uintah District
## 3771                                               Uintah District
## 3772                                               Sevier District
## 3780                               Ashton-Franklin Center CUSD 275
## 3781                               Ashton-Franklin Center CUSD 275
## 3782                               Ashton-Franklin Center CUSD 275
## 3791                                        City of Chicago SD 299
## 3796                             Arizona Department of Corrections
## 3797                             Arizona Department of Corrections
## 3798                             Arizona Department of Corrections
## 3799                             Arizona Department of Corrections
## 3800                             Arizona Department of Corrections
## 3801                             Arizona Department of Corrections
## 3802                             Arizona Department of Corrections
## 3803                             Arizona Department of Corrections
## 3804                             Arizona Department of Corrections
## 3825                                               Alpine District
## 3834                                        City of Chicago SD 299
## 3835                                        City of Chicago SD 299
## 3837                                                          DADE
## 3841                                       RICHMOND CITY PBLC SCHS
## 3898                                      Acton-Agua Dulce Unified
## 3914                         ASU Preparatory Academy - Casa Grande
## 3915                                     ASU Preparatory Academy 5
## 3916                               ASU Preparatory Academy Digital
## 3917                                 ASU Preparatory Academy Tempe
## 3918                                     ASU Preparatory Academy 1
## 3919                                     ASU Preparatory Academy 2
## 3920                                     ASU Preparatory Academy 4
## 3921                                     ASU Preparatory Academy 3
## 3922                                     ASU Preparatory Academy 6
## 3931                                                  SOMERSET ISD
## 3934                                                    POTEET ISD
## 3953                                             Athenian eAcademy
## 3986                                 Athlos Academy of Saint Cloud
## 3987                                        Athlos Academy of Utah
## 4006                                              San Juan Unified
## 4034               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 4042                                                    PALM BEACH
## 4051       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4053       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4196                                Department of Juvenile Justice
## 4204                           Antelope Union High School District
## 4283                                                    AUSTIN ISD
## 4308                                                Autauga County
## 4309                                                Autauga County
## 4332                               Excalibur Charter Schools  Inc.
## 4384                                              Pasadena Unified
## 4472                                           BRUCEVILLE-EDDY ISD
## 4497                                      AZ Compass Schools  Inc.
## 4513                                            Az-Tec High School
## 4514                                              JUVENILE JUSTICE
## 4534                                        B H R A Cooperative HS
## 4547                                 MO SCHLS FOR THE SEV DISABLED
## 4557                                       East Baton Rouge Parish
## 4576                                                     JEFFERSON
## 4592                                            Salt Lake District
## 4622                                         ACCOMACK CO PBLC SCHS
## 4623                                         ACCOMACK CO PBLC SCHS
## 4626                                               Willits Unified
## 4635                                 BAGLEY PUBLIC SCHOOL DISTRICT
## 4644                                 WASHOE COUNTY SCHOOL DISTRICT
## 4690                                                         BAKER
## 4695                                                         BAKER
## 4727                                                         BAKER
## 4728                                                         BAKER
## 4800                                                Baldy View ROP
## 4807                              Ball Charter Schools (Val Vista)
## 4948                                        City of Chicago SD 299
## 4949                                               Banning Unified
## 4950                                               Banning Unified
## 4952                                               Banning Unified
## 5054                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 5128                                         MARION COUNTY SCHOOLS
## 5137                                                 Nebo District
## 5164                                     Lakeside Union Elementary
## 5174                                               Alpine District
## 5189                                                      Brockton
## 5305                                           BASIS School Inc. 9
## 5306                                           BASIS School Inc. 5
## 5307                                          BASIS School Inc. 18
## 5308                                          BASIS School Inc. 17
## 5310                                           BASIS School Inc. 6
## 5311                                          BASIS School Inc. 14
## 5312                                          BASIS School Inc. 15
## 5313                                          BASIS School Inc. 10
## 5314                                           BASIS School Inc. 3
## 5315                                          BASIS School Inc. 11
## 5316                                           BASIS School Inc. 4
## 5317                                          BASIS School Inc. 19
## 5318                                           BASIS School Inc. 7
## 5319                                          BASIS School Inc. 13
## 5320                                          BASIS School Inc. 21
## 5321                                          BASIS School Inc. 20
## 5322                                          BASIS School Inc. 12
## 5323                                                   BASIS TEXAS
## 5324                                                   BASIS TEXAS
## 5325                                                   BASIS TEXAS
## 5326                                           BASIS School Inc. 2
## 5327                                          BASIS School Inc. 16
## 5328                                           BASIS School Inc. 8
## 5329                                           BASIS School Inc. 1
## 5347                                               Jordan District
## 5348                                                     ELGIN ISD
## 5375                                                Weber District
## 5457                                                       BROWARD
## 5532                                                           BAY
## 5533                                                           BAY
## 5534                                                           BAY
## 5588                                            San Marcos Unified
## 5623                               Baltimore County Public Schools
## 5670                                            Salt Lake District
## 5672                                                       COLLIER
## 5735                                     Bear River Charter School
## 5737                                            Box Elder District
## 5738                                            Box Elder District
## 5803                                              Beaumont Unified
## 5809                                                      Abington
## 5825                                               Beaver District
## 5829                           NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 5834                                               Beaver District
## 5873                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 5885                                          BEDFORD CO PBLC SCHS
## 5908                                          BEDFORD CO PBLC SCHS
## 5937                                      Beech Grove City Schools
## 5967                                              Granite District
## 5968                          Beehive Science & Technology Academy
## 5989                                             Princeton ESD 115
## 6059                                               Beaver District
## 6075                                                    ROGERS ISD
## 6114                                              Canyons District
## 6122                              Pathways KM Charter Schools  Inc
## 6131                                              Canyons District
## 6152                                                 Sumter County
## 6156                                              Kewanee CUSD 229
## 6184                           BELLE PLAINE PUBLIC SCHOOL DISTRICT
## 6263                                      San Luis Coastal Unified
## 6397                           BEMIDJI REGIONAL INTERDIST. COUNCIL
## 6416                                        KANAWHA COUNTY SCHOOLS
## 6426                                                          DADE
## 6428                                                       BROWARD
## 6441                                           Ogden City District
## 6456                                           Aurora East USD 131
## 6463                                        Benchmark School  Inc.
## 6506                                     Blochman Union Elementary
## 6508                              Benjamin Franklin Charter School
## 6509                              Benjamin Franklin Charter School
## 6510                              Benjamin Franklin Charter School
## 6531                              Benjamin Franklin Charter School
## 6541                                            Springfield SD 186
## 6574     Twenty First Century Charter School  Inc. Bennett Academy
## 6575     Twenty First Century Charter School  Inc. Bennett Academy
## 6616                                              Granite District
## 6617                                              Granite District
## 6684                                   BENTON-STEARNS ED. DISTRICT
## 6685                                   BENTON-STEARNS ED. DISTRICT
## 6687                                   BENTON-STEARNS ED. DISTRICT
## 6710                     Cochise Community Development Corporation
## 6723               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 6729       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 6753                                              Berkeley Unified
## 6872                                    Berryessa Union Elementary
## 6933                                                 Bessemer City
## 6965                                 DULUTH PUBLIC SCHOOL DISTRICT
## 7127                                                HARLANDALE ISD
## 7128                                                    JUDSON ISD
## 7129                                              EAST CENTRAL ISD
## 7130                                             ALAMO HEIGHTS ISD
## 7135                                             MEDINA VALLEY ISD
## 7146                                                   Bibb County
## 7166                                     Stony Creek Joint Unified
## 7200                                   Big Lagoon Union Elementary
## 7211                             Fresno County Office of Education
## 7213                                       Big Picture Twin Cities
## 7214                                                        MONROE
## 7252                                               Big Sur Unified
## 7263                                                 Kane District
## 7264                                                 Kane District
## 7280                                                 Biggs Unified
## 7296                                                      WACO ISD
## 7338                                               Jordan District
## 7351                                                Cache District
## 7424                            MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 7430                                                         DUVAL
## 7470                                  Bitterwater-Tully Elementary
## 7498                                            Springfield SD 186
## 7522                                               Alpine District
## 7523                           Wisconsin Department of Corrections
## 7576                                               Jordan District
## 7588                                                SAN ANGELO ISD
## 7659                                              Blake Elementary
## 7709                                             San Juan District
## 7752                                 Utah Schools for Deaf & Blind
## 7753                                 Utah Schools for Deaf & Blind
## 7769                                             Bloom Twp HSD 206
## 7770                                             Bloom Twp HSD 206
## 7816                            BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 7825                                           Washington District
## 7828                                           Washington District
## 7829                            BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 7836                                               Willits Unified
## 7839                                    Los Gatos Union Elementary
## 7843                                                 Blount County
## 7844                                                 Blount County
## 7900                                               Tooele District
## 7922                                         BLUE RIDGE GOV SCHOOL
## 7931                                         DOE SOP EDUC PROGRAMS
## 7963                                         MERCER COUNTY SCHOOLS
## 7976                                           Blueprint Education
## 7995                                                Davis District
## 7996                                             San Juan District
## 8003                                               Jordan District
## 8030                                            Palo Verde Unified
## 8046                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 8068                                Department of Juvenile Justice
## 8084                                                    PALM BEACH
## 8108                                              Bogus Elementary
## 8136                                                       GADSDEN
## 8173                                                Rapides Parish
## 8252                                            Bonneville Academy
## 8255                                                Weber District
## 8257                                              Granite District
## 8260                                           Ogden City District
## 8261                                            Salt Lake District
## 8262                                               Alpine District
## 8284                                                Emery District
## 8313                                         BOONE COUNTY  SCHOOLS
## 8319                                   Boone County Spec Educ Coop
## 8352                                     DEPARTMENT OF CORRECTIONS
## 8358                                     DEPARTMENT OF CORRECTIONS
## 8441                                        BOTETOURT CO PBLC SCHS
## 8470                                             Garfield District
## 8480                                                Davis District
## 8481                                                       ALACHUA
## 8485                                                Davis District
## 8486                                                Davis District
## 8487                                                Davis District
## 8604                                            Box Elder District
## 8606                                            Box Elder District
## 8663                                                    PALM BEACH
## 8677                                                      SEMINOLE
## 8679                                                          DADE
## 8728                                                      BRADFORD
## 8729                                                      BRADFORD
## 8730                                                      BRADFORD
## 8735                           Bradley Academy of Excellence  Inc.
## 8748                                      Bradley Union Elementary
## 8768                                     Humboldt Unified District
## 8808                              WEST ST. PAUL-MENDOTA HTS.-EAGAN
## 8859                                           Laytonville Unified
## 8902                                                  PEARLAND ISD
## 8905                                                     ALVIN ISD
## 8910                                                     BRYAN ISD
## 8928                     BREAKING BARRIERS ALTERNATIVE ED/HENRY CO
## 8942                           BRECKENRIDGE PUBLIC SCHOOL DISTRICT
## 9056                                                       BREVARD
## 9063                                                       BREVARD
## 9065                                                       BREVARD
## 9066                                                       BREVARD
## 9073                                               SAN ANTONIO ISD
## 9107                                                  Cary CCSD 26
## 9201                                                         DUVAL
## 9218                                           Logan City District
## 9227                                                       BREVARD
## 9228                            Ventura County Office of Education
## 9239                                                 Nebo District
## 9271                           BRIDGING COMMUNITIES REG CTE CENTER
## 9272                           BRIDGING COMMUNITIES REG CTE CENTER
## 9305                                Bright Beginnings School  Inc.
## 9327                                              Canyons District
## 9406                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 9491                                                 Nebo District
## 9694                               BROOKLYN CENTER SCHOOL DISTRICT
## 9787                                               Willits Unified
## 9814                                                 Nebo District
## 9863                                              Canyons District
## 9878                                                       BROWARD
## 9879                                                       BROWARD
## 9880                                                       BROWARD
## 9885                                                       BROWARD
## 9886                                                       BROWARD
## 9887                                                       BROWARD
## 10043                                                         DADE
## 10044                                              Carbon District
## 10095                                             Brussels CUSD 42
## 10096                                             Brussels CUSD 42
## 10145                                           Salt Lake District
## 10159                                            Garfield District
## 10160                                            Garfield District
## 10174                                        Burlingame Elementary
## 10177                                                   ST. JOSEPH
## 10178                                        BUCHANAN CO PBLC SCHS
## 10314                                     Pleasant View Elementary
## 10330                                              Taft Union High
## 10373                                               Davis District
## 10402                           Buckeye Union High School District
## 10426                       Santa Clara County Office of Education
## 10432                                               Bullock County
## 10487                                              Oakland Unified
## 10491                                               Weber District
## 10525                                   American Basic Schools LLC
## 10538                                         FAIRFAX CO PBLC SCHS
## 10565                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 10567              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 10569           BURLINGTON COUNTY SPECIAL SERVICES SCHOOL DISTRICT
## 10591      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 10597      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 10621                                     Fall River Joint Unified
## 10644                                                      VOLUSIA
## 10650                            BURNSVILLE PUBLIC SCHOOL DISTRICT
## 10655                            BURNSVILLE PUBLIC SCHOOL DISTRICT
## 10702                                         ROANOKE CO PBLC SCHS
## 10767                                                Butler County
## 10776                                           Springfield SD 186
## 10782                               NEW HORIZONS CAREER & TECH CTR
## 10789                                             Canyons District
## 10793                                             Canyons District
## 10805                                             Butte County ROP
## 10816                                         Las Virgenes Unified
## 10817                                              Jordan District
## 10823                             Maricopa Unified School District
## 10928                                          Aurora East USD 131
## 10937                                          Aurora East USD 131
## 10938                                                 Gadsden City
## 10948                                          Aurora East USD 131
## 10957                                                Monroe County
## 10962                                               Grand District
## 11016                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 11017                                           C.S. Lewis Academy
## 11021   CA Advancing Pathways for Students in Los Angeles Co ROC/P
## 11030                                              Banning Unified
## 11033                                        CABELL COUNTY SCHOOLS
## 11059                                               Cache District
## 11065                                               Cache District
## 11125                                           Cajon Valley Union
## 11156                            CENTENNIAL PUBLIC SCHOOL DISTRICT
## 11192                                                    Haverhill
## 11230                                               Calhoun County
## 11231                                               Calhoun County
## 11255                                                      CALHOUN
## 11256                                                      CALHOUN
## 11257                                                      CALHOUN
## 11258                                                      CALHOUN
## 11259                                       CALHOUN COUNTY SCHOOLS
## 11263                                              Calibre Academy
## 11272                                            Dehesa Elementary
## 11273                                       Raisin City Elementary
## 11299                                      Sacramento City Unified
## 11300                                            Elk Grove Unified
## 11301                                             San Juan Unified
## 11302                                     Buckeye Union Elementary
## 11303                                               Warner Unified
## 11307         California School for the Blind (State Special Schl)
## 11308  California School for the Deaf-Fremont (State Special Schl)
## 11309   California Sch for the Deaf-Riverside (State Special Schl)
## 11310                                               Duarte Unified
## 11312                                         Cuyama Joint Unified
## 11313                                           Liberty Elementary
## 11314                                       Guerneville Elementary
## 11351                                                   DALLAS ISD
## 11405                                             Granite District
## 11422                                            Oxnard Union High
## 11439                                Cambridge Academy  East   Inc
## 11440                                Cambridge Academy  East   Inc
## 11483              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 11484                                          Campbell Union High
## 11512      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 11513      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 11514      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 11522                                     Camelback Education  Inc
## 11534                                       City of Chicago SD 299
## 11535                                       City of Chicago SD 299
## 11539                                    West Contra Costa Unified
## 11541                                              SAN BENITO CISD
## 11543                                               HARLINGEN CISD
## 11544                                              BROWNSVILLE ISD
## 11546                                             LOS FRESNOS CISD
## 11547                                             POINT ISABEL ISD
## 11551                                                 LA FERIA ISD
## 11582                                            Camino Montessori
## 11589                                             JUVENILE JUSTICE
## 11591                                      Camino Union Elementary
## 11612                            Mohave Valley Elementary District
## 11621                                        CAMPBELL CO PBLC SCHS
## 11683                                       HAMPTON CITY PBLC SCHS
## 11685                                                      BREVARD
## 11728                                         Candeo Schools  Inc.
## 11869                                               Davis District
## 11872                                               Provo District
## 11876                                             Monrovia Unified
## 11877                                            Canyon Elementary
## 11881                                         Canyon Grove Academy
## 11900                                  Pointe Educational Services
## 11908                                           Canyon Rim Academy
## 11911                                    Canyon Rose Academy  Inc.
## 11912                                    Canyon Rose Academy  Inc.
## 11913                                               Cache District
## 11914                                                Nebo District
## 11925                                                Iron District
## 11926                         Agua Fria Union High School District
## 11927                                              Alpine District
## 11928                                               Emery District
## 11929                                                Iron District
## 11930                                       Park View School  Inc.
## 11931                                               Weber District
## 11932                                             Canyons District
## 11935                                             Canyons District
## 11936                                             Canyons District
## 11937                                             Canyons District
## 11967      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 11968      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 11975                                          WOOD COUNTY SCHOOLS
## 12070                                              Carbon District
## 12083                                       Carden of Tucson  Inc.
## 12088                                           Cardiff Elementary
## 12114                             SOUTHERN MN EDUCATION CONSORTIUM
## 12123                               JACKSON PUBLIC SCHOOL DISTRICT
## 12131                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 12138                                      MCDOWELL COUNTY SCHOOLS
## 12149                                           Ventura County ROP
## 12163                                       Career Success Schools
## 12164                                       Career Success Schools
## 12165                                       Career Success Schools
## 12166                                       Career Success Schools
## 12167                                                Etowah County
## 12168                                                Shelby County
## 12190                                     LYNCHBURG CITY PBLC SCHS
## 12221                                                Joliet PSD 86
## 12227                                             Granite District
## 12228                                            NEW BRAUNFELS ISD
## 12243                                               Winnetka SD 36
## 12249                                  ELKO COUNTY SCHOOL DISTRICT
## 12307                                  San Bernardino City Unified
## 12310                                             Waukegan CUSD 60
## 12316                                     Del Mar Union Elementary
## 12348                                Sierra Vista Unified District
## 12427                            Carpe Diem Collegiate High School
## 12480                                           San Marcos Unified
## 12501                                         CARROLL CO PBLC SCHS
## 12523                                                   Ozark City
## 12540                 CARROLL-GALAX REG ALT ED PRGM/THE RAE CENTER
## 12567                                  CARSON CITY SCHOOL DISTRICT
## 12591                                          Lawndale Elementary
## 12677                                       KANAWHA COUNTY SCHOOLS
## 12746                                                 Cary CCSD 26
## 12749                                                     CHSD 155
## 12756                                                 CASA Academy
## 12764                                  San Bernardino City Unified
## 12783                                         Butte Valley Unified
## 12806                                              Alpine District
## 12905                                               Emery District
## 12912                                              Carbon District
## 12934                                              Carbon District
## 12965                                                Ceres Unified
## 12974                                       City of Chicago SD 299
## 12976                                       City of Chicago SD 299
## 12979                                                        DUVAL
## 13071    Coconino Association for Vocation Industry and Technology
## 13072    Coconino Association for Vocation Industry and Technology
## 13073    Coconino Association for Vocation Industry and Technology
## 13075    Coconino Association for Vocation Industry and Technology
## 13076    Coconino Association for Vocation Industry and Technology
## 13077    Coconino Association for Vocation Industry and Technology
## 13079    Coconino Association for Vocation Industry and Technology
## 13080    Coconino Association for Vocation Industry and Technology
## 13081    Coconino Association for Vocation Industry and Technology
## 13082               Central Arizona Valley Institute of Technology
## 13085               Central Arizona Valley Institute of Technology
## 13086               Central Arizona Valley Institute of Technology
## 13087               Central Arizona Valley Institute of Technology
## 13088               Central Arizona Valley Institute of Technology
## 13089               Central Arizona Valley Institute of Technology
## 13090               Central Arizona Valley Institute of Technology
## 13091               Central Arizona Valley Institute of Technology
## 13111                  COMMONWEALTH CTR FOR CHILDREN & ADOLESCENTS
## 13117                                          Monroe/Randolph ROE
## 13156                                                Iron District
## 13176                                                Iron District
## 13230                                         FAIRFAX CO PBLC SCHS
## 13233                                                Iron District
## 13240                                                Iron District
## 13262                                              Sevier District
## 13269                                               Cache District
## 13270                                              Alpine District
## 13275                                                Iron District
## 13290                                              Alpine District
## 13335                                       SBE - Celerity Himalia
## 13338                                          Los Angeles Unified
## 13340                                         SBE - Celerity Rolas
## 13424                                               Davis District
## 13428                                               Provo District
## 13442                                            Duchesne District
## 13448                                                    CENTER 58
## 13467                            Center for Academic Success  Inc.
## 13468                            Center for Academic Success  Inc.
## 13469                            Center for Academic Success  Inc.
## 13470                            Center for Academic Success  Inc.
## 13471                            Center for Academic Success  Inc.
## 13483                                         HENRICO CO PBLC SCHS
## 13487                              Allen-Cochran Enterprises  Inc.
## 13588                              Potter Valley Community Unified
## 13595                                               Davis District
## 13602                                               Davis District
## 13623                                        Institutional Schools
## 13625                                                      BREVARD
## 13677                                               Davis District
## 13704                                             Kewanee CUSD 229
## 13755                                              Banning Unified
## 13816                                     Beech Grove City Schools
## 13964                                             Kewanee CUSD 229
## 14045                           CENTRAL MINNESOTA JT. POWERS DIST.
## 14047                           CENTRAL MINNESOTA JT. POWERS DIST.
## 14061                                   Central Nine Career Center
## 14062                                               NM CORRECTIONS
## 14068                 Central Orange County CTE Partnership (CTEp)
## 14102                                Utah Schools for Deaf & Blind
## 14112                                              Alpine District
## 14118                                NATCHEZ-ADAMS SCHOOL DISTRICT
## 14124                        Red Clay Consolidated School District
## 14129                                           Central Sierra ROP
## 14136                                              CENTRAL ST HOSP
## 14142                                             CENT VA TRAIN CT
## 14161                        CENTRAL VIRGINIA GOV SCH FOR SCI/TECH
## 14205                                                       Lennox
## 14221                                   Roseville Joint Union High
## 14226                           PARK RAPIDS PUBLIC SCHOOL DISTRICT
## 14229                                           Box Elder District
## 14237                                                Ceres Unified
## 14371                                                 CONNALLY ISD
## 14373                                                   MIDWAY ISD
## 14375                                                  LA VEGA ISD
## 14377                                                 ROBINSON ISD
## 14379                                       Challenge School  Inc.
## 14387                                Challenger Basic School  Inc.
## 14436                                              Chambers County
## 14458                          Fit Kids  Inc. dba Champion Schools
## 14464                          Fit Kids  Inc. dba Champion Schools
## 14465                          Fit Kids  Inc. dba Champion Schools
## 14516                 Institute for Transformative Education  Inc.
## 14520                                              Channahon SD 17
## 14526                                                Channing Hall
## 14531                                         FAIRFAX CO PBLC SCHS
## 14618                                                         DADE
## 14671                                                     PINELLAS
## 14768                               Palisades Park School District
## 14876                                                    CHARLOTTE
## 14877                                                    CHARLOTTE
## 14880                                CHARLOTTESVILLE CTY PBLC SCHS
## 14882                                             UNIVERSITY OF VA
## 14883                               CHARLOTTESVILLE-ALBEMARLE TECH
## 14899                                                         DADE
## 14912                                          Morgan Hill Unified
## 15111                                              Cherokee County
## 15116                                               Rapides Parish
## 15161                                                Nebo District
## 15172      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 15173                                              Alpine District
## 15175      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 15212                                    CHESAPEAKE CITY PBLC SCHS
## 15213                                       CHESAPEAKE BAY GOV SCH
## 15215                                    CHESAPEAKE CITY PBLC SCHS
## 15297                                    CHESTERFIELD CO PBLC SCHS
## 15298                                    CHESTERFIELD CO PBLC SCHS
## 15304                                        DOE SOP EDUC PROGRAMS
## 15365                                                     PINELLAS
## 15370                                       City of Chicago SD 299
## 15371                                       City of Chicago SD 299
## 15373                                       City of Chicago SD 299
## 15376                                      Chicago Park Elementary
## 15377                                      Chicago Park Elementary
## 15395                                                Chico Unified
## 15442                                          Aurora East USD 131
## 15448                                           Salt Lake District
## 15451                           Edkey  Inc. - Sequoia Ranch School
## 15452                           Edkey  Inc. - Sequoia Ranch School
## 15454                                 Griffin Foundation  Inc. The
## 15458                                             Paradise Unified
## 15473                                               CHILDRENS PSYC
## 15508                                               Chilton County
## 15587                                CHISAGO LAKES SCHOOL DISTRICT
## 15666                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 15778                             CHURCHILL COUNTY SCHOOL DISTRICT
## 15789                                             Granite District
## 15809                                Smith-Green Community Schools
## 15822                                       City of Chicago SD 299
## 15823                                       City of Chicago SD 299
## 15824                                       City of Chicago SD 299
## 15825                                       City of Chicago SD 299
## 15826                                       City of Chicago SD 299
## 15828                                       City of Chicago SD 299
## 15829                                       City of Chicago SD 299
## 15830                                       City of Chicago SD 299
## 15831                                       City of Chicago SD 299
## 15832                                       City of Chicago SD 299
## 15833                                       City of Chicago SD 299
## 15834                                       City of Chicago SD 299
## 15835                                       City of Chicago SD 299
## 15843                                     Cienega Union Elementary
## 15898                                               Piute District
## 15899                                               Piute District
## 15943                                                         DADE
## 15950                                                       CITRUS
## 15957                                                       CITRUS
## 15958                                                       CITRUS
## 15960                                                 City Academy
## 15966                                              Birmingham City
## 15970                       CITY Center for Collaborative Learning
## 15981                                                         DADE
## 16010                                              Oakland Unified
## 16141                                 CLARK COUNTY SCHOOL DISTRICT
## 16190                                Clark Township Public Schools
## 16218                                              Tooele District
## 16247                                     Buckeye Union Elementary
## 16271                                              Escondido Union
## 16273                                         Escondido Union High
## 16307                               Department of Juvenile Justice
## 16308                                           Woodstock CUSD 200
## 16332                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 16357                                                         CLAY
## 16359                                                         CLAY
## 16360                                                         CLAY
## 16403                                           Salt Lake District
## 16411                      Contra Costa County Office of Education
## 16483                                               Davis District
## 16498                                             Waukegan CUSD 60
## 16525                                              Cleburne County
## 16526                                              Cleburne County
## 16623                                               Emery District
## 16633                                                       HENDRY
## 16767                                               Davis District
## 16805                            Clintn/Jeffrsn/Marin/Washngtn ROE
## 16811                               CLOQUET PUBLIC SCHOOL DISTRICT
## 16816                                             Glendale Unified
## 16828                                    BEAR LAKE COUNTY DISTRICT
## 16913                                              Bethalto CUSD 8
## 16918                                     Coachella Valley Unified
## 16926                              PERSHING COUNTY SCHOOL DISTRICT
## 16948                                            Oceanside Unified
## 16950                                                 SANTA FE ISD
## 16952                                               TEXAS CITY ISD
## 16953                            Colusa County Office of Education
## 16963                                                Coastline ROP
## 17019                                                CODE RVA HIGH
## 17046                                      Coffee Creek Elementary
## 17116                                       Cold Spring Elementary
## 17160       Kaizen Education Foundation dba Colegio Petite Arizona
## 17231                                                  Hale County
## 17232                                 College and Career Advantage
## 17282                                      Mountain Empire Unified
## 17334                                                      COLLIER
## 17335                                                      COLLIER
## 17344                                                  PROSPER ISD
## 17345                                                   FRISCO ISD
## 17347                                                    WYLIE ISD
## 17447                              COLONIAL HEIGHTS CITY PBLC SCHS
## 17510                                  Colton-Redlands-Yucaipa ROP
## 17538                                         Fruitvale Elementary
## 17599                                              Jordan District
## 17600                                               Davis District
## 17611                                                     COLUMBIA
## 17612                                                     COLUMBIA
## 17613                                                     COLUMBIA
## 17639                                                 COLUMBUS ISD
## 17641                                  Bartholomew Con School Corp
## 17651                                           Salt Lake District
## 17775                               COMMONWEALTH GOVERNOR'S SCHOOL
## 17787                                                     SUWANNEE
## 17793                                         FAIRFAX CO PBLC SCHS
## 17800                                     Acton-Agua Dulce Unified
## 17802                                      Keppel Union Elementary
## 17803                                         Helendale Elementary
## 17805                                           Fremont Union High
## 17815                                              Oakland Unified
## 17823                                                FAIRFAX R-III
## 17845                                            Dehesa Elementary
## 17850                                   COMMUNITY OF PEACE ACADEMY
## 17856                                           Capistrano Unified
## 17895                                                Orange Center
## 17896                                     Acton-Agua Dulce Unified
## 17897                                      Mountain Empire Unified
## 17901                                    Compass High School  Inc.
## 17907                           ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 17925                                          Compton Unified ROP
## 17936                                            Duchesne District
## 17977                               Concordia Charter School  Inc.
## 17978                               Concordia Charter School  Inc.
## 18066                                            Waterford Unified
## 18067                           Alameda County Office of Education
## 18074                                 School Assn For Special Educ
## 18168                                      Contra Costa County ROP
## 18169                      Contra Costa County Office of Education
## 18170                                               KANSAS CITY 33
## 18171                          Big Stone City School District 25-1
## 18173                                                      BREVARD
## 18174                                                       SUMTER
## 18176                                                     HERNANDO
## 18177                                                     SEMINOLE
## 18178                                          Ogden City District
## 18216                                       City of Chicago SD 299
## 18232                                               Davis District
## 18254                               Higley Unified School District
## 18273                                              Rock Island ROE
## 18285                                        San Francisco Unified
## 18338                                                 Coosa County
## 18375                               Employ-Ability Unlimited  Inc.
## 18378                                              Tooele District
## 18379                                              Jordan District
## 18386                                              Jordan District
## 18387                                             Granite District
## 18392                                              Jordan District
## 18393                  Innovative Humanities Education Corporation
## 18408                                             Canyons District
## 18423                                WASHOE COUNTY SCHOOL DISTRICT
## 18424                                WASHOE COUNTY SCHOOL DISTRICT
## 18425                                WASHOE COUNTY SCHOOL DISTRICT
## 18431                                          Washington District
## 18432                                          Washington District
## 18468                                       Corcoran Joint Unified
## 18490                                       Folsom-Cordova Unified
## 18508                                           Box Elder District
## 18553                                             Canyons District
## 18557                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 18567                               Cornerstone Charter School Inc
## 18574                                        CAMPBELL CO PBLC SCHS
## 18614                                         Corona-Norco Unified
## 18642                                             Coronado Unified
## 18677                                    Portola Valley Elementary
## 18719              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 18726                                  Cotati-Rohnert Park Unified
## 18762                                  Cottonwood Union Elementary
## 18787                                             Granite District
## 18792                                  Cottonwood Union Elementary
## 18795                                             Granite District
## 18796                                               Emery District
## 18840                              Country Gardens Charter Schools
## 18861                                               Weber District
## 18877                                      Mountain Empire Unified
## 18878                          Mariposa County Office of Education
## 18879                            Amador County Office of Education
## 18881                                            NEW BRAUNFELS ISD
## 18890                                                          LEE
## 18891                                                       HENDRY
## 18900                                    SPOTSYLVANIA CO PBLC SCHS
## 18932                                  Covered Bridge Spec Ed Dist
## 18973                                 CLARK COUNTY SCHOOL DISTRICT
## 18994                                         Trinity Alps Unified
## 19047                                    PORTSMOUTH CITY PBLC SCHS
## 19102                                    Crane Elementary District
## 19111                                                     Cranston
## 19115                                        DOE SOP EDUC PROGRAMS
## 19147                                               Create Academy
## 19169                                  Cotati-Rohnert Park Unified
## 19183                                     Mountain View Elementary
## 19190                                         Newcastle Elementary
## 19232                                           Woodstock CUSD 200
## 19238                                               Davis District
## 19246                                              Carbon District
## 19257                                    DEPARTMENT OF CORRECTIONS
## 19258                                              Crenshaw County
## 19288                                             Canyons District
## 19292                                      Stone Corral Elementary
## 19293                                      Stone Corral Elementary
## 19294                                          Westside Elementary
## 19295                                          Westside Elementary
## 19296                            Fresno County Office of Education
## 19354 American Charter Schools Foundation d.b.a. Crestview College
## 19388                                               Davis District
## 19389                                             Granite District
## 19451                                          Washington District
## 19461                               Department of Juvenile Justice
## 19474                                            HICKMAN MILLS C-1
## 19486                                 Hillsborough City Elementary
## 19492                                                  ABILENE ISD
## 19568                                               CROSBYTON CISD
## 19612                        Prince George's County Public Schools
## 19626                          CROSSROADS ALTERNATIVE/BRISTOL CITY
## 19649                                                    CHARLOTTE
## 19659                                                  Hoover City
## 19664                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 19690                                               Winnetka SD 36
## 19712                                    Crown Charter School  Inc
## 19719                       James Sandoval Preparatory High School
## 19748                                                     CHSD 155
## 19756                                                     CHSD 155
## 19776                                  Cochise Technology District
## 19777                                  Cochise Technology District
## 19778                                  Cochise Technology District
## 19779                                  Cochise Technology District
## 19781                                  Cochise Technology District
## 19782                                  Cochise Technology District
## 19783                                  Cochise Technology District
## 19784                                  Cochise Technology District
## 19785                                  Cochise Technology District
## 19786                                  Cochise Technology District
## 19788                                                       ORANGE
## 19832                                               Cullman County
## 19833                                               Cullman County
## 19835                                                 Cullman City
## 19837                                                 Cullman City
## 19860              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 19892      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 19900      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 19928                                           Fremont Union High
## 20031                Cobre Valley Institute of Technology District
## 20032                Cobre Valley Institute of Technology District
## 20033                Cobre Valley Institute of Technology District
## 20034                Cobre Valley Institute of Technology District
## 20035                Cobre Valley Institute of Technology District
## 20036                Cobre Valley Institute of Technology District
## 20061                                                        PASCO
## 20099                                        CYPRESS-FAIRBANKS ISD
## 20101                                             Granite District
## 20161                                             Wiseburn Unified
## 20167                                                 Dodge County
## 20175                                                         DADE
## 20182                                                 PROGRESO ISD
## 20196                                             Daggett District
## 20223                            FARMINGTON PUBLIC SCHOOL DISTRICT
## 20247                                           Box Elder District
## 20266                                                   IRVING ISD
## 20268                                                Dallas County
## 20272                                CARROLLTON-FARMERS BRANCH ISD
## 20273                                                   DESOTO ISD
## 20335                                              Alpine District
## 20413                                             Waukegan CUSD 60
## 20424                                             Wasatch District
## 20545                                   Los Gatos Union Elementary
## 20590                                             Granite District
## 20654                                              Davinci Academy
## 20662                                         FAIRFAX CO PBLC SCHS
## 20695                                               Davis District
## 20712                                              Uintah District
## 20715                                          Davis Joint Unified
## 20719                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 20764                                               SAN ANGELO ISD
## 20770                                       BRISTOL CITY PBLC SCHS
## 20774                                              Jordan District
## 20775                                    MONONGALIA COUNTY SCHOOLS
## 20826                                                         DCYF
## 20887                                           Woodstock CUSD 200
## 20927                                                 Decatur City
## 21008                                            Deer Park CCSD 82
## 21027                                                 Cary CCSD 26
## 21040                            Deer Valley Charter Schools  Inc.
## 21073                                              Alpine District
## 21095                                            Dehesa Elementary
## 21101                                                DeKalb County
## 21115                               Department of Juvenile Justice
## 21117                                                DeKalb County
## 21137                                     Del Mar Union Elementary
## 21140                                     Del Mar Union Elementary
## 21143                                         Del Norte County ROP
## 21161                                      Orinda Union Elementary
## 21251                                                 HILLSBOROUGH
## 21283                                           Delphic Elementary
## 21287                                                   PALM BEACH
## 21309                                             Millard District
## 21325                                             Millard District
## 21329                                             Millard District
## 21331                                             Millard District
## 21374                                               Denair Unified
## 21440                                               LITTLE ELM ISD
## 21446                                                   DENTON ISD
## 21451                                CARROLLTON-FARMERS BRANCH ISD
## 21479                                    Department of Corrections
## 21480                                Department of Human Resources
## 21490                             Indiana Department of Correction
## 21549                               Desert Heights Charter Schools
## 21551                               Desert Heights Charter Schools
## 21554                                          Washington District
## 21555 American Charter Schools Foundation d.b.a. Desert Hills High
## 21556                                          Washington District
## 21563  Valley of the Sun Waldorf Education Association  dba Desert
## 21569 Kaizen Education Foundation dba Discover U Elementary School
## 21580                               Employ-Ability Unlimited  Inc.
## 21585                                     Desert Rose Academy Inc.
## 21591                                   Antelope Valley Union High
## 21596                            Desert Sky Community School  Inc.
## 21602                                       Desert Springs Academy
## 21607                                          Desert Star Academy
## 21608                           Desert Star Community School  Inc.
## 21610                                  Cave Creek Unified District
## 21618                  Arizona State School for the Deaf and Blind
## 21619                                         Juniper Tree Academy
## 21633                                 CLARK COUNTY SCHOOL DISTRICT
## 21638                                  Cave Creek Unified District
## 21641                                 CLARK COUNTY SCHOOL DISTRICT
## 21646                                               Tuscumbia City
## 21647                                               Tuscumbia City
## 21656                                         San Mateo Union High
## 21680                                                       DESOTO
## 21681                                                       DESOTO
## 21693                                         Destiny School  Inc.
## 21698                                                       TAYLOR
## 21827                                                   KENNETT 39
## 21837                                                Nebo District
## 21849                                             Canyons District
## 21850                                             Granite District
## 21855                                          Washington District
## 21859                            BURNSVILLE PUBLIC SCHOOL DISTRICT
## 21913                                            Dehesa Elementary
## 21914                                            Dehesa Elementary
## 21916                                      Borrego Springs Unified
## 21917                                      Julian Union Elementary
## 21975                                           Salt Lake District
## 22012                                                Joliet PSD 86
## 22028                       Santa Clara County Office of Education
## 22029                                          Tracy Joint Unified
## 22033                       Santa Clara County Office of Education
## 22041                              STATE-SPONSORED CHARTER SCHOOLS
## 22049                                         Fruitvale Elementary
## 22088                                       Discovery Plus Academy
## 22096                                           Box Elder District
## 22097                                              Uintah District
## 22101                                              Discovery Woods
## 22109                                       City of Chicago SD 299
## 22113                                            Bloom Twp HSD 206
## 22114                                                      JACKSON
## 22115                                                      JACKSON
## 22117                                  NORTH BRANCH PUBLIC SCHOOLS
## 22125                                                         DADE
## 22133                                                         DADE
## 22134                                                         DADE
## 22135                                                         DADE
## 22136                                                         DADE
## 22137                                                         DADE
## 22138                                                         DADE
## 22139                                                         DADE
## 22157                                                        DIXIE
## 22168                                          Washington District
## 22172                                          Washington District
## 22174                                     Dixie Montessori Academy
## 22175                                          Washington District
## 22176                                                        DIXIE
## 22177                                                        DIXIE
## 22178                                                        DIXIE
## 22179                                                        DIXIE
## 22180                                                        DIXIE
## 22199                                               Provo District
## 22202                                                Dixon Unified
## 22218                                Ball Charter Schools (Dobson)
## 22386                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 22450                                                 Dooly County
## 22538                             Dos Palos Oro Loma Joint Unified
## 22554                                                  Dothan City
## 22573                               DOUGLAS COUNTY SCHOOL DISTRICT
## 22583                               DOUGLAS COUNTY SCHOOL DISTRICT
## 22596                                            Princeton ESD 115
## 22626                                           Springfield SD 186
## 22627                                             Granite District
## 22646                                         LOUDOUN CO PBLC SCHS
## 22699              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 22736                                              Oakland Unified
## 22752                                               Davis District
## 22913                                                       Lowell
## 22991                                             Canyons District
## 22992                                             Canyons District
## 23002                                                     Kane ROE
## 23004                                                      SD U-46
## 23059                                                     PINELLAS
## 23060                                    Norway J7 School District
## 23087                                              Alpine District
## 23115                                       Dual Immersion Academy
## 23144                                           Springfield SD 186
## 23161                                            Duchesne District
## 23162                                            Duchesne District
## 23167                                   NYE COUNTY SCHOOL DISTRICT
## 23195                                              Tooele District
## 23204                                    DULCE INDEPENDENT SCHOOLS
## 23228                                                          LEE
## 23337                                    Dunsmuir Joint Union High
## 23364                                              Birmingham City
## 23444                                                        DUVAL
## 23446                                                        DUVAL
## 23447                                                        DUVAL
## 23448                                                        DUVAL
## 23449                                                        DUVAL
## 23450                                                        DUVAL
## 23452                                                        DUVAL
## 23455                                                        DUVAL
## 23456                                                        DUVAL
## 23458                                                        DUVAL
## 23578                            E-Institute Charter Schools  Inc.
## 23579                            E-Institute Charter Schools  Inc.
## 23580                            E-Institute Charter Schools  Inc.
## 23581                            E-Institute Charter Schools  Inc.
## 23582                            E-Institute Charter Schools  Inc.
## 23583                            E-Institute Charter Schools  Inc.
## 23584                            E-Institute Charter Schools  Inc.
## 23656                                               Davis District
## 23667                           EAGLE South Mountain Charter  Inc.
## 23668                              EAGLE College Prep Harmony  LLC
## 23669                             EAGLE College Prep Maryvale  LLC
## 23670                                EAGLE College Prep Mesa  LLC.
## 23673                                           Cloverdale Unified
## 23737                                  LYON COUNTY SCHOOL DISTRICT
## 23762                                              Alpine District
## 23768                                              Uintah District
## 23773                                              Alpine District
## 23858                            WHITE PINE COUNTY SCHOOL DISTRICT
## 23861                             PINE CITY PUBLIC SCHOOL DISTRICT
## 23872                                  Scottsdale Unified District
## 23891                               PROCTOR PUBLIC SCHOOL DISTRICT
## 23895                                              Murray District
## 23932                                          Aurora East USD 131
## 23935                                            LINDBERGH SCHOOLS
## 23938                                         Lancaster Elementary
## 23939                            Nevada County Office of Education
## 23949                                         Garden Grove Unified
## 23951                                          Round Lake CUSD 116
## 23952                              SPRING LAKE PARK PUBLIC SCHOOLS
## 23953                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 23959                                               Irvine Unified
## 23964                                                          LEE
## 23965                          BELLE PLAINE PUBLIC SCHOOL DISTRICT
## 23971                                  ELKO COUNTY SCHOOL DISTRICT
## 23972                                NEWARK PUBLIC SCHOOL DISTRICT
## 23974                                NEWARK PUBLIC SCHOOL DISTRICT
## 23975                                NEWARK PUBLIC SCHOOL DISTRICT
## 23979                           SOUTH ST. PAUL PUBLIC SCHOOL DIST.
## 23980                               WAYZATA PUBLIC SCHOOL DISTRICT
## 23985                               WACONIA PUBLIC SCHOOL DISTRICT
## 23988                                DULUTH PUBLIC SCHOOL DISTRICT
## 23991                              BROOKLYN CENTER SCHOOL DISTRICT
## 24066                                           Springfield SD 186
## 24073                                             Waukegan CUSD 60
## 24074                                              Tooele District
## 24088                                            El Rancho Unified
## 24093                              Early Light Academy at Daybreak
## 24101                                     PARTNERSHIP ACADEMY INC.
## 24122                                        Institutional Schools
## 24128                                                     Kane ROE
## 24186                                             EAST CENTRAL ISD
## 24379                                           Salt Lake District
## 24396                                          Aurora East USD 131
## 24412                                          East Hollywood High
## 24467                                               Davis District
## 24500                                                Nebo District
## 24521                                             Canyons District
## 24546                                  East Newark School District
## 24564                                              Ouachita Parish
## 24599                                    DEPARTMENT OF CORRECTIONS
## 24600                                    DEPARTMENT OF CORRECTIONS
## 24634                                  East San Gabriel Valley ROP
## 24636                                             Canyons District
## 24639                                            Duchesne District
## 24642                                              Alpine District
## 24701                                          East Valley Academy
## 24706                                       Legacy Education Group
## 24756                                                      VOLUSIA
## 24757                                                      BREVARD
## 24794                  Arizona State School for the Deaf and Blind
## 24819                                              EASTERN ST HOSP
## 24852                                              Jordan District
## 24866                               Department of Juvenile Justice
## 24871                                             Canyons District
## 24899                                 Eastpointe High School  Inc.
## 24994                                             Granite District
## 25047                                              Turlock Unified
## 25049                                       Toltec School District
## 25075                                           Park City District
## 25090                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 25107                                                   PALM BEACH
## 25125                                                Eden Area ROP
## 25126                                              St Clair County
## 25167                                       Edge School  Inc.  The
## 25168                                       Edge School  Inc.  The
## 25191                                               Provo District
## 25192                                             Canyons District
## 25335                                         FAIRFAX CO PBLC SCHS
## 25364                                           Salt Lake District
## 25372                                               RSU 30/MSAD 30
## 25375                                Edith Bowen Laboratory School
## 25389                             Edkey  Inc. - Pathfinder Academy
## 25390                         Edkey  Inc. - Sequoia Choice Schools
## 25391 Edkey  Inc. - Sequoia School for the Deaf and Hard of Hearin
## 25392                             Edkey  Inc. - Pathfinder Academy
## 25440                                                Joliet PSD 86
## 25444     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 25445                                          Aurora East USD 131
## 25458                               Educational Options Foundation
## 25459                               Educational Options Foundation
## 25465                                          West Chicago ESD 33
## 25475                          Yuma Private Industry Council  Inc.
## 25478                                            Riverside Unified
## 25482                                                   PALM BEACH
## 25483                                                   PALM BEACH
## 25486                                         EduPreneurship  Inc.
## 25487                                        Eduprize Schools  LLC
## 25488                                        Eduprize Schools  LLC
## 25498                                            Tallapoosa County
## 25520                                               Orleans Parish
## 25578                                           Springfield SD 186
## 25653                                                Joliet PSD 86
## 25693                                             Granite District
## 25748                                         El Centro Elementary
## 25797                                           El Nido Elementary
## 25808                                            Val Verde Unified
## 25842                                                    Elba City
## 25858                               Department of Juvenile Justice
## 25867                                                       MARION
## 25868                                          West Chicago ESD 33
## 25877                            WEST RUSK COUNTY CONSOLIDATED ISD
## 25917                            Tulare County Office of Education
## 25932                                                    HAZELWOOD
## 25958                                            San Diego Unified
## 26038                                           Springfield SD 186
## 26092                                         Elk Hills Elementary
## 26097                                              Jordan District
## 26112                                              Jordan District
## 26114                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 26118                                             Granite District
## 26166                                            Elkins Elementary
## 26172                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 26286                                          Logan City District
## 26289                                               Davis District
## 26327                                               Bossier Parish
## 26389                                                Elmore County
## 26433                               Higley Unified School District
## 26530                                                OKLAHOMA CITY
## 26532                                                OKLAHOMA CITY
## 26590                                           Salt Lake District
## 26602                                               Emery District
## 26606                                                Emery Unified
## 26632                               MADELIA PUBLIC SCHOOL DISTRICT
## 26677                                                 Emmons SD 33
## 26701                                         Empower College Prep
## 26702                                         Empower College Prep
## 26703                                     Acton-Agua Dulce Unified
## 26707                                         HENRICO CO PBLC SCHS
## 26728                                WASHOE COUNTY SCHOOL DISTRICT
## 26748                                                Endeavor Hall
## 26753                                         Fruitvale Elementary
## 26761                                               Davis District
## 26774                                                  HOUSTON ISD
## 26776                                                  HOUSTON ISD
## 26777                                                  HOUSTON ISD
## 26778                                                  HOUSTON ISD
## 26780                                                  HOUSTON ISD
## 26797                                              Birmingham City
## 26838                                                Iron District
## 26844                                           Springfield SD 186
## 26851                             SOUTHERN MN EDUCATION CONSORTIUM
## 26852                             SOUTHERN MN EDUCATION CONSORTIUM
## 26856                                           Salt Lake District
## 26860                         ENTERPRISE ACADEMY/NEWPORT NEWS CITY
## 26875                                          Washington District
## 26886                                          Washington District
## 26888                      Madera County Superintendent of Schools
## 26889                                              Entheos Academy
## 26890                                              Entheos Academy
## 26892                                             Canyons District
## 26907              CPLC Community Schools dba Envision High School
## 26915                                       South Sanpete District
## 26916                                       South Sanpete District
## 26924                                EPIC BLENDED LEARNING CHARTER
## 26930                            Nevada County Office of Education
## 26947                                               Jackson County
## 27064             Hunterdon County Educational Services Commission
## 27066                                            Garfield District
## 27069                                           Salt Lake District
## 27070                                            Garfield District
## 27071                                                Iron District
## 27073                                              Escalon Unified
## 27076                                                     ESCAMBIA
## 27078                                              Escambia County
## 27082                                                     ESCAMBIA
## 27083                                                     ESCAMBIA
## 27085                                                     ESCAMBIA
## 27086                                                     ESCAMBIA
## 27087                                                     ESCAMBIA
## 27089                                              Escambia County
## 27098                                         Escondido Union High
## 27106                                         East Side Union High
## 27111                                                       MARTIN
## 27115                                                      VOLUSIA
## 27121                                             Millard District
## 27151                                             Esperanza School
## 27157              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 27175              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 27176      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 27188                            ESTANCIA VALLEY CLASSICAL ACADEMY
## 27229 American Charter Schools Foundation d.b.a. Estrella High Sch
## 27238                                                         DADE
## 27266               Ethos Academy - A Challenge Foundation Academy
## 27283                                                Etowah County
## 27390                                              Tintic District
## 27478                                         North Chicago SD 187
## 27487                                                Mobile County
## 27489                                         HENRICO CO PBLC SCHS
## 27524                                                  McHenry ROE
## 27577                                             Granite District
## 27606                          East Valley Institute of Technology
## 27607                          East Valley Institute of Technology
## 27608                          East Valley Institute of Technology
## 27609                          East Valley Institute of Technology
## 27610                          East Valley Institute of Technology
## 27611                          East Valley Institute of Technology
## 27612                          East Valley Institute of Technology
## 27613                          East Valley Institute of Technology
## 27614                          East Valley Institute of Technology
## 27615                          East Valley Institute of Technology
## 27616                          East Valley Institute of Technology
## 27617                          East Valley Institute of Technology
## 27618                          East Valley Institute of Technology
## 27619                          East Valley Institute of Technology
## 27620                          East Valley Institute of Technology
## 27621                          East Valley Institute of Technology
## 27622                          East Valley Institute of Technology
## 27623                          East Valley Institute of Technology
## 27625                          East Valley Institute of Technology
## 27627                          East Valley Institute of Technology
## 27628                          East Valley Institute of Technology
## 27629                          East Valley Institute of Technology
## 27630                          East Valley Institute of Technology
## 27631                          East Valley Institute of Technology
## 27632                          East Valley Institute of Technology
## 27633                          East Valley Institute of Technology
## 27634                          East Valley Institute of Technology
## 27635                          East Valley Institute of Technology
## 27636                          East Valley Institute of Technology
## 27637                          East Valley Institute of Technology
## 27638                          East Valley Institute of Technology
## 27639                          East Valley Institute of Technology
## 27640                          East Valley Institute of Technology
## 27641                          East Valley Institute of Technology
## 27642                          East Valley Institute of Technology
## 27643                          East Valley Institute of Technology
## 27644                          East Valley Institute of Technology
## 27645                          East Valley Institute of Technology
## 27646                          East Valley Institute of Technology
## 27647                          East Valley Institute of Technology
## 27648                          East Valley Institute of Technology
## 27650                          East Valley Institute of Technology
## 27651                          East Valley Institute of Technology
## 27652                          East Valley Institute of Technology
## 27653                          East Valley Institute of Technology
## 27654                          East Valley Institute of Technology
## 27656                          East Valley Institute of Technology
## 27657                          East Valley Institute of Technology
## 27658                          East Valley Institute of Technology
## 27671                               Somerset County Public Schools
## 27689                                                 PASADENA ISD
## 27690                                             GOOSE CREEK CISD
## 27691                                       City of Chicago SD 299
## 27692                                       City of Chicago SD 299
## 27693                                       City of Chicago SD 299
## 27697                                                EXCEL ACADEMY
## 27728                                            Excelsior Academy
## 27730                                                         DADE
## 27737                                                         DADE
## 27749                             Greater Jasper Consolidated Schs
## 27756                                               Exeter Unified
## 27804                                                      ALACHUA
## 27805                              Baltimore County Public Schools
## 27851                                Caesar Rodney School District
## 27896                                                 Caddo Parish
## 27913                                     Morenci Unified District
## 27935                                         FAIRFAX CO PBLC SCHS
## 27937                                        DOE SOP EDUC PROGRAMS
## 27942                                               Fairfield City
## 27946                                               Fairfield City
## 27977                                               Davis District
## 27998                                     Fairfield-Suisun Unified
## 28085                                              GRAPE CREEK ISD
## 28086                                            STERLING CITY ISD
## 28087                                               ROBERT LEE ISD
## 28089                                                BALLINGER ISD
## 28090                                                 VERIBEST ISD
## 28091                                               CHRISTOVAL ISD
## 28093                                                BALLINGER ISD
## 28095                                               PAINT ROCK ISD
## 28101                                               CHRISTOVAL ISD
## 28107                                CHISAGO LAKES SCHOOL DISTRICT
## 28120                                           Springfield SD 186
## 28198                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 28202                                       North Sanpete District
## 28204                                               PAINT ROCK ISD
## 28205                             ROSEVILLE PUBLIC SCHOOL DISTRICT
## 28209                                             WATER VALLEY ISD
## 28211                                               ROBERT LEE ISD
## 28213                                               PAINT ROCK ISD
## 28230                                  Phoenix Elementary District
## 28248                                              Jordan District
## 28304                                         FAIRFAX CO PBLC SCHS
## 28335                                              Birmingham City
## 28336                                              Birmingham City
## 28338                                       ARLINGTON CO PBLC SCHS
## 28339                                               Davis District
## 28340                                  Centinela Valley Union High
## 28341                                                       MARTIN
## 28346                                                MACON CO. R-I
## 28348                                    Blochman Union Elementary
## 28354                                                 FAMU LAB SCH
## 28400                                              Rowland Unified
## 28432                                    DEPARTMENT OF CORRECTIONS
## 28445                                               Davis District
## 28450                                               Davis District
## 28454                                    DEPARTMENT OF CORRECTIONS
## 28472                                               Weber District
## 28475                                                Joliet PSD 86
## 28508                                            Fast Forward High
## 28547                                       FAYETTE COUNTY SCHOOLS
## 28574                  Arizona State School for the Deaf and Blind
## 28579                                                      ALACHUA
## 28585                             FARIBAULT PUBLIC SCHOOL DISTRICT
## 28606                                           Springfield SD 186
## 28628                          Wisconsin Department of Corrections
## 28659                              FERGUS FALLS AREA SP. ED. COOP.
## 28660                              FERGUS FALLS AREA SP. ED. COOP.
## 28661                              FERGUS FALLS AREA SP. ED. COOP.
## 28730                                               Emery District
## 28754                                                Iron District
## 28781                                                Harvey SD 152
## 28791                                           Box Elder District
## 28830                                             FILLMORE CENTRAL
## 28842                                             Millard District
## 28843                                             Millard District
## 28921                             SOUTHERN MN EDUCATION CONSORTIUM
## 28922                             SOUTHERN MN EDUCATION CONSORTIUM
## 28932                                                   KENEDY ISD
## 28933                                                   KENEDY ISD
## 28989                                                        PASCO
## 28991                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 28994                                        San Francisco Unified
## 28995                                        San Francisco Unified
## 28996                                        San Francisco Unified
## 29010                                                      FLAGLER
## 29013                        Flagstaff Arts And Leadership Academy
## 29016                                     Flagstaff Junior Academy
## 29022                          Wisconsin Department of Corrections
## 29026                                             Daggett District
## 29100                                           Grundy/Kendall ROE
## 29101                                Carroll County Public Schools
## 29105                             SOUTHERN MN EDUCATION CONSORTIUM
## 29128                             FLOODWOOD PUBLIC SCHOOL DISTRICT
## 29178                                                Florence City
## 29195                             Florence Unified School District
## 29207                                                    RUNGE ISD
## 29208                                                LA VERNIA ISD
## 29216                                                        DUVAL
## 29218                                                      OSCEOLA
## 29230                                              Banning Unified
## 29251                                    Flournoy Union Elementary
## 29300                                                 FLOYDADA ISD
## 29311                                                   FL VIRTUAL
## 29318                                     CHATFIELD PUBLIC SCHOOLS
## 29395                                             JUVENILE JUSTICE
## 29398                    Tuolumne County Superintendent of Schools
## 29406                                              Alpine District
## 29407                                           Box Elder District
## 29410                                            Foothills Academy
## 29411                                            Foothills Academy
## 29422                                                Nebo District
## 29423                                              Jordan District
## 29428                                              Alpine District
## 29527                                                   PALM BEACH
## 29546                                  Richland-Bean Blossom C S C
## 29569                                       ROANOKE CITY PBLC SCHS
## 29587                                                Joliet PSD 86
## 29596                                                Chico Unified
## 29652                                   Forks of Salmon Elementary
## 29669                                         North Chicago SD 187
## 29702                                                     KATY ISD
## 29757                                              Jordan District
## 29795                            Mohave Valley Elementary District
## 29818                                         Fort Ross Elementary
## 29871                                              Forty-Niner ROP
## 29882                                          Washington District
## 29937                                       North Sanpete District
## 29939                                Fountain Hills Charter School
## 29953                              Fountain Hills Unified District
## 29977                                NEWARK PUBLIC SCHOOL DISTRICT
## 30024                                             Granite District
## 30028                                              Alpine District
## 30029                                              Jordan District
## 30031                          Wisconsin Department of Corrections
## 30058                                               Davis District
## 30153                                  CAMDEN CITY SCHOOL DISTRICT
## 30256                                                     HERNANDO
## 30260                           PARK RAPIDS PUBLIC SCHOOL DISTRICT
## 30325                                              Franklin County
## 30333                                                     FRANKLIN
## 30347                                   Franklin Discovery Academy
## 30349                                                     Franklin
## 30489                      Franklin Phonetic Primary School Inc. 1
## 30490                      Franklin Phonetic Primary School Inc. 2
## 30502                                               Provo District
## 30505                                           Salt Lake District
## 30521                                                     FRANKLIN
## 30590                                Caesar Rodney School District
## 30609                                          Aurora East USD 131
## 30616                                        UPSHUR COUNTY SCHOOLS
## 30721                                        Freedom Academy  Inc.
## 30723                                        Freedom Academy  Inc.
## 30781                                  Freedom Prep Charter School
## 30783                                  Freedom Preparatory Academy
## 30784                                  Freedom Preparatory Academy
## 30787                                               Weber District
## 30788                                              Alpine District
## 30849                                                Fremont SD 79
## 30870                                               Weber District
## 30872                                           Fremont Union High
## 30875                                                Fremont SD 79
## 30876                                                Fremont SD 79
## 30886                                               Davis District
## 30900                          French Gulch-Whiskeytown Elementary
## 30920                                     SOUTHAMPTON CO PBLC SCHS
## 30928                                               Fresno Unified
## 30929                            Fresno County Office of Education
## 30933                                                   Fresno ROP
## 30957                                         Friendly House  Inc.
## 31043                                              Alpine District
## 31107                                         Fruitvale Elementary
## 31115                                                  FSU LAB SCH
## 31168                                               Fresno Unified
## 31197                                    DEPARTMENT OF CORRECTIONS
## 31223                                 Griffin Foundation  Inc. The
## 31250                                          Aurora East USD 131
## 31252                                            HALLETTSVILLE ISD
## 31298                                   NYE COUNTY SCHOOL DISTRICT
## 31299                                   NYE COUNTY SCHOOL DISTRICT
## 31314                                                 Gadsden City
## 31327                                                      GADSDEN
## 31328                                                      GADSDEN
## 31357                               Department of Juvenile Justice
## 31388                                               Galena USD 120
## 31390                                               Galena USD 120
## 31395                                               Galena USD 120
## 31463                                              FRIENDSWOOD ISD
## 31464                                                DICKINSON ISD
## 31465                                                 SANTA FE ISD
## 31467                                                GALVESTON ISD
## 31559     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 31645                                          Garfield Elementary
## 31699                                           Box Elder District
## 31709                                       KANAWHA COUNTY SCHOOLS
## 31733                              Paterson Public School District
## 31740                                             Millard District
## 31751                                             Millard District
## 31829                                               Alvord Unified
## 31831                                    SPOTSYLVANIA CO PBLC SCHS
## 31845                         Riverside County Office of Education
## 31850 Maricopa County Community College District dba Gateway Early
## 31852                                             WARRENSBURG R-VI
## 31883                                  Gateway Preparatory Academy
## 31888                                                     CHSD 117
## 31910                                              Oakland Unified
## 31941                                                  Gavin SD 37
## 31942                                                  Gavin SD 37
## 31957                                     Gazelle Union Elementary
## 31968                                             Granite District
## 31973                                                      BREVARD
## 31989                                     Gem Charter School  Inc.
## 32006                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 32010                                         HENRICO CO PBLC SCHS
## 32014                                             San Juan Unified
## 32036                                         HENRICO CO PBLC SCHS
## 32054                                        Genesis Program  Inc.
## 32060                                               Conecuh County
## 32081                                                Geneva County
## 32082                                              Alpine District
## 32142                                        GEORGE CO SCHOOL DIST
## 32176                             George Gervin Youth Center  Inc.
## 32179                                                Mobile County
## 32273              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 32297                         Edkey  Inc. - Sequoia Village School
## 32298                                    George Washington Academy
## 32349                                          Ogden City District
## 32366                            WHITE PLAINS CITY SCHOOL DISTRICT
## 32474                                             Germantown SD 60
## 32573                                Gila Institute for Technology
## 32574                                Gila Institute for Technology
## 32576                                Gila Institute for Technology
## 32577                                Gila Institute for Technology
## 32578                                Gila Institute for Technology
## 32579                                Gila Institute for Technology
## 32580                                Gila Institute for Technology
## 32581                                Gila Institute for Technology
## 32639                                                    GILCHRIST
## 32640                                                    GILCHRIST
## 32641                                                    GILCHRIST
## 32642                                                    GILCHRIST
## 32651                                           GILES CO PBLC SCHS
## 32710                                               Gilroy Unified
## 32733                                          Los Angeles Unified
## 32738                Florence Crittenton Services of Arizona  Inc.
## 32753                                             Yosemite Unified
## 32768                                      Marana Unified District
## 32779                                                   PALM BEACH
## 32784                                                       GLADES
## 32785                                                       GLADES
## 32786                                                       GLADES
## 32787                                                       GLADES
## 32805                          NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 32822                                              Fremont Unified
## 32879                                             Waukegan CUSD 60
## 32984                                           Salt Lake District
## 33021                                             Glenn County ROP
## 33083        Kaizen Education Foundation dba El Dorado High School
## 33104                                       RESERVE PUBLIC SCHOOLS
## 33122                                             Waukegan CUSD 60
## 33198                                      Orinda Union Elementary
## 33228                                                     CUSD 308
## 33263                                          Los Angeles Unified
## 33281                                       Summerville Union High
## 33292                                              Jordan District
## 33293                      Contra Costa County Office of Education
## 33317                                              Hayward Unified
## 33337                                        Mesa Union Elementary
## 33343                                             San Juan Unified
## 33344                                             San Juan Unified
## 33360                                             Canyons District
## 33388                                                Joliet PSD 86
## 33416                                     Good Foundations Academy
## 33473                                                Mobile County
## 33496                          Wisconsin Department of Corrections
## 33499                                          Coatesville Area SD
## 33536                                                 Gorman Joint
## 33562                                                Nebo District
## 33591                               GOVERNOR'S SCHOOL FOR THE ARTS
## 33592                                GOV SCH GLOBAL ECONOMICS/TECH
## 33614                                         BEDFORD CO PBLC SCHS
## 33620                                    Crane Elementary District
## 33666                                     Mountain View Elementary
## 33701                                              Jersey CUSD 100
## 33758                                          Ogden City District
## 33804                                               Grand District
## 33805                                               Grand District
## 33829                                   DIVISION OF YOUTH SERVICES
## 33945                                             Granite District
## 33950                                             Granite District
## 33956                                             Granite District
## 33971                                             Granite District
## 33973                                             Granite District
## 33976                                             Canyons District
## 33979                                             Granite District
## 33994                           Mississinewa Community School Corp
## 34050                                              Murray District
## 34077                                              Tooele District
## 34078                                              Tooele District
## 34079                                              Tooele District
## 34124                                      Grass Valley Elementary
## 34145                                 Gravenstein Union Elementary
## 34152                                            Graves Elementary
## 34183                                         Rooks Creek CCSD 425
## 34190                                           Grayslake CHSD 127
## 34193                                           Grayslake CHSD 127
## 34197                                         GRAYSON CO PBLC SCHS
## 34227                                   Great Expectations Academy
## 34235                                   Anthem Preparatory Academy
## 34236                              Archway Classical Academy Arete
## 34237                           Archway Classical Academy Chandler
## 34238                             Archway Classical Academy Cicero
## 34239                           Archway Classical Academy Glendale
## 34240                            Archway Classical Academy Lincoln
## 34241                      Archway Classical Academy North Phoenix
## 34242                         Archway Classical Academy Scottsdale
## 34243                       Archway Classical Academy Trivium East
## 34244                       Archway Classical Academy Trivium West
## 34245                            Archway Classical Academy Veritas
## 34246                                    Arete Preparatory Academy
## 34247                                 Chandler Preparatory Academy
## 34248                                   Cicero Preparatory Academy
## 34249                                 Glendale Preparatory Academy
## 34250                                  Lincoln Preparatory Academy
## 34251                                 Maryvale Preparatory Academy
## 34252                            North Phoenix Preparatory Academy
## 34253                               Scottsdale Preparatory Academy
## 34254                                   Teleos Preparatory Academy
## 34255                                  Trivium Preparatory Academy
## 34256                                  Veritas Preparatory Academy
## 34302                        Stanislaus County Office of Education
## 34303                                      Salida Union Elementary
## 34323                                 Lafayette School Corporation
## 34329                               NEW HORIZONS CAREER & TECH CTR
## 34331                               Jamul-Dulzura Union Elementary
## 34336                                                   Peoria ROE
## 34341                                               Winnetka SD 36
## 34359                                               Weber District
## 34365                                         North Chicago SD 187
## 34369                                               Cache District
## 34436                                       Green Point Elementary
## 34439              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 34445                                               Emery District
## 34525                                    GREENBRIER COUNTY SCHOOLS
## 34559                                          GREENE CO PBLC SCHS
## 34560                                                Greene County
## 34583                                   Greene-Sullivan Sp Ed Coop
## 34719                                               Cache District
## 34743                                     Greenwood Charter School
## 34752                                             Waukegan CUSD 60
## 34754                                           Woodstock CUSD 200
## 34797                                              Alpine District
## 34855                                             Jefferson Parish
## 34870      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 34968                                           Box Elder District
## 34969                                           Box Elder District
## 34971                                             Redlands Unified
## 35001                                              Alpine District
## 35040                                      Sacramento City Unified
## 35065                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 35069                                               NM CORRECTIONS
## 35075                                   Guadalupe Union Elementary
## 35076                                             Guadalupe School
## 35077                                                Vista Unified
## 35096                                          Palmdale Elementary
## 35134                                                        PASCO
## 35143                                                         GULF
## 35152                                                   PALM BEACH
## 35167                                       South Sanpete District
## 35168                                       South Sanpete District
## 35169                                       South Sanpete District
## 35252                                               Davis District
## 35261                                 Eastern IL Area of Spec Educ
## 35271                                               Weber District
## 35289                                             Waukegan CUSD 60
## 35294                                                DEER PARK ISD
## 35338                                                Clarke County
## 35339                                  Ha:san Educational Services
## 35428                                                         POLK
## 35457                                                PLAINVIEW ISD
## 35479                                              Haleyville City
## 35494                                         HALIFAX CO PBLC SCHS
## 35595                                             Hamilton Unified
## 35694                                                     HAMILTON
## 35695                                                     HAMILTON
## 35696                                                     HAMILTON
## 35697                                                     HAMILTON
## 35875                                               Wayne District
## 35962                                      Happy Valley Elementary
## 35972                                    Happy Valley School  Inc.
## 35973                                            Happy Valley East
## 36024                                                       HARDEE
## 36025                                                       HARDEE
## 36026                                                       HARDEE
## 36038                                         HARDIN-JEFFERSON ISD
## 36065                                           HARDIN-CENTRAL C-2
## 36116                           Pemberton Township School District
## 36316                                         Newport-Mesa Unified
## 36382                                                  HOUSTON ISD
## 36383                                            SPRING BRANCH ISD
## 36384                                                    KLEIN ISD
## 36385                                              CLEAR CREEK ISD
## 36402                                           Box Elder District
## 36449                                      HARRISON COUNTY SCHOOLS
## 36458                                   South Harrison Com Schools
## 36510                       CALDWELL-WEST CALDWELL SCHOOL DISTRICT
## 36557                              Yuba County Office of Education
## 36571                                             Granite District
## 36588                                                     Hart ROP
## 36661                                             Granite District
## 36680                                           Springfield SD 186
## 36691                                           Pleasanton Unified
## 36692              Harvest Power Community Development Group  Inc.
## 36693              Harvest Power Community Development Group  Inc.
## 36694              Harvest Power Community Development Group  Inc.
## 36696                                         Newcastle Elementary
## 36699                                              Alpine District
## 36752                                                    ST. JOHNS
## 36807                                        San Francisco Unified
## 36808   Kaizen Education Foundation dba Havasu Preparatory Academy
## 36809                                 Lake Havasu Unified District
## 36821                      Haven Montessori Children's House  Inc.
## 36893                                             Hawthorn Academy
## 36894                                             Hawthorn Academy
## 36966                                           Salt Lake District
## 36988                                              Jordan District
## 37076                                           Springfield SD 186
## 37138                                       ARLINGTON CO PBLC SCHS
## 37158                                             Granite District
## 37197                                 Ball Charter Schools (Hearn)
## 37227                                              Jordan District
## 37243                              Frederick County Public Schools
## 37265                                             Wasatch District
## 37373                                               Grand District
## 37421                                              Carbon District
## 37447                                              Banning Unified
## 37458                                                HEMPSTEAD ISD
## 37522                                                       HENDRY
## 37523                                                       HENDRY
## 37542                                        DOE SOP EDUC PROGRAMS
## 37575                                                 Henry County
## 37581                                     Safford Unified District
## 37638                                  CAMDEN CITY SCHOOL DISTRICT
## 37668                                          Aurora East USD 131
## 37731                                                         DADE
## 37751                                       Heritage Academy  Inc.
## 37754                                Heritage Academy Laveen  Inc.
## 37759                           Heritage Academy Queen Creek  Inc.
## 37790                                   Heritage Elementary School
## 37795                                   Heritage Elementary School
## 37841                                              Escondido Union
## 37866                                              WEBB CITY R-VII
## 37869                                          Ogden City District
## 37871                                               Davis District
## 37872                                          Washington District
## 37877                                               Cache District
## 37892                                            Sandwich CUSD 430
## 37932                            Hermosa Montessori Charter School
## 37933                                Hermosa Beach City Elementary
## 37934                                Hermosa Beach City Elementary
## 37940                                                     HERNANDO
## 37941                                                     HERNANDO
## 37947                                                     HERNANDO
## 37950                                                     HERNANDO
## 37951                                                     HERNANDO
## 37952                                                     HERNANDO
## 37981                                              Jordan District
## 37982                                              Jordan District
## 38055                                                         DADE
## 38057                                                         DADE
## 38127                                            Northbrook ESD 27
## 38149                                                  WESLACO ISD
## 38151                                                 MISSION CISD
## 38153                                                    DONNA ISD
## 38154                                             EDCOUCH-ELSA ISD
## 38160                                                  HIDALGO ISD
## 38169                                              Alpine District
## 38212                                WASHOE COUNTY SCHOOL DISTRICT
## 38214                                 CLARK COUNTY SCHOOL DISTRICT
## 38238                                                  SHELDON ISD
## 38251                                             GOOSE CREEK CISD
## 38340                              Higher Institute of Arts & Tech
## 38349                                             Beaumont Unified
## 38427                                         Highland Free School
## 38433                                           Salt Lake District
## 38453                                          Ogden City District
## 38522                                           Salt Lake District
## 38526                                                Highland Prep
## 38541                                              Alpine District
## 38560                                          Twin Rivers Unified
## 38561                                                    HIGHLANDS
## 38562                                                    HIGHLANDS
## 38596                                        DOE SOP EDUC PROGRAMS
## 38607                                                    HIGHLANDS
## 38608                                                    HIGHLANDS
## 38609                                                    HIGHLANDS
## 38622                                      Highmark Charter School
## 38626                                                   ALDINE ISD
## 38627                                             BARBERS HILL ISD
## 38628                                                 LA PORTE ISD
## 38629                                                   HUMBLE ISD
## 38631                                                   CROSBY ISD
## 38632                                              GALENA PARK ISD
## 38688                                                HILLSBORO ISD
## 38690                                                  WHITNEY ISD
## 38711                                               Davis District
## 38736                                                LEBANON R-III
## 38787                                             Canyons District
## 38799                                              Murray District
## 38809                                              Alpine District
## 38810                                          Logan City District
## 38815                                          Ogden City District
## 38895                                                 HILLSBOROUGH
## 38916                                             Granite District
## 38933                                  South San Francisco Unified
## 38962                                           Salt Lake District
## 38970                                             Granite District
## 39085                        Hirsch Academy A Challenge Foundation
## 39089                                                         DADE
## 39124                                                Nebo District
## 39138                                       Hoboken Charter School
## 39173                                              Banning Unified
## 39213                                               Davis District
## 39289                                       HOLLANDALE SCHOOL DIST
## 39457                                                       HOLMES
## 39458                                                       HOLMES
## 39459                                                       HOLMES
## 39466                                Graysmark Schools Corporation
## 39480                                               Davis District
## 39511                              Baltimore County Public Schools
## 39525                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 39526                                               NORTH EAST ISD
## 39534                                              Birmingham City
## 39535                                              Birmingham City
## 39536                                                    ST. LUCIE
## 39585                                           Fremont Union High
## 39592                                             Paradise Unified
## 39600                                  Homewood Flossmoor CHSD 233
## 39636                                             Paradise Unified
## 39638                                              Mattole Unified
## 39672                                               Weber District
## 39677                                               Adams-Cheshire
## 39739                                                 Eufaula City
## 39743                                                      GADSDEN
## 39772                                               Houston County
## 39775                                          Blueprint Education
## 39777                                          Blueprint Education
## 39778                                                     Cranston
## 39780                         San Diego County Office of Education
## 39781                                       City of Chicago SD 299
## 39795                  Navajo County School Superintendents Office
## 39874                                              Burbank Unified
## 39915                                          Ogden City District
## 39933                                       Western Placer Unified
## 39959                                                 Decatur City
## 39961                     Horizon Community Learning Center Inc. 2
## 39962                     Horizon Community Learning Center Inc. 1
## 39976                                              Alpine District
## 39978                                          Washington District
## 39979                                              Murray District
## 39980                                       City of Chicago SD 299
## 40009                                           Salt Lake District
## 40025                                     Beech Grove City Schools
## 40044                                  Cave Creek Unified District
## 40065                                                     ESCAMBIA
## 40068                                                         POLK
## 40070                                                      ALACHUA
## 40071                                                         LEON
## 40073                                                      MANATEE
## 40074                                                     SEMINOLE
## 40075                                                      BROWARD
## 40077                                                      COLLIER
## 40078                                                     PINELLAS
## 40079                                                    PLANO ISD
## 40081                                                      OSCEOLA
## 40138                                         HOUSTON  SCHOOL DIST
## 40145                                               Houston County
## 40146                                               Houston County
## 40243                                  HOWARD LAKE-WAVERLY-WINSTED
## 40253                                             Granite District
## 40255                                                Howard School
## 40354                                               Winnetka SD 36
## 40383              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 40402                                                        PASCO
## 40421      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 40449                                                Joliet PSD 86
## 40520   Humanities and Sciences Academy of the United States  Inc.
## 40521   Humanities and Sciences Academy of the United States  Inc.
## 40522               International Commerce Secondary Schools  Inc.
## 40534                              HUMBOLDT COUNTY SCHOOL DISTRICT
## 40537                                          Humboldt County ROP
## 40561                                     New Jerusalem Elementary
## 40592                                             Granite District
## 40595                                             Granite District
## 40598                                             Granite District
## 40657                                               Emery District
## 40730                                          Washington District
## 40732                                          Washington District
## 40733                                          Washington District
## 40735                                          Washington District
## 40762                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 40763                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 40789                                      Mountain Valley Unified
## 40808                                             Waukegan CUSD 60
## 40832                                WASHOE COUNTY SCHOOL DISTRICT
## 40851                                              Tooele District
## 40918                                       OROFINO JOINT DISTRICT
## 41002                                                      FLAGLER
## 41005                                  INVER GROVE HEIGHTS SCHOOLS
## 41020                                       City of Chicago SD 299
## 41021                                       City of Chicago SD 299
## 41034                                     Acton-Agua Dulce Unified
## 41035                                         Lancaster Elementary
## 41036                                     Acton-Agua Dulce Unified
## 41038                                           Springfield SD 186
## 41053                             Il Mathematics & Science Academy
## 41054                                                      SD U-46
## 41097                            Imagine Avondale Elementary  Inc.
## 41098                                Imagine Avondale Middle  Inc.
## 41099                              Bell Canyon Charter School  Inc
## 41100                Imagine Charter Elementary at Camelback  Inc.
## 41101                               Imagine Camelback Middle  Inc.
## 41109                            Imagine Coolidge Elementary  Inc.
## 41110                         Pathfinder Charter School Foundation
## 41111                      Cortez Park Charter Middle School  Inc.
## 41112              Imagine Charter Elementary at Desert West  Inc.
## 41113                             Imagine Desert West Middle  Inc.
## 41114                    East Mesa Charter Elementary School  Inc.
## 41115                            Imagine Middle at East Mesa  Inc.
## 41123                                  Imagine Prep Coolidge  Inc.
## 41124                              Imagine Prep Superstition  Inc.
## 41125                                  Imagine Prep Surprise  Inc.
## 41126                    Rosefield Charter Elementary School  Inc.
## 41139                            Imagine Superstition Middle  Inc.
## 41140                             Imagine Middle at Surprise  Inc.
## 41141                            Imagine Elementary at Tempe  Inc.
## 41142                 West Gilbert Charter Elementary School  Inc.
## 41143                     West Gilbert Charter Middle School  Inc.
## 41146                                                         DADE
## 41186                                          Imperial Valley ROP
## 41198                                               Incito Schools
## 41241                                               Provo District
## 41257                                 CORRECTIONAL SCHOOL DISTRICT
## 41277                                  PRINCE WILLIAM CO PBLC SCHS
## 41301                                        Indian Creek CUSD 425
## 41307                                        Indian Creek CUSD 425
## 41310                                        Indian Creek CUSD 425
## 41316                                   Indian Diggings Elementary
## 41331                                         Las Virgenes Unified
## 41342                                             Canyons District
## 41344                                           Salt Lake District
## 41395                                                 INDIAN RIVER
## 41402                                    Indian Springs Elementary
## 41486                                              Oakland Unified
## 41488                                     San Ramon Valley Unified
## 41542                               Yucaipa-Calimesa Joint Unified
## 41545                                                   PALM BEACH
## 41574                                           Salt Lake District
## 41577                                           Salt Lake District
## 41599                                   INSIGHT SCHOOL OF OKLAHOMA
## 41600                                   INSIGHT SCHOOL OF OKLAHOMA
## 41607                                     Acton-Agua Dulce Unified
## 41608                                             Maricopa Unified
## 41609                                            Dehesa Elementary
## 41611                                              Winship-Robbins
## 41612                                          Westside Elementary
## 41616                                                  HOUSTON ISD
## 41626                                                         DADE
## 41629                                Intech Collegiate High School
## 41633                                INTEGRATED DAY CHARTER SCHOOL
## 41637                             Integrity Education Incorporated
## 41640               SC Jensen Corporation  Inc. dba Intelli-School
## 41641                        PAS Charter  Inc.  dba Intelli-School
## 41642                                         Intelli-School  Inc.
## 41643                        PAS Charter  Inc.  dba Intelli-School
## 41644                          SHERBURNE AND NORTHERN WRIGHT SPECI
## 41652                                         FAIRFAX CO PBLC SCHS
## 41685               International Commerce Secondary Schools  Inc.
## 41686   Humanities and Sciences Academy of the United States  Inc.
## 41704                       Los Angeles County Office of Education
## 41716                                   Monterey Peninsula Unified
## 41719                                                         DADE
## 41720                                                         DADE
## 41725                                                         DADE
## 41735                                       City of Chicago SD 299
## 41753                              Inyo County Office of Education
## 41792                               Feather Falls Union Elementary
## 41847                                                Iron District
## 41854                                                Iron District
## 41907                                             Kewanee CUSD 229
## 42016                               WAYZATA PUBLIC SCHOOL DISTRICT
## 42029                                                Joliet PSD 86
## 42040                           Pemberton Township School District
## 42054                            Carpe Diem Collegiate High School
## 42062                                         HENRICO CO PBLC SCHS
## 42121                                      East Baton Rouge Parish
## 42142                                  Itineris Early College High
## 42154                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 42157                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 42173                                                      VOLUSIA
## 42180                                             Moorpark Unified
## 42183                                            IDJJ Sch Dist 428
## 42252                                                EDINBURG CISD
## 42338                             Kings County Office of Education
## 42388                            J O Combs Unified School District
## 42409                                               Rapides Parish
## 42424                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 42429                                             Wasatch District
## 42448                                             Waukegan CUSD 60
## 42485                  Lifelong Learning Research Institute Inc. 2
## 42490                                             Granite District
## 42495                                  ELKO COUNTY SCHOOL DISTRICT
## 42523                                  Brownstown Cnt Com Sch Corp
## 42525                          Wisconsin Department of Corrections
## 42526                                               Jackson County
## 42636                              JACKSON RIVER GOVERNOR'S SCHOOL
## 42637                                       JACKSON RIVER TECH CTR
## 42644                                                         DADE
## 42652                                                      JACKSON
## 42653                                                      JACKSON
## 42654                                                      JACKSON
## 42661                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 42704                                  Gila County Sheriffs Office
## 42705                          Graham County School Superintendent
## 42706                              Greenlee County Sheriffs Office
## 42707                              Maricopa County Sheriffs Office
## 42708                            Santa Cruz County Sheriffs Office
## 42803                                             Granite District
## 42845                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 42911                             James Madison Preparatory School
## 42913                                          Ogden City District
## 42961                                      BERKELEY COUNTY SCHOOLS
## 42992                                                        PASCO
## 43046                              Mono County Office of Education
## 43053                                           Springfield SD 186
## 43163                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 43164                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 43165                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 43181                                Utah Schools for Deaf & Blind
## 43220                                            Jefferson Academy
## 43239                                       PORT NECHES-GROVES ISD
## 43244                                              PORT ARTHUR ISD
## 43245                                                 BEAUMONT ISD
## 43248                                                    JEFFERSON
## 43249                                     JEFFERSON CO SCHOOL DIST
## 43250                                             Jefferson County
## 43251                                             Jefferson County
## 43253                                                    JEFFERSON
## 43302                                            Princeton ESD 115
## 43366                                         Jefferson Elementary
## 43500                                           Springfield SD 186
## 43509                                       Choice Academies  Inc.
## 43531                                                    JEFFERSON
## 43532                                                    JEFFERSON
## 43533                                                    JEFFERSON
## 43564                                               Chilton County
## 43637                                           Park City District
## 43638                                           Park City District
## 43667                                              Jersey CUSD 100
## 43668                                              Jersey CUSD 100
## 43673                                              Jersey CUSD 100
## 43674                                              Jersey CUSD 100
## 43786                                            INSPIRE ACADEMIES
## 43794                              Inyo County Office of Education
## 43800                                             Granite District
## 43833                                                   WILLIS ISD
## 43839                                              SAN ANTONIO ISD
## 43840                                                   HUMBLE ISD
## 43841                                                 LA PORTE ISD
## 43843                                                 MERCEDES ISD
## 43858                                                      MADISON
## 43909                                              Jordan District
## 43914            California Education Authority (CEA) Headquarters
## 43941                                      Loomis Union Elementary
## 43942                         El Dorado County Office of Education
## 43943                                       Western Placer Unified
## 43945                                         Desert Sands Unified
## 44002                          Wisconsin Department of Corrections
## 44016                                             Granite District
## 44041                                       HANCOCK COUNTY SCHOOLS
## 44043                                              John de la Howe
## 44151                                             Granite District
## 44166                                                  Westminster
## 44189                                          Aurora East USD 131
## 44227                                  John Hancock Charter School
## 44236                                    West Contra Costa Unified
## 44246                                                   PALM BEACH
## 44271                                    SPOTSYLVANIA CO PBLC SCHS
## 44319                                      MARSHALL COUNTY SCHOOLS
## 44347                            Nevada County Office of Education
## 44393                                                     SEMINOLE
## 44425                                             Waukegan CUSD 60
## 44435                                                Lombard SD 44
## 44557                                                 BURLESON ISD
## 44649                                           San Marcos Unified
## 44763                                              Jordan District
## 44764                                              Jordan District
## 44766                                        Mesa Unified District
## 44768                                JORDAN PUBLIC SCHOOL DISTRICT
## 44778                                             Canyons District
## 44781                                              Jordan District
## 44786                                              Jordan District
## 44791                                             Canyons District
## 44829                                      MANASSAS CITY PBLC SCHS
## 44955                                               JOURDANTON ISD
## 44961                                           Capistrano Unified
## 44993                                                Juab District
## 44994                                                Juab District
## 44995                                      Borrego Springs Unified
## 45101                                      Julian Union Elementary
## 45145                                          Junction Elementary
## 45174                                   Ravendale-Termo Elementary
## 45183                                                   PALM BEACH
## 45188                                               Jurupa Unified
## 45207                                          Simi Valley Unified
## 45226                                           Champaign/Ford ROE
## 45241              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 45243                                                   DALLAS ISD
## 45244                                              GALENA PARK ISD
## 45245                                                 ALVARADO ISD
## 45247                                                    VENUS ISD
## 45249                             South Bend Community School Corp
## 45252                                                   LIBERTY 53
## 45255              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 45256              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 45259                                          Noblesville Schools
## 45260                                                   UNITED ISD
## 45266                                          Aurora East USD 131
## 45314                                               Kairos Academy
## 45316                                            Vacaville Unified
## 45322        Kaizen Education Foundation dba El Dorado High School
## 45323         Kaizen Education Foundation dba Gilbert Arts Academy
## 45324             Kaizen Education Foundation dba Maya High School
## 45325 Kaizen Education Foundation dba Tempe Accelerated High Schoo
## 45326 Kaizen Education Foundation dba South Pointe Elementary Scho
## 45327           Kaizen Education Foundation dba Summit High School
## 45328   Kaizen Education Foundation dba Vista Grove Preparatory  2
## 45351                                  KALEIDOSCOPE CHARTER SCHOOL
## 45383                                                Kane District
## 45384                                                Kane District
## 45385                                                Kane District
## 45389                                                  HOUSTON ISD
## 45393                                                Kane District
## 45401                                               Weber District
## 45449                           Karl G. Maeser Preparatory Academy
## 45467                                            Kashia Elementary
## 45549                                              Jordan District
## 45550                                            San Diego Unified
## 45558                                               Davis District
## 45562                                               Davis District
## 45563                                               Davis District
## 45566                                   Kings Canyon Joint Unified
## 45568                                              KARNES CITY ISD
## 45591                                             Granite District
## 45592                                             Granite District
## 45646                                            San Diego Unified
## 45706 Edkey  Inc. - Sequoia School for the Deaf and Hard of Hearin
## 45803                                WASHOE COUNTY SCHOOL DISTRICT
## 45907                                Utah Schools for Deaf & Blind
## 45918                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 45946                                      Kenosha School District
## 46044                                                      Kenwood
## 46105                                              Kern County ROP
## 46107                                                Kern High ROC
## 46166                                             Kewanee CUSD 229
## 46187                                                       MONROE
## 46203                                                         DADE
## 46226                     Keystone Montessori Charter School  Inc.
## 46233                         Khalsa Montessori Elementary Schools
## 46234                                       Khalsa Family Services
## 46289                                                  KILLEEN ISD
## 46375                             Huntington Beach City Elementary
## 46430                                               Davis District
## 46455                                  Kingman Academy Of Learning
## 46456                                  Kingman Academy Of Learning
## 46457                                  Kingman Academy Of Learning
## 46458                                  Kingman Academy Of Learning
## 46468                                   Kings Canyon Joint Unified
## 46471                                             Kings County ROP
## 46472                             Kings County Office of Education
## 46473                             Kings County Office of Education
## 46475                                              KINGS DAUGHTERS
## 46476                                            Kings Cons SD 144
## 46492                                            Duchesne District
## 46500                                  Kit Carson Union Elementary
## 46501                                  Kit Carson Union Elementary
## 46641                                       City of Chicago SD 299
## 46672                                       City of Chicago SD 299
## 46673                                       City of Chicago SD 299
## 46752                                       City of Chicago SD 299
## 46925                                            NEW BRAUNFELS ISD
## 46926                                                    KLEIN ISD
## 46956                                          Kneeland Elementary
## 46970                                     Knights Ferry Elementary
## 46978                                           San Marcos Unified
## 47007                                               Davis District
## 47096                                              Konocti Unified
## 47101                                              Sevier District
## 47254                                           LUBBOCK-COOPER ISD
## 47256                                          Aurora East USD 131
## 47270                                                LANCASTER ISD
## 47303                       Los Angeles County Office of Education
## 47324                                            La Canada Unified
## 47326                                            La Canada Unified
## 47344                                           San Marcos Unified
## 47427                                           San Marcos Unified
## 47433                    Arizona Community Development Corporation
## 47434                    Arizona Community Development Corporation
## 47435                    Arizona Community Development Corporation
## 47459                                         La Puente Valley ROP
## 47466                                            San Juan District
## 47477                              La Tierra Community School  Inc
## 47478                                    Saddleback Valley Unified
## 47498                                              Willits Unified
## 47515                                                       HENDRY
## 47568                                                 Ladd CCSD 94
## 47580                                               Pickens County
## 47581                             Lagrange Area Dept Spec Ed-Ladse
## 47583                                                        LADUE
## 47603                             South Bend Community School Corp
## 47659                                                    LAFAYETTE
## 47660                                                    LAFAYETTE
## 47661                                                    LAFAYETTE
## 47662                                                    LAFAYETTE
## 47682                                      Laguna Joint Elementary
## 47693                                          Lagunita Elementary
## 47730                                            Lake Bluff ESD 65
## 47732                                            Lake Bluff ESD 65
## 47761                                                     Lake ROE
## 47770                                                         LAKE
## 47775                                              Lake County ROP
## 47820                                         Lake Forest CHSD 115
## 47924                               WILLMAR PUBLIC SCHOOL DISTRICT
## 47937                                                Kane District
## 47938                                                Kane District
## 47959                                             Granite District
## 48017                                           Box Elder District
## 48020                                                         LAKE
## 48021                                                         LAKE
## 48022                                                         LAKE
## 48034                                                   PALM BEACH
## 48096                                              Alpine District
## 48136                                    Lakeside Union Elementary
## 48187                                               Davis District
## 48189                                              LAKESIDE SCHOOL
## 48192                                           Springfield SD 186
## 48195                                             Lakeview Academy
## 48200                                                     ESCAMBIA
## 48275                               WILLMAR PUBLIC SCHOOL DISTRICT
## 48277                                               Provo District
## 48279                                               Weber District
## 48315                                Twin Lakes #4 School District
## 48389                                                 Lamar County
## 48400                                            NEW BRAUNFELS ISD
## 48509                                                        PASCO
## 48515                                LANDER COUNTY SCHOOL DISTRICT
## 48534                                                Nebo District
## 48594                                       ARLINGTON CO PBLC SCHS
## 48634                                           Springfield SD 186
## 48661                                                   PALM BEACH
## 48677                                              Uintah District
## 48737                                                Nebo District
## 48748                                        San Francisco Unified
## 48779                                    StrengthBuilding Partners
## 48786                                 La Salle/Marshall/Putnam ROE
## 48802                                         Los Altos Elementary
## 48813                                                   Lassen ROP
## 48835                                                         DADE
## 48863                                             Torrance Unified
## 48945                                            San Diego Unified
## 48956                                 Northern Humboldt Union High
## 48987                                          Washington District
## 49000                                          Washington District
## 49040                                              Lawrence County
## 49052                                           Springfield SD 186
## 49123                                               Davis District
## 49124                                               Davis District
## 49126                                          Laytonville Unified
## 49177                                   Leadership Academy of Utah
## 49179                                  Leadership Learning Academy
## 49180                                  Leadership Learning Academy
## 49192                                         LEAD Charter Schools
## 49193                                         LEAD Charter Schools
## 49194                                         LEAD Charter Schools
## 49195                                Leading Edge Academy Maricopa
## 49196    LEAD Charter Schools dba Leading Edge Academy Queen Creek
## 49197                                         LEAD Charter Schools
## 49232                                         North Chicago SD 187
## 49240                                         North Chicago SD 187
## 49247                              STATE-SPONSORED CHARTER SCHOOLS
## 49255                                   Monterey Peninsula Unified
## 49256    CAFA  Inc. dba Learning Foundation Performing Arts School
## 49257  CAFA  Inc. dba Learning Foundation and Performing Arts Alta
## 49258 CAFA  Inc. dba Learning Foundation and Performing Arts Gilbe
## 49259 CAFA  Inc. dba Learning Foundation and Performing Arts Gilbe
## 49262                    Phoenix School of Academic Excellence The
## 49263                                            Dehesa Elementary
## 49269                                      Goleta Union Elementary
## 49353                                             LEE CO PBLC SCHS
## 49355                                               NM CORRECTIONS
## 49429                                                          LEE
## 49430                                                          LEE
## 49480                                       LEFLORE CO SCHOOL DIST
## 49511                                               Davis District
## 49519                                   Legacy Preparatory Academy
## 49523                                              Alpine District
## 49524                                          Washington District
## 49526                          Legacy Traditional School - Gilbert
## 49527           Legacy Traditional Charter School - Laveen Village
## 49529                         Legacy Traditional School - Avondale
## 49530             Legacy Traditional Charter Schools - Casa Grande
## 49531                         Legacy Traditional School - Chandler
## 49533                         Legacy Traditional School - Glendale
## 49534                 Legacy Traditional Charter School - Maricopa
## 49535                   Legacy Traditional School - North Chandler
## 49536                 Legacy Traditional School - Northwest Tucson
## 49537                           Legacy Traditional School - Peoria
## 49538                            Legacy Traditional Charter School
## 49539                         Legacy Traditional School - Surprise
## 49540                                       City of Chicago SD 299
## 49557                                              Alpine District
## 49558                                              Alpine District
## 49559                                              Alpine District
## 49591                              HUMBOLDT COUNTY SCHOOL DISTRICT
## 49618                            Leman Academy of Excellence  Inc.
## 49620                            Leman Academy of Excellence  Inc.
## 49621                            Leman Academy of Excellence  Inc.
## 49623                            Leman Academy of Excellence  Inc.
## 49645                                           Lemoore Union High
## 49646                                           Lemoore Union High
## 49682                                                       Lennox
## 49726                                                         LEON
## 49742                                                         LEON
## 49743                                                         LEON
## 49890                                                         LEVY
## 49892                                                         LEVY
## 49893                                                         LEVY
## 49894                                                         LEVY
## 49895                                                         LEVY
## 49982                                              Santa Rosa High
## 50014                                               Cache District
## 50039                                   Los Gatos Union Elementary
## 50092                   Libertas Academy Charter School (District)
## 50097                                                   LIBERTY 53
## 50099         Kaizen Education Foundation dba Liberty Arts Academy
## 50223                                          Liberty High School
## 50289                                              Murray District
## 50290                                           Salt Lake District
## 50295                           Liberty Traditional Charter School
## 50296                           Liberty Traditional Charter School
## 50303                                                      LIBERTY
## 50304                                                      LIBERTY
## 50305                                                      LIBERTY
## 50315                                                     CHSD 128
## 50355                          Life Skills Center of Arizona  Inc.
## 50366                                         Lancaster Elementary
## 50368                             SBE - Lifeline Education Charter
## 50370                  Lifelong Learning Research Institute Inc. 1
## 50400                                              Carbon District
## 50403                                               BRAZOSPORT ISD
## 50465                                             Limestone County
## 50478                            Lincoln-Woodstock School District
## 50479                            Lincoln-Woodstock School District
## 50493                                              Lincoln Academy
## 50495                               LINCOLN COUNTY SCHOOL DISTRICT
## 50522                               LINCOLN COUNTY SCHOOL DISTRICT
## 50561                                            Princeton ESD 115
## 50830                                           Springfield SD 186
## 50899                                               Davis District
## 50901                                               Cache District
## 50911                                             Granite District
## 50916                                          Ogden City District
## 50951                                              Lincoln Unified
## 50952                                           Lincoln Elementary
## 50965                                                         DADE
## 50966                                                         DADE
## 51003                                                     Pacifica
## 51022                               Palisades Park School District
## 51083                                              Alpine District
## 51093                                           Springfield SD 186
## 51196                                   Plano Area Special Ed Coop
## 51203                                               Lisbon CCSD 90
## 51222                            LITCHFIELD PUBLIC SCHOOL DISTRICT
## 51237                               Litchfield Elementary District
## 51243                         San Diego County Office of Education
## 51284                                             Waukegan CUSD 60
## 51321                                     Little Shasta Elementary
## 51326                                          Washington District
## 51358                                     Petaluma City Elementary
## 51374                                            Livingston Parish
## 51419                                             Livingston Union
## 51459                                 La Salle/Marshall/Putnam ROE
## 51461                                               Wayne District
## 51476                                       City of Chicago SD 299
## 51502                                                  LOCKNEY ISD
## 51573                                          Logan City District
## 51590                                          Logan City District
## 51594                                            Princeton ESD 115
## 51613                                Logansport Community Sch Corp
## 51637                                Baltimore City Public Schools
## 51686                                               Weber District
## 51712                                  Cave Creek Unified District
## 51720                                              Alpine District
## 51722                                             Canyons District
## 51728                                            NEW BRAUNFELS ISD
## 51735                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51736                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51737                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51738                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51739                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51740                            TEXAS JUVENILE JUSTICE DEPARTMENT
## 51741                                                        DUVAL
## 51765                                       Long Beach Unified ROP
## 51809                                                 Decatur City
## 51811                                   Ravendale-Termo Elementary
## 51910                                              Murray District
## 51936                                   DIVISION OF YOUTH SERVICES
## 51963                                    BILOXI PUBLIC SCHOOL DIST
## 52033                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 52055                                       Los Angeles County ROP
## 52063                                     Los Angeles Unified ROCP
## 52069                                            Los Banos Unified
## 52092                                          Los Molinos Unified
## 52129                                Lost River Career Cooperative
## 52139                                                   TAYLOR ISD
## 52154                                         LOUDOUN CO PBLC SCHS
## 52155                                        DOE SOP EDUC PROGRAMS
## 52204                                               Autauga County
## 52210                                   Los Gatos Union Elementary
## 52219                 Louisiana School for Math Science & the Arts
## 52222                           Louisiana Special Education Center
## 52285                                   LOVEWORKS ACADEMY FOR ARTS
## 52375                                       LOWNDES CO SCHOOL DIST
## 52420                                        LSU Laboratory School
## 52433                                                   SLATON ISD
## 52434                                                 FRENSHIP ISD
## 52462                                       Lucerne Valley Unified
## 52512                                   San Lorenzo Valley Unified
## 52544                                      Dysart Unified District
## 52568                                      Lumen Scholar Institute
## 52677                                             Kewanee CUSD 229
## 52705                                           Fremont Union High
## 52711                         LYNCHBURG CITY SECONDARY ALTERNATIVE
## 52713                                        DOE SOP EDUC PROGRAMS
## 52714                                     LYNCHBURG CITY PBLC SCHS
## 52752                                            Sandwich CUSD 430
## 52763                                                Joliet PSD 86
## 52785                                  LYON COUNTY SCHOOL DISTRICT
## 52794                                             Waukegan CUSD 60
## 52828                                                Joliet PSD 86
## 52837      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 52847                                           Salt Lake District
## 52875                                          Aurora East USD 131
## 52988                                                 Macon County
## 52998                               Department of Juvenile Justice
## 53039                                                     Kane ROE
## 53054                                       NORFOLK CITY PBLC SCHS
## 53072                                                      MADISON
## 53073                                               Madison County
## 53075                                               Madison County
## 53176                                        Madison Highland Prep
## 53239                                                      MADISON
## 53242                                                      MADISON
## 53243                                                      MADISON
## 53244                                                      MADISON
## 53297                                              Uintah District
## 53314                                     MAGGIE L. WALKER GOV SCH
## 53319                                             Granite District
## 53341                                    Magnolia Union Elementary
## 53392                                        San Francisco Unified
## 53407                             MAHTOMEDI PUBLIC SCHOOL DISTRICT
## 53461                                                 West Warwick
## 53472                                          Washington District
## 53473                                              Jordan District
## 53474                                               Weber District
## 53589                                  Mana Academy Charter School
## 53620                                                      MANATEE
## 53705                                      Manhattan Beach Unified
## 53730                                             Daggett District
## 53733                                             Daggett District
## 53734                                              Alpine District
## 53846                                        Page Unified District
## 53862                                       South Sanpete District
## 53863                                       South Sanpete District
## 53922                                       Maple Creek Elementary
## 53978                                                Nebo District
## 53985                                                Nebo District
## 54026                                                Nebo District
## 54028                                                Nebo District
## 54138                           Pemberton Township School District
## 54154                                             Marengo CHSD 154
## 54186                             Eatontown Public School District
## 54231                                     Maria Montessori Academy
## 54252                              Estrella Educational Foundation
## 54264                      Marie H. Katzenbach School for the Deaf
## 54265                      Marie H. Katzenbach School for the Deaf
## 54288                               Department of Juvenile Justice
## 54296                                             Marin County ROP
## 54301                                   Monterey Peninsula Unified
## 54336                                                   MARION ISD
## 54347                                        MARION COUNTY SCHOOLS
## 54357                                        MARION COUNTY SCHOOLS
## 54405                                                       MARION
## 54414                                                       MARION
## 54416                                                       MARION
## 54426                                WASHOE COUNTY SCHOOL DISTRICT
## 54637                                              Marshall County
## 54646                              MARSHALL PUBLIC SCHOOL DISTRICT
## 54683                                         FAIRFAX CO PBLC SCHS
## 54691                              MARSHALL PUBLIC SCHOOL DISTRICT
## 54721                                              Marshall County
## 54743                                                     MART ISD
## 54765                               Department of Juvenile Justice
## 54791                                                       MARTIN
## 54907                                             Martinez Unified
## 54946                                             San Juan Unified
## 54972            California Education Authority (CEA) Headquarters
## 54976                                     Fairfield-Suisun Unified
## 55018                                           Woodstock CUSD 200
## 55110                                           Salt Lake District
## 55121                                                Joliet PSD 86
## 55164                                    DEPARTMENT OF CORRECTIONS
## 55166                                  Masada Charter School  Inc.
## 55187                                         MASON COUNTY SCHOOLS
## 55203                                       City of Chicago SD 299
## 55238                                   MASSANUTTEN GOVERNOR'S SCH
## 55239                                         MASSANUTTEN TECH CTR
## 55291                                                         DADE
## 55298                                                         DADE
## 55299                                                         DADE
## 55300                                                         DADE
## 55306                                                         DADE
## 55307                                                         DADE
## 55309                                                         DADE
## 55312                                                         DADE
## 55314                                                         DADE
## 55317                                                         DADE
## 55323                       Math and Science Success Academy  Inc.
## 55331                                           Springfield SD 186
## 55369                                                       Boston
## 55412                                              Mattole Unified
## 55413                                              Mattole Unified
## 55414                                              Mattole Unified
## 55530                                                       MONROE
## 55677                                           Park City District
## 55748                                            McClellan CCSD 12
## 55754                                           Springfield SD 186
## 55901                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 55902                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 55903                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 56099                             FARIBAULT PUBLIC SCHOOL DISTRICT
## 56102                                           Box Elder District
## 56123                                        McKittrick Elementary
## 56133                                        San Francisco Unified
## 56183                                              Murray District
## 56184                                                     ESCAMBIA
## 56213                          Wisconsin Department of Corrections
## 56232                                           Park City District
## 56233                             Montgomery County Public Schools
## 56243                                                       MARION
## 56295                                                Nebo District
## 56337                                              Alpine District
## 56358                             Eatontown Public School District
## 56361                                             Yosemite Unified
## 56384                                               Davis District
## 56419                                           Salt Lake District
## 56428                           Ventura County Office of Education
## 56619                           ST. LOUIS PARK PUBLIC SCHOOL DIST.
## 56678                                            NEW BRAUNFELS ISD
## 56739                             Eatontown Public School District
## 56817                                     Mendocino County ROC/ROP
## 56838                                     Menifee Union Elementary
## 56863                                              Huntsville City
## 56873                                         MERAMEC VALLEY R-III
## 56880                                            Merced County ROP
## 56904                                        MERCER COUNTY SCHOOLS
## 56918      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 56931                               Meredosia-Chambersburg CUSD 11
## 56932                               Meredosia-Chambersburg CUSD 11
## 56933                               Meredosia-Chambersburg CUSD 11
## 56982                            Merit College Preparatory Academy
## 57060  Boys & Girls Clubs of the East Valley dba Mesa Arts Academy
## 57140                                     Acton-Agua Dulce Unified
## 57141                                     Acton-Agua Dulce Unified
## 57144                                            Dehesa Elementary
## 57152                                            METRO DEAF SCHOOL
## 57160                               Department of Juvenile Justice
## 57161                                METRO RICHMOND ALTERNATIVE ED
## 57167                                                         DADE
## 57171                            Metropolitan Arts Institute  Inc.
## 57198                                     Mexicayotl Academy  Inc.
## 57199                                     Mexicayotl Academy  Inc.
## 57226                                                         DADE
## 57228                                                         DADE
## 57230                                                         DADE
## 57231                                                         DADE
## 57234                                                         DADE
## 57238                                                         DADE
## 57252                                                         DADE
## 57264                                                         DADE
## 57270                                                         DADE
## 57276                                                         DADE
## 57278                                                         DADE
## 57287                                                         DADE
## 57288                                                         DADE
## 57289                                                         DADE
## 57297                                                      ALACHUA
## 57298                                                      ALACHUA
## 57354                                     PLEASANTS COUNTY SCHOOLS
## 57379                                              Jordan District
## 57385                                              Tooele District
## 57420                                        DOE SOP EDUC PROGRAMS
## 57472                                                Vermilion ROE
## 57478              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 57533                                                Midfield City
## 57571                                               Weber District
## 57595                                         Vista Charter School
## 57596                                       Midtown Primary School
## 57603                                             Canyons District
## 57604                                             Canyons District
## 57609                                             Canyons District
## 57656                                             Wasatch District
## 57665                              MIDWEST SPECIAL EDUCATION COOP.
## 57685                                             Waukegan CUSD 60
## 57688                                      Mountain Institute JTED
## 57689                                      Mountain Institute JTED
## 57690                                      Mountain Institute JTED
## 57691                                      Mountain Institute JTED
## 57692                                      Mountain Institute JTED
## 57694                                      Mountain Institute JTED
## 57695                                      Mountain Institute JTED
## 57696                                   Fallbrook Union Elementary
## 57778                                    Milestones Charter School
## 57780                                 CLARK COUNTY SCHOOL DISTRICT
## 57788                                         Milford Area PSD 124
## 57791                                              Beaver District
## 57800                                              Beaver District
## 57848                                             Granite District
## 57882                                             Millard District
## 57904                                             Millburn CCSD 24
## 57907                                             Millburn CCSD 24
## 57912                                          Washington District
## 57913                                               Davis District
## 57925                                          Tracy Joint Unified
## 57927                          Monterey County Office of Education
## 57966                       Los Angeles County Office of Education
## 57984                                           LEE'S SUMMIT R-VII
## 57993                                    Prescott Unified District
## 58065                                               Cache District
## 58141                          Wisconsin Department of Corrections
## 58185                                       MINERAL COUNTY SCHOOLS
## 58204                                              Beaver District
## 58205                                              Beaver District
## 58219                                         MINGO COUNTY SCHOOLS
## 58222                                Mingus Springs Charter School
## 58355                                       Corcoran Joint Unified
## 58359                                          Santa Clara Unified
## 58363                                     Mission Union Elementary
## 58371  Kaizen Education Foundation dba Mission Heights Preparatory
## 58373                                 CLARK COUNTY SCHOOL DISTRICT
## 58383                                 Little Lamb Community School
## 58393                                           Mission Trails ROP
## 58400                                         Mission Valley ROC/P
## 58405                                   William S. Hart Union High
## 58420                                    DEPARTMENT OF CORRECTIONS
## 58432                                            Santa Ana Unified
## 58489                                                    ST. JOHNS
## 58492                                              Rock Island ROE
## 58502                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 58505                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 58506                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 58520                                          Moab Charter School
## 58530                                                Mobile County
## 58536                               MO VIRTUAL INSTRUCTION PROGRAM
## 58537                               MO VIRTUAL INSTRUCTION PROGRAM
## 58554                             Modoc County Office of Education
## 58555                                             Modoc County ROP
## 58571                   Mohave Accelerated Elementary School  Inc.
## 58572                   Mohave Accelerated Elementary School  Inc.
## 58573                           Mohave Accelerated Learning Center
## 58600                                        Oro Grande Elementary
## 58635                                                Juab District
## 58658                                           Redding Elementary
## 58701      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 58702      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 58707                                            Mono County ROC/P
## 58741                                                Monroe County
## 58747                                        MONROE COUNTY SCHOOLS
## 58800                                                       MONROE
## 58813                                              Sevier District
## 58814                                             Granite District
## 58817                                         LOUDOUN CO PBLC SCHS
## 58821                                                       MONROE
## 58822                                                       MONROE
## 58823                                                       MONROE
## 58824                                                       MONROE
## 58843                                              Carbon District
## 58848                                           Fremont Union High
## 58930                                              Jordan District
## 58953                                           Southern Berkshire
## 58954                          Monterey County Office of Education
## 58981                                     Montessori Academy  Inc.
## 58985                                 Flagstaff Montessori  L.L.C.
## 58987                Montessori Day Public Schools Chartered  Inc.
## 58988                Montessori Day Public Schools Chartered  Inc.
## 58989           Santa Cruz Valley Opportunities in Education  Inc.
## 58991                   Montessori Education Centre Charter School
## 58992                   Montessori Education Centre Charter School
## 58995                                       Montessori House  Inc.
## 59000                                       City of Chicago SD 299
## 59006                       Montessori Schoolhouse of Tucson  Inc.
## 59007                       Montessori Schoolhouse of Tucson  Inc.
## 59016                                            San Juan District
## 59031                                      MONTGOMERY CO PBLC SCHS
## 59035                        Montgomery Childrens Specialty Center
## 59038                                               MONTGOMERY ISD
## 59076                                            Montgomery County
## 59081                                           Monticello Academy
## 59091                                            San Juan District
## 59108                                            San Juan District
## 59129                       South Orange-Maplewood School District
## 59158                                            San Juan District
## 59205                                                       GLADES
## 59331                                                Morgan County
## 59335                                                Morgan County
## 59346                                              Morgan District
## 59351                                              Morgan District
## 59355                                              Morgan District
## 59359                                               Davis District
## 59360                                              Morgan District
## 59416                                             Granite District
## 59421                                       North Sanpete District
## 59447              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 59472      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 59477                                 CLARK COUNTY SCHOOL DISTRICT
## 59478      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 59482                                       Lee/Ogle/Whiteside ROE
## 59489                                              Morrison CUSD 6
## 59491                                              Morrison CUSD 6
## 59534                                    Region 06 West Cook ISC 2
## 59564                                                    ST. LUCIE
## 59677                                          Ogden City District
## 59716                                                  HOUSTON ISD
## 59758                                          Logan City District
## 59759                                              Alpine District
## 59770                                          Ogden City District
## 59848                                   DIVISION OF YOUTH SERVICES
## 59861                                               Cache District
## 59864                                     Del Norte County Unified
## 59865                                          Mountain Elementary
## 59868                                      Mountain Empire Unified
## 59870                                              Morgan District
## 59875                                     Mountain Heights Academy
## 59877                                               Davis District
## 59881                                             Yosemite Unified
## 59886                                    Mountain House Elementary
## 59901                            Mountain Oak Charter School  Inc.
## 59917                                              Alpine District
## 59922                                  Mountain Rose Academy  Inc.
## 59924                                        Mountain School  Inc.
## 59928                                              Jordan District
## 59933                                              Alpine District
## 59967                                     Mountain View Elementary
## 60008                                              Alpine District
## 60040                                               Davis District
## 60041                                           Salt Lake District
## 60043                                           Box Elder District
## 60058                                               Madera Unified
## 60068                             Mountain West Montessori Academy
## 60081                                               Cache District
## 60084     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 60089                                        Mountainville Academy
## 60098                                       City of Chicago SD 299
## 60099                          CAMBRIDGE-ISANTI PUBLIC SCHOOL DIST
## 60113                                           Park City District
## 60118                                   Monterey Peninsula Unified
## 60162                                 MID STATE EDUCATION DISTRICT
## 60254                                   Mt. Baldy Joint Elementary
## 60255                                     Fall River Joint Unified
## 60276                                             Canyons District
## 60285                                                Nebo District
## 60289                                                Nebo District
## 60300                                       North Sanpete District
## 60329                                MOUNTAIN VISTA GOVERNOR'S SCH
## 60346                                               Davis District
## 60368                                               Davis District
## 60375                                          Mulberry Elementary
## 60464                                               Weber District
## 60517                                              Murray District
## 60528                                              Murray District
## 60558                                           Muscle Shoals City
## 60606                                                       HENDRY
## 60658                                            Duchesne District
## 60662                                              Channahon SD 17
## 60679            California Education Authority (CEA) Headquarters
## 60682                                    DIVISION OF YOUTH SERVICE
## 60683                               PROCTOR PUBLIC SCHOOL DISTRICT
## 60689                                        DOE SOP EDUC PROGRAMS
## 60721                                       City of Chicago SD 299
## 60755                                                    Nantucket
## 60764                              Napa County Office of Education
## 60765                                              Napa County ROP
## 60768                              Napa County Office of Education
## 60787                                              Uintah District
## 60859                                                       NASSAU
## 60860                                                       NASSAU
## 60862                                                       NASSAU
## 60863                                                       NASSAU
## 60864                                                       NASSAU
## 60865                                                       NASSAU
## 60932                                          National Elementary
## 60938                                        La Mesa-Spring Valley
## 60940 Northeast Arizona Technological Institute of Vocational Educ
## 60941 Northeast Arizona Technological Institute of Vocational Educ
## 60942 Northeast Arizona Technological Institute of Vocational Educ
## 60943 Northeast Arizona Technological Institute of Vocational Educ
## 60944 Northeast Arizona Technological Institute of Vocational Educ
## 60945 Northeast Arizona Technological Institute of Vocational Educ
## 60946 Northeast Arizona Technological Institute of Vocational Educ
## 60947 Northeast Arizona Technological Institute of Vocational Educ
## 60948 Northeast Arizona Technological Institute of Vocational Educ
## 60956                                              Natomas Unified
## 60994                                            San Juan District
## 61018                                     Navigator Pointe Academy
## 61021          Northern Arizona Vocational Institute of Technology
## 61022          Northern Arizona Vocational Institute of Technology
## 61023          Northern Arizona Vocational Institute of Technology
## 61024          Northern Arizona Vocational Institute of Technology
## 61025          Northern Arizona Vocational Institute of Technology
## 61027          Northern Arizona Vocational Institute of Technology
## 61028          Northern Arizona Vocational Institute of Technology
## 61029          Northern Arizona Vocational Institute of Technology
## 61030          Northern Arizona Vocational Institute of Technology
## 61031          Northern Arizona Vocational Institute of Technology
## 61032          Northern Arizona Vocational Institute of Technology
## 61051                                     NC Virtual Public School
## 61054                                          NORTHEAST METRO 916
## 61055                                          NORTHEAST METRO 916
## 61065                                         North Chicago SD 187
## 61070                                              Huntsville City
## 61073                                                Nebo District
## 61077                                                Juab District
## 61140                                             Granite District
## 61161                                               NORTH EAST ISD
## 61222                                                 Neoga CUSD 3
## 61225                                            Duchesne District
## 61229                                             Kewanee CUSD 229
## 61270                                        Nettle Creek CCSD 24C
## 61284                                       Nevada City Elementary
## 61296                              STATE-SPONSORED CHARTER SCHOOLS
## 61298                              STATE-SPONSORED CHARTER SCHOOLS
## 61356                                                     Kane ROE
## 61357                                           New Berlin CUSD 16
## 61359                                           New Berlin CUSD 16
## 61360                                           New Berlin CUSD 16
## 61369                                                     MAUD ISD
## 61376                                                      Quabbin
## 61378                                            NEW BRAUNFELS ISD
## 61379                                            NEW BRAUNFELS ISD
## 61380                                            NEW BRAUNFELS ISD
## 61384                                         HENRICO CO PBLC SCHS
## 61386                                          Ogden City District
## 61438                                                 NEW DEAL ISD
## 61450                                                Shelby County
## 61453                                                     Kane ROE
## 61455                                  PRINCE WILLIAM CO PBLC SCHS
## 61456                                       ARLINGTON CO PBLC SCHS
## 61457                                    PORTSMOUTH CITY PBLC SCHS
## 61459                                                     Kane ROE
## 61463                                AUSTIN PUBLIC SCHOOL DISTRICT
## 61464                    NEW DOMINION ALT. CTR./PRINCE WILLIAM CO.
## 61563                                      HOPEWELL CITY PBLC SCHS
## 61586                                                Bessemer City
## 61588                                              Banning Unified
## 61591                   New Horizon School for the Performing Arts
## 61600                                      NEW HORIZONS GOV SCHOOL
## 61611              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 61612               Monmouth-Ocean Educational Services Commission
## 61637                          Wisconsin Department of Corrections
## 61697                                  Centinela Valley Union High
## 61699                         New Orleans Center for Creative Arts
## 61754                                        DOE SOP EDUC PROGRAMS
## 61766                                      New School For The Arts
## 61767                        New School for the Arts Middle School
## 61781                                         HENRICO CO PBLC SCHS
## 61802                                        New Trier Twp HSD 203
## 61803                                        New Trier Twp HSD 203
## 61843                                       SBE - New West Charter
## 61845                                 New World Educational Center
## 61866                                   Plano Area Special Ed Coop
## 61868                                   Plano Area Special Ed Coop
## 61876                                NEWARK PUBLIC SCHOOL DISTRICT
## 62013                                           Salt Lake District
## 62051                                        DOE SOP EDUC PROGRAMS
## 62125                       Espiritu Community Development Corp. 1
## 62139                                           Salt Lake District
## 62140                                               Cache District
## 62141                                                      Nicasio
## 62144                                          Aurora East USD 131
## 62147                                      NICHOLAS COUNTY SCHOOLS
## 62185                                                         DADE
## 62192                                              Banning Unified
## 62266                                              Nippersink SD 2
## 62267                                                NORTHSIDE ISD
## 62269                                                NORTHSIDE ISD
## 62305                                       City of Chicago SD 299
## 62309                NM SCHOOL FOR THE BLIND AND VISUALLY IMPAIRED
## 62310                                       NM SCHOOL FOR THE DEAF
## 62312                 No. UT. Acad. for Math Engineering & Science
## 62315                                         Noah Webster Academy
## 62316                                  Noah Webster Schools - Mesa
## 62317                                    Noah Webster Schools-Pima
## 62339                                       City of Chicago SD 299
## 62340                                       City of Chicago SD 299
## 62341                                       City of Chicago SD 299
## 62342                                       City of Chicago SD 299
## 62343                                       City of Chicago SD 299
## 62344                                       City of Chicago SD 299
## 62345                                       City of Chicago SD 299
## 62346                                       City of Chicago SD 299
## 62347                                       City of Chicago SD 299
## 62348                                       City of Chicago SD 299
## 62349                                       City of Chicago SD 299
## 62350                                       City of Chicago SD 299
## 62351                                       City of Chicago SD 299
## 62352                                       City of Chicago SD 299
## 62353                                       City of Chicago SD 299
## 62354                                       City of Chicago SD 299
## 62355                                       City of Chicago SD 299
## 62373                                       ROANOKE CITY PBLC SCHS
## 62408                                                         LAKE
## 62409                                                    HIGHLANDS
## 62410                                                Castaic Union
## 62414                                                         LAKE
## 62415                                                         LAKE
## 62445                                       NORFOLK CITY PBLC SCHS
## 62446                                       NORFOLK CITY PBLC SCHS
## 62450                                        DOE SOP EDUC PROGRAMS
## 62453                                       NORFOLK CITY PBLC SCHS
## 62456                                        San Francisco Unified
## 62523                                            Norris Elementary
## 62531                                            Norris Elementary
## 62557                                                      BREVARD
## 62574                                               Baldwin County
## 62644                                               Cache District
## 62678                  Arizona State School for the Deaf and Blind
## 62679                                                      MOBERLY
## 62687                                         North Chicago SD 187
## 62693                                       Clay Community Schools
## 62731    North County Regional Occupational Center/Program (ROC/P)
## 62755                                               Davis District
## 62756                              North Davis Preparatory Academy
## 62788                                               NORTH EAST ISD
## 62803                                             Waukegan CUSD 60
## 62866                                                     COLUMBIA
## 62978                                 Hillsborough City Elementary
## 63014                        North Kern Vocational Training Center
## 63041                                       City of Chicago SD 299
## 63042                                       City of Chicago SD 299
## 63044                                               Davis District
## 63058                                            Livingston Parish
## 63094                                                         DADE
## 63111                         BRENTWOOD UNION FREE SCHOOL DISTRICT
## 63144                                               Weber District
## 63145                                               Weber District
## 63151                                North Orange County ROP-Adult
## 63152                                 NORTH PANOLA SCHOOL DISTRICT
## 63169                                                         DADE
## 63173                                               Weber District
## 63174                                               Cache District
## 63175                                           Box Elder District
## 63206                                              Alpine District
## 63211                                  Pointe Educational Services
## 63239                                Utah Schools for Deaf & Blind
## 63240                                                Rich District
## 63279                                       North Sanpete District
## 63280                                       North Sanpete District
## 63291                                              Sevier District
## 63292                                              Sevier District
## 63344                                           North Star Academy
## 63363                                WASHOE COUNTY SCHOOL DISTRICT
## 63365                                           Salt Lake District
## 63379                                        North Summit District
## 63380                                        North Summit District
## 63381                                        North Summit District
## 63382                                        North Summit District
## 63397                                                   PALM BEACH
## 63509                                                     Kane ROE
## 63511                                                     Kane ROE
## 63519                                                     PINELLAS
## 63615                                  ELKO COUNTY SCHOOL DISTRICT
## 63616                                               NM CORRECTIONS
## 63622                                   Flagstaff Unified District
## 63623                                     Career Development  Inc.
## 63672                          Northern Lights Academy Cooperative
## 63674                          Northern Lights Academy Cooperative
## 63685                               NORTHERN NECK TECHNICAL CENTER
## 63686                        NORTHERN NECK REGIONAL ALTERNATIVE ED
## 63687                               NORTHERN NECK TECHNICAL CENTER
## 63698                                                N. VA. TRN CT
## 63703                                        DOE SOP EDUC PROGRAMS
## 63711                                           Sunset Ridge SD 29
## 63741                                              Tooele District
## 63749                                    NORTHLAND LEARNING CENTER
## 63756                                Northland Preparatory Academy
## 63780                            Compass Points International  Inc
## 63802                                               Davis District
## 63818                                              Alpine District
## 63821                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 63822                             City of Bogalusa School District
## 63834                             CHURCHILL COUNTY SCHOOL DISTRICT
## 63903                                              Morrison CUSD 6
## 64038                                           Salt Lake District
## 64095                                               NM CORRECTIONS
## 64146                                           Woodstock CUSD 200
## 64246                                                Nosotros  Inc
## 64284                                               Novato Unified
## 64285                                               Novato Unified
## 64321                                              FLOUR BLUFF ISD
## 64322                                           CORPUS CHRISTI ISD
## 64323                                            TULOSO-MIDWAY ISD
## 64327                                           Nuestro Elementary
## 64334                                       ARIZONA STATE HOSPITAL
## 64368                                               MARYVILLE R-II
## 64381                                      SANTA FE PUBLIC SCHOOLS
## 64460                                              Alpine District
## 64502                                              Oak Grove SD 68
## 64599                                               Davis District
## 64601                                             Canyons District
## 64612                                               Sierra Unified
## 64629                                          Aurora East USD 131
## 64646                                             Oak Park Unified
## 64679                                                     Kane ROE
## 64684                                               Provo District
## 64733                                              Jordan District
## 64739                                             Waukegan CUSD 60
## 64753                                               Oakdale CCSD 1
## 64766                                             Canyons District
## 64783                          Wisconsin Department of Corrections
## 64796                                              Oakland Unified
## 64797                                              Oakland Unified
## 64911                                             Granite District
## 64913                                            NEW BRAUNFELS ISD
## 64984                                             Granite District
## 65028                                 Ocean Academy Charter School
## 65030                                     Del Mar Union Elementary
## 65046              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 65056                                   San Lorenzo Valley Unified
## 65063              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 65064      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 65072                                                       MONROE
## 65075      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 65076                                                   Ocean View
## 65129                                  CAMDEN CITY SCHOOL DISTRICT
## 65134                                                       ORANGE
## 65136                                                       ORANGE
## 65172                       Los Angeles County Office of Education
## 65175                                       Odyssey Charter School
## 65186                        The Odyssey Preparatory Academy  Inc.
## 65193                                               Davis District
## 65194                                          Ogden City District
## 65211                                       City of Chicago SD 299
## 65214                                          Ogden City District
## 65219                                    Ogden Preparatory Academy
## 65220                                          Ogden City District
## 65281                                                     OKALOOSA
## 65282                                                     OKALOOSA
## 65285                                                     OKALOOSA
## 65286                                                     OKALOOSA
## 65287                                                     OKALOOSA
## 65288                                                     OKALOOSA
## 65309                                                   OKEECHOBEE
## 65310                                                   OKEECHOBEE
## 65311                                                   OKEECHOBEE
## 65323                                OKLAHOMA VIRTUAL CHARTER ACAD
## 65324                                OKLAHOMA VIRTUAL CHARTER ACAD
## 65325                                OKLAHOMA VIRTUAL CHARTER ACAD
## 65329                                 OKLAHOMA CONNECTIONS ACADEMY
## 65330                                 OKLAHOMA CONNECTIONS ACADEMY
## 65333                                OKLAHOMA SCHOOL FOR THE BLIND
## 65334                                OKLAHOMA SCHOOL FOR THE BLIND
## 65335                                 OKLAHOMA SCHOOL FOR THE DEAF
## 65336                                 OKLAHOMA SCHOOL FOR THE DEAF
## 65389                                   San Rafael City Elementary
## 65404                                             Wasatch District
## 65405                                              Tooele District
## 65429      Old Sturbridge Academy Charter Public School (District)
## 65430                                            San Diego Unified
## 65485                                            Norris Elementary
## 65559                                          Aurora East USD 131
## 65575                                           Woodstock CUSD 200
## 65602                                                   PALM BEACH
## 65622                                             Granite District
## 65623                                             Granite District
## 65636   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65637   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65638   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65639   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65640   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65641   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65642   Ombudsman Educational Services Ltd. a subsidiary of Educ 1
## 65643                                       City of Chicago SD 299
## 65644                                          Omega Alpha Academy
## 65687                       San Joaquin County Office of Education
## 65711                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 65712                                               Davis District
## 65755                                                 Opelika City
## 65761                                               Open Classroom
## 65768                            Open Doors Community School  Inc.
## 65793                                         Baldwin Park Unified
## 65794                                         Baldwin Park Unified
## 65795                                           Capistrano Unified
## 65796                                               Duarte Unified
## 65797                                   William S. Hart Union High
## 65799                                                   Ozark City
## 65800                                                  Dale County
## 65821                                          San Gabriel Unified
## 65822                                     Acton-Agua Dulce Unified
## 65823                                  San Bernardino City Unified
## 65824                                             San Juan Unified
## 65825                                     Victor Valley Union High
## 65833                                              Jordan District
## 65834                                             Granite District
## 65835                                              Jordan District
## 65837                                   Oracle Elementary District
## 65859                        Orange County Department of Education
## 65861                    ORANGE BOARD OF EDUCATION SCHOOL DISTRICT
## 65899                                               Orange Unified
## 65905                                    Balsz Elementary District
## 65919                        Washington Elementary School District
## 65956                                                Nebo District
## 65980                                              Alpine District
## 65981                                               Davis District
## 66018                          Wisconsin Department of Corrections
## 66035                                              Alpine District
## 66036                                              Alpine District
## 66037                                              Alpine District
## 66044                                             Orick Elementary
## 66049                                      Orinda Union Elementary
## 66059                                               Weber District
## 66083                                    Portola Valley Elementary
## 66089                                 ORONO PUBLIC SCHOOL DISTRICT
## 66186                                               Piute District
## 66187                                               Piute District
## 66188                                                      OSCEOLA
## 66220                                                      OSCEOLA
## 66221                                                      OSCEOLA
## 66222                                                      OSCEOLA
## 66228                          Wisconsin Department of Corrections
## 66242                                 OSSEO PUBLIC SCHOOL DISTRICT
## 66267                                           Grundy/Kendall ROE
## 66370                                          Washington District
## 66397                                              Tooele District
## 66455                                           Springfield SD 186
## 66470                                         Owens Valley Unified
## 66471                                         Owens Valley Unified
## 66496                                  ELKO COUNTY SCHOOL DISTRICT
## 66509                                                  Oxford City
## 66543                        Orange County Department of Education
## 66544                                           Capistrano Unified
## 66558                                       OKLAHOMA YOUTH ACADEMY
## 66560                                       OKLAHOMA YOUTH ACADEMY
## 66569                                    DEPARTMENT OF CORRECTIONS
## 66592                                                  GARLAND ISD
## 66593                                            GRAND PRAIRIE ISD
## 66594                                               RICHARDSON ISD
## 66595                                              DUNCANVILLE ISD
## 66601                                                 MULESHOE ISD
## 66602                                                    SUDAN ISD
## 66620                                                   UF LAB SCH
## 66631                                                      ALACHUA
## 66632                                         HENRICO CO PBLC SCHS
## 66640                                                         DADE
## 66641                                                        PASCO
## 66643                                                     HERNANDO
## 66648                                                      VOLUSIA
## 66651                                                      BROWARD
## 66653                                                        DUVAL
## 66660                               PACE Preparatory Academy  Inc.
## 66669                                             Glendale Unified
## 66681                                       Arena Union Elementary
## 66687                                           Pacific Elementary
## 66691                                     Pacific Heritage Academy
## 66698                       Los Angeles County Office of Education
## 66705                                              Big Sur Unified
## 66706                                            Oceanside Unified
## 66747                                            PAGE CO PBLC SCHS
## 66758                                        Page Unified District
## 66775                                              Sevier District
## 66794                               Painted Desert Montessori  LLC
## 66822                                     Palermo Union Elementary
## 66844                               Palisades Park School District
## 66852                                                      BREVARD
## 66855                                                   PALM BEACH
## 66859                                                   PALM BEACH
## 66871                                                   PALM BEACH
## 66876                                            La Canada Unified
## 66902                                                   PALM BEACH
## 66908                               Litchfield Elementary District
## 66966                                                      MANATEE
## 66967                                                  Florence 01
## 67008                                           San Marcos Unified
## 67038                              Pan-American Elementary Charter
## 67043                                                          BAY
## 67056                                            Garfield District
## 67057                                            Garfield District
## 67058                                            Garfield District
## 67063                                           Panoche Elementary
## 67078                                          Washington District
## 67110                                        Institutional Schools
## 67116                                         Paradigm High School
## 67117                                            La Canada Unified
## 67119                                             Paradise Unified
## 67121                                     Paragon Management  Inc.
## 67132                                     Paragon Management  Inc.
## 67138                                             Paradise Unified
## 67151      Daisy Education Corporation dba Paragon Science Academy
## 67155                              Paramount Education Studies Inc
## 67158                           SBE - Paramount Collegiate Academy
## 67230                                           Park City District
## 67295                                             Canyons District
## 67326                                                Nebo District
## 67339                                           Box Elder District
## 67340                                           Box Elder District
## 67360                                       Park View School  Inc.
## 67361                                                Nebo District
## 67366                                                   PALM BEACH
## 67487                                              Murray District
## 67488                                               Davis District
## 67558                                           Salt Lake District
## 67620                                           Park City District
## 67621                                           Park City District
## 67642                                                Iron District
## 67643                                                Iron District
## 67681                                       Western Placer Unified
## 67693                                             Pasadena Unified
## 67703                                                        PASCO
## 67709                                                        PASCO
## 67715                                             Robla Elementary
## 67733                                                 MESQUITE ISD
## 67743      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 67756                       Patagonia Montessori Elementary School
## 67773                                                         DADE
## 67774                             Edkey  Inc. - Pathfinder Academy
## 67802                                              Bonsall Unified
## 67803                                     Acton-Agua Dulce Unified
## 67806                                     Harmony Union Elementary
## 67812                                   NYE COUNTY SCHOOL DISTRICT
## 67818                          Pathways In Education-Arizona  Inc.
## 67822                                       City of Chicago SD 299
## 67831                            GOODHUE COUNTY EDUCATION DISTRICT
## 67861                                             Jefferson Parish
## 68022                         Research Based Education Corporation
## 68038                       CITY Center for Collaborative Learning
## 68039                       CITY Center for Collaborative Learning
## 68053                                             Paw Paw CUSD 271
## 68057                                             Paw Paw CUSD 271
## 68079                                                     Kane ROE
## 68080                                                     Kane ROE
## 68113                                                Nebo District
## 68115                                                Nebo District
## 68118                                             Pima County JTED
## 68119                                             Pima County JTED
## 68120                                             Pima County JTED
## 68121                                             Pima County JTED
## 68122                                             Pima County JTED
## 68123                                             Pima County JTED
## 68124                                             Pima County JTED
## 68125                                             Pima County JTED
## 68126                                             Pima County JTED
## 68127                                             Pima County JTED
## 68128                                             Pima County JTED
## 68130                                             Pima County JTED
## 68131                                             Pima County JTED
## 68132                                             Pima County JTED
## 68133                                             Pima County JTED
## 68134                                             Pima County JTED
## 68135                                             Pima County JTED
## 68136                                             Pima County JTED
## 68137                                             Pima County JTED
## 68138                                             Pima County JTED
## 68139                                             Pima County JTED
## 68140                                             Pima County JTED
## 68141                                             Pima County JTED
## 68142                                             Pima County JTED
## 68143                                             Pima County JTED
## 68144                                             Pima County JTED
## 68145                                             Pima County JTED
## 68146                                             Pima County JTED
## 68147                                             Pima County JTED
## 68148                                             Pima County JTED
## 68149                                             Pima County JTED
## 68150                                             Pima County JTED
## 68151                                             Pima County JTED
## 68152                                             Pima County JTED
## 68153                                             Pima County JTED
## 68154                                             Pima County JTED
## 68155                                             Pima County JTED
## 68156                                             Pima County JTED
## 68157                                             Pima County JTED
## 68158                                             Pima County JTED
## 68209                                             Maricopa Unified
## 68303                                          Pecatonica CUSD 321
## 68304                                          Pecatonica CUSD 321
## 68307                                          Pecatonica CUSD 321
## 68338                                     San Luis Coastal Unified
## 68449                               Pendergast Elementary District
## 68464                           Penfield Montessori Academy Agency
## 68468                                         San Mateo Union High
## 68474                                               NM CORRECTIONS
## 68501                                 Penn Valley Union Elementary
## 68568                                               Pensar Academy
## 68579 American Charter Schools Foundation d.b.a. Peoria Accelerate
## 68580                                               Norwood ESD 63
## 68597                             Montgomery County Public Schools
## 68598                                                  SUNDOWN ISD
## 68698                                         PERRY CO SCHOOL DIST
## 68774                              PERSHING COUNTY SCHOOL DISTRICT
## 68782                                                Joliet PSD 86
## 68801                                       City of Chicago SD 299
## 68802                                       City of Chicago SD 299
## 68803                                       City of Chicago SD 299
## 68804                                       City of Chicago SD 299
## 68811                                             Canyons District
## 68839                                                Greene County
## 68870                              PETERSBURG REGIONAL ALTERNATIVE
## 68940                                            SPRINGFIELD R-XII
## 69031                                             Granite District
## 69060                       Phoenix Advantage Charter School  Inc.
## 69064                                    CHESTERFIELD CO PBLC SCHS
## 69066                                    Whitmore Union Elementary
## 69068                  Arizona State School for the Deaf and Blind
## 69070       MCCCD on behalf of Phoenix College Preparatory Academy
## 69071                             Phoenix Collegiate Academy  Inc.
## 69072                   Phoenix Collegiate Academy Elementary  LLC
## 69073                          Phoenix Collegiate Academy High LLC
## 69096                                 JANESVILLE-WALDORF-PEMBERTON
## 69099                                                   Selma City
## 69100                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 69117                                         Butte Valley Unified
## 69153                                 Ottumwa Comm School District
## 69157                                                    ST. JOHNS
## 69161                                  PIEDMONT ALTERNATIVE SCHOOL
## 69170                           PIEDMONT GOV SCH FOR MATH/SCI/TECH
## 69184                                        Piedmont City Unified
## 69186                                        DOE SOP EDUC PROGRAMS
## 69232                                 PIERZ PUBLIC SCHOOL DISTRICT
## 69244                                                  Pike County
## 69289                                        Pillar Charter School
## 69290                                        Pillar Charter School
## 69314                                             Pima County JTED
## 69324                                             Pima County JTED
## 69330     Pima Prevention Partnership dba Pima Partnership Academy
## 69331 Pima Prevention Partnership dba Pima Partnership School  The
## 69332 Pima Prevention Partnership dba Pima Partnership School  The
## 69333                                      Pima Rose Academy  Inc.
## 69334                                                  Pima County
## 69394                      Pine Forest Education Association  Inc.
## 69420            California Education Authority (CEA) Headquarters
## 69518                                          Washington District
## 69519                                          Washington District
## 69533                                                         DADE
## 69551                                                         DADE
## 69552                                                         DADE
## 69576              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 69581                                                     PINELLAS
## 69583                                                     PINELLAS
## 69594                                                     PINELLAS
## 69595                                                     PINELLAS
## 69596                                                     PINELLAS
## 69688                                      Pinnacle Canyon Academy
## 69689                                Pinnacle Education-WMCB  Inc.
## 69690                                Pinnacle Education-Kino  Inc.
## 69695                         Pinnacle Education-Casa Grande  Inc.
## 69696                               Pinnacle Education-Tempe  Inc.
## 69698                                Pinnacle Education-WMCB  Inc.
## 69699                               Pinnacle Education-Tempe  Inc.
## 69701                                  Pointe Educational Services
## 69766                                              Gustine Unified
## 69774                  Pioneer High School for the Performing Arts
## 69792                                              Channahon SD 17
## 69794                                   Pioneer Preparatory School
## 69802                                             Granite District
## 69803                                               Weber District
## 69957                                    PITTSYLVANIA CO PBLC SCHS
## 69958                                               Piute District
## 69963                                      Mountain Empire Unified
## 69964                              Golden Feather Union Elementary
## 69965                                   Oak Grove Union Elementary
## 69970                                                       MARTIN
## 69971                                                         DADE
## 69973                          SOUTH WASHINGTON COUNTY SCHOOL DIST
## 69986                                               Weber District
## 70053                                   Plano Area Special Ed Coop
## 70059                                                    PLANO ISD
## 70115                                   DIVISION OF YOUTH SERVICES
## 70143                         PLC Arts Academy at Scottsdale  Inc.
## 70148                                       North Sanpete District
## 70157                                             Granite District
## 70173                                              Alpine District
## 70177                                              Alpine District
## 70240                              Pleasant Ridge Union Elementary
## 70286                                                   Ocean View
## 70351                                         FAIRFAX CO PBLC SCHS
## 70365                            Plumas County Office of Education
## 70366                            Plumas County Office of Education
## 70367                                            Plumas County ROP
## 70397                                             Granite District
## 70469                                  NEWPORT NEWS CITY PBLC SCHS
## 70504                             Paradise Valley Unified District
## 70505                                              Alpine District
## 70524                                                         POLK
## 70528                                                         POLK
## 70529                                          Ogden City District
## 70535                                                         POLK
## 70536                                                         POLK
## 70586                                                      BROWARD
## 70658                                              Alpine District
## 70674                                 Pope Valley Union Elementary
## 70755                                    Keansburg School District
## 70769                                                       MARTIN
## 70808                                 Valparaiso Community Schools
## 70809                             Porter County Education Services
## 70851                            Plumas County Office of Education
## 70883                                          Washington District
## 70889                                Carroll County Public Schools
## 70895                                                      BROWARD
## 71038                                        POWHATAN CO PBLC SCHS
## 71047   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71048   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71049   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71050   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71051   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71053   Portable Practical Educational Preparation Inc. (PPEP In 1
## 71064                               MANKATO PUBLIC SCHOOL DISTRICT
## 71161                                                     CHSD 155
## 71180                                                      ALACHUA
## 71182                                            Sandwich CUSD 430
## 71226                          NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 71238                                           Woodstock CUSD 200
## 71260                                                     PINELLAS
## 71263                                      RICHMOND CITY PBLC SCHS
## 71264                                             EAST CENTRAL ISD
## 71267                      Avondale Learning dba Precision Academy
## 71271                                                         GULF
## 71272                                                     COLUMBIA
## 71273                                                         DADE
## 71278                           Minneapolis Public School District
## 71279                        Prince George's County Public Schools
## 71280                                                       MARTIN
## 71281                           Minneapolis Public School District
## 71285                                  Premier Charter High School
## 71337                                        Lake Elsinore Unified
## 71338                                              Morongo Unified
## 71339                                              Jordan District
## 71344                                              Pleasant Valley
## 71345                         Riverside County Office of Education
## 71368                               Prescott Valley Charter School
## 71380                                        San Francisco Unified
## 71384                                              Presidio School
## 71389                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 71390                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 71468                                          Tracy Joint Unified
## 71473                                     American Virtual Academy
## 71482                                   PRINCE EDWARD CO PBLC SCHS
## 71491                                        DOE SOP EDUC PROGRAMS
## 71499                                        MERCER COUNTY SCHOOLS
## 71500                             PRINCETON PUBLIC SCHOOL DISTRICT
## 71507                             PRINCETON PUBLIC SCHOOL DISTRICT
## 71527                             PRINCETON PUBLIC SCHOOL DISTRICT
## 71577                 PASCACK VALLEY REGIONAL HIGH SCHOOL DISTRICT
## 71586                                            Montgomery County
## 71588                                    PROJECT BRIDGE/RUSSELL CO
## 71595                                           Grundy/Kendall ROE
## 71598                                 PROJECT RENEW/NORTHAMPTON CO
## 71599                                                NEW CANEY ISD
## 71600                                                 MAGNOLIA ISD
## 71602                                   PROJECT RETURN/FLUVANNA CO
## 71603                                   PROJECT RETURN/POWHATAN CO
## 71608                                                       MARTIN
## 71609                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 71611                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 71613                                               Lowndes County
## 71614      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71615      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71616      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71617      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71618      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71619      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 71627                  Promontory School of Expeditionary Learning
## 71669                             Paradise Valley Unified District
## 71696                                              Providence Hall
## 71700                                               Cache District
## 71715                                               Provo District
## 71716                                               Provo District
## 71717                                               Provo District
## 71718                                               Provo District
## 71719                                               Provo District
## 72527                                         PULASKI CO PBLC SCHS
## 72555                                         FAIRFAX CO PBLC SCHS
## 72606                                        PUTNAM COUNTY SCHOOLS
## 72618                                                       PUTNAM
## 72637                                                       PUTNAM
## 72638                                                       PUTNAM
## 72639                                                       PUTNAM
## 72651                                     Nogales Unified District
## 72671                                             Canyons District
## 72684                                         Fruitvale Elementary
## 72695                                         FAIRFAX CO PBLC SCHS
## 72756                                                Quest Academy
## 72762                                    SPOTSYLVANIA CO PBLC SCHS
## 72814                                          QUITMAN SCHOOL DIST
## 72922                                   Rancho Santa Fe Elementary
## 72923                                   Rancho Santa Fe Elementary
## 72959                          Wisconsin Department of Corrections
## 72980                             Henderson/Knox/Mercer/Warren ROE
## 72981                             Henderson/Knox/Mercer/Warren ROE
## 72983                             Henderson/Knox/Mercer/Warren ROE
## 72986                                  CAMDEN CITY SCHOOL DISTRICT
## 72991                                             Bakersfield City
## 73021                                        Moreno Valley Unified
## 73095                                         LOGAN COUNTY SCHOOLS
## 73146                                    Norwalk-La Mirada Unified
## 73180                                     Mountain View Elementary
## 73185                                              Ranches Academy
## 73220                               Litchfield Elementary District
## 73300                                      RANDOLPH COUNTY SCHOOLS
## 73303                                                 Roanoke City
## 73304                                              Randolph County
## 73355                                        DOE SOP EDUC PROGRAMS
## 73356                                RIVER BEND EDUCATION DISTRICT
## 73395                                   Ravenswood City Elementary
## 73437                                         Ray Unified District
## 73473                                  Raymond #14 School District
## 73489                                   Los Gatos Union Elementary
## 73527                    AIBT Non-Profit Charter High School  Inc.
## 73528                AIBT Non-Profit Charter High School - Phoenix
## 73537                                  Sebastopol Union Elementary
## 73551                                    DIVISION OF YOUTH SERVICE
## 73554                          Woodbridge Township School District
## 73573                                               Davis District
## 73582                                               Reagan Academy
## 73601                                            Princeton ESD 115
## 73603                           Real Salt Lake Academy High School
## 73604                                      RICHMOND CITY PBLC SCHS
## 73643                                   Red Bluff Union Elementary
## 73656                                                Juab District
## 73676                                              Sevier District
## 73688                              RED LAKE PUBLIC SCHOOL DISTRICT
## 73712                                          Washington District
## 73781                                          Columbia Elementary
## 73782                            Shasta County Office of Education
## 73790                          Wisconsin Department of Corrections
## 73792                                          ORANGE CO PBLC SCHS
## 73816                                                       DESOTO
## 73846                                             Granite District
## 73862                                        Reed Union Elementary
## 73901                                          Reef-Sunset Unified
## 73908                                                Nebo District
## 73927                                REG ALT ED CENTER/BUENA VISTA
## 73928               REG ALTERNATIVE PLUS SELF PROJECT/ROANOKE CITY
## 73931                                          Boone/Winnebago ROE
## 73933                                       Bureau/Henry/Stark ROE
## 73954                         REGIONAL ALTERNATIVE ED/KING WILLIAM
## 73955                          REGIONAL ALTERNATIVE ED/STAFFORD CO
## 73956                                          Boone/Winnebago ROE
## 73957               Monmouth-Ocean Educational Services Commission
## 73958                          REGIONAL ALTERNATIVE/PITTSLVANIA CO
## 73959                                REGIONAL ALTERNATIVE/WYTHE CO
## 73965               Mercer County Special Services School District
## 73968                            REGIONAL LEARNING ACADEMY/WISE CO
## 73971                                        STAFFORD CO PBLC SCHS
## 73988          Reid Traditional Schools' Painted Rock Academy Inc.
## 73989               Reid Traditional Schools' Valley Academy  Inc.
## 74028                                          Renaissance Academy
## 74032                                               Davis District
## 74068                              Lake County Office of Education
## 74094                                         RENAISSANCE/SCOTT CO
## 74122                                              Banning Unified
## 74159                                                     COLUMBIA
## 74161                                                   Fall River
## 74198                       Espiritu Community Development Corp. 2
## 74199                                       Folsom-Cordova Unified
## 74294                                                Rich District
## 74298                                                Rich District
## 74300                                                Rich District
## 74369                                                      VOLUSIA
## 74414                                       City of Chicago SD 299
## 74432                                                   SPRING ISD
## 74444                                              Sevier District
## 74447                                              Sevier District
## 74462                              RICHLAND COLLEGIATE HIGH SCHOOL
## 74476                                           San Marcos Unified
## 74511                                      RICHMOND CITY PBLC SCHS
## 74515                                    West Contra Costa Unified
## 74516                                    West Contra Costa Unified
## 74522                                        RICHMOND CO PBLC SCHS
## 74529                                          Richmond Elementary
## 74531                                     Richmond School District
## 74538                                              Nippersink SD 2
## 74552                                        MEDICAL COLLEGE OF VA
## 74554                                        DOE SOP EDUC PROGRAMS
## 74558                                                         DADE
## 74562                                      RICHMOND CITY PBLC SCHS
## 74563                                     Richmond-Burton CHSD 157
## 74634                                                         POLK
## 74659                                             Canyons District
## 74676                                      Ridgeline Academy  Inc.
## 74677                                               Cache District
## 74680                                              Alpine District
## 74681                                           Springfield SD 186
## 74751                                                        PASCO
## 74784                                                Riley CCSD 18
## 74800                                           Salt Lake District
## 74805                                Amphitheater Unified District
## 74809                                     Rim of the World Unified
## 74912                                               SAN ANGELO ISD
## 74940                              Ripley-Ohio-Dearborn Sp Ed Coop
## 74993                                     Buckeye Union Elementary
## 75052                                                        DUVAL
## 75053                                                        DUVAL
## 75078                                               Cache District
## 75084                                              Old Adobe Union
## 75087                           Ventura County Office of Education
## 75109                                                        PASCO
## 75122                                              Alpine District
## 75141                                    Lakeside Union Elementary
## 75194                West Valley Arts and Technology Academy  Inc.
## 75213                                           Riverdale CUSD 100
## 75237                                           Riverdale CUSD 100
## 75241                                               Weber District
## 75244                                           Riverdale CUSD 100
## 75268                                              Jordan District
## 75272                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 75283                                   Office of Juvenile Justice
## 75295                     Riverside County Office Of Education ROP
## 75400                                          Logan City District
## 75407                                              Jordan District
## 75408                                          Washington District
## 75421                                    Dept of Corrections-Youth
## 75422                                    Dept of Corrections-Youth
## 75429                                              Jordan District
## 75439                                              Jordan District
## 75483                                              Murray District
## 75499                                                Nebo District
## 75500                                              Alpine District
## 75530                           RED LAKE COUNTY CENTRAL PUBLIC SCH
## 75536                       Los Angeles County Office of Education
## 75545                                       JACKSON COUNTY SCHOOLS
## 75554                                       ROANOKE VALLEY GOV SCH
## 75555                                        DOE SOP EDUC PROGRAMS
## 75563                                            Perris Elementary
## 75581                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 75637                                             Waukegan CUSD 60
## 75694                                             Granite District
## 75725                              IDAHO DEPARTMENT OF CORRECTIONS
## 75745                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 75922                                             Robla Elementary
## 75976                                               Provo District
## 76028                                       Lee/Ogle/Whiteside ROE
## 76076                               Department of Juvenile Justice
## 76137                                              Rocklin Unified
## 76138                                              Rocklin Unified
## 76139                                         Newcastle Elementary
## 76174                                 Rockwell Charter High School
## 76226                                               Weber District
## 76227                                             Wasatch District
## 76235                                              Alpine District
## 76239                                              Gateway Unified
## 76257                                ROCORI PUBLIC SCHOOL DISTRICT
## 76286                            Calhoun/Greene/Jersy/Macoupin ROE
## 76287                            Calhoun/Greene/Jersy/Macoupin ROE
## 76288                                                     Lake ROE
## 76291                            Edw/Glt/Hlt/Hdn/Pop/Sln/Wbh/Wn/Wh
## 76405                                                     ROLLA 31
## 76435                                             Granite District
## 76488                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 76530                                                Rondout SD 72
## 76670                                            Duchesne District
## 76683                                                   PALM BEACH
## 76703                                             Granite District
## 76704                                               Weber District
## 76721                                    Roots Charter High School
## 76728                                          Los Angeles Unified
## 76771                                              Jordan District
## 76793                                              Jordan District
## 76795                                          Aurora East USD 131
## 76820                                           Salt Lake District
## 76824                                              Tooele District
## 76849                                             Granite District
## 76996                                 SBE - Ross Valley Elementary
## 77018                                               NM CORRECTIONS
## 77091                                  ROWANTY VOCATIONAL TECH CTR
## 77094                                       City of Chicago SD 299
## 77111                                              Rowland Unified
## 77151                                               Weber District
## 77156                                               Weber District
## 77167                                               Weber District
## 77194                                                   PALM BEACH
## 77218                            Hancck/Fultn/Schuylr/McDonogh ROE
## 77242                                     RSD Charter School  Inc.
## 77264                                              St Clair County
## 77417                                         RUSSELL CO PBLC SCHS
## 77448                                            Russellville City
## 77612                            Colusa County Office of Education
## 77625                                    DIVISION OF YOUTH SERVICE
## 77651                            Phoenix Education Management  LLC
## 77656                     Southern Arizona Community Academy  Inc.
## 77683                                        Sacramento County ROP
## 77686                                           Washington Unified
## 77696                             Maricopa Unified School District
## 77698                             Maricopa Unified School District
## 77731                                           Sage Academy  Inc.
## 77733                                     Del Mar Union Elementary
## 77738                                                Nebo District
## 77745                                              Alpine District
## 77831                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 77833                                              SAN ANTONIO ISD
## 77892                                                Nebo District
## 77894                                                Nebo District
## 77903                                                Nebo District
## 77928                                              Sevier District
## 77972                                              Carbon District
## 78005                                       Salt Lake Arts Academy
## 78006                       Salt Lake Center for Science Education
## 78008                                           Salt Lake District
## 78009                     Salt Lake School for the Performing Arts
## 78010                  Salt River Pima-Maricopa  Community Schools
## 78011                  Salt River Pima-Maricopa  Community Schools
## 78066                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 78095                                                      VOLUSIA
## 78160                                              San Antonio ROP
## 78168                        San Benito County Office of Education
## 78176                                    San Bernardino County ROP
## 78179                                        San Carlos Elementary
## 78183                                        San Carlos Elementary
## 78193                                         San Diego County ROP
## 78198                                      Mountain Empire Unified
## 78202                                      Mountain Empire Unified
## 78203                                      Borrego Springs Unified
## 78217                                     San Francisco County ROP
## 78228                                          San Jacinto Unified
## 78243                       San Joaquin County Office of Education
## 78245                                       San Joaquin County ROP
## 78255                                                        DUVAL
## 78263                                                        DUVAL
## 78265                                               Warner Unified
## 78272                                            San Juan District
## 78279                                          San Lorenzo Unified
## 78296                                           San Marcos Unified
## 78306                                         San Mateo County ROP
## 78311                                        San Mateo-Foster City
## 78312                                                       Oxnard
## 78313                                        San Francisco Unified
## 78332                               Benson Unified School District
## 78340                                               Emery District
## 78346                                         Colton Joint Unified
## 78348                              San Tan Montessori School  Inc.
## 78351                             Florence Unified School District
## 78399                                               Weber District
## 78400                      Wisconsin Department of Health Services
## 78405                                               Davis District
## 78408                                           Springfield SD 186
## 78436                               Department of Juvenile Justice
## 78482                                          Washington District
## 78492                                            Sandwich CUSD 430
## 78494                                            Sandwich CUSD 430
## 78522                                             Canyons District
## 78570                                              Willits Unified
## 78584                     Santa Barbara County Office of Education
## 78585                     Santa Barbara County Office of Education
## 78586                                     Santa Barbara County ROP
## 78587                                     Santa Barbara County ROP
## 78588                     Santa Barbara County Office of Education
## 78591                                        Santa Barbara Unified
## 78595                                       Santa Clara County ROP
## 78597                                       Santa Clara Elementary
## 78601                                          Washington District
## 78603                                   William S. Hart Union High
## 78606                        Santa Cruz County Office of Education
## 78609                                        Santa Cruz County ROP
## 78652                                              SANTA MARIA ISD
## 78663                                  Santa Monica-Malibu Unified
## 78670                                  Santa Rita Union Elementary
## 78671                                     Menifee Union Elementary
## 78685                                                   SANTA ROSA
## 78686                             Maricopa Unified School District
## 78689                                                   SANTA ROSA
## 78690                                                   SANTA ROSA
## 78699                                           College Elementary
## 78702                                                   PALM BEACH
## 78708                                                Nebo District
## 78744                                   Union City School District
## 78787                                                     SARASOTA
## 78788                                                     SARASOTA
## 78797                                              Alpine District
## 78841                                                Joliet PSD 86
## 78842                                                 Satori  Inc.
## 78908                               Department of Juvenile Justice
## 78926                              Mono County Office of Education
## 78955                Governor's School for the Arts and Humanities
## 78956                 Governor' School for Science and Mathematics
## 78963                                     Acton-Agua Dulce Unified
## 79001                                              Alpine District
## 79055                                              Scholar Academy
## 79162                                     Gen George Patton SD 133
## 79249                                                        DUVAL
## 79257                         San Diego County Office of Education
## 79413                                           SCOTT CO PBLC SCHS
## 79443                                             Granite District
## 79478                                Scottsdale Country Day School
## 79484                                                     SEMINOLE
## 79485                                                     SEMINOLE
## 79544                                                        DUVAL
## 79545                                      Seacoast Charter School
## 79573                             Spec Educ Assoc of Peoria County
## 79582                                                        DUVAL
## 79583                                                        DUVAL
## 79610                                  Sebastopol Union Elementary
## 79634                                                   PALM BEACH
## 79638                                         FAIRFAX CO PBLC SCHS
## 79644                                                         DADE
## 79645                                                         DADE
## 79646                                                         DADE
## 79647                                                         DADE
## 79672                                  Sedona Charter School  Inc.
## 79673                                     Sedona-Oak Creek JUSD #9
## 79681                                            NEW BRAUNFELS ISD
## 79689                                              Alpine District
## 79698                                             Seiad Elementary
## 79700                                              SAN ANTONIO ISD
## 79722                                           Long Beach Unified
## 79723                             Self Development Academy-Phoenix
## 79724                              Self Development Charter School
## 79770                                                     SEMINOLE
## 79789                                                   PALM BEACH
## 79795                                                     SEMINOLE
## 79817                                  Seneca Area School District
## 79825                                  Seneca Area School District
## 79834                                  Seneca Area School District
## 79850                               HOPKINS PUBLIC SCHOOL DISTRICT
## 79864                         Edkey  Inc. - Sequoia Choice Schools
## 79875                         Edkey  Inc. - Sequoia Charter School
## 79887                        Edkey  Inc. - Sequoia Pathway Academy
## 79889                         Edkey  Inc. - Sequoia Charter School
## 79891                         Edkey  Inc. - Sequoia Village School
## 79892                         Edkey  Inc. - Sequoia Village School
## 79894                                                     SEQUOYAH
## 79942                                              Alpine District
## 79945                                  South Eastern Sp Ed Program
## 79946                                             Fillmore Unified
## 79959                                              Tooele District
## 79974                              SEVEN HILLS PREPARATORY ACADEMY
## 80014                                           Cajon Valley Union
## 80015                                              Sevier District
## 80073                                            Northbrook ESD 27
## 80104                                          Ogden City District
## 80225                                                       Sharon
## 80241                                              Alpine District
## 80273                                            Shasta Union High
## 80286                                           Shasta-Trinity ROP
## 80443                                              Alpine District
## 80474                            Amador County Office of Education
## 80477                           SHENANDOAH VALLEY GOVERNORS SCHOOL
## 80479                                        DOE SOP EDUC PROGRAMS
## 80480                 SHENANDOAH VALLEY REG ALTERNATIVE ED/GENESIS
## 80569                                                        PASCO
## 80570                                                         POLK
## 80603                                               Madera Unified
## 80604                                               Madera Unified
## 80605                                               Madera Unified
## 80615                                              Willits Unified
## 80653                                                Chico Unified
## 80752                    Shonto Governing Board of Education  Inc.
## 80789                                         Death Valley Unified
## 80834                                     Acton-Agua Dulce Unified
## 80835                                                      ALACHUA
## 80885                                      Nevada Joint Union High
## 80889                                                Nebo District
## 80891                            Sierra County Office of Education
## 80892                                     Oroville City Elementary
## 80893                              Mono County Office of Education
## 80900                                        Tahoe-Truckee Unified
## 80920                                         Cuyama Joint Unified
## 80928                            Nevada County Office of Education
## 80929                                WASHOE COUNTY SCHOOL DISTRICT
## 80944                                         Sierra Sands Unified
## 80969                                Sierra Vista Unified District
## 80990                                                       MONROE
## 80991                                             Township HSD 214
## 81005                                              Metro Education
## 81039                                              Jordan District
## 81041                                       Silver Fork Elementary
## 81048                                             Granite District
## 81067                                             Canyons District
## 81093                                        South Summit District
## 81094                                        South Summit District
## 81149            Union County Vocational-Technical School District
## 81217                                                 Siskiyou ROP
## 81306                                           Blue Adobe Project
## 81307                                       Lucerne Valley Unified
## 81314                                               Cache District
## 81328                              Skyline Gila River Schools  LLC
## 81346                                             Granite District
## 81359                                        Skyline Schools  Inc.
## 81364                                              Alpine District
## 81376          Kaizen Education Foundation dba Skyview High School
## 81384                                         Skyview School  Inc.
## 81401                                               Provo District
## 81411                                        Mountain View Whisman
## 81434                                      Orinda Union Elementary
## 81621                                           SMYTH CO PBLC SCHS
## 81653                                          Washington District
## 81654                                          Washington District
## 81665                                               Davis District
## 81669                                              Alpine District
## 81670                                               Weber District
## 81681                                           Box Elder District
## 81702                                  RUNESTONE AREA ED. DISTRICT
## 81709                                                  HOUSTON ISD
## 81761                                Soldier Hollow Charter School
## 81771                                              Soledad Unified
## 81772                                              Soledad Unified
## 81778                            LAKE SUPERIOR PUBLIC SCHOOL DIST.
## 81817                                                         DADE
## 81818                                                         DADE
## 81848                                                      BROWARD
## 81854                                                        DUVAL
## 81855                                                        DUVAL
## 81857                                                         DADE
## 81882                                                         DADE
## 81894                                                         DADE
## 81917                            Sonoma County Office of Education
## 81918                            Sonoma County Office of Education
## 81919                                            Sonoma County ROP
## 81920                            Sonoma County Office of Education
## 81938                                        Sonoran Desert School
## 81941                           Sonoran Science Academy - Broadway
## 81942 Daisy Education Corporation dba. Sonoran Science Academy Dav
## 81943 Daisy Education Corporation dba Sonoran Science Academy - Ph
## 81944      Daisy Education Corporation dba Sonoran Science Academy
## 81945 Daisy Education Corporation dba. Sonoran Science Academy Peo
## 81978                               Higley Unified School District
## 82019                                                      BREVARD
## 82029                                               Baldwin County
## 82053                                         GRANT COUNTY SCHOOLS
## 82064             SOUTH BRONX EARLY COLLEGE ACADEMY CHARTER SCHOOL
## 82078                                               Cache District
## 82096                                    DEPARTMENT OF CORRECTIONS
## 82123                                               Davis District
## 82125                                 Point Arena Joint Union High
## 82138                                          Siskiyou Union High
## 82159                                               Davis District
## 82186                                           Southern Berkshire
## 82297                                     Beech Grove City Schools
## 82353                                              Jordan District
## 82355                                 Hillsborough City Elementary
## 82372                                            ODE YCEP District
## 82376                                              Jordan District
## 82377                                              Jordan District
## 82381                                             Granite District
## 82472                    Kaizen Education Foundation dba Advance U
## 82487                                               Weber District
## 82497                                             Canyons District
## 82525                                   South Phoenix Academy Inc.
## 82548 American Charter Schools Foundation d.b.a. South Pointe High
## 82549 Kaizen Education Foundation dba South Pointe Junior High Sch
## 82575                                Utah Schools for Deaf & Blind
## 82576                                                Rich District
## 82581  American Charter Schools Foundation d.b.a. South Ridge High
## 82606                                       South Sanpete District
## 82618                                              Sevier District
## 82619                                              Sevier District
## 82677                                        South Summit District
## 82678                                        South Summit District
## 82679                                        South Summit District
## 82680                                        South Summit District
## 82683                             Marcum-Illinois Union Elementary
## 82694                                                   PALM BEACH
## 82717                                   South Valley Academy  Inc.
## 82718                                              Jordan District
## 82742                                               Davis District
## 82752                                     South Wilmington CCSD 74
## 82787                                        Institutional Schools
## 82788                                       City of Chicago SD 299
## 82793                                    DEPARTMENT OF CORRECTIONS
## 82848                  Arizona State School for the Deaf and Blind
## 82877                                             S.EAST VA TRN CT
## 82880                     Southern Arizona Community Academy  Inc.
## 82888                                      Southern California ROC
## 82928                          Humboldt County Office of Education
## 82949                                               NM CORRECTIONS
## 82958              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 82967                                           Springfield SD 186
## 82975                                      Southgate Academy  Inc.
## 82996                                              Jordan District
## 83016                                              Jordan District
## 83040                                                SOUTHSIDE ISD
## 83041                                   Office of Juvenile Justice
## 83045                                              Aprender Tucson
## 83058                                         Southside Elementary
## 83096                      SOUTHSIDE L.I.N.K. PROJECT/BRUNSWICK CO
## 83107                                              Morrison CUSD 6
## 83111                                             S.SIDE VA TRN CT
## 83142                                                Iron District
## 83179                                          Washington District
## 83189                                                  MCALLEN ISD
## 83192                                 Southwest Leadership Academy
## 83199                                                         DADE
## 83223                  Arizona State School for the Deaf and Blind
## 83233                                   SOUTHWEST VIRGINIA GOV SCH
## 83254                                SW VA MENTAL HEALTH INSTITUTE
## 83255                                             S.WEST VA TRN CT
## 83288                                               CROSBYTON CISD
## 83297                                             Jefferson County
## 83305                                                Nebo District
## 83306                                                Nebo District
## 83313                                                Nebo District
## 83315                                                   PALM BEACH
## 83322                       Santa Clara County Office of Education
## 83337                                WASHOE COUNTY SCHOOL DISTRICT
## 83387                                          Ogden City District
## 83389                                             Canyons District
## 83393                                 EDINA PUBLIC SCHOOL DISTRICT
## 83395                                DULUTH PUBLIC SCHOOL DISTRICT
## 83398                             WEST ST. PAUL-MENDOTA HTS.-EAGAN
## 83408                                            Shoreline Unified
## 83409                                       Chula Vista Elementary
## 83410                                          Live Oak Elementary
## 83411                                              King City Union
## 83412                                              Lincoln Unified
## 83416                                          Los Angeles Unified
## 83417                                              Hayward Unified
## 83419                                                     ANNA ISD
## 83425                              SHAKOPEE PUBLIC SCHOOL DISTRICT
## 83430                                                   LUFKIN ISD
## 83436                                             Spectrum Academy
## 83437                                             Spectrum Academy
## 83446                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 83485                                    Spencer Valley Elementary
## 83527                                            HICKMAN MILLS C-1
## 83549                                                         DADE
## 83550                                                         DADE
## 83555                                                         DADE
## 83562                                    SPOTSYLVANIA CO PBLC SCHS
## 83589                                       North Sanpete District
## 83615                                               Cache District
## 83617                                               Provo District
## 83621                                   DIVISION OF YOUTH SERVICES
## 83644                                              Nippersink SD 2
## 83675                          Mariposa County Office of Education
## 83693                                                Nebo District
## 83694                                                       DESOTO
## 83695                                             Granite District
## 83774                                          Washington District
## 83775                                               NM CORRECTIONS
## 83781                                           Springfield SD 186
## 83783                                               Columbia Union
## 83805                                           Springfield SD 186
## 83816                                           Springfield SD 186
## 83835                                           Springfield SD 186
## 83841                                                  Springfield
## 83867                                              Alpine District
## 83886                                                Nebo District
## 83888                                                Nebo District
## 83912                                             Canyons District
## 83927                                         Newcastle Elementary
## 83947                                         East St Louis SD 189
## 83957                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 83958                          Wisconsin Department of Corrections
## 83995                                                    ST. JOHNS
## 84024                                              Macon/Piatt ROE
## 84061                                                    ST. JOHNS
## 84094                                           St. George Academy
## 84100                                            St. Helena Parish
## 84121                                                    ST. JOHNS
## 84122                                                    ST. JOHNS
## 84128                                                    ST. JOHNS
## 84129                                                    ST. JOHNS
## 84130                                                    ST. JOHNS
## 84132                                               ST. LOUIS CITY
## 84135                           ST. LOUIS PARK PUBLIC SCHOOL DIST.
## 84138                                                    ST. LUCIE
## 84141                                                    ST. LUCIE
## 84289                          Wisconsin Department of Corrections
## 84314                                              Tooele District
## 84315                                              Tooele District
## 84316                                             Granite District
## 84364                  Painted Desert Demonstration Projects  Inc.
## 84381                                               Davis District
## 84414                                Starmont Comm School District
## 84442                                            StarShine Academy
## 84521       Southwest Technical Education District of Yuma (STEDY)
## 84524       Southwest Technical Education District of Yuma (STEDY)
## 84525       Southwest Technical Education District of Yuma (STEDY)
## 84526       Southwest Technical Education District of Yuma (STEDY)
## 84527       Southwest Technical Education District of Yuma (STEDY)
## 84528       Southwest Technical Education District of Yuma (STEDY)
## 84529       Southwest Technical Education District of Yuma (STEDY)
## 84530       Southwest Technical Education District of Yuma (STEDY)
## 84535                                           Steel City Academy
## 84591                                       BOTETOURT CO PBLC SCHS
## 84599                                         RUSSELL CO PBLC SCHS
## 84624                                        STEP UP Schools  Inc.
## 84679                                      Stepping Stones Academy
## 84684                            WHITE PINE COUNTY SCHOOL DISTRICT
## 84717                                              Tooele District
## 84791                                              Steward ESD 220
## 84822                                               Davis District
## 84857                          STILLWATER AREA PUBLIC SCHOOL DIST.
## 84910                                        San Francisco Unified
## 84912                                             Stockton Unified
## 84913                                             Stockton Unified
## 84940                                          Napa Valley Unified
## 85144                                       ARLINGTON CO PBLC SCHS
## 85152                                  Strathmore Union Elementary
## 85280                                                   LUFKIN ISD
## 85282                                                  CENTRAL ISD
## 85283                                                   DIBOLL ISD
## 85289                             South Bend Community School Corp
## 85292                                     PHARR-SAN JUAN-ALAMO ISD
## 85295                      GAR  LLC dba Student Choice High School
## 85296                      GAR  LLC dba Student Choice High School
## 85301                                                   OKEECHOBEE
## 85305                                                       MARION
## 85353                                                     Kane ROE
## 85356                                                   MARLIN ISD
## 85357                                                     Kane ROE
## 85362                                                  Phenix City
## 85365                                                     Kane ROE
## 85398                                                     Kane ROE
## 85399                            Arizona Department of Corrections
## 85400                            Arizona Department of Corrections
## 85402                            Arizona Department of Corrections
## 85403                            Arizona Department of Corrections
## 85404                                              Success Academy
## 85412                             SOUTHERN MN EDUCATION CONSORTIUM
## 85413                                              Success Academy
## 85435                               Higley Unified School District
## 85534                                        Sulphur Springs Union
## 85589                                               Summit Academy
## 85590                                               Summit Academy
## 85591                                               Summit Academy
## 85606                                   Summit Academy High School
## 85630                                               Alvord Unified
## 85642                                              Alpine District
## 85660                                             Hesperia Unified
## 85688                                               Cache District
## 85689                                 CLARK COUNTY SCHOOL DISTRICT
## 85692                                               Alvord Unified
## 85697                                               Weber District
## 85733                                                       SUMTER
## 85738                                                       SUMTER
## 85741                                                       SUMTER
## 85757                               Morrison Education Group  Inc.
## 85768 American Charter Schools Foundation d.b.a. Sun Valley High S
## 85785                                                   PALM BEACH
## 85790                                                     HERNANDO
## 85791                                                     HERNANDO
## 85795                                              Alpine District
## 85831                                                        PASCO
## 85969                               Palos Verdes Peninsula Unified
## 85970                                               Provo District
## 85971                                          Washington District
## 85973                                             Canyons District
## 85974                                               Cache District
## 86024                                               Davis District
## 86049                                              Jordan District
## 86051                                               Davis District
## 86052                                          Washington District
## 86065                                               Provo District
## 86067                                              INDEPENDENCE 30
## 86081                                DULUTH PUBLIC SCHOOL DISTRICT
## 86096                             Apache Junction Unified District
## 86101                                      CUMBERLAND CO PBLC SCHS
## 86180                                      Seaford School District
## 86205                                           Nuestro Elementary
## 86233                                                     SUWANNEE
## 86234                                                     SUWANNEE
## 86235                                                     SUWANNEE
## 86254                             Southwest Metro Intermediate 288
## 86342                             Paradise Valley Unified District
## 86438                                     Del Mar Union Elementary
## 86494                                  Synergy Public School  Inc.
## 86498                                        Syracuse Arts Academy
## 86499                                        Syracuse Arts Academy
## 86503                                               Davis District
## 86504                                               Davis District
## 86506                                               Davis District
## 86511                                               SySTEM Schools
## 86522                                                Joliet PSD 86
## 86533                               Department of Juvenile Justice
## 86570                                               Weber District
## 86584                                            Duchesne District
## 86585                                            Duchesne District
## 86593                                       MCCOMB SCHOOL DISTRICT
## 86616                                                Joliet PSD 86
## 86640                                              Taft Union High
## 86691                                               Talladega City
## 86693                                             Talladega County
## 86781                                                     ESCAMBIA
## 86782                             Tempe Union High School District
## 86788                                                     SEMINOLE
## 86827                                         EAGLE MT-SAGINAW ISD
## 86828                                                  CROWLEY ISD
## 86829                                                  CARROLL ISD
## 86831                                                BIRDVILLE ISD
## 86832                                                ARLINGTON ISD
## 86834                                     HURST-EULESS-BEDFORD ISD
## 86835                                                   KELLER ISD
## 86839                                                NORTHWEST ISD
## 86892                                          Adelanto Elementary
## 86893                                        Vallecitos Elementary
## 86898                                          Ogden City District
## 86906                                                  ABILENE ISD
## 86917                                        TAYLOR COUNTY SCHOOLS
## 86966                                                Nebo District
## 86967                                               Davis District
## 86970                                                       TAYLOR
## 86971                                                       TAYLOR
## 86984                                             Granite District
## 86985                                             Granite District
## 86991                                        TAZEWELL CO PBLC SCHS
## 87055                                       ARLINGTON CO PBLC SCHS
## 87058                                      VA BEACH CITY PBLC SCHS
## 87061                                    MONONGALIA COUNTY SCHOOLS
## 87097                                                       MARTIN
## 87099                                                     HAMILTON
## 87101                                                         DADE
## 87107                                            Tehama County ROP
## 87125                            Telesis Center for Learning  Inc.
## 87126                            Telesis Center for Learning  Inc.
## 87127                                               Telfair County
## 87148                         Riverside County Office of Education
## 87151                                      Temecula Valley Unified
## 87152                                      Temecula Valley Unified
## 87158                                    Tempe Preparatory Academy
## 87243                                                Terra Academy
## 87251                                              Jordan District
## 87284                               Department of Juvenile Justice
## 87331                                               TEXAS CITY ISD
## 87332                                                  HOUSTON ISD
## 87341                                               HUNTSVILLE ISD
## 87342                                               HUNTSVILLE ISD
## 87343                                               HUNTSVILLE ISD
## 87346                  TEXAS SCH FOR THE BLIND & VISUALLY IMPAIRED
## 87347                                       TEXAS SCH FOR THE DEAF
## 87401                                                    HIGHLANDS
## 87407                                       NORFOLK CITY PBLC SCHS
## 87430                                DULUTH PUBLIC SCHOOL DISTRICT
## 87447           The Center for Creativity Innovation and Discovery
## 87456                                                      VOLUSIA
## 87457                                          Los Angeles Unified
## 87465                                       SUFFOLK CITY PBLC SCHS
## 87487                                                      JACKSON
## 87501                                                Etowah County
## 87505                                THE EXCEL CENTER (FOR ADULTS)
## 87511                       The Farm at Mission Montessori Academy
## 87519                                         HANOVER CO PBLC SCHS
## 87521                             Mohave County Juvenile Detention
## 87523                      THE GOVERNOR'S SCHOOL @ INNOVATION PARK
## 87525                                The Grande Innovation Academy
## 87532                                         HANOVER CO PBLC SCHS
## 87535                                            Dehesa Elementary
## 87542                                Amphitheater Unified District
## 87555                                              Lawrence County
## 87570                                                   PALM BEACH
## 87590                                            NEW BRAUNFELS ISD
## 87603                        The Odyssey Preparatory Academy  Inc.
## 87604                        The Odyssey Preparatory Academy  Inc.
## 87605                        The Odyssey Preparatory Academy  Inc.
## 87608                                                        UNION
## 87611                                   The Paideia Academies  Inc
## 87617                                        PEAK School Inc.  The
## 87618                                                      Newport
## 87623                                                      COLLIER
## 87636                                                      VOLUSIA
## 87639              THE REGIONAL COMMUNITY ALTERNATIVE ED CONTINUUM
## 87640                                      VA BEACH CITY PBLC SCHS
## 87648                                         Rising Schools  Inc.
## 87662                                                         DADE
## 87663                                            The Shelby School
## 87664                                               Winnetka SD 36
## 87676                                     NORTHAMPTON CO PBLC SCHS
## 87749                                                 Gadsden City
## 87752                                                    ST. JOHNS
## 87775                                      RICHMOND CITY PBLC SCHS
## 87828                              Yuba County Office of Education
## 87832                                          Thomas Edison - Lea
## 87833                                          Thomas Edison - Lea
## 87880                                                Joliet PSD 86
## 87915                                             Granite District
## 87931                                             Waukegan CUSD 60
## 87963                                          Ogden City District
## 87997                                             Granite District
## 88027                          Wisconsin Department of Corrections
## 88044                                                Joliet PSD 86
## 88153                                          Washington District
## 88164                                           Box Elder District
## 88171                                                 Cary CCSD 26
## 88172                                                Iron District
## 88173                                                Iron District
## 88191                                              Channahon SD 17
## 88212                                              Alpine District
## 88265                           Tucson International Academy  Inc.
## 88266                           Tucson International Academy  Inc.
## 88281                                        DOE SOP EDUC PROGRAMS
## 88283                    TIDEWATER REGIONAL ALTERNATIVE ED PROJECT
## 88314                                                        DUVAL
## 88394                                              Alpine District
## 88418                                           Timpanogos Academy
## 88419                                              Alpine District
## 88420                                             Wasatch District
## 88421                                               Provo District
## 88423                                               Provo District
## 88445                                              Tintic District
## 88446                                              Tintic District
## 88449                              Mono County Office of Education
## 88500                                                         DADE
## 88509                                                Mobile County
## 88586                          Tolleson Union High School District
## 88590                                               Davis District
## 88595            CPLC Community Schools dba Toltecalli High School
## 88640                                                  TOMBALL ISD
## 88672                                          Washington District
## 88706                                              Tooele District
## 88707                                              Tooele District
## 88708                                              Tooele District
## 88709                                              Tooele District
## 88753                                  Washington Union Elementary
## 88760                                     Del Mar Union Elementary
## 88893                                           Park City District
## 88894                                           Park City District
## 88918                            MINNETONKA PUBLIC SCHOOL DISTRICT
## 88926                                                         POLK
## 88928                      TRANSITION SUPPORT RESOURCE CTR/FAIRFAX
## 88931                          SOUTH WASHINGTON COUNTY SCHOOL DIST
## 88932                               WACONIA PUBLIC SCHOOL DISTRICT
## 88957                                              Alpine District
## 88966                                             PFLUGERVILLE ISD
## 88969                                                   AUSTIN ISD
## 89013                                           Park City District
## 89016                                                       MONROE
## 89023                                     Cascade Union Elementary
## 89025                                      Treeside Charter School
## 89065      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 89069                                  Tres Pinos Union Elementary
## 89105                                               Tri-Cities ROP
## 89106 Mary Ellen Halvorson Educational Foundation. dba: Tri-City P
## 89107                                              Tri City CUSD 1
## 89108                                              Tri City CUSD 1
## 89109                                              Tri City CUSD 1
## 89130                                               Tri-County ROP
## 89153                                               Tri-Valley ROP
## 89210                           Trinity County Office of Education
## 89211                           Trinity County Office of Education
## 89212                           Trinity County Office of Education
## 89247                                      SHENANDOAH CO PBLC SCHS
## 89274                                   Triumphant Learning Center
## 89353                                                  Pike County
## 89406                                            San Juan District
## 89414                                                  HOUSTON ISD
## 89417                  Tuacahn High School for the Performing Arts
## 89433                                     Marion Community Schools
## 89447                  Arizona State School for the Deaf and Blind
## 89448                                  Paragon Preparatory Academy
## 89449                              Tucson Country Day School  Inc.
## 89450                           Tucson International Academy  Inc.
## 89451                           Tucson International Academy  Inc.
## 89453                                    Tucson Preparatory School
## 89454                  Arizona State School for the Deaf and Blind
## 89480                                              Alpaugh Unified
## 89481                                        San Francisco Unified
## 89531                    Tuolumne County Superintendent of Schools
## 89533                                    TUPELO PUBLIC SCHOOL DIST
## 89554                                       SUFFOLK CITY PBLC SCHS
## 89569                                                Turner County
## 89601                                                         DADE
## 89604                                                    JEFFERSON
## 89609                                          ORANGE CO PBLC SCHS
## 89636                                              Tuscaloosa City
## 89638                                            Tuscaloosa County
## 89744                                          TWIN FALLS DISTRICT
## 89769                                           San Marcos Unified
## 89778                                             Granite District
## 89783                                       Twin Ridges Elementary
## 89788                            Twin Rivers Career & Tech Ed Area
## 89826                                               Weber District
## 89890                                           Springfield SD 186
## 89900                                                      BROWARD
## 89902                                                Mobile County
## 89919                                              Uintah District
## 89920                                              Uintah District
## 89921                                              Uintah District
## 89922                                            Uintah River High
## 89923                                           Salt Lake District
## 89924                                               Weber District
## 89925                                              Uintah District
## 89950      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 89973                         Del Norte County Office of Education
## 90028                                                        UNION
## 90050                                                        UNION
## 90102                                            Duchesne District
## 90115                                        Union Hill Elementary
## 90117                                        Union Hill Elementary
## 90134                                             Canyons District
## 90154      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 90167                                            Arcata Elementary
## 90175                                                        UNION
## 90176                                                        UNION
## 90177                                                        UNION
## 90204                                      HARRISON COUNTY SCHOOLS
## 90207                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 90221                                      HARRISON COUNTY SCHOOLS
## 90249                        Orange County Department of Education
## 90255                                       City of Chicago SD 299
## 90256                                       City of Chicago SD 299
## 90257                                       City of Chicago SD 299
## 90258                                       City of Chicago SD 299
## 90281                                        Conejo Valley Unified
## 90325                                 University of Ill Lab School
## 90347                                            Shasta Union High
## 90348                       Santa Clara County Office of Education
## 90383                                             Granite District
## 90385                                     Bradley Union Elementary
## 90386                                         Cuyama Joint Unified
## 90387                                     Bradley Union Elementary
## 90405                                            GRAND PRAIRIE ISD
## 90414                                             UPLIFT EDUCATION
## 90520                              Mono County Office of Education
## 90531                                       City of Chicago SD 299
## 90532                                       City of Chicago SD 299
## 90533                                       City of Chicago SD 299
## 90541                                                Urbana SD 116
## 90569                                 Utah Career Path High School
## 90570                                     Utah Connections Academy
## 90571                               Utah County Academy of Science
## 90572                            Utah International Charter School
## 90573                                        Utah Military Academy
## 90574                                        Utah Military Academy
## 90575                                          Washington District
## 90576                                          Washington District
## 90578                                         Utah Virtual Academy
## 90615                                         HENRICO CO PBLC SCHS
## 90619           Valley Academy for Career and Technology Education
## 90620           Valley Academy for Career and Technology Education
## 90621           Valley Academy for Career and Technology Education
## 90622           Valley Academy for Career and Technology Education
## 90623           Valley Academy for Career and Technology Education
## 90627                                               Davis District
## 90689     Ahwatukee Foothills Prep Early College High School  Inc.
## 90690     Ahwatukee Foothills Prep Early College High School  Inc.
## 90694                                         Cuyama Joint Unified
## 90720                                               Valley Academy
## 90726                                       VALLEY VOCATIONAL TECH
## 90748                                             Granite District
## 90787                                                Kane District
## 90802                                              Jordan District
## 90807                                             Granite District
## 90810                            Tulare County Office of Education
## 90825                                                 Ojai Unified
## 90831                                             San Juan Unified
## 90835                                     Petaluma City Elementary
## 90846                                        Kestrel Schools  Inc.
## 90855                                                   Valley ROP
## 90856                                               Weber District
## 90858                                                Kane District
## 90879                                     New Jerusalem Elementary
## 90951                                               Weber District
## 90952                                               Davis District
## 90953                                              Alpine District
## 90981                                     VALLIVUE SCHOOL DISTRICT
## 91064                               Van Meter Comm School District
## 91146                                             Vanguard Academy
## 91180                                 CLARK COUNTY SCHOOL DISTRICT
## 91223                                 Vector School District  Inc.
## 91266                           Ventura County Office of Education
## 91274                       San Joaquin County Office of Education
## 91277                                              Venture Academy
## 91293                                           Woodstock CUSD 200
## 91298                              A Center for Creative Education
## 91322                                               PAINT ROCK ISD
## 91345                                              Uintah District
## 91367                                                     CHSD 128
## 91377                                              Tooele District
## 91425                                            Norris Elementary
## 91468                                               ST. LOUIS CITY
## 91481                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 91528                       Victory Collegiate Academy Corporation
## 91537                                    Victory High School  Inc.
## 91543                                                  HOUSTON ISD
## 91544                                                  HOUSTON ISD
## 91586                                               Davis District
## 91587                                              Murray District
## 91607                              Villa Montessori Charter School
## 91622                                              Windsor Unified
## 91682                                        Covina-Valley Unified
## 91709              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 91724                                              Alpine District
## 91761                                              South Bay Union
## 91781                                        DOE SOP EDUC PROGRAMS
## 91813                                         MCV/VA TREATMENT CTR
## 91827                                         Palm Springs Unified
## 91841                                  Vision Charter School  Inc.
## 91868    Vista at Entrada School of Performing Arts and Technology
## 91872                              Vista College Preparatory  Inc.
## 91873                              Vista College Preparatory  Inc.
## 91898   Kaizen Education Foundation dba Vista Grove Preparatory  1
## 91899                                              Alpine District
## 91923                           Ventura County Office of Education
## 91928                                             Granite District
## 91950                                               ST. LOUIS CITY
## 91975                                                      VOLUSIA
## 91979                                                      VOLUSIA
## 91988              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 91998                                               Voyage Academy
## 92024                                               Chilton County
## 92100                                          Aurora East USD 131
## 92120                                            Sandwich CUSD 430
## 92183                                        DOE SOP EDUC PROGRAMS
## 92189                                  M S D Wabash County Schools
## 92217                               WACONIA PUBLIC SCHOOL DISTRICT
## 92258                                      Orinda Union Elementary
## 92275                                               Weber District
## 92365                                                      WAKULLA
## 92369                                                      WAKULLA
## 92385                                Walden School of Liberal Arts
## 92422                                                Walker County
## 92423                                                Walker County
## 92489                                               ROBERT LEE ISD
## 92490                                               CHRISTOVAL ISD
## 92493                                                    OLFEN ISD
## 92494                                               PAINT ROCK ISD
## 92495                                            STERLING CITY ISD
## 92519                                        ROSCOE COLLEGIATE ISD
## 92526                                      Wallace Stegner Academy
## 92547                                                   WALLER ISD
## 92555                                          Los Angeles Unified
## 92632                                            NEW BRAUNFELS ISD
## 92693                                       City of Chicago SD 299
## 92700                                                 Lodi Unified
## 92754                                                       WALTON
## 92763                                                       WALTON
## 92771                                                       WALTON
## 92791      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 92792      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 92870                                   NYE COUNTY SCHOOL DISTRICT
## 92972              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 92974      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 93049                                                      Warwick
## 93051                                             Wasatch District
## 93052                                             Granite District
## 93053                                             Wasatch District
## 93054                                         Wasatch Peak Academy
## 93055                                               Davis District
## 93056                                           Salt Lake District
## 93057                                               Provo District
## 93058                                          Ogden City District
## 93059                               Wasatch Waldorf Charter School
## 93068                                WASECA PUBLIC SCHOOL DISTRICT
## 93116                                      WASHINGTON CO PBLC SCHS
## 93117                                            Washington County
## 93120                                    West Bend School District
## 93154                                             Waukegan CUSD 60
## 93349                                                Joliet PSD 86
## 93394                                           Springfield SD 186
## 93416                                          Washington District
## 93433                                          Washington District
## 93434                                           Salt Lake District
## 93438                                               Davis District
## 93457                                               Weber District
## 93459                                    Prescott Unified District
## 93466                                                   WASHINGTON
## 93490                                WASHOE COUNTY SCHOOL DISTRICT
## 93519                                          Washington District
## 93520                                          Washington District
## 93521                                             WATER VALLEY ISD
## 93680                          WAUBUN-OGEMA-WHITE EARTH PUBLIC SCH
## 93685                                                     Lake ROE
## 93696                                             Waukegan CUSD 60
## 93722                          Wisconsin Department of Corrections
## 93746                      Western Arizona Vocational District #50
## 93747                      Western Arizona Vocational District #50
## 93748                      Western Arizona Vocational District #50
## 93749                      Western Arizona Vocational District #50
## 93750                      Western Arizona Vocational District #50
## 93752                      Western Arizona Vocational District #50
## 93757                                                        DUVAL
## 93816                               Department of Juvenile Justice
## 93861                                               Wayne District
## 93873                                               Wayne District
## 93967                                                 Weaver Union
## 93976                                                   LAREDO ISD
## 94003                                               Weber District
## 94004                                               Weber District
## 94006                                               Weber District
## 94007                       Weber State University Charter Academy
## 94113                               Weilenmann School of Discovery
## 94114                                        San Francisco Unified
## 94142                                              Jordan District
## 94191                                                   PALM BEACH
## 94200                                              Carbon District
## 94227                                  ELKO COUNTY SCHOOL DISTRICT
## 94241                                                Fulton County
## 94249                           Minneapolis Public School District
## 94257                                               Cache District
## 94289                                              Tooele District
## 94324                                                        PASCO
## 94349                                    Region 06 West Cook ISC 2
## 94362                                        Institutional Schools
## 94369                                                     Kane ROE
## 94396                                                   PALM BEACH
## 94403                                               Davis District
## 94460                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 94467                                        West Central CUSD 235
## 94468                              WEST CENTRAL EDUCATION DISTRICT
## 94501                                               Davis District
## 94534                                              Tintic District
## 94535                                              Tintic District
## 94696                                               Weber District
## 94701                             INTERMEDIATE SCHOOL DISTRICT 917
## 94719                                           Salt Lake District
## 94738                                              Jordan District
## 94742                                 Hillsborough City Elementary
## 94782                                              Jordan District
## 94783                                              Jordan District
## 94784                                              Jordan District
## 94790                                             Granite District
## 94798                                             Granite District
## 94800                              Lake Central School Corporation
## 94948                                                 WEST OSO ISD
## 94976 American Charter Schools Foundation d.b.a. West Phoenix High
## 94997                                               Davis District
## 95001                                               Davis District
## 95007                                         FAIRFAX CO PBLC SCHS
## 95064                                              Tooele District
## 95100                                NEWARK PUBLIC SCHOOL DISTRICT
## 95109                                 Newman-Crows Landing Unified
## 95116                                West Sonoma County Union High
## 95141                                                   PALM BEACH
## 95151                             INTERMEDIATE SCHOOL DISTRICT 287
## 95176                                             Granite District
## 95198                        WV SCHOOLS FOR THE DEAF AND THE BLIND
## 95199                        WV SCHOOLS FOR THE DEAF AND THE BLIND
## 95200                        WV SCHOOLS FOR THE DEAF AND THE BLIND
## 95206                                               Weber District
## 95232                 West-MEC - Western Maricopa Education Center
## 95233                 West-MEC - Western Maricopa Education Center
## 95234                 West-MEC - Western Maricopa Education Center
## 95235                 West-MEC - Western Maricopa Education Center
## 95236                 West-MEC - Western Maricopa Education Center
## 95237                 West-MEC - Western Maricopa Education Center
## 95238                 West-MEC - Western Maricopa Education Center
## 95240                 West-MEC - Western Maricopa Education Center
## 95241                 West-MEC - Western Maricopa Education Center
## 95242                 West-MEC - Western Maricopa Education Center
## 95243                 West-MEC - Western Maricopa Education Center
## 95244                 West-MEC - Western Maricopa Education Center
## 95245                 West-MEC - Western Maricopa Education Center
## 95246                 West-MEC - Western Maricopa Education Center
## 95247                 West-MEC - Western Maricopa Education Center
## 95248                 West-MEC - Western Maricopa Education Center
## 95249                 West-MEC - Western Maricopa Education Center
## 95250                 West-MEC - Western Maricopa Education Center
## 95251                 West-MEC - Western Maricopa Education Center
## 95252                 West-MEC - Western Maricopa Education Center
## 95254                 West-MEC - Western Maricopa Education Center
## 95255                 West-MEC - Western Maricopa Education Center
## 95256                 West-MEC - Western Maricopa Education Center
## 95257                 West-MEC - Western Maricopa Education Center
## 95258                 West-MEC - Western Maricopa Education Center
## 95259                 West-MEC - Western Maricopa Education Center
## 95261                 West-MEC - Western Maricopa Education Center
## 95262                 West-MEC - Western Maricopa Education Center
## 95263                 West-MEC - Western Maricopa Education Center
## 95264                 West-MEC - Western Maricopa Education Center
## 95265                 West-MEC - Western Maricopa Education Center
## 95266                 West-MEC - Western Maricopa Education Center
## 95267                 West-MEC - Western Maricopa Education Center
## 95268                 West-MEC - Western Maricopa Education Center
## 95269                 West-MEC - Western Maricopa Education Center
## 95270                 West-MEC - Western Maricopa Education Center
## 95271                 West-MEC - Western Maricopa Education Center
## 95272                 West-MEC - Western Maricopa Education Center
## 95273                 West-MEC - Western Maricopa Education Center
## 95275                 West-MEC - Western Maricopa Education Center
## 95276                 West-MEC - Western Maricopa Education Center
## 95277                 West-MEC - Western Maricopa Education Center
## 95278                 West-MEC - Western Maricopa Education Center
## 95279                 West-MEC - Western Maricopa Education Center
## 95303                                             Granite District
## 95335                                      East Baton Rouge Parish
## 95343                                                     Westerly
## 95401                                             Granite District
## 95413                                    DEPARTMENT OF CORRECTIONS
## 95417                                               NM CORRECTIONS
## 95429                                    DEPARTMENT OF CORRECTIONS
## 95430                                    DEPARTMENT OF CORRECTIONS
## 95442               Western School of Science and Technology  Inc.
## 95444                                              Rocklin Unified
## 95446                                              WESTERN ST HOSP
## 95486                                              Alpine District
## 95534                                              Alpine District
## 95549                                              Jordan District
## 95550                                               Cholla Academy
## 95551                                               Cholla Academy
## 95593                                              Alpine District
## 95670                                               Provo District
## 95748                                                Nebo District
## 95752                                              Jordan District
## 95806                                           Woodstock CUSD 200
## 95886                                        WETZEL COUNTY SCHOOLS
## 95930                                         Wheatland Union High
## 96039                                       Cedar Unified District
## 96120                                               Cache District
## 96180                                               Newark Unified
## 96209                                            San Juan District
## 96241                                               Davis District
## 96369                                             Waukegan CUSD 60
## 96399                                     Whittier City Elementary
## 96408                                           Salt Lake District
## 96409                                             Granite District
## 96426                                              BURKBURNETT ISD
## 96450                               Wicomico County Public Schools
## 96498                                                Wilcox County
## 96502                                           Springfield SD 186
## 96541                                                Chico Unified
## 96544                                                       NASSAU
## 96572                                                      ALACHUA
## 96689                                           Box Elder District
## 96726                                            Norris Elementary
## 96834                                                         DADE
## 96927                                             Granite District
## 96945                                        WIlliam (R) Rouse ROP
## 97010                                             Glendora Unified
## 97070                                       Williamsfield CUSD 210
## 97071                                       Williamsfield CUSD 210
## 97072                                       Williamsfield CUSD 210
## 97073                                             LIBERTY HILL ISD
## 97074                                                  LEANDER ISD
## 97075                             Williamson Co Spec Educ District
## 97078                                                  JARRELL ISD
## 97080                                                   TAYLOR ISD
## 97084                                                    HUTTO ISD
## 97085                                               ROUND ROCK ISD
## 97087                                                  LEANDER ISD
## 97091                                               ROUND ROCK ISD
## 97159                                              Willits Unified
## 97166                               WILLMAR PUBLIC SCHOOL DISTRICT
## 97181                                             Canyons District
## 97187                            Painted Pony Ranch Charter School
## 97220                                Willow Grove Union Elementary
## 97244                                              Tooele District
## 97255                                             Canyons District
## 97258                                               Winnetka SD 36
## 97267                                              Alpine District
## 97335                                              FLORESVILLE ISD
## 97338                                                LA VERNIA ISD
## 97339                                                STOCKDALE ISD
## 97452                                                Nebo District
## 97453                                          Logan City District
## 97541                                      Windham School District
## 97546                                      Windham School District
## 97564                                               Davis District
## 97614                                              Alpine District
## 97769                                              Winship-Robbins
## 97803                                               Winston County
## 97824                                         Winter Sports School
## 97879                                                        PASCO
## 97908                                            WISE CO PBLC SCHS
## 97909                                            WISE CO PBLC SCHS
## 97960                                              Rockford SD 205
## 98030                             SOUTHERN MN EDUCATION CONSORTIUM
## 98031                                    DEPARTMENT OF CORRECTIONS
## 98032                                    DEPARTMENT OF CORRECTIONS
## 98034                                    DEPARTMENT OF CORRECTIONS
## 98051                                          WOOD COUNTY SCHOOLS
## 98063                                            Northbrook ESD 27
## 98197                                                Joliet PSD 86
## 98206                                             Woodland CCSD 50
## 98261                                             Woodland CCSD 50
## 98267                                             Woodland CCSD 50
## 98288                                             Woodland CCSD 50
## 98299                                        Sonoma Valley Unified
## 98309                                      Woodlands School Agency
## 98310                                 Woodlands School East Agency
## 98359                             Eatontown Public School District
## 98435                                   WILSON WORKFORCE AND REHAB
## 98437                                             Granite District
## 98450                                          Logan City District
## 98454                                               Davis District
## 98455                                               Davis District
## 98471                               NEW HORIZONS CAREER & TECH CTR
## 98485                      Woodside Juvenile Rehabilitation Center
## 98506                                           Woodstock CUSD 200
## 98511                                           Woodstock CUSD 200
## 98512                                             Granite District
## 98617                                                 Worth SD 127
## 98619                                                 Worth SD 127
## 98627                           WORTHINGTON PUBLIC SCHOOL DISTRICT
## 98628                           WORTHINGTON PUBLIC SCHOOL DISTRICT
## 98644                                                 Worth SD 127
## 98645                                                 Worth SD 127
## 98693                                      WRIGHT TECHNICAL CENTER
## 98711                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 98787                                       WYOMING COUNTY SCHOOLS
## 98807                                           WYTHE CO PBLC SCHS
## 98885                                       City of Chicago SD 299
## 98886                                       City of Chicago SD 299
## 98887                                       City of Chicago SD 299
## 98888                                       City of Chicago SD 299
## 98889                                       City of Chicago SD 299
## 98890                                       City of Chicago SD 299
## 98891                                       City of Chicago SD 299
## 98892                                       City of Chicago SD 299
## 98893                                       City of Chicago SD 299
## 98894                                       City of Chicago SD 299
## 98895                                       City of Chicago SD 299
## 98897                                       City of Chicago SD 299
## 98898                                       City of Chicago SD 299
## 98899                                       City of Chicago SD 299
## 98901                                       City of Chicago SD 299
## 98902                                       City of Chicago SD 299
## 98903                                       City of Chicago SD 299
## 98904                                       City of Chicago SD 299
## 98905                                           Grundy/Kendall ROE
## 98965                                              Yolo County ROP
## 99046                                                 Yosemite ROP
## 99047                             Bass Lake Joint Union Elementary
## 99056                                             Township HSD 214
## 99070                                           Box Elder District
## 99073                                                  HOUSTON ISD
## 99074                                             SOUTHWEST SCHOOL
## 99085                  Young Scholars Academy Charter School Corp.
## 99086                                                  HOUSTON ISD
## 99129                                             Granite District
## 99148             Tucson Youth Development/ACE Charter High School
## 99149              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 99170                           Alameda County Office of Education
## 99174                                            Yuba City Unified
## 99175                              Yuba County Office of Education
## 99176                              Yuba County Office of Education
## 99181                               Yucaipa-Calimesa Joint Unified
## 99203                                     Yuma Elementary District
## 99265                                   DIVISION OF YOUTH SERVICES
## 99294                                                        PASCO
## 99333                                    ZUMBRO EDUCATION DISTRICT
##                   County_Name COUNTY.ID Urban.centric.Locale Latitude
## 3               Carver County     27019     21-Suburb: Large 44.84528
## 4               Carver County     27019     21-Suburb: Large 44.84161
## 108               Lake County     17097     21-Suburb: Large 42.32605
## 129               Will County     17197     21-Suburb: Large 41.53138
## 133            Ventura County      6111     21-Suburb: Large 34.44835
## 163            Lincoln Parish     22061     32-Town: Distant 32.52588
## 177         Washington County     51191     23-Suburb: Small 36.69671
## 209           Maricopa County      4013       11-City: Large 33.64847
## 210           Maricopa County      4013       11-City: Large 33.38188
## 212           Muscogee County     13215     41-Rural: Fringe 32.52715
## 263               Hale County     48189      33-Town: Remote 34.19360
## 283           Plymouth County     25023     21-Suburb: Large 42.11829
## 397         Miami-Dade County     12086     21-Suburb: Large 25.71313
## 398         Miami-Dade County     12086     21-Suburb: Large 25.58766
## 399         Miami-Dade County     12086     21-Suburb: Large 25.74236
## 400         Miami-Dade County     12086     21-Suburb: Large 25.71313
## 404       Chesterfield County     51041     21-Suburb: Large 37.40821
## 406               Pima County      4019       11-City: Large 32.26228
## 407               Pima County      4019       11-City: Large 32.27782
## 413            Henrico County     51087     21-Suburb: Large 37.66158
## 421               Pima County      4019       11-City: Large 32.28005
## 422               Pima County      4019     21-Suburb: Large 32.13023
## 427     San Bernardino County      6071     21-Suburb: Large 34.53330
## 432             Morris County     34027     21-Suburb: Large 40.89553
## 446             Morris County     34027     41-Rural: Fringe 41.01667
## 455             Morris County     34027     21-Suburb: Large 40.99771
## 457          Salt Lake County     49035     21-Suburb: Large 40.64661
## 458             Morris County     34027     21-Suburb: Large 40.89026
## 496             Mohave County      4015      33-Town: Remote 34.98319
## 497             Washoe County     32031    12-City: Mid-size 39.51254
## 499            Raleigh County     54081       13-City: Small 37.79534
## 506            Loudoun County     51107     41-Rural: Fringe 39.13212
## 508           Maricopa County      4013       11-City: Large 33.45342
## 516               Pima County      4019       11-City: Large 32.27178
## 517           Maricopa County      4013       11-City: Large 33.50852
## 518           Maricopa County      4013       11-City: Large 33.48524
## 535               Pima County      4019       11-City: Large 32.24373
## 536               Pima County      4019       11-City: Large 32.20590
## 537               Pima County      4019       11-City: Large 32.20598
## 544          Salt Lake County     49035     21-Suburb: Large 40.67029
## 545     San Bernardino County      6071    12-City: Mid-size 34.47344
## 546             Marion County     54049     32-Town: Distant 39.44825
## 552           Maricopa County      4013       11-City: Large 33.42353
## 574           Maricopa County      4013       11-City: Large 33.58194
## 575               Pima County      4019     41-Rural: Fringe 32.30300
## 579             Mobile County      1097    12-City: Mid-size 30.66802
## 584         Washington County     27163     21-Suburb: Large 44.81839
## 591           Maricopa County      4013       11-City: Large 33.49578
## 637              Butte County      6007      31-Town: Fringe 39.76041
## 661            Fairfax County     51059     21-Suburb: Large 38.76375
## 680            Yavapai County      4025     23-Suburb: Small 34.59951
## 681            Yavapai County      4025     23-Suburb: Small 34.59961
## 688          Champaign County     17019       13-City: Small 40.12681
## 717          San Diego County      6073     21-Suburb: Large 33.03115
## 803              Davis County     49011     21-Suburb: Large 41.09494
## 805              Cache County     49005       13-City: Small 41.74139
## 807           Maricopa County      4013       11-City: Large 33.69528
## 849              Davis County     49011     21-Suburb: Large 40.85001
## 875               Lake County     17097     21-Suburb: Large 42.19967
## 898           Maricopa County      4013       11-City: Large 33.70220
## 899          Jefferson County      1073    12-City: Mid-size 33.51971
## 915             Danville city     51590     32-Town: Distant 36.58843
## 919          Middlesex County     34023     21-Suburb: Large 40.58997
## 924               Elko County     32007      33-Town: Remote 40.84223
## 925          Lafayette County     12067     43-Rural: Remote 30.05519
## 929             Martin County     12085      31-Town: Fringe 27.02075
## 930            Henrico County     51087     21-Suburb: Large 37.54413
## 932            Alachua County     12001    12-City: Mid-size 29.65260
## 933             Martin County     12085     21-Suburb: Large 27.16951
## 936       Virginia Beach city     51810       11-City: Large 36.84404
## 937              Pasco County     12101     23-Suburb: Small 28.36995
## 938              Pasco County     12101     21-Suburb: Large 28.27125
## 942         Palm Beach County     12099     21-Suburb: Large 26.64219
## 943            Wakulla County     12129     32-Town: Distant 30.17698
## 950            Henrico County     51087     21-Suburb: Large 37.63334
## 951            Henrico County     51087     21-Suburb: Large 37.53875
## 952          Worcester County     25027  22-Suburb: Mid-size 42.59724
## 959       Virginia Beach city     51810       11-City: Large 36.78680
## 969               Pima County      4019       11-City: Large 32.24369
## 1028          Maricopa County      4013     43-Rural: Remote 33.93830
## 1072          Maricopa County      4013       11-City: Large 33.40192
## 1105             Pinal County      4021    42-Rural: Distant 33.03141
## 1106             Pinal County      4021    42-Rural: Distant 33.03141
## 1139          Maricopa County      4013       11-City: Large 33.33329
## 1140          Maricopa County      4013     21-Suburb: Large 33.23340
## 1141             Pinal County      4021     21-Suburb: Large 33.19418
## 1144           Alachua County     12001    12-City: Mid-size 29.68022
## 1145           Alachua County     12001    12-City: Mid-size 29.68002
## 1150           Alachua County     12001    12-City: Mid-size 29.68301
## 1151           Alachua County     12001    12-City: Mid-size 29.65264
## 1160           Alameda County      6001     21-Suburb: Large 37.77920
## 1163           Alameda County      6001    12-City: Mid-size 37.65848
## 1247           Clinton County     17027    42-Rural: Distant 38.54510
## 1252        Burlington County     34005     21-Suburb: Large 40.15992
## 1290          San Juan County     49037      33-Town: Remote 37.63285
## 1318         Salt Lake County     49035     21-Suburb: Large 40.58676
## 1335           Fairfax County     51059     21-Suburb: Large 38.76426
## 1336           Fairfax County     51059     21-Suburb: Large 38.78385
## 1337           Fairfax County     51059     21-Suburb: Large 38.81504
## 1338           Fairfax County     51059     21-Suburb: Large 38.83727
## 1345          Hennepin County     27053       11-City: Large 44.99904
## 1347          Hennepin County     27053     21-Suburb: Large 45.08796
## 1358          Hennepin County     27053     21-Suburb: Large 45.08796
## 1431            Harris County     48201       11-City: Large 29.75884
## 1470           Johnson County     19103     41-Rural: Fringe 41.62198
## 1506             Anoka County     27003     21-Suburb: Large 45.20893
## 1557              Cole County     29051       13-City: Small 38.59254
## 1633            Harris County     48201       11-City: Large 29.68441
## 1656          Maricopa County      4013       11-City: Large 33.52337
## 1660         San Diego County      6073    42-Rural: Distant 33.27871
## 1661         San Diego County      6073    42-Rural: Distant 33.27871
## 1692             Allen County     18003       11-City: Large 41.10370
## 1693             Allen County     18003       11-City: Large 41.18921
## 1738        Lauderdale County      1077     41-Rural: Fringe 34.86064
## 1766            Blount County      1009     32-Town: Distant 33.90548
## 1837           Alameda County      6001     21-Suburb: Large 37.70809
## 1844            Plumas County      6063     43-Rural: Remote 40.30907
## 1853   San Luis Obispo County      6079    42-Rural: Distant 35.75748
## 1857        Cumberland County     34011       13-City: Small 39.49783
## 1877              Cook County     17031     21-Suburb: Large 41.89010
## 1902           Broward County     12011     21-Suburb: Large 26.26470
## 1906            Alpine County      6003    42-Rural: Distant 38.76656
## 1907            Alpine County      6003    42-Rural: Distant 38.81001
## 1921              Utah County     49049     21-Suburb: Large 40.38840
## 1922              Utah County     49049     21-Suburb: Large 40.45676
## 1932          Buchanan County     29021       13-City: Small 39.77602
## 1940         Salt Lake County     49035     21-Suburb: Large 40.54953
## 1952         Salt Lake County     49035     21-Suburb: Large 40.56365
## 1971              Pima County      4019       11-City: Large 32.16085
## 1972    San Bernardino County      6071     21-Suburb: Large 34.46878
## 1974    San Bernardino County      6071    12-City: Mid-size 34.10126
## 1987          Duchesne County     49013     43-Rural: Remote 40.36020
## 1989          Duchesne County     49013     43-Rural: Remote 40.36019
## 1992         Salt Lake County     49035     21-Suburb: Large 40.55106
## 2008        Montgomery County     51121       13-City: Small 37.13210
## 2014              Pima County      4019       11-City: Large 32.24576
## 2016            Greene County     51079      31-Town: Fringe 38.29359
## 2017       Mecklenburg County     51117    42-Rural: Distant 36.66467
## 2020          Fauquier County     51061    42-Rural: Distant 38.62387
## 2027              Lake County     12069     21-Suburb: Large 28.53889
## 2034           Wakulla County     12129     32-Town: Distant 30.17628
## 2036              Pike County      1109      33-Town: Remote 31.81303
## 2038           Russell County      1113    42-Rural: Distant 32.31697
## 2054        Montgomery County     24031       13-City: Small 39.09507
## 2057            Wilson County     48493     41-Rural: Fringe 29.15300
## 2060            Barrow County     13013      31-Town: Fringe 33.93115
## 2061            DeKalb County      1049     32-Town: Distant 34.46020
## 2067           Alameda County      6001       11-City: Large 37.76434
## 2160            Washoe County     32031     21-Suburb: Large 39.65302
## 2162            Amador County      6005     32-Town: Distant 38.35252
## 2163            Amador County      6005     32-Town: Distant 38.35257
## 2194            Fresno County      6019       11-City: Large 36.72732
## 2195            Fresno County      6019       11-City: Large 36.73793
## 2210               Lee County     17103    42-Rural: Distant 41.71731
## 2212               Lee County     17103    42-Rural: Distant 41.71995
## 2213               Lee County     17103    42-Rural: Distant 41.71302
## 2219          Maricopa County      4013     41-Rural: Fringe 33.86472
## 2230              Utah County     49049    12-City: Mid-size 40.23053
## 2236          Nottoway County     51135    42-Rural: Distant 37.26374
## 2242         Salt Lake County     49035     41-Rural: Fringe 40.55698
## 2251              Utah County     49049     21-Suburb: Large 40.38694
## 2252              Utah County     49049     21-Suburb: Large 40.40031
## 2253           Yavapai County      4025     32-Town: Distant 34.55968
## 2254           Yavapai County      4025     32-Town: Distant 34.73240
## 2266         Salt Lake County     49035     21-Suburb: Large 40.66310
## 2268              Utah County     49049     21-Suburb: Large 40.09668
## 2269          Maricopa County      4013     21-Suburb: Large 33.29347
## 2270          Maricopa County      4013     21-Suburb: Large 33.33115
## 2271          Maricopa County      4013     41-Rural: Fringe 33.28021
## 2272             Pinal County      4021     41-Rural: Fringe 33.22115
## 2273          Maricopa County      4013     21-Suburb: Large 33.23127
## 2274             Pinal County      4021     41-Rural: Fringe 33.07236
## 2275          Maricopa County      4013     21-Suburb: Large 33.24441
## 2279         Salt Lake County     49035     21-Suburb: Large 40.70465
## 2280         Salt Lake County     49035     21-Suburb: Large 40.51652
## 2281         Salt Lake County     49035     21-Suburb: Large 40.53424
## 2282         Salt Lake County     49035     21-Suburb: Large 40.53438
## 2283              Utah County     49049     21-Suburb: Large 40.03651
## 2284         Salt Lake County     49035     21-Suburb: Large 40.71342
## 2288        Miami-Dade County     12086     21-Suburb: Large 25.93952
## 2297          Maricopa County      4013       11-City: Large 33.50894
## 2298              Pima County      4019       11-City: Large 32.23756
## 2299              Yuma County      4027       13-City: Small 32.69006
## 2300              Yuma County      4027       13-City: Small 32.70508
## 2310             Essex County     25009     21-Suburb: Large 42.85089
## 2334          Pinellas County     12103     21-Suburb: Large 27.70548
## 2335          Okaloosa County     12091       13-City: Small 30.41073
## 2342              Leon County     12073    12-City: Mid-size 30.46676
## 2343           Alachua County     12001  22-Suburb: Mid-size 29.59987
## 2348             Duval County     12031       11-City: Large 30.28812
## 2350        Miami-Dade County     12086     21-Suburb: Large 25.91819
## 2351        Miami-Dade County     12086     21-Suburb: Large 25.73900
## 2352           Broward County     12011    12-City: Mid-size 26.08331
## 2355           Volusia County     12127       13-City: Small 29.21339
## 2440             Pasco County     12101     21-Suburb: Large 28.18190
## 2442            Camden County     34007     21-Suburb: Large 39.68230
## 2552              Lake County     17097     21-Suburb: Large 42.35503
## 2669            Mercer County     34021       13-City: Small 40.24666
## 2682           Broward County     12011     21-Suburb: Large 26.10107
## 2704            Hudson County     34017     21-Suburb: Large 40.79374
## 2720            Tooele County     49045      33-Town: Remote 40.74604
## 2724            Ramsey County     27123       11-City: Large 44.98075
## 2743      Anne Arundel County     24003     21-Suburb: Large 39.07662
## 2786           Calhoun County      1015       13-City: Small 33.70818
## 2832            Tehama County      6103     32-Town: Distant 40.18617
## 2842             Davis County     49011       13-City: Small 41.08719
## 2846       Los Angeles County      6037     21-Suburb: Large 34.55861
## 2847       Los Angeles County      6037     21-Suburb: Large 34.55736
## 2857        Greenbrier County     54025     43-Rural: Remote 37.96326
## 2886          Garfield County     49017     43-Rural: Remote 38.11750
## 2887      Contra Costa County      6013     21-Suburb: Large 37.98834
## 2888      Contra Costa County      6013     21-Suburb: Large 38.01082
## 2926           Cochise County      4003     41-Rural: Fringe 31.55394
## 2927            Graham County      4009      33-Town: Remote 32.83373
## 2928             Pinal County      4021     41-Rural: Fringe 33.02686
## 2929        Santa Cruz County      4023      33-Town: Remote 31.35531
## 2930           Yavapai County      4025       13-City: Small 34.55906
## 2931              Yuma County      4027       13-City: Small 32.67760
## 2932              Gila County      4007      33-Town: Remote 33.39457
## 2941             Pinal County      4021     21-Suburb: Large 33.39155
## 2943             Pinal County      4021     21-Suburb: Large 33.41450
## 3000          Monterey County      6053    42-Rural: Distant 36.27501
## 3009    San Bernardino County      6071     21-Suburb: Large 34.47983
## 3049          Petersburg city     51730     21-Suburb: Large 37.22558
## 3129            Marion County     12083       13-City: Small 29.17282
## 3130           Broward County     12011     21-Suburb: Large 26.18790
## 3155         Salt Lake County     49035     21-Suburb: Large 40.66321
## 3274          Maricopa County      4013       11-City: Large 33.48084
## 3275          Maricopa County      4013       11-City: Large 33.39090
## 3276           Yavapai County      4025     23-Suburb: Small 34.59790
## 3277          Maricopa County      4013       11-City: Large 33.45539
## 3278          Maricopa County      4013  22-Suburb: Mid-size 33.48575
## 3279          Maricopa County      4013       11-City: Large 33.50089
## 3280          Maricopa County      4013       11-City: Large 33.49418
## 3281          Maricopa County      4013       11-City: Large 33.45648
## 3282          Maricopa County      4013     21-Suburb: Large 33.62986
## 3284              Pima County      4019       11-City: Large 32.22113
## 3287          Maricopa County      4013       11-City: Large 33.48595
## 3288          Maricopa County      4013     41-Rural: Fringe 33.27702
## 3289          Maricopa County      4013       11-City: Large 33.63705
## 3290          Maricopa County      4013       11-City: Large 33.63644
## 3291          Maricopa County      4013       11-City: Large 33.63730
## 3295          Maricopa County      4013       11-City: Large 33.47632
## 3296           Yavapai County      4025     32-Town: Distant 34.74070
## 3297          Maricopa County      4013       11-City: Large 33.61997
## 3299          Maricopa County      4013       11-City: Large 33.49530
## 3300          Maricopa County      4013       11-City: Large 33.46444
## 3301          Maricopa County      4013       11-City: Large 33.47639
## 3330       St. Bernard Parish     22087     21-Suburb: Large 29.95845
## 3512        Washington County     49053     23-Suburb: Small 37.11803
## 3544              Utah County     49049     21-Suburb: Large 40.16772
## 3613          Maricopa County      4013       11-City: Large 33.42396
## 3646    San Bernardino County      6071    12-City: Mid-size 34.15559
## 3666             Davis County     49011     21-Suburb: Large 40.97969
## 3667              Utah County     49049     21-Suburb: Large 40.39777
## 3668         Salt Lake County     49035     21-Suburb: Large 40.60294
## 3673          Maricopa County      4013       11-City: Large 33.55003
## 3674              Pima County      4019       11-City: Large 32.23596
## 3675              Pima County      4019       11-City: Large 32.23596
## 3763         San Diego County      6073       11-City: Large 32.95623
## 3770            Uintah County     49047      33-Town: Remote 40.45983
## 3771            Uintah County     49047     41-Rural: Fringe 40.46372
## 3772            Sevier County     49041      33-Town: Remote 38.76904
## 3780               Lee County     17103    42-Rural: Distant 41.83804
## 3781               Lee County     17103    42-Rural: Distant 41.86586
## 3782               Lee County     17103    42-Rural: Distant 41.83956
## 3791              Cook County     17031       11-City: Large 41.98319
## 3796             Pinal County      4021      31-Town: Fringe 33.03898
## 3797              Pima County      4019     41-Rural: Fringe 32.41775
## 3798          Maricopa County      4013       11-City: Large 33.43255
## 3799           Cochise County      4003    42-Rural: Distant 31.46073
## 3800            Graham County      4009    42-Rural: Distant 32.83042
## 3801             Pinal County      4021     41-Rural: Fringe 33.03410
## 3802             Pinal County      4021      31-Town: Fringe 33.03068
## 3803              Gila County      4007    42-Rural: Distant 33.41671
## 3804            Navajo County      4017      33-Town: Remote 34.98474
## 3825              Utah County     49049       13-City: Small 40.33182
## 3834              Cook County     17031       11-City: Large 41.93770
## 3835              Cook County     17031       11-City: Large 41.96628
## 3837        Miami-Dade County     12086     21-Suburb: Large 25.89742
## 3841            Richmond city     51760    12-City: Mid-size 37.57908
## 3898       Los Angeles County      6037     21-Suburb: Large 34.66733
## 3914             Pinal County      4021     41-Rural: Fringe 32.88062
## 3915          Maricopa County      4013       11-City: Large 33.45350
## 3916          Maricopa County      4013    12-City: Mid-size 33.42297
## 3917          Maricopa County      4013    12-City: Mid-size 33.36534
## 3918          Maricopa County      4013       11-City: Large 33.45380
## 3919          Maricopa County      4013       11-City: Large 33.45408
## 3920          Maricopa County      4013       11-City: Large 33.30867
## 3921          Maricopa County      4013       11-City: Large 33.30519
## 3922          Maricopa County      4013       11-City: Large 33.30872
## 3931          Atascosa County     48013     32-Town: Distant 28.92054
## 3934          Atascosa County     48013     32-Town: Distant 28.92051
## 3953              Utah County     49049     21-Suburb: Large 40.37025
## 3986           Stearns County     27145     41-Rural: Fringe 45.51656
## 3987         Salt Lake County     49035     21-Suburb: Large 40.52647
## 4006        Sacramento County      6067       13-City: Small 38.63155
## 4034          Atlantic County     34001     41-Rural: Fringe 39.53658
## 4042        Palm Beach County     12099       13-City: Small 26.46258
## 4051          Atlantic County     34001  22-Suburb: Mid-size 39.42053
## 4053          Atlantic County     34001  22-Suburb: Mid-size 39.42045
## 4196          Richmond County     13245    12-City: Mid-size 33.39154
## 4204              Yuma County      4027    42-Rural: Distant 32.69172
## 4283            Travis County     48453       11-City: Large 30.27207
## 4308           Autauga County      1001     21-Suburb: Large 32.45506
## 4309           Autauga County      1001     41-Rural: Fringe 32.50063
## 4332             Pinal County      4021     21-Suburb: Large 33.40507
## 4384       Los Angeles County      6037     21-Suburb: Large 34.19198
## 4472          McLennan County     48309    42-Rural: Distant 31.30622
## 4497          Maricopa County      4013     21-Suburb: Large 33.33866
## 4513              Yuma County      4027       13-City: Small 32.67782
## 4514       Doña Ana County     35013     41-Rural: Fringe 32.26805
## 4534         Vermilion County     17183     41-Rural: Fringe 40.26311
## 4547           Jackson County     29095       11-City: Large 39.07658
## 4557  East Baton Rouge Parish     22033    12-City: Mid-size 30.44015
## 4576         Jefferson County     12065    42-Rural: Distant 30.49090
## 4592         Salt Lake County     49035    12-City: Mid-size 40.78204
## 4622          Accomack County     51001    42-Rural: Distant 37.92526
## 4623          Accomack County     51001     43-Rural: Remote 37.67916
## 4626         Mendocino County      6045      33-Town: Remote 39.40055
## 4635        Clearwater County     27029     43-Rural: Remote 47.52347
## 4644            Washoe County     32031    12-City: Mid-size 39.49455
## 4690             Baker County     12003     32-Town: Distant 30.27778
## 4695             Baker County     12003     32-Town: Distant 30.27691
## 4727             Baker County     12003     32-Town: Distant 30.27694
## 4728             Baker County     12003     32-Town: Distant 30.27691
## 4800    San Bernardino County      6071    12-City: Mid-size 34.04615
## 4807          Maricopa County      4013     21-Suburb: Large 33.27526
## 4948              Cook County     17031       11-City: Large 41.89574
## 4949         Riverside County      6065     41-Rural: Fringe 33.91717
## 4950         Riverside County      6065     21-Suburb: Large 33.93032
## 4952         Riverside County      6065     21-Suburb: Large 33.92763
## 5054            Cabell County     54011     41-Rural: Fringe 38.38908
## 5128            Marion County     54049     32-Town: Distant 39.50113
## 5137              Utah County     49049     21-Suburb: Large 40.04921
## 5164         San Diego County      6073     41-Rural: Fringe 32.94228
## 5174              Utah County     49049     21-Suburb: Large 40.38043
## 5189          Plymouth County     25023     21-Suburb: Large 42.08955
## 5305          Maricopa County      4013       11-City: Large 33.35420
## 5306          Maricopa County      4013     21-Suburb: Large 33.23558
## 5307          Maricopa County      4013     21-Suburb: Large 33.30700
## 5308          Maricopa County      4013     21-Suburb: Large 33.23460
## 5310          Coconino County      4005       13-City: Small 35.20770
## 5311          Maricopa County      4013  22-Suburb: Mid-size 33.43980
## 5312          Maricopa County      4013  22-Suburb: Mid-size 33.43980
## 5313          Maricopa County      4013     41-Rural: Fringe 33.32485
## 5314              Pima County      4019     21-Suburb: Large 32.40944
## 5315              Pima County      4019     21-Suburb: Large 32.40944
## 5316          Maricopa County      4013     21-Suburb: Large 33.71940
## 5317          Maricopa County      4013     21-Suburb: Large 33.71948
## 5318          Maricopa County      4013       11-City: Large 33.59384
## 5319          Maricopa County      4013       11-City: Large 33.49202
## 5320          Maricopa County      4013       11-City: Large 33.59378
## 5321          Maricopa County      4013       11-City: Large 33.39484
## 5322           Yavapai County      4025     41-Rural: Fringe 34.58979
## 5323             Bexar County     48029       11-City: Large 29.52054
## 5324             Bexar County     48029       11-City: Large 29.52704
## 5325             Bexar County     48029     21-Suburb: Large 29.53421
## 5326          Maricopa County      4013    12-City: Mid-size 33.58160
## 5327          Maricopa County      4013    12-City: Mid-size 33.59239
## 5328              Pima County      4019       11-City: Large 32.27284
## 5329              Pima County      4019       11-City: Large 32.23486
## 5347         Salt Lake County     49035     21-Suburb: Large 40.52708
## 5348           Bastrop County     48021      31-Town: Fringe 30.34785
## 5375             Weber County     49057     21-Suburb: Large 41.31828
## 5457           Broward County     12011     21-Suburb: Large 26.07814
## 5532               Bay County     12005       13-City: Small 30.17603
## 5533               Bay County     12005       13-City: Small 30.17603
## 5534               Bay County     12005       13-City: Small 30.17603
## 5588         San Diego County      6073     21-Suburb: Large 33.13765
## 5623         Baltimore County     24005       13-City: Small 39.39944
## 5670         Salt Lake County     49035    12-City: Mid-size 40.73023
## 5672           Collier County     12021     21-Suburb: Large 26.14108
## 5735             Cache County     49005       13-City: Small 41.73027
## 5737         Box Elder County     49003     32-Town: Distant 41.72403
## 5738         Box Elder County     49003     32-Town: Distant 41.72522
## 5803         Riverside County      6065     21-Suburb: Large 33.96081
## 5809          Plymouth County     25023     21-Suburb: Large 42.11881
## 5825            Beaver County     49001      33-Town: Remote 38.27490
## 5829            Ramsey County     27123     21-Suburb: Large 44.97326
## 5834            Beaver County     49001      33-Town: Remote 38.27803
## 5873           Raleigh County     54081     41-Rural: Fringe 37.82514
## 5885           Bedford County     51019     32-Town: Distant 37.32720
## 5908           Bedford County     51019     32-Town: Distant 37.32695
## 5937            Marion County     18097     21-Suburb: Large 39.71140
## 5967         Salt Lake County     49035     21-Suburb: Large 40.64866
## 5968         Salt Lake County     49035     21-Suburb: Large 40.57773
## 5989            Bureau County     17011    42-Rural: Distant 41.42457
## 6059            Beaver County     49001      33-Town: Remote 38.28135
## 6075              Bell County     48027    42-Rural: Distant 30.92921
## 6114         Salt Lake County     49035     21-Suburb: Large 40.57399
## 6122          Maricopa County      4013    12-City: Mid-size 33.78853
## 6131         Salt Lake County     49035     21-Suburb: Large 40.62530
## 6152            Sumter County      1119     43-Rural: Remote 32.61309
## 6156             Henry County     17073     32-Town: Distant 41.24857
## 6184             Scott County     27139     32-Town: Distant 44.62159
## 6263   San Luis Obispo County      6079     41-Rural: Fringe 35.19295
## 6397          Beltrami County     27007     41-Rural: Fringe 47.47007
## 6416           Kanawha County     54039  22-Suburb: Mid-size 38.36785
## 6426        Miami-Dade County     12086       13-City: Small 25.66557
## 6428           Broward County     12011     21-Suburb: Large 26.01000
## 6441             Weber County     49057       13-City: Small 41.24865
## 6456              Kane County     17089     21-Suburb: Large 41.78283
## 6463          Maricopa County      4013       11-City: Large 33.61989
## 6506     Santa Barbara County      6083     41-Rural: Fringe 34.86661
## 6508          Maricopa County      4013     41-Rural: Fringe 33.25971
## 6509          Maricopa County      4013     21-Suburb: Large 33.33619
## 6510          Maricopa County      4013     21-Suburb: Large 33.24052
## 6531          Maricopa County      4013     21-Suburb: Large 33.27976
## 6541          Sangamon County     17167    12-City: Mid-size 39.77335
## 6574          Maricopa County      4013       11-City: Large 33.52512
## 6575          Maricopa County      4013       11-City: Large 33.56718
## 6616         Salt Lake County     49035     21-Suburb: Large 40.64113
## 6617         Salt Lake County     49035     21-Suburb: Large 40.64686
## 6684            Benton County     27009  22-Suburb: Mid-size 45.58679
## 6685           Stearns County     27145  22-Suburb: Mid-size 45.61611
## 6687            Benton County     27009  22-Suburb: Mid-size 45.58696
## 6710           Cochise County      4003       13-City: Small 31.56688
## 6723            Bergen County     34003     21-Suburb: Large 40.95576
## 6729            Bergen County     34003     21-Suburb: Large 40.95512
## 6753           Alameda County      6001    12-City: Mid-size 37.86966
## 6872       Santa Clara County      6085       11-City: Large 37.40271
## 6933         Jefferson County      1073     21-Suburb: Large 33.37089
## 6965         St. Louis County     27137       13-City: Small 46.84935
## 7127             Bexar County     48029       11-City: Large 29.43681
## 7128             Bexar County     48029       11-City: Large 29.43681
## 7129             Bexar County     48029       11-City: Large 29.43681
## 7130             Bexar County     48029     21-Suburb: Large 29.49245
## 7135             Bexar County     48029       11-City: Large 29.43681
## 7146              Bibb County      1007    42-Rural: Distant 33.05182
## 7166             Glenn County      6021     43-Rural: Remote 39.60696
## 7200          Humboldt County      6023     43-Rural: Remote 41.15741
## 7211            Fresno County      6019       11-City: Large 36.73049
## 7213          Hennepin County     27053     21-Suburb: Large 45.06321
## 7214            Monroe County     12087     41-Rural: Fringe 24.66874
## 7252          Monterey County      6053  22-Suburb: Mid-size 36.61135
## 7263              Kane County     49025     43-Rural: Remote 37.08552
## 7264              Kane County     49025     43-Rural: Remote 37.08554
## 7280             Butte County      6007    42-Rural: Distant 39.41531
## 7296          McLennan County     48309    12-City: Mid-size 31.60153
## 7338         Salt Lake County     49035     21-Suburb: Large 40.56342
## 7351             Cache County     49005     23-Suburb: Small 41.84184
## 7424            Ramsey County     27123     21-Suburb: Large 45.06579
## 7430             Duval County     12031       11-City: Large 30.43323
## 7470        San Benito County      6069     43-Rural: Remote 36.37666
## 7498          Sangamon County     17167    12-City: Mid-size 39.77231
## 7522              Utah County     49049     21-Suburb: Large 40.38155
## 7523           Jackson County     55053    42-Rural: Distant 44.35789
## 7576         Salt Lake County     49035     21-Suburb: Large 40.49421
## 7588         Tom Green County     48451    12-City: Mid-size 31.47885
## 7659              Kern County      6029    42-Rural: Distant 35.70371
## 7709          San Juan County     49037      33-Town: Remote 37.62111
## 7752         Salt Lake County     49035     21-Suburb: Large 40.70050
## 7753              Utah County     49049       13-City: Small 40.28918
## 7769              Cook County     17031     21-Suburb: Large 41.51478
## 7770              Cook County     17031     21-Suburb: Large 41.48446
## 7816          Hennepin County     27053       13-City: Small 44.84290
## 7825        Washington County     49053       13-City: Small 37.05497
## 7828        Washington County     49053       13-City: Small 37.05159
## 7829          Hennepin County     27053       13-City: Small 44.81252
## 7836         Mendocino County      6045      33-Town: Remote 39.39926
## 7839       Santa Clara County      6085     21-Suburb: Large 37.23435
## 7843            Blount County      1009    42-Rural: Distant 33.99149
## 7844            Blount County      1009    42-Rural: Distant 33.99294
## 7900            Tooele County     49045     41-Rural: Fringe 40.52622
## 7922          Fluvanna County     51065    42-Rural: Distant 37.87394
## 7931         Albemarle County     51003     23-Suburb: Small 38.00531
## 7963            Mercer County     54055     32-Town: Distant 37.25183
## 7976          Maricopa County      4013     21-Suburb: Large 33.31510
## 7995             Davis County     49011     21-Suburb: Large 41.07572
## 7996          San Juan County     49037     43-Rural: Remote 37.28400
## 8003         Salt Lake County     49035     21-Suburb: Large 40.49126
## 8030         Riverside County      6065      33-Town: Remote 33.61847
## 8046          Berkeley County     54003  22-Suburb: Mid-size 39.53200
## 8068             Floyd County     13115       13-City: Small 34.27853
## 8084        Palm Beach County     12099       13-City: Small 26.35976
## 8108          Siskiyou County      6093    42-Rural: Distant 41.92805
## 8136           Gadsden County     12039      31-Town: Fringe 30.58056
## 8173           Rapides Parish     22079       13-City: Small 31.29328
## 8252            Tooele County     49045     41-Rural: Fringe 40.63792
## 8255             Weber County     49057     21-Suburb: Large 41.17496
## 8257         Salt Lake County     49035     21-Suburb: Large 40.65459
## 8260             Weber County     49057       13-City: Small 41.25503
## 8261         Salt Lake County     49035    12-City: Mid-size 40.74433
## 8262              Utah County     49049       13-City: Small 40.32023
## 8284             Emery County     49015     43-Rural: Remote 38.99248
## 8313             Boone County     54005     41-Rural: Fringe 38.10332
## 8319             Boone County     17007     21-Suburb: Large 42.24726
## 8352            Cooper County     29053     32-Town: Distant 38.97695
## 8358            Cooper County     29053     32-Town: Distant 38.97696
## 8441         Botetourt County     51023     41-Rural: Fringe 37.50617
## 8470          Garfield County     49017     43-Rural: Remote 37.90795
## 8480             Davis County     49011     21-Suburb: Large 40.86081
## 8481           Alachua County     12001    12-City: Mid-size 29.67323
## 8485             Davis County     49011     21-Suburb: Large 40.88166
## 8486             Davis County     49011     21-Suburb: Large 40.89417
## 8487             Davis County     49011     21-Suburb: Large 40.87353
## 8604         Box Elder County     49003     21-Suburb: Large 41.50433
## 8606         Box Elder County     49003     21-Suburb: Large 41.50986
## 8663        Palm Beach County     12099     21-Suburb: Large 26.54166
## 8677          Seminole County     12117     41-Rural: Fringe 28.68469
## 8679        Miami-Dade County     12086     21-Suburb: Large 25.59544
## 8728          Bradford County     12007     32-Town: Distant 29.95158
## 8729          Bradford County     12007     32-Town: Distant 29.95182
## 8730          Bradford County     12007     32-Town: Distant 29.95158
## 8735          Maricopa County      4013  22-Suburb: Mid-size 33.43724
## 8748          Monterey County      6053    42-Rural: Distant 35.86278
## 8768           Yavapai County      4025     23-Suburb: Small 34.60053
## 8808            Dakota County     27037     21-Suburb: Large 44.89105
## 8859         Mendocino County      6045     43-Rural: Remote 39.65484
## 8902          Brazoria County     48039     41-Rural: Fringe 29.17544
## 8905          Brazoria County     48039     21-Suburb: Large 29.41939
## 8910            Brazos County     48041       13-City: Small 30.67600
## 8928             Henry County     51089     41-Rural: Fringe 36.74228
## 8942            Wilkin County     27167     32-Town: Distant 46.27063
## 9056           Brevard County     12009     21-Suburb: Large 28.32687
## 9063           Brevard County     12009     21-Suburb: Large 28.37571
## 9065           Brevard County     12009     21-Suburb: Large 28.37571
## 9066           Brevard County     12009     21-Suburb: Large 28.37571
## 9073             Bexar County     48029       11-City: Large 29.40907
## 9107           McHenry County     17111     21-Suburb: Large 42.20628
## 9201             Duval County     12031       11-City: Large 30.31195
## 9218             Cache County     49005       13-City: Small 41.75511
## 9227           Brevard County     12009     21-Suburb: Large 28.32919
## 9228           Ventura County      6111    12-City: Mid-size 34.21224
## 9239              Utah County     49049     21-Suburb: Large 40.16327
## 9271          New Kent County     51127    42-Rural: Distant 37.51591
## 9272          New Kent County     51127    42-Rural: Distant 37.51591
## 9305          Maricopa County      4013     21-Suburb: Large 33.30859
## 9327         Salt Lake County     49035     21-Suburb: Large 40.61177
## 9406            Ramsey County     27123       11-City: Large 44.96721
## 9491              Utah County     49049     21-Suburb: Large 40.11687
## 9694          Hennepin County     27053     21-Suburb: Large 45.07377
## 9787         Mendocino County      6045      33-Town: Remote 39.41223
## 9814              Utah County     49049     21-Suburb: Large 40.15964
## 9863         Salt Lake County     49035     21-Suburb: Large 40.59404
## 9878           Broward County     12011    12-City: Mid-size 26.23026
## 9879           Broward County     12011     21-Suburb: Large 26.04760
## 9880           Broward County     12011    12-City: Mid-size 26.12436
## 9885           Broward County     12011     21-Suburb: Large 26.24659
## 9886           Broward County     12011     21-Suburb: Large 26.24659
## 9887           Broward County     12011     21-Suburb: Large 25.99814
## 10043       Miami-Dade County     12086       13-City: Small 25.69832
## 10044           Carbon County     49007     43-Rural: Remote 39.55110
## 10095          Calhoun County     17013    42-Rural: Distant 38.94709
## 10096          Calhoun County     17013    42-Rural: Distant 38.94709
## 10145        Salt Lake County     49035    12-City: Mid-size 40.76837
## 10159         Garfield County     49017     43-Rural: Remote 37.62466
## 10160         Garfield County     49017     43-Rural: Remote 37.62386
## 10174        San Mateo County      6081     21-Suburb: Large 37.57617
## 10177         Buchanan County     29021       13-City: Small 39.81171
## 10178         Buchanan County     51027     43-Rural: Remote 37.29549
## 10314           Tulare County      6107     41-Rural: Fringe 36.04389
## 10330             Kern County      6029     32-Town: Distant 35.14994
## 10373            Davis County     49011     21-Suburb: Large 41.08521
## 10402         Maricopa County      4013     41-Rural: Fringe 33.45513
## 10426      Santa Clara County      6085     21-Suburb: Large 37.39625
## 10432          Bullock County      1011     32-Town: Distant 32.14286
## 10487          Alameda County      6001       11-City: Large 37.77522
## 10491            Weber County     49057     21-Suburb: Large 41.18341
## 10525         Maricopa County      4013       11-City: Large 33.39251
## 10538          Fairfax County     51059     21-Suburb: Large 38.78405
## 10565          Mineral County     54057    42-Rural: Distant 39.33682
## 10567       Burlington County     34005     41-Rural: Fringe 39.96834
## 10569       Burlington County     34005     21-Suburb: Large 39.97182
## 10591       Burlington County     34005     21-Suburb: Large 40.01398
## 10597       Burlington County     34005     21-Suburb: Large 40.01299
## 10621           Shasta County      6089      33-Town: Remote 40.87982
## 10644          Volusia County     12127     41-Rural: Fringe 28.86213
## 10650           Dakota County     27037     21-Suburb: Large 44.77242
## 10655           Dakota County     27037       13-City: Small 44.80562
## 10702              Salem city     51775  22-Suburb: Mid-size 37.27473
## 10767           Butler County      1013     32-Town: Distant 31.81501
## 10776         Sangamon County     17167    12-City: Mid-size 39.78195
## 10782            Hampton city     51650    12-City: Mid-size 37.06274
## 10789        Salt Lake County     49035     21-Suburb: Large 40.61412
## 10793        Salt Lake County     49035     21-Suburb: Large 40.62245
## 10805            Butte County      6007       13-City: Small 39.71583
## 10816      Los Angeles County      6037  22-Suburb: Mid-size 34.16694
## 10817        Salt Lake County     49035     21-Suburb: Large 40.50101
## 10823            Pinal County      4021     32-Town: Distant 33.05935
## 10928             Kane County     17089     21-Suburb: Large 41.77894
## 10937             Kane County     17089     21-Suburb: Large 41.76517
## 10938           Etowah County      1055       13-City: Small 34.00464
## 10948             Kane County     17089     21-Suburb: Large 41.74543
## 10957           Monroe County      1099     41-Rural: Fringe 31.48350
## 10962            Grand County     49019      33-Town: Remote 38.57453
## 11016        Sherburne County     27141     21-Suburb: Large 45.32108
## 11017             Utah County     49049      31-Town: Fringe 39.98209
## 11021      Los Angeles County      6037     21-Suburb: Large 33.88254
## 11030        Riverside County      6065     41-Rural: Fringe 33.90988
## 11033           Cabell County     54011  22-Suburb: Mid-size 38.40323
## 11059            Cache County     49005       13-City: Small 41.75510
## 11065            Cache County     49005     23-Suburb: Small 41.76879
## 11125        San Diego County      6073     21-Suburb: Large 32.80802
## 11156            Anoka County     27003     21-Suburb: Large 45.13914
## 11192            Essex County     25009     21-Suburb: Large 42.76102
## 11230          Calhoun County      1015       13-City: Small 33.80193
## 11231          Calhoun County      1015       13-City: Small 33.80182
## 11255          Calhoun County     12013     32-Town: Distant 30.44952
## 11256          Calhoun County     12013     32-Town: Distant 30.44952
## 11257          Calhoun County     12013     32-Town: Distant 30.44952
## 11258          Calhoun County     12013     32-Town: Distant 30.44952
## 11259          Calhoun County     54013    42-Rural: Distant 38.89936
## 11263         Maricopa County      4013     21-Suburb: Large 33.61791
## 11272   San Bernardino County      6071    12-City: Mid-size 34.06903
## 11273   San Bernardino County      6071    12-City: Mid-size 34.06903
## 11299       Sacramento County      6067       11-City: Large 38.55370
## 11300       Sacramento County      6067     21-Suburb: Large 38.40876
## 11301       Sacramento County      6067     21-Suburb: Large 38.63518
## 11302        El Dorado County      6017     21-Suburb: Large 38.66964
## 11303        San Diego County      6073    42-Rural: Distant 33.27433
## 11307          Alameda County      6001     21-Suburb: Large 37.56180
## 11308          Alameda County      6001     21-Suburb: Large 37.55976
## 11309        Riverside County      6065       11-City: Large 33.94373
## 11310      Los Angeles County      6037     21-Suburb: Large 34.13690
## 11312   San Bernardino County      6071    12-City: Mid-size 34.06902
## 11313   San Bernardino County      6071    12-City: Mid-size 34.06902
## 11314           Sonoma County      6097      31-Town: Fringe 38.51002
## 11351           Dallas County     48113       11-City: Large 32.81404
## 11405        Salt Lake County     49035     21-Suburb: Large 40.63961
## 11422          Ventura County      6111       13-City: Small 34.22646
## 11439         Maricopa County      4013       11-City: Large 33.43738
## 11440         Maricopa County      4013     21-Suburb: Large 33.24182
## 11483           Camden County     34007     21-Suburb: Large 39.78396
## 11484      Santa Clara County      6085       11-City: Large 37.26483
## 11512           Camden County     34007       13-City: Small 39.92894
## 11513           Camden County     34007       13-City: Small 39.92894
## 11514           Camden County     34007       13-City: Small 39.92894
## 11522         Maricopa County      4013     21-Suburb: Large 33.50931
## 11534             Cook County     17031       11-City: Large 41.88388
## 11535             Cook County     17031       11-City: Large 41.75226
## 11539     Contra Costa County      6013     21-Suburb: Large 37.92203
## 11541          Cameron County     48061       13-City: Small 26.16365
## 11543          Cameron County     48061       13-City: Small 26.19228
## 11544          Cameron County     48061  22-Suburb: Mid-size 26.16261
## 11546          Cameron County     48061  22-Suburb: Mid-size 26.16267
## 11547          Cameron County     48061     32-Town: Distant 26.07085
## 11551          Cameron County     48061  22-Suburb: Mid-size 26.15791
## 11582            Pinal County      4021     32-Town: Distant 33.05407
## 11589       Bernalillo County     35001     21-Suburb: Large 35.12011
## 11591        El Dorado County      6017     41-Rural: Fringe 38.73287
## 11612           Mohave County      4015      33-Town: Remote 35.03052
## 11621         Campbell County     51031     41-Rural: Fringe 37.25184
## 11683            Hampton city     51650    12-City: Mid-size 37.01993
## 11685          Brevard County     12009     21-Suburb: Large 28.48025
## 11728         Maricopa County      4013     21-Suburb: Large 33.70309
## 11869            Davis County     49011     21-Suburb: Large 40.96836
## 11872             Utah County     49049    12-City: Mid-size 40.29534
## 11876      Los Angeles County      6037     21-Suburb: Large 34.14146
## 11877     Contra Costa County      6013     41-Rural: Fringe 37.83076
## 11881             Utah County     49049     21-Suburb: Large 40.40152
## 11900         Maricopa County      4013       11-City: Large 33.65382
## 11908        Salt Lake County     49035     21-Suburb: Large 40.70585
## 11911             Pima County      4019       11-City: Large 32.19378
## 11912             Pima County      4019       11-City: Large 32.25991
## 11913            Cache County     49005     23-Suburb: Small 41.62850
## 11914             Utah County     49049     21-Suburb: Large 40.09258
## 11925             Iron County     49021      33-Town: Remote 37.71386
## 11926         Maricopa County      4013     41-Rural: Fringe 33.52439
## 11927             Utah County     49049       13-City: Small 40.31557
## 11928            Emery County     49015    42-Rural: Distant 39.33628
## 11929             Iron County     49021      33-Town: Remote 37.71114
## 11930          Yavapai County      4025     41-Rural: Fringe 34.58560
## 11931            Weber County     49057       13-City: Small 41.24589
## 11932        Salt Lake County     49035     21-Suburb: Large 40.60879
## 11935        Salt Lake County     49035     21-Suburb: Large 40.58719
## 11936        Salt Lake County     49035     21-Suburb: Large 40.58156
## 11937        Salt Lake County     49035     21-Suburb: Large 40.58145
## 11967         Cape May County     34009     41-Rural: Fringe 39.09891
## 11968         Cape May County     34009     41-Rural: Fringe 39.09899
## 11975             Wood County     54107     23-Suburb: Small 39.21603
## 12070           Carbon County     49007      33-Town: Remote 39.60810
## 12083             Pima County      4019     21-Suburb: Large 32.30304
## 12088        San Diego County      6073     21-Suburb: Large 33.02512
## 12114            Mower County     27099     43-Rural: Remote 43.51310
## 12123            Hinds County     28049    12-City: Mid-size 32.33621
## 12131           Ramsey County     27123     21-Suburb: Large 45.08086
## 12138         McDowell County     54047     32-Town: Distant 37.41503
## 12149          Ventura County      6111       13-City: Small 34.20761
## 12163         Maricopa County      4013       11-City: Large 33.49281
## 12164         Maricopa County      4013       11-City: Large 33.49265
## 12165         Maricopa County      4013       11-City: Large 33.63902
## 12166         Maricopa County      4013       11-City: Large 33.48452
## 12167           Etowah County      1055     23-Suburb: Small 33.99633
## 12168           Shelby County      1117     41-Rural: Fringe 33.17809
## 12190          Lynchburg city     51680       13-City: Small 37.39989
## 12221             Will County     17197     21-Suburb: Large 41.54258
## 12227        Salt Lake County     49035     21-Suburb: Large 40.68715
## 12228            Comal County     48091       13-City: Small 29.69590
## 12243             Cook County     17031     21-Suburb: Large 42.10539
## 12249             Elko County     32007     43-Rural: Remote 40.71680
## 12307   San Bernardino County      6071    12-City: Mid-size 34.17181
## 12310             Lake County     17097     21-Suburb: Large 42.34841
## 12316        San Diego County      6073       11-City: Large 32.94079
## 12348          Cochise County      4003       13-City: Small 31.56262
## 12427             Yuma County      4027       13-City: Small 32.68574
## 12480        San Diego County      6073    12-City: Mid-size 33.12089
## 12501          Carroll County     51035    42-Rural: Distant 36.75707
## 12523             Dale County      1045      31-Town: Fringe 31.46148
## 12540          Carroll County     51035    42-Rural: Distant 36.76781
## 12567             Carson City     32510       13-City: Small 39.17252
## 12591      Los Angeles County      6037     21-Suburb: Large 33.89777
## 12677          Kanawha County     54039  22-Suburb: Mid-size 38.28923
## 12746          McHenry County     17111     21-Suburb: Large 42.22975
## 12749          McHenry County     17111     21-Suburb: Large 42.22149
## 12756         Maricopa County      4013       11-City: Large 33.53218
## 12764   San Bernardino County      6071    12-City: Mid-size 34.11233
## 12783         Siskiyou County      6093     43-Rural: Remote 41.96374
## 12806             Utah County     49049       13-City: Small 40.30031
## 12905            Emery County     49015      33-Town: Remote 39.22115
## 12912           Carbon County     49007      33-Town: Remote 39.61248
## 12934           Carbon County     49007      33-Town: Remote 39.61221
## 12965       Stanislaus County      6099     21-Suburb: Large 37.60176
## 12974             Cook County     17031       11-City: Large 41.77092
## 12976             Cook County     17031       11-City: Large 41.88247
## 12979            Duval County     12031       11-City: Large 30.30856
## 13071         Coconino County      4005       13-City: Small 35.21601
## 13072         Coconino County      4005      33-Town: Remote 36.92189
## 13073         Coconino County      4005       13-City: Small 35.23808
## 13075         Coconino County      4005       13-City: Small 35.20443
## 13076         Coconino County      4005    42-Rural: Distant 36.95190
## 13077         Coconino County      4005     43-Rural: Remote 36.05239
## 13079         Coconino County      4005      33-Town: Remote 36.91192
## 13080         Coconino County      4005     32-Town: Distant 35.24530
## 13081         Coconino County      4005      33-Town: Remote 36.92189
## 13082            Pinal County      4021     23-Suburb: Small 32.93593
## 13085            Pinal County      4021      31-Town: Fringe 32.98126
## 13086            Pinal County      4021     41-Rural: Fringe 33.02254
## 13087            Pinal County      4021     32-Town: Distant 33.05383
## 13088            Pinal County      4021     41-Rural: Fringe 33.17321
## 13089            Pinal County      4021     41-Rural: Fringe 33.13907
## 13090            Pinal County      4021      31-Town: Fringe 32.75926
## 13091            Pinal County      4021     23-Suburb: Small 32.89286
## 13111           Staunton city     51790     41-Rural: Fringe 38.13182
## 13117           Monroe County     17133    42-Rural: Distant 38.29051
## 13156             Iron County     49021      33-Town: Remote 37.66530
## 13176             Iron County     49021      33-Town: Remote 37.67670
## 13230          Fairfax County     51059     21-Suburb: Large 38.88403
## 13233             Iron County     49021     41-Rural: Fringe 37.65860
## 13240             Iron County     49021      33-Town: Remote 37.68189
## 13262           Sevier County     49041      33-Town: Remote 38.76909
## 13269            Cache County     49005     41-Rural: Fringe 41.80091
## 13270             Utah County     49049     21-Suburb: Large 40.41471
## 13275             Iron County     49021      33-Town: Remote 37.66980
## 13290             Utah County     49049    42-Rural: Distant 40.32653
## 13335      Los Angeles County      6037       11-City: Large 34.00254
## 13338      Los Angeles County      6037       11-City: Large 34.11610
## 13340      Los Angeles County      6037       11-City: Large 34.13957
## 13424            Davis County     49011     41-Rural: Fringe 41.02240
## 13428             Utah County     49049    12-City: Mid-size 40.26546
## 13442         Duchesne County     49013      33-Town: Remote 40.28562
## 13448          Jackson County     29095       11-City: Large 38.97350
## 13467          Cochise County      4003       13-City: Small 31.55741
## 13468          Cochise County      4003      33-Town: Remote 31.33956
## 13469          Cochise County      4003      33-Town: Remote 31.33699
## 13470          Cochise County      4003      33-Town: Remote 31.34888
## 13471          Cochise County      4003       13-City: Small 31.56372
## 13483          Henrico County     51087     21-Suburb: Large 37.66192
## 13487         Maricopa County      4013    12-City: Mid-size 33.35047
## 13588        Mendocino County      6045    42-Rural: Distant 39.32155
## 13595            Davis County     49011     21-Suburb: Large 40.91041
## 13602            Davis County     49011     21-Suburb: Large 40.92086
## 13623        Worcester County     25027     21-Suburb: Large 42.29311
## 13625          Brevard County     12009     21-Suburb: Large 28.37571
## 13677            Davis County     49011     21-Suburb: Large 41.06923
## 13704            Henry County     17073     32-Town: Distant 41.24182
## 13755        Riverside County      6065     21-Suburb: Large 33.92850
## 13816           Marion County     18097     21-Suburb: Large 39.72281
## 13964            Henry County     17073     32-Town: Distant 41.24185
## 14045          Stearns County     27145  22-Suburb: Mid-size 45.62261
## 14047           Benton County     27009     41-Rural: Fringe 45.60965
## 14061          Johnson County     18081     21-Suburb: Large 39.58954
## 14062         Valencia County     35061     23-Suburb: Small 34.78735
## 14068           Orange County      6059    12-City: Mid-size 33.66799
## 14102        Salt Lake County     49035     21-Suburb: Large 40.70050
## 14112             Utah County     49049     21-Suburb: Large 40.36511
## 14118            Adams County     28001      33-Town: Remote 31.56277
## 14124       New Castle County     10003     21-Suburb: Large 39.71209
## 14129        El Dorado County      6017     41-Rural: Fringe 38.72118
## 14136        Dinwiddie County     51053     21-Suburb: Large 37.21169
## 14142          Amherst County     51009  22-Suburb: Mid-size 37.42016
## 14161          Lynchburg city     51680       13-City: Small 37.36073
## 14205      Los Angeles County      6037     21-Suburb: Large 33.96067
## 14221           Placer County      6061    12-City: Mid-size 38.72348
## 14226          Hubbard County     27057     41-Rural: Fringe 46.92744
## 14229        Box Elder County     49003    42-Rural: Distant 41.61504
## 14237       Stanislaus County      6099     21-Suburb: Large 37.59062
## 14371         McLennan County     48309    12-City: Mid-size 31.52700
## 14373         McLennan County     48309    12-City: Mid-size 31.52700
## 14375         McLennan County     48309    12-City: Mid-size 31.52700
## 14377         McLennan County     48309    12-City: Mid-size 31.58472
## 14379         Maricopa County      4013     21-Suburb: Large 33.64253
## 14387         Maricopa County      4013     21-Suburb: Large 33.37433
## 14436         Chambers County      1017    42-Rural: Distant 32.89031
## 14458         Maricopa County      4013     21-Suburb: Large 33.30063
## 14464            Pinal County      4021     21-Suburb: Large 33.16248
## 14465         Maricopa County      4013       11-City: Large 33.46299
## 14516             Pima County      4019       11-City: Large 32.20468
## 14520             Will County     17197     21-Suburb: Large 41.44372
## 14526        Salt Lake County     49035     21-Suburb: Large 40.50602
## 14531          Fairfax County     51059     21-Suburb: Large 38.88057
## 14618       Miami-Dade County     12086       11-City: Large 25.78997
## 14671         Pinellas County     12103       11-City: Large 27.74531
## 14768           Bergen County     34003     21-Suburb: Large 40.84696
## 14876        Charlotte County     12015  22-Suburb: Mid-size 27.00550
## 14877        Charlotte County     12015  22-Suburb: Mid-size 27.00554
## 14880    Charlottesville city     51540       13-City: Small 38.03711
## 14882        Albemarle County     51003     23-Suburb: Small 38.04535
## 14883        Albemarle County     51003     23-Suburb: Small 38.06248
## 14899       Miami-Dade County     12086       11-City: Large 25.77290
## 14912      Santa Clara County      6085     41-Rural: Fringe 37.20490
## 15111         Cherokee County      1019     32-Town: Distant 34.15972
## 15116          Rapides Parish     22079       13-City: Small 31.26443
## 15161             Utah County     49049     21-Suburb: Large 40.15946
## 15172           Camden County     34007     21-Suburb: Large 39.86064
## 15173             Utah County     49049       13-City: Small 40.26646
## 15175           Camden County     34007     21-Suburb: Large 39.86062
## 15212         Chesapeake city     51550     21-Suburb: Large 36.80235
## 15213            Essex County     51057     32-Town: Distant 37.93099
## 15215         Chesapeake city     51550     21-Suburb: Large 36.72545
## 15297     Chesterfield County     51041     21-Suburb: Large 37.40821
## 15298     Chesterfield County     51041     21-Suburb: Large 37.38826
## 15304     Chesterfield County     51041     21-Suburb: Large 37.38157
## 15365         Pinellas County     12103    12-City: Mid-size 28.03114
## 15370             Cook County     17031       11-City: Large 41.67940
## 15371             Cook County     17031       11-City: Large 41.69194
## 15373             Cook County     17031       11-City: Large 41.89953
## 15376           Nevada County      6057     41-Rural: Fringe 39.14437
## 15377           Nevada County      6057     41-Rural: Fringe 39.14437
## 15395            Butte County      6007       13-City: Small 39.72384
## 15442             Kane County     17089     21-Suburb: Large 41.78613
## 15448        Salt Lake County     49035    12-City: Mid-size 40.75123
## 15451         Maricopa County      4013    12-City: Mid-size 33.41578
## 15452         Maricopa County      4013       11-City: Large 33.45394
## 15454             Pima County      4019       11-City: Large 32.20060
## 15458            Butte County      6007      31-Town: Fringe 39.78386
## 15473       Bernalillo County     35001       11-City: Large 35.09235
## 15508          Chilton County      1021     32-Town: Distant 32.84090
## 15587          Chisago County     27025     41-Rural: Fringe 45.37443
## 15666       Montgomery County     17135     32-Town: Distant 39.30017
## 15778        Churchill County     32001      33-Town: Remote 39.47218
## 15789        Salt Lake County     49035     21-Suburb: Large 40.67780
## 15809          Whitley County     18183    42-Rural: Distant 41.23118
## 15822             Cook County     17031       11-City: Large 41.74303
## 15823             Cook County     17031       11-City: Large 41.79420
## 15824             Cook County     17031       11-City: Large 41.65334
## 15825             Cook County     17031       11-City: Large 41.92254
## 15826             Cook County     17031       11-City: Large 41.95064
## 15828             Cook County     17031       11-City: Large 41.72007
## 15829             Cook County     17031       11-City: Large 41.99088
## 15830             Cook County     17031       11-City: Large 41.68456
## 15831             Cook County     17031       11-City: Large 41.90705
## 15832             Cook County     17031       11-City: Large 41.74820
## 15833             Cook County     17031       11-City: Large 41.78417
## 15834             Cook County     17031       11-City: Large 41.92177
## 15835             Cook County     17031       11-City: Large 41.74518
## 15843       San Benito County      6069    42-Rural: Distant 36.73010
## 15898            Piute County     49031     43-Rural: Remote 38.16708
## 15899            Piute County     49031     43-Rural: Remote 38.16702
## 15943       Miami-Dade County     12086     21-Suburb: Large 25.85979
## 15950           Citrus County     12017     41-Rural: Fringe 28.81845
## 15957           Citrus County     12017     23-Suburb: Small 28.83506
## 15958           Citrus County     12017     23-Suburb: Small 28.83506
## 15960        Salt Lake County     49035    12-City: Mid-size 40.76533
## 15966        Jefferson County      1073    12-City: Mid-size 33.51578
## 15970             Pima County      4019       11-City: Large 32.22287
## 15981       Miami-Dade County     12086     21-Suburb: Large 25.89130
## 16010          Alameda County      6001       11-City: Large 37.79888
## 16141            Clark County     32003       11-City: Large 36.17472
## 16190            Union County     34039     21-Suburb: Large 40.62688
## 16218           Tooele County     49045     32-Town: Distant 40.56768
## 16247        El Dorado County      6017     21-Suburb: Large 38.65863
## 16271        San Diego County      6073     21-Suburb: Large 33.08404
## 16273        San Diego County      6073     21-Suburb: Large 33.12450
## 16307            Evans County     13109     32-Town: Distant 32.14200
## 16308          McHenry County     17111      31-Town: Fringe 42.32120
## 16332             Clay County     27027     41-Rural: Fringe 46.84864
## 16357             Clay County     12019     21-Suburb: Large 30.16330
## 16359             Clay County     12019     21-Suburb: Large 30.16306
## 16360             Clay County     12019     21-Suburb: Large 30.16330
## 16403        Salt Lake County     49035    12-City: Mid-size 40.73749
## 16411     Contra Costa County      6013     21-Suburb: Large 37.94970
## 16483            Davis County     49011       13-City: Small 41.10094
## 16498             Lake County     17097     21-Suburb: Large 42.38423
## 16525         Cleburne County      1029    42-Rural: Distant 33.59728
## 16526         Cleburne County      1029    42-Rural: Distant 33.59728
## 16623            Emery County     49015     43-Rural: Remote 39.34816
## 16633           Hendry County     12051      33-Town: Remote 26.75610
## 16767            Davis County     49011     21-Suburb: Large 41.13926
## 16805        Jefferson County     17081     32-Town: Distant 38.31658
## 16811          Carlton County     27017      31-Town: Fringe 46.73446
## 16816      Los Angeles County      6037     21-Suburb: Large 34.22680
## 16828        Bear Lake County     16007     43-Rural: Remote 42.32917
## 16913          Madison County     17119     23-Suburb: Small 38.90958
## 16918        Riverside County      6065     21-Suburb: Large 33.63812
## 16926         Pershing County     32027     43-Rural: Remote 40.22278
## 16948        San Diego County      6073     21-Suburb: Large 33.20733
## 16950        Galveston County     48167  22-Suburb: Mid-size 29.37865
## 16952        Galveston County     48167  22-Suburb: Mid-size 29.37865
## 16953           Colusa County      6011     41-Rural: Fringe 39.16037
## 16963           Orange County      6059    12-City: Mid-size 33.67112
## 17019           Richmond city     51760    12-City: Mid-size 37.56809
## 17046          Trinity County      6105     43-Rural: Remote 41.08568
## 17116    Santa Barbara County      6083  22-Suburb: Mid-size 34.44113
## 17160       Santa Cruz County      4023      33-Town: Remote 31.34831
## 17231             Hale County      1065    42-Rural: Distant 32.72273
## 17232           Orange County      6059     21-Suburb: Large 33.47968
## 17282        San Diego County      6073     21-Suburb: Large 32.77259
## 17334          Collier County     12021     21-Suburb: Large 26.22077
## 17335          Collier County     12021     21-Suburb: Large 26.14165
## 17344           Collin County     48085  22-Suburb: Mid-size 33.24897
## 17345           Collin County     48085  22-Suburb: Mid-size 33.24882
## 17347           Collin County     48085     21-Suburb: Large 33.00328
## 17447   Colonial Heights city     51570     21-Suburb: Large 37.26621
## 17510   San Bernardino County      6071       13-City: Small 34.06830
## 17538             Kern County      6029       11-City: Large 35.36467
## 17599        Salt Lake County     49035     21-Suburb: Large 40.60863
## 17600            Davis County     49011     21-Suburb: Large 41.02741
## 17611         Columbia County     12023     32-Town: Distant 30.18896
## 17612         Columbia County     12023     32-Town: Distant 30.18893
## 17613         Columbia County     12023     32-Town: Distant 30.18895
## 17639         Colorado County     48089      33-Town: Remote 29.70241
## 17641      Bartholomew County     18005       13-City: Small 39.22362
## 17651        Salt Lake County     49035     21-Suburb: Large 40.69541
## 17775     Spotsylvania County     51177     41-Rural: Fringe 38.29519
## 17787         Suwannee County     12121      33-Town: Remote 30.30265
## 17793          Fairfax County     51059     21-Suburb: Large 38.85726
## 17800      Los Angeles County      6037    42-Rural: Distant 34.47264
## 17802        San Diego County      6073     21-Suburb: Large 33.10466
## 17803        San Diego County      6073     21-Suburb: Large 33.10466
## 17805      Santa Clara County      6085    12-City: Mid-size 37.35100
## 17815          Alameda County      6001       11-City: Large 37.78792
## 17823         Atchison County     29005     43-Rural: Remote 40.33931
## 17845        San Diego County      6073     21-Suburb: Large 33.12943
## 17850           Ramsey County     27123       11-City: Large 44.97421
## 17856           Orange County      6059     21-Suburb: Large 33.53592
## 17895          Ventura County      6111    12-City: Mid-size 34.15520
## 17896          Ventura County      6111    12-City: Mid-size 34.15520
## 17897          Ventura County      6111    12-City: Mid-size 34.15520
## 17901             Pima County      4019       11-City: Large 32.20562
## 17907            Anoka County     27003     21-Suburb: Large 45.18156
## 17925      Los Angeles County      6037     21-Suburb: Large 33.90071
## 17936         Duchesne County     49013    42-Rural: Distant 40.19495
## 17977         Maricopa County      4013       11-City: Large 33.41788
## 17978           Apache County      4001     43-Rural: Remote 36.71714
## 18066       Stanislaus County      6099      31-Town: Fringe 37.63951
## 18067       Stanislaus County      6099      31-Town: Fringe 37.63946
## 18074           DuPage County     17043     21-Suburb: Large 41.77983
## 18168     Contra Costa County      6013     21-Suburb: Large 37.93491
## 18169     Contra Costa County      6013       13-City: Small 37.93030
## 18170          Jackson County     29095       11-City: Large 39.06809
## 18171        Big Stone County     27011    42-Rural: Distant 45.30869
## 18173          Brevard County     12009     21-Suburb: Large 28.24860
## 18174           Sumter County     12119     41-Rural: Fringe 28.65918
## 18176             Lake County     12069     41-Rural: Fringe 28.76328
## 18177         Seminole County     12117       13-City: Small 28.75788
## 18178            Weber County     49057       13-City: Small 41.23198
## 18216             Cook County     17031       11-City: Large 41.86767
## 18232            Davis County     49011     21-Suburb: Large 41.09360
## 18254         Maricopa County      4013     21-Suburb: Large 33.33098
## 18273      Rock Island County     17161       13-City: Small 41.49087
## 18285    San Francisco County      6075       11-City: Large 37.80094
## 18338            Coosa County      1037     43-Rural: Remote 33.00154
## 18375         Maricopa County      4013     21-Suburb: Large 33.58064
## 18378           Tooele County     49045     32-Town: Distant 40.55974
## 18379        Salt Lake County     49035     21-Suburb: Large 40.59052
## 18386        Salt Lake County     49035     21-Suburb: Large 40.59422
## 18387        Salt Lake County     49035     21-Suburb: Large 40.69083
## 18392        Salt Lake County     49035     21-Suburb: Large 40.53216
## 18393             Pima County      4019       11-City: Large 32.28008
## 18408        Salt Lake County     49035     21-Suburb: Large 40.59773
## 18423           Washoe County     32031    12-City: Mid-size 39.54390
## 18424           Washoe County     32031    12-City: Mid-size 39.46892
## 18425           Washoe County     32031    12-City: Mid-size 39.53821
## 18431       Washington County     49053     23-Suburb: Small 37.16242
## 18432       Washington County     49053     41-Rural: Fringe 37.14385
## 18468            Kings County      6031     32-Town: Distant 36.09652
## 18490       Sacramento County      6067       13-City: Small 38.60466
## 18508        Box Elder County     49003     41-Rural: Fringe 41.54660
## 18553        Salt Lake County     49035     21-Suburb: Large 40.51684
## 18557           McLeod County     27085     32-Town: Distant 44.89053
## 18567         Maricopa County      4013       11-City: Large 33.54114
## 18574         Campbell County     51031     41-Rural: Fringe 37.27612
## 18614        Riverside County      6065    12-City: Mid-size 33.87193
## 18642        San Diego County      6073     21-Suburb: Large 32.69649
## 18677        San Mateo County      6081     41-Rural: Fringe 37.36810
## 18719       Burlington County     34005     41-Rural: Fringe 39.78604
## 18726           Sonoma County      6097     21-Suburb: Large 38.33870
## 18762           Shasta County      6089      31-Town: Fringe 40.38600
## 18787        Salt Lake County     49035     21-Suburb: Large 40.64714
## 18792           Shasta County      6089      31-Town: Fringe 40.39077
## 18795        Salt Lake County     49035     21-Suburb: Large 40.65637
## 18796            Emery County     49015      33-Town: Remote 39.22519
## 18840         Maricopa County      4013     21-Suburb: Large 33.39112
## 18861            Weber County     49057     21-Suburb: Large 41.17683
## 18877        San Diego County      6073    42-Rural: Distant 32.73208
## 18878         Mariposa County      6043     43-Rural: Remote 37.47176
## 18879           Amador County      6005     41-Rural: Fringe 38.37748
## 18881            Comal County     48091       13-City: Small 29.67072
## 18890              Lee County     12071       13-City: Small 26.59990
## 18891           Hendry County     12051     32-Town: Distant 26.76134
## 18900     Spotsylvania County     51177     41-Rural: Fringe 38.20363
## 18932             Vigo County     18167       13-City: Small 39.46510
## 18973            Clark County     32003       11-City: Large 36.08391
## 18994          Trinity County      6105     43-Rural: Remote 40.73735
## 19047         Portsmouth city     51740       13-City: Small 36.80210
## 19102             Yuma County      4027       13-City: Small 32.69938
## 19111       Providence County     44007     21-Suburb: Large 41.78611
## 19115    Prince George County     51149     41-Rural: Fringe 37.17167
## 19147         Maricopa County      4013       11-City: Large 33.47733
## 19169           Sonoma County      6097     21-Suburb: Large 38.32375
## 19183   San Bernardino County      6071    12-City: Mid-size 34.02443
## 19190           Placer County      6061    42-Rural: Distant 39.16912
## 19232          McHenry County     17111      31-Town: Fringe 42.27923
## 19238            Davis County     49011     21-Suburb: Large 41.05008
## 19246           Carbon County     49007      33-Town: Remote 39.59298
## 19257         Callaway County     29027     32-Town: Distant 38.84501
## 19258         Crenshaw County      1041     43-Rural: Remote 31.70506
## 19288        Salt Lake County     49035     21-Suburb: Large 40.54920
## 19292           Tulare County      6107    12-City: Mid-size 36.33042
## 19293           Tulare County      6107    12-City: Mid-size 36.33033
## 19294           Fresno County      6019       11-City: Large 36.80935
## 19295           Fresno County      6019       11-City: Large 36.80934
## 19296           Fresno County      6019       11-City: Large 36.78063
## 19354         Maricopa County      4013       11-City: Large 33.62695
## 19388            Davis County     49011     21-Suburb: Large 41.06999
## 19389        Salt Lake County     49035     21-Suburb: Large 40.68064
## 19451       Washington County     49053     41-Rural: Fringe 37.07511
## 19461            Crisp County     13081     41-Rural: Fringe 31.92589
## 19474          Jackson County     29095       11-City: Large 38.92426
## 19486        San Mateo County      6081     21-Suburb: Large 37.56630
## 19492           Taylor County     48441    12-City: Mid-size 32.43436
## 19568           Crosby County     48107     43-Rural: Remote 33.65838
## 19612  Prince George's County     24033     21-Suburb: Large 38.79442
## 19626            Bristol city     51520       13-City: Small 36.60001
## 19649        Charlotte County     12015    42-Rural: Distant 26.93529
## 19659        Jefferson County      1073       13-City: Small 33.33760
## 19664            Anoka County     27003     41-Rural: Fringe 45.37674
## 19690             Cook County     17031     21-Suburb: Large 42.10039
## 19712         Maricopa County      4013     41-Rural: Fringe 33.53018
## 19719         Maricopa County      4013       11-City: Large 33.49201
## 19748          McHenry County     17111     21-Suburb: Large 42.23722
## 19756          McHenry County     17111     21-Suburb: Large 42.21076
## 19776          Cochise County      4003     32-Town: Distant 31.96542
## 19777          Cochise County      4003     32-Town: Distant 31.41481
## 19778          Cochise County      4003     43-Rural: Remote 32.32528
## 19779          Cochise County      4003       13-City: Small 31.57017
## 19781          Cochise County      4003      33-Town: Remote 31.35030
## 19782          Cochise County      4003     43-Rural: Remote 32.26649
## 19783          Cochise County      4003    42-Rural: Distant 31.90614
## 19784          Cochise County      4003    42-Rural: Distant 31.72767
## 19785          Cochise County      4003     43-Rural: Remote 31.68590
## 19786          Cochise County      4003     41-Rural: Fringe 32.25623
## 19788           Orange County     12095       11-City: Large 28.55013
## 19832          Cullman County      1043    42-Rural: Distant 34.20756
## 19833          Cullman County      1043     32-Town: Distant 34.22274
## 19835          Cullman County      1043     32-Town: Distant 34.17901
## 19837          Cullman County      1043     32-Town: Distant 34.17915
## 19860       Cumberland County     34011     41-Rural: Fringe 39.41303
## 19892       Cumberland County     34011     41-Rural: Fringe 39.44739
## 19900       Cumberland County     34011     41-Rural: Fringe 39.44739
## 19928      Santa Clara County      6085       13-City: Small 37.32024
## 20031             Gila County      4007      33-Town: Remote 33.39380
## 20032             Gila County      4007     43-Rural: Remote 32.99307
## 20033             Gila County      4007     41-Rural: Fringe 33.41077
## 20034            Pinal County      4021     43-Rural: Remote 33.06486
## 20035             Gila County      4007     41-Rural: Fringe 33.29819
## 20036            Pinal County      4021     32-Town: Distant 33.27869
## 20061            Pasco County     12101     41-Rural: Fringe 28.28209
## 20099           Harris County     48201       11-City: Large 29.92429
## 20101        Salt Lake County     49035     21-Suburb: Large 40.70574
## 20161      Los Angeles County      6037     21-Suburb: Large 33.90800
## 20167            Dodge County     13091     32-Town: Distant 32.18448
## 20175       Miami-Dade County     12086     41-Rural: Fringe 25.37247
## 20182          Hidalgo County     48215     21-Suburb: Large 26.09871
## 20196          Daggett County     49009     43-Rural: Remote 40.99219
## 20223           Dakota County     27037     41-Rural: Fringe 44.65085
## 20247        Box Elder County     49003     21-Suburb: Large 41.50638
## 20266           Dallas County     48113       11-City: Large 32.77158
## 20268           Dallas County      1047     41-Rural: Fringe 32.37204
## 20272           Dallas County     48113       11-City: Large 32.77158
## 20273           Dallas County     48113       11-City: Large 32.77158
## 20335             Utah County     49049     21-Suburb: Large 40.38049
## 20413             Lake County     17097     21-Suburb: Large 42.37284
## 20424          Wasatch County     49051     32-Town: Distant 40.47749
## 20545      Santa Clara County      6085     21-Suburb: Large 37.24020
## 20590        Salt Lake County     49035     21-Suburb: Large 40.66258
## 20654            Weber County     49057       13-City: Small 41.23046
## 20662          Fairfax County     51059     21-Suburb: Large 38.90643
## 20695            Davis County     49011     21-Suburb: Large 41.02931
## 20712           Uintah County     49047     41-Rural: Fringe 40.39689
## 20715             Yolo County      6113     23-Suburb: Small 38.55220
## 20719       Greenbrier County     54025     41-Rural: Fringe 37.75968
## 20764        Tom Green County     48451    12-City: Mid-size 31.49265
## 20770            Bristol city     51520       13-City: Small 36.61549
## 20774        Salt Lake County     49035     21-Suburb: Large 40.53912
## 20775       Monongalia County     54061    42-Rural: Distant 39.66680
## 20826       Providence County     44007     21-Suburb: Large 41.74388
## 20887          McHenry County     17111      31-Town: Fringe 42.30970
## 20927           Morgan County      1103       13-City: Small 34.59392
## 21008          LaSalle County     17099    42-Rural: Distant 41.27310
## 21027          McHenry County     17111     21-Suburb: Large 42.23299
## 21040         Maricopa County      4013     21-Suburb: Large 33.65323
## 21073             Utah County     49049     21-Suburb: Large 40.40574
## 21095        San Diego County      6073     21-Suburb: Large 33.12938
## 21101           DeKalb County      1049    42-Rural: Distant 34.49173
## 21115           DeKalb County     13089     21-Suburb: Large 33.69163
## 21117           DeKalb County      1049    42-Rural: Distant 34.49173
## 21137        San Diego County      6073       11-City: Large 32.94487
## 21140        San Diego County      6073       11-City: Large 32.95338
## 21143        Del Norte County      6015      33-Town: Remote 41.76987
## 21161     Contra Costa County      6013     21-Suburb: Large 37.84627
## 21251     Hillsborough County     12057       11-City: Large 27.97476
## 21283         Siskiyou County      6093    42-Rural: Distant 41.70478
## 21287       Palm Beach County     12099       13-City: Small 26.45552
## 21309          Millard County     49027      33-Town: Remote 39.35799
## 21325          Millard County     49027      33-Town: Remote 39.35641
## 21329          Millard County     49027      33-Town: Remote 39.35351
## 21331          Millard County     49027      33-Town: Remote 39.34416
## 21374       Stanislaus County      6099     23-Suburb: Small 37.52623
## 21440           Denton County     48121     21-Suburb: Large 33.15127
## 21446           Denton County     48121    12-City: Mid-size 33.21206
## 21451           Denton County     48121    12-City: Mid-size 33.21206
## 21479           Monroe County     13207     32-Town: Distant 33.03641
## 21480           Fulton County     13121       11-City: Large 33.75416
## 21490           Marion County     18097       11-City: Large 39.76810
## 21549         Maricopa County      4013     21-Suburb: Large 33.63331
## 21551         Maricopa County      4013       11-City: Large 33.65497
## 21554       Washington County     49053     41-Rural: Fringe 37.05081
## 21555         Maricopa County      4013     21-Suburb: Large 33.32300
## 21556       Washington County     49053     41-Rural: Fringe 37.05083
## 21563         Maricopa County      4013       11-City: Large 33.39104
## 21569         Maricopa County      4013     21-Suburb: Large 33.60424
## 21580         Maricopa County      4013     21-Suburb: Large 33.58064
## 21585             Pima County      4019       11-City: Large 32.26565
## 21591      Los Angeles County      6037     21-Suburb: Large 34.68483
## 21596             Pima County      4019       11-City: Large 32.23948
## 21602             Pima County      4019     41-Rural: Fringe 32.23583
## 21607           Mohave County      4015      33-Town: Remote 34.99309
## 21608          Yavapai County      4025    42-Rural: Distant 34.71715
## 21610         Maricopa County      4013    12-City: Mid-size 33.73732
## 21618         Maricopa County      4013       11-City: Large 33.55523
## 21619             Yuma County      4027       13-City: Small 32.68506
## 21633            Clark County     32003       11-City: Large 36.16436
## 21638         Maricopa County      4013       11-City: Large 33.76912
## 21641            Clark County     32003       11-City: Large 36.15842
## 21646          Colbert County      1033     23-Suburb: Small 34.73874
## 21647          Colbert County      1033     23-Suburb: Small 34.73874
## 21656        San Mateo County      6081       13-City: Small 37.53279
## 21680           DeSoto County     12027     32-Town: Distant 27.22106
## 21681           DeSoto County     12027     32-Town: Distant 27.22291
## 21693             Gila County      4007      33-Town: Remote 33.39113
## 21698           Taylor County     12123     41-Rural: Fringe 30.12087
## 21827          Dunklin County     29069      33-Town: Remote 36.22660
## 21837             Utah County     49049     21-Suburb: Large 40.11066
## 21849        Salt Lake County     49035     21-Suburb: Large 40.58719
## 21850        Salt Lake County     49035     21-Suburb: Large 40.63679
## 21855       Washington County     49053    42-Rural: Distant 37.24923
## 21859           Dakota County     27037     21-Suburb: Large 44.77242
## 21913        San Diego County      6073       11-City: Large 32.76064
## 21914        San Diego County      6073     41-Rural: Fringe 32.78158
## 21916        San Diego County      6073     21-Suburb: Large 32.63715
## 21917        San Diego County      6073     21-Suburb: Large 32.80070
## 21975        Salt Lake County     49035    12-City: Mid-size 40.72832
## 22012             Will County     17197     21-Suburb: Large 41.51859
## 22028      Santa Clara County      6085       11-City: Large 37.30297
## 22029      San Joaquin County      6077     23-Suburb: Small 37.74553
## 22033      Santa Clara County      6085       11-City: Large 37.23606
## 22041            Clark County     32003       11-City: Large 36.19803
## 22049             Kern County      6029       11-City: Large 35.40016
## 22088           Graham County      4009     41-Rural: Fringe 32.90140
## 22096        Box Elder County     49003     21-Suburb: Large 41.52661
## 22097           Uintah County     49047      33-Town: Remote 40.43812
## 22101        Crow Wing County     27035      33-Town: Remote 46.36283
## 22109             Cook County     17031       11-City: Large 41.95063
## 22113             Cook County     17031     21-Suburb: Large 41.51411
## 22114          Jackson County     12063     32-Town: Distant 30.77616
## 22115          Jackson County     12063     32-Town: Distant 30.77636
## 22117          Chisago County     27025     41-Rural: Fringe 45.50813
## 22125       Miami-Dade County     12086       11-City: Large 25.78978
## 22133       Miami-Dade County     12086       11-City: Large 25.78978
## 22134       Miami-Dade County     12086       11-City: Large 25.78978
## 22135       Miami-Dade County     12086       11-City: Large 25.78978
## 22136       Miami-Dade County     12086     21-Suburb: Large 25.87762
## 22137       Miami-Dade County     12086       11-City: Large 25.78978
## 22138       Miami-Dade County     12086       11-City: Large 25.78978
## 22139       Miami-Dade County     12086       11-City: Large 25.78978
## 22157            Dixie County     12029      33-Town: Remote 29.63750
## 22168       Washington County     49053       13-City: Small 37.09536
## 22172       Washington County     49053       13-City: Small 37.09371
## 22174       Washington County     49053     41-Rural: Fringe 37.14672
## 22175       Washington County     49053       13-City: Small 37.12885
## 22176            Dixie County     12029      33-Town: Remote 29.63756
## 22177            Dixie County     12029      33-Town: Remote 29.63750
## 22178            Dixie County     12029      33-Town: Remote 29.63767
## 22179            Dixie County     12029      33-Town: Remote 29.63763
## 22180            Dixie County     12029      33-Town: Remote 29.63750
## 22199             Utah County     49049    12-City: Mid-size 40.23742
## 22202           Solano County      6095      31-Town: Fringe 38.44838
## 22218         Maricopa County      4013     21-Suburb: Large 33.33943
## 22386            Boone County     54005     41-Rural: Fringe 38.13772
## 22450            Dooly County     13093     32-Town: Distant 32.10429
## 22538           Merced County      6047     32-Town: Distant 36.98474
## 22554          Houston County      1069       13-City: Small 31.26650
## 22573          Douglas County     32005     41-Rural: Fringe 38.95932
## 22583          Douglas County     32005     41-Rural: Fringe 38.95932
## 22596           Bureau County     17011     32-Town: Distant 41.38282
## 22626         Sangamon County     17167    12-City: Mid-size 39.80587
## 22627        Salt Lake County     49035     21-Suburb: Large 40.69000
## 22646          Loudoun County     51107     21-Suburb: Large 39.10948
## 22699        Hunterdon County     34019     41-Rural: Fringe 40.42546
## 22736          Alameda County      6001       11-City: Large 37.78041
## 22752            Davis County     49011     21-Suburb: Large 41.12770
## 22913            Essex County     25009     21-Suburb: Large 42.73907
## 22991        Salt Lake County     49035     21-Suburb: Large 40.51284
## 22992        Salt Lake County     49035     21-Suburb: Large 40.52075
## 23002             Kane County     17089    12-City: Mid-size 42.03659
## 23004             Kane County     17089    12-City: Mid-size 42.03655
## 23059         Pinellas County     12103       13-City: Small 27.91278
## 23060           Racine County     55101     41-Rural: Fringe 42.83019
## 23087             Utah County     49049     41-Rural: Fringe 40.36982
## 23115        Salt Lake County     49035    12-City: Mid-size 40.74392
## 23144         Sangamon County     17167    12-City: Mid-size 39.80067
## 23161         Duchesne County     49013     43-Rural: Remote 40.16403
## 23162         Duchesne County     49013     43-Rural: Remote 40.16623
## 23167              Nye County     32023     43-Rural: Remote 38.90496
## 23195           Tooele County     49045     43-Rural: Remote 40.22660
## 23204       Rio Arriba County     35039     43-Rural: Remote 36.94281
## 23228              Lee County     12071       13-City: Small 26.64328
## 23337         Siskiyou County      6093    42-Rural: Distant 41.21016
## 23364        Jefferson County      1073    12-City: Mid-size 33.54798
## 23444            Duval County     12031       11-City: Large 30.23286
## 23446            Duval County     12031       11-City: Large 30.28489
## 23447            Duval County     12031     41-Rural: Fringe 30.13806
## 23448            Duval County     12031       11-City: Large 30.19394
## 23449            Duval County     12031       11-City: Large 30.24647
## 23450            Duval County     12031       11-City: Large 30.24661
## 23452            Duval County     12031       11-City: Large 30.29259
## 23455            Duval County     12031       11-City: Large 30.31739
## 23456            Duval County     12031       11-City: Large 30.31739
## 23458            Duval County     12031       11-City: Large 30.31739
## 23578         Maricopa County      4013  22-Suburb: Mid-size 33.44862
## 23579         Maricopa County      4013      31-Town: Fringe 33.38957
## 23580         Maricopa County      4013       11-City: Large 33.64851
## 23581         Maricopa County      4013       11-City: Large 33.57522
## 23582         Maricopa County      4013     21-Suburb: Large 33.62577
## 23583         Maricopa County      4013       11-City: Large 33.64860
## 23584         Maricopa County      4013       11-City: Large 33.65405
## 23656            Davis County     49011     21-Suburb: Large 40.98145
## 23667         Maricopa County      4013       11-City: Large 33.37150
## 23668         Maricopa County      4013       11-City: Large 33.37171
## 23669         Maricopa County      4013       11-City: Large 33.49330
## 23670         Maricopa County      4013       11-City: Large 33.41402
## 23673           Sonoma County      6097      31-Town: Fringe 38.80792
## 23737             Lyon County     32019    42-Rural: Distant 39.39404
## 23762             Utah County     49049      31-Town: Fringe 40.31225
## 23768           Uintah County     49047    42-Rural: Distant 40.30374
## 23773             Utah County     49049     21-Suburb: Large 40.42275
## 23858       White Pine County     32033      33-Town: Remote 39.25145
## 23861             Pine County     27115      33-Town: Remote 45.82256
## 23872         Maricopa County      4013    12-City: Mid-size 33.58891
## 23891        St. Louis County     27137  22-Suburb: Mid-size 46.74385
## 23895        Salt Lake County     49035     21-Suburb: Large 40.63820
## 23932             Kane County     17089     21-Suburb: Large 41.78326
## 23935        St. Louis County     29189     21-Suburb: Large 38.54642
## 23938      Los Angeles County      6037     21-Suburb: Large 34.68902
## 23939           Nevada County      6057     32-Town: Distant 39.23606
## 23949           Orange County      6059     21-Suburb: Large 33.80043
## 23951             Lake County     17097     21-Suburb: Large 42.35484
## 23952            Anoka County     27003     21-Suburb: Large 45.11386
## 23953          Olmsted County     27109    12-City: Mid-size 44.01072
## 23959           Orange County      6059       11-City: Large 33.68457
## 23964              Lee County     12071       13-City: Small 26.64709
## 23965            Scott County     27139     32-Town: Distant 44.61826
## 23971             Elko County     32007      33-Town: Remote 40.84013
## 23972            Essex County     34013       11-City: Large 40.73025
## 23974            Essex County     34013       11-City: Large 40.75189
## 23975            Essex County     34013       11-City: Large 40.70865
## 23979           Dakota County     27037     21-Suburb: Large 44.89029
## 23980         Hennepin County     27053       13-City: Small 44.99463
## 23985           Carver County     27019      31-Town: Fringe 44.83869
## 23988        St. Louis County     27137       13-City: Small 46.78920
## 23991         Hennepin County     27053     21-Suburb: Large 45.06276
## 24066         Sangamon County     17167    12-City: Mid-size 39.77257
## 24073             Lake County     17097     21-Suburb: Large 42.38414
## 24074           Tooele County     49045     32-Town: Distant 40.53110
## 24088      Los Angeles County      6037     21-Suburb: Large 33.98301
## 24093        Salt Lake County     49035     41-Rural: Fringe 40.53920
## 24101         Hennepin County     27053       11-City: Large 44.95590
## 24122        Worcester County     25027     21-Suburb: Large 42.29311
## 24128             Kane County     17089     21-Suburb: Large 41.79072
## 24186           Wilson County     48493     32-Town: Distant 29.15842
## 24379        Salt Lake County     49035    12-City: Mid-size 40.75090
## 24396             Kane County     17089     21-Suburb: Large 41.74484
## 24412        Salt Lake County     49035     21-Suburb: Large 40.72457
## 24467            Davis County     49011     21-Suburb: Large 41.08021
## 24500             Utah County     49049     21-Suburb: Large 40.09310
## 24521        Salt Lake County     49035     21-Suburb: Large 40.62483
## 24546           Hudson County     34017     21-Suburb: Large 40.75043
## 24564         Ouachita Parish     22073     41-Rural: Fringe 32.58602
## 24599     St. Francois County     29187     32-Town: Distant 37.92313
## 24600     St. Francois County     29187     32-Town: Distant 37.92313
## 24634      Los Angeles County      6037     21-Suburb: Large 34.07681
## 24636        Salt Lake County     49035     21-Suburb: Large 40.60042
## 24639         Duchesne County     49013     41-Rural: Fringe 40.30530
## 24642             Utah County     49049     21-Suburb: Large 40.37347
## 24701         Maricopa County      4013       11-City: Large 33.43773
## 24706         Maricopa County      4013       11-City: Large 33.41665
## 24756          Volusia County     12127       13-City: Small 29.20687
## 24757          Brevard County     12009    12-City: Mid-size 27.99727
## 24794           Navajo County      4017     41-Rural: Fringe 34.93310
## 24819       James City County     51095     23-Suburb: Small 37.28985
## 24852        Salt Lake County     49035     21-Suburb: Large 40.55499
## 24866            Dodge County     13091     32-Town: Distant 32.17988
## 24871        Salt Lake County     49035     21-Suburb: Large 40.56687
## 24899             Pima County      4019       11-City: Large 32.22152
## 24994        Salt Lake County     49035     21-Suburb: Large 40.69949
## 25047       Stanislaus County      6099     23-Suburb: Small 37.49699
## 25049            Pinal County      4021     41-Rural: Fringe 32.78383
## 25075           Summit County     49043     41-Rural: Fringe 40.73981
## 25090          Olmsted County     27109    12-City: Mid-size 44.01072
## 25107       Palm Beach County     12099     21-Suburb: Large 26.56515
## 25125          Alameda County      6001    12-City: Mid-size 37.63824
## 25126        St. Clair County      1115    42-Rural: Distant 33.78322
## 25167             Pima County      4019       11-City: Large 32.23514
## 25168             Pima County      4019     21-Suburb: Large 32.33444
## 25191             Utah County     49049    12-City: Mid-size 40.28128
## 25192        Salt Lake County     49035     21-Suburb: Large 40.57386
## 25335          Fairfax County     51059     21-Suburb: Large 38.78320
## 25364        Salt Lake County     49035    12-City: Mid-size 40.75922
## 25372        Penobscot County     23019     43-Rural: Remote 45.39389
## 25375            Cache County     49005       13-City: Small 41.74482
## 25389         Maricopa County      4013       11-City: Large 33.45793
## 25390         Maricopa County      4013       11-City: Large 33.40898
## 25391         Maricopa County      4013       11-City: Large 33.38762
## 25392         Maricopa County      4013     41-Rural: Fringe 33.32767
## 25440             Will County     17197     21-Suburb: Large 41.51658
## 25444        Hunterdon County     34019     21-Suburb: Large 40.62974
## 25445             Kane County     17089     21-Suburb: Large 41.75720
## 25458         Maricopa County      4013    12-City: Mid-size 33.39398
## 25459       Santa Cruz County      4023      33-Town: Remote 31.36886
## 25465           DuPage County     17043     21-Suburb: Large 41.87065
## 25475             Yuma County      4027       13-City: Small 32.69922
## 25478        Riverside County      6065       11-City: Large 33.94046
## 25482       Palm Beach County     12099     21-Suburb: Large 26.67098
## 25483       Palm Beach County     12099     41-Rural: Fringe 26.72291
## 25486         Maricopa County      4013       11-City: Large 33.55167
## 25487            Pinal County      4021     41-Rural: Fringe 33.17520
## 25488         Maricopa County      4013     21-Suburb: Large 33.37614
## 25498       Tallapoosa County      1123    42-Rural: Distant 32.80457
## 25520          Orleans Parish     22071       11-City: Large 30.00376
## 25578         Sangamon County     17167    12-City: Mid-size 39.73887
## 25653             Will County     17197     21-Suburb: Large 41.51700
## 25693        Salt Lake County     49035     21-Suburb: Large 40.67507
## 25748         Imperial County      6025       13-City: Small 32.79410
## 25797           Merced County      6047    42-Rural: Distant 37.13441
## 25808        Riverside County      6065     21-Suburb: Large 33.87590
## 25842           Coffee County      1031     43-Rural: Remote 31.42684
## 25858        Whitfield County     13313       13-City: Small 34.78669
## 25867           Marion County     12083       13-City: Small 29.18375
## 25868           DuPage County     17043     21-Suburb: Large 41.86837
## 25877             Rusk County     48401    42-Rural: Distant 32.23916
## 25917           Tulare County      6107     41-Rural: Fringe 36.35554
## 25932        St. Louis County     29189     21-Suburb: Large 38.83013
## 25958        San Diego County      6073       11-City: Large 32.78642
## 26038         Sangamon County     17167    12-City: Mid-size 39.79556
## 26092             Kern County      6029    42-Rural: Distant 35.29821
## 26097        Salt Lake County     49035     21-Suburb: Large 40.57409
## 26112        Salt Lake County     49035     21-Suburb: Large 40.57186
## 26114        Sherburne County     27141     21-Suburb: Large 45.32108
## 26118        Salt Lake County     49035     21-Suburb: Large 40.69511
## 26166           Tehama County      6103     43-Rural: Remote 39.88572
## 26172         Randolph County     54083      33-Town: Remote 38.92362
## 26286            Cache County     49005       13-City: Small 41.73692
## 26289            Davis County     49011     21-Suburb: Large 41.07240
## 26327          Bossier Parish     22015    42-Rural: Distant 32.35137
## 26389           Elmore County      1051      31-Town: Fringe 32.55040
## 26433         Maricopa County      4013     21-Suburb: Large 33.33077
## 26530         Oklahoma County     40109       11-City: Large 35.47466
## 26532         Oklahoma County     40109       11-City: Large 35.47463
## 26590        Salt Lake County     49035    12-City: Mid-size 40.74056
## 26602            Emery County     49015      33-Town: Remote 39.22778
## 26606          Alameda County      6001     21-Suburb: Large 37.83644
## 26632         Watonwan County     27165    42-Rural: Distant 44.04728
## 26677             Lake County     17097     21-Suburb: Large 42.45974
## 26701         Maricopa County      4013       11-City: Large 33.52194
## 26702         Maricopa County      4013       11-City: Large 33.51272
## 26703      Los Angeles County      6037     21-Suburb: Large 34.67442
## 26707          Henrico County     51087     21-Suburb: Large 37.55042
## 26728           Washoe County     32031    12-City: Mid-size 39.51569
## 26748        Salt Lake County     49035     21-Suburb: Large 40.71349
## 26753             Kern County      6029       11-City: Large 35.39201
## 26761            Davis County     49011     21-Suburb: Large 41.00347
## 26774           Harris County     48201       11-City: Large 29.72047
## 26776           Harris County     48201       11-City: Large 29.69546
## 26777           Harris County     48201       11-City: Large 29.65769
## 26778           Harris County     48201       11-City: Large 29.69113
## 26780           Harris County     48201       11-City: Large 29.69113
## 26797        Jefferson County      1073    12-City: Mid-size 33.51971
## 26838             Iron County     49021      33-Town: Remote 37.76335
## 26844         Sangamon County     17167    12-City: Mid-size 39.81381
## 26851         Fillmore County     27045    42-Rural: Distant 43.69715
## 26852            Mower County     27099    42-Rural: Distant 43.70927
## 26856        Salt Lake County     49035    12-City: Mid-size 40.78310
## 26860       Newport News city     51700    12-City: Mid-size 37.08471
## 26875       Washington County     49053     43-Rural: Remote 37.56477
## 26886       Washington County     49053     43-Rural: Remote 37.57010
## 26888           Madera County      6039     23-Suburb: Small 36.95323
## 26889        Salt Lake County     49035     21-Suburb: Large 40.64059
## 26890        Salt Lake County     49035     21-Suburb: Large 40.71286
## 26892        Salt Lake County     49035     21-Suburb: Large 40.58729
## 26907             Pima County      4019     21-Suburb: Large 32.11588
## 26915          Sanpete County     49039      33-Town: Remote 39.34969
## 26916          Sanpete County     49039      33-Town: Remote 39.35709
## 26924         Oklahoma County     40109       11-City: Large 35.59516
## 26930             Kern County      6029     32-Town: Distant 35.13170
## 26947          Jackson County      1071    42-Rural: Distant 34.72109
## 27064        Hunterdon County     34019     41-Rural: Fringe 40.69727
## 27066         Garfield County     49017     43-Rural: Remote 37.76601
## 27069        Salt Lake County     49035    12-City: Mid-size 40.78950
## 27070         Garfield County     49017     43-Rural: Remote 37.77037
## 27071             Iron County     49021     43-Rural: Remote 37.71084
## 27073      San Joaquin County      6077      31-Town: Fringe 37.79940
## 27076         Escambia County     12033     21-Suburb: Large 30.40614
## 27078         Escambia County      1053     32-Town: Distant 31.00668
## 27082         Escambia County     12033     21-Suburb: Large 30.44198
## 27083         Escambia County     12033     21-Suburb: Large 30.44244
## 27085         Escambia County     12033       13-City: Small 30.44668
## 27086         Escambia County     12033       13-City: Small 30.44668
## 27087         Escambia County     12033       13-City: Small 30.44668
## 27089         Escambia County      1053     41-Rural: Fringe 31.11330
## 27098        San Diego County      6073     21-Suburb: Large 33.13654
## 27106      Santa Clara County      6085       11-City: Large 37.36973
## 27111           Martin County     12085     21-Suburb: Large 27.19642
## 27115          Volusia County     12127  22-Suburb: Mid-size 29.03070
## 27121          Millard County     49027     43-Rural: Remote 39.10884
## 27151        Salt Lake County     49035     21-Suburb: Large 40.69798
## 27157            Essex County     34013       11-City: Large 40.74771
## 27175            Essex County     34013       11-City: Large 40.74805
## 27176            Essex County     34013       11-City: Large 40.76158
## 27188         Torrance County     35057    42-Rural: Distant 35.02921
## 27229         Maricopa County      4013  22-Suburb: Mid-size 33.44035
## 27238       Miami-Dade County     12086       11-City: Large 25.78982
## 27266         Maricopa County      4013     21-Suburb: Large 33.56543
## 27283           Etowah County      1055     23-Suburb: Small 33.95807
## 27390             Juab County     49023    42-Rural: Distant 39.95654
## 27478             Lake County     17097     21-Suburb: Large 42.33731
## 27487           Mobile County      1097    12-City: Mid-size 30.60722
## 27489          Henrico County     51087     21-Suburb: Large 37.66192
## 27524          McHenry County     17111     41-Rural: Fringe 42.23411
## 27577        Salt Lake County     49035     21-Suburb: Large 40.69757
## 27606            Pinal County      4021     21-Suburb: Large 33.39155
## 27607         Maricopa County      4013       11-City: Large 33.49356
## 27608         Maricopa County      4013     21-Suburb: Large 33.31039
## 27609         Maricopa County      4013     21-Suburb: Large 33.22011
## 27610         Maricopa County      4013       11-City: Large 33.41254
## 27611         Maricopa County      4013     41-Rural: Fringe 33.27955
## 27612         Maricopa County      4013       11-City: Large 33.42514
## 27613         Maricopa County      4013     21-Suburb: Large 33.22221
## 27614         Maricopa County      4013     21-Suburb: Large 33.30843
## 27615         Maricopa County      4013    12-City: Mid-size 33.57749
## 27616            Pinal County      4021     41-Rural: Fringe 33.27738
## 27617         Maricopa County      4013    12-City: Mid-size 33.36497
## 27618         Maricopa County      4013    12-City: Mid-size 33.32616
## 27619         Maricopa County      4013    12-City: Mid-size 33.47539
## 27620         Maricopa County      4013    12-City: Mid-size 33.58881
## 27621         Maricopa County      4013       11-City: Large 33.37047
## 27622         Maricopa County      4013       11-City: Large 33.29639
## 27623         Maricopa County      4013       11-City: Large 33.36241
## 27625         Maricopa County      4013       11-City: Large 33.39948
## 27627         Maricopa County      4013     21-Suburb: Large 33.61871
## 27628         Maricopa County      4013       11-City: Large 33.43293
## 27629         Maricopa County      4013     21-Suburb: Large 33.34869
## 27630         Maricopa County      4013     21-Suburb: Large 33.25281
## 27631         Maricopa County      4013     21-Suburb: Large 33.35522
## 27632         Maricopa County      4013     21-Suburb: Large 33.36273
## 27633         Maricopa County      4013     21-Suburb: Large 33.29410
## 27634         Maricopa County      4013       11-City: Large 33.43141
## 27635         Maricopa County      4013    12-City: Mid-size 33.36645
## 27636         Maricopa County      4013    12-City: Mid-size 33.39757
## 27637         Maricopa County      4013       11-City: Large 33.39586
## 27638         Maricopa County      4013       11-City: Large 33.40962
## 27639         Maricopa County      4013     21-Suburb: Large 33.34060
## 27640         Maricopa County      4013       11-City: Large 33.32596
## 27641         Maricopa County      4013       11-City: Large 33.43874
## 27642         Maricopa County      4013     21-Suburb: Large 33.26169
## 27643         Maricopa County      4013       11-City: Large 33.42894
## 27644         Maricopa County      4013       11-City: Large 33.41254
## 27645         Maricopa County      4013     21-Suburb: Large 33.24653
## 27646         Maricopa County      4013       11-City: Large 33.43536
## 27647         Maricopa County      4013       11-City: Large 33.38015
## 27648         Maricopa County      4013    12-City: Mid-size 33.52663
## 27650         Maricopa County      4013       11-City: Large 33.44070
## 27651         Maricopa County      4013       11-City: Large 33.39970
## 27652         Maricopa County      4013       11-City: Large 33.43057
## 27653         Maricopa County      4013       11-City: Large 33.46043
## 27654         Maricopa County      4013       11-City: Large 33.40317
## 27656         Maricopa County      4013    12-City: Mid-size 33.40875
## 27657         Maricopa County      4013       11-City: Large 33.42850
## 27658         Maricopa County      4013     21-Suburb: Large 33.31395
## 27671         Somerset County     24039    42-Rural: Distant 38.10288
## 27689           Harris County     48201       11-City: Large 29.68441
## 27690           Harris County     48201       11-City: Large 29.68452
## 27691             Cook County     17031       11-City: Large 41.76359
## 27692             Cook County     17031       11-City: Large 41.76593
## 27693             Cook County     17031       11-City: Large 41.75956
## 27697           Harris County     48201       11-City: Large 29.71007
## 27728           Tooele County     49045     41-Rural: Fringe 40.60105
## 27730       Miami-Dade County     12086     21-Suburb: Large 25.94001
## 27737       Miami-Dade County     12086     21-Suburb: Large 25.83169
## 27749           Dubois County     18037     32-Town: Distant 38.40051
## 27756           Tulare County      6107  22-Suburb: Mid-size 36.29740
## 27804          Alachua County     12001  22-Suburb: Mid-size 29.60296
## 27805        Baltimore County     24005       13-City: Small 39.39939
## 27851             Kent County     10001  22-Suburb: Mid-size 39.09983
## 27896            Caddo Parish     22017    12-City: Mid-size 32.48002
## 27913         Greenlee County      4011      33-Town: Remote 33.04481
## 27935            Fairfax city     51600     21-Suburb: Large 38.86056
## 27937          Fairfax County     51059     21-Suburb: Large 38.84506
## 27942        Jefferson County      1073     21-Suburb: Large 33.47452
## 27946        Jefferson County      1073     21-Suburb: Large 33.49119
## 27977            Davis County     49011     21-Suburb: Large 41.05011
## 27998           Solano County      6095    12-City: Mid-size 38.26785
## 28085        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28086        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28087        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28089        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28090        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28091        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28093        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28095        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28101        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28107          Chisago County     27025     32-Town: Distant 45.38195
## 28120         Sangamon County     17167    12-City: Mid-size 39.82328
## 28198        Sherburne County     27141     21-Suburb: Large 45.31222
## 28202          Sanpete County     49039    42-Rural: Distant 39.63148
## 28204        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28205           Ramsey County     27123     21-Suburb: Large 45.00405
## 28209        Tom Green County     48451    42-Rural: Distant 31.66791
## 28211        Tom Green County     48451     41-Rural: Fringe 31.39103
## 28213           Concho County     48095     43-Rural: Remote 31.50387
## 28230         Maricopa County      4013       11-City: Large 33.44903
## 28248        Salt Lake County     49035     21-Suburb: Large 40.62304
## 28304          Fairfax County     51059     21-Suburb: Large 38.86218
## 28335        Jefferson County      1073    12-City: Mid-size 33.50510
## 28336        Jefferson County      1073    12-City: Mid-size 33.50510
## 28338        Arlington County     51013    12-City: Mid-size 38.88668
## 28339            Davis County     49011     21-Suburb: Large 41.02849
## 28340      Los Angeles County      6037     21-Suburb: Large 33.89552
## 28341           Martin County     12085     21-Suburb: Large 27.19642
## 28346            Macon County     29121      33-Town: Remote 39.73462
## 28348    Santa Barbara County      6083    12-City: Mid-size 34.94617
## 28354             Leon County     12073    12-City: Mid-size 30.41326
## 28400      Los Angeles County      6037     21-Suburb: Large 33.97924
## 28432     St. Francois County     29187     32-Town: Distant 37.77370
## 28445            Davis County     49011     21-Suburb: Large 40.97782
## 28450            Davis County     49011     21-Suburb: Large 40.97757
## 28454     St. Francois County     29187     32-Town: Distant 37.77369
## 28472            Weber County     49057     21-Suburb: Large 41.30753
## 28475             Will County     17197     21-Suburb: Large 41.53096
## 28508            Cache County     49005       13-City: Small 41.75827
## 28547          Fayette County     54019     23-Suburb: Small 37.98862
## 28574         Maricopa County      4013       11-City: Large 33.55453
## 28579          Alachua County     12001    12-City: Mid-size 29.68463
## 28585             Rice County     27131     32-Town: Distant 44.28568
## 28606         Sangamon County     17167    12-City: Mid-size 39.78997
## 28628        Milwaukee County     55079       11-City: Large 43.07012
## 28659       Otter Tail County     27111      33-Town: Remote 46.28802
## 28660       Otter Tail County     27111      33-Town: Remote 46.28849
## 28661       Otter Tail County     27111      33-Town: Remote 46.28849
## 28730            Emery County     49015    42-Rural: Distant 39.09133
## 28754             Iron County     49021      33-Town: Remote 37.71315
## 28781             Cook County     17031     21-Suburb: Large 41.62211
## 28791        Box Elder County     49003    42-Rural: Distant 41.81513
## 28830         Fillmore County     27045     43-Rural: Remote 43.55272
## 28842          Millard County     49027     43-Rural: Remote 38.95912
## 28843          Millard County     49027     43-Rural: Remote 38.95915
## 28921            Mower County     27099    42-Rural: Distant 43.56566
## 28922         Freeborn County     27047    42-Rural: Distant 43.67312
## 28932           Wilson County     48493     41-Rural: Fringe 29.15300
## 28933           Wilson County     48493     41-Rural: Fringe 29.15300
## 28989            Pasco County     12101     21-Suburb: Large 28.33329
## 28991          Jackson County     17077      31-Town: Fringe 37.76411
## 28994    San Francisco County      6075       11-City: Large 37.77716
## 28995        San Mateo County      6081     21-Suburb: Large 37.62757
## 28996    San Francisco County      6075       11-City: Large 37.77717
## 29010          Flagler County     12035     21-Suburb: Large 29.47195
## 29013         Coconino County      4005       13-City: Small 35.23806
## 29016         Coconino County      4005       13-City: Small 35.21354
## 29022           Sawyer County     55113     43-Rural: Remote 45.65658
## 29026          Daggett County     49009     43-Rural: Remote 40.93062
## 29100          Kendall County     17093     21-Suburb: Large 41.66585
## 29101          Carroll County     24013     41-Rural: Fringe 39.53484
## 29105            Mower County     27099    42-Rural: Distant 43.50914
## 29128        St. Louis County     27137     43-Rural: Remote 46.93025
## 29178       Lauderdale County      1077       13-City: Small 34.79673
## 29195            Pinal County      4021      31-Town: Fringe 33.02868
## 29207           Wilson County     48493     32-Town: Distant 29.13740
## 29208         Gonzales County     48177     43-Rural: Remote 29.26741
## 29216            Duval County     12031       11-City: Large 30.20043
## 29218            Duval County     12031       11-City: Large 30.20078
## 29230        Riverside County      6065     21-Suburb: Large 33.93214
## 29251           Tehama County      6103     43-Rural: Remote 39.92144
## 29300            Floyd County     48153     32-Town: Distant 33.97903
## 29311           Orange County     12095       11-City: Large 28.51897
## 29318          Olmsted County     27109     32-Town: Distant 43.85344
## 29395       Bernalillo County     35001     21-Suburb: Large 35.12011
## 29398         Tuolumne County      6109     32-Town: Distant 37.97474
## 29406             Utah County     49049       13-City: Small 40.31388
## 29407        Box Elder County     49003     21-Suburb: Large 41.52754
## 29410         Maricopa County      4013    12-City: Mid-size 33.77625
## 29411         Maricopa County      4013    12-City: Mid-size 33.77701
## 29422             Utah County     49049     21-Suburb: Large 40.04800
## 29423        Salt Lake County     49035     21-Suburb: Large 40.50117
## 29428             Utah County     49049     21-Suburb: Large 40.38225
## 29527       Palm Beach County     12099    12-City: Mid-size 26.65413
## 29546           Monroe County     18105     41-Rural: Fringe 39.24788
## 29569            Roanoke city     51770       13-City: Small 37.28747
## 29587             Will County     17197     21-Suburb: Large 41.54804
## 29596            Butte County      6007    42-Rural: Distant 39.88466
## 29652         Siskiyou County      6093     43-Rural: Remote 41.25926
## 29669             Lake County     17097     21-Suburb: Large 42.30190
## 29702           Harris County     48201     21-Suburb: Large 29.79730
## 29757        Salt Lake County     49035     21-Suburb: Large 40.49559
## 29795           Mohave County      4015      33-Town: Remote 34.99636
## 29818           Sonoma County      6097    42-Rural: Distant 38.55658
## 29871           Placer County      6061      31-Town: Fringe 38.90653
## 29882       Washington County     49053       13-City: Small 37.10229
## 29937          Sanpete County     49039     43-Rural: Remote 39.62633
## 29939         Maricopa County      4013     21-Suburb: Large 33.62386
## 29953         Maricopa County      4013     21-Suburb: Large 33.61490
## 29977            Essex County     34013       11-City: Large 40.73859
## 30024        Salt Lake County     49035     21-Suburb: Large 40.64084
## 30028             Utah County     49049     21-Suburb: Large 40.42876
## 30029        Salt Lake County     49035     21-Suburb: Large 40.60324
## 30031            Dodge County     55027    42-Rural: Distant 43.56760
## 30058            Davis County     49011     21-Suburb: Large 40.85340
## 30153           Camden County     34007       13-City: Small 39.94374
## 30256         Hernando County     12053  22-Suburb: Mid-size 28.48165
## 30260          Hubbard County     27057     41-Rural: Fringe 46.92526
## 30325         Franklin County      1059    42-Rural: Distant 34.47442
## 30333         Franklin County     12037     41-Rural: Fringe 29.74358
## 30347             Utah County     49049     41-Rural: Fringe 40.29644
## 30349          Norfolk County     25021     21-Suburb: Large 42.09164
## 30489          Yavapai County      4025     23-Suburb: Small 34.58119
## 30490         Maricopa County      4013       11-City: Large 33.57110
## 30502             Utah County     49049    12-City: Mid-size 40.22906
## 30505        Salt Lake County     49035    12-City: Mid-size 40.76232
## 30521         Franklin County     12037     41-Rural: Fringe 29.74358
## 30590             Kent County     10001  22-Suburb: Mid-size 39.11616
## 30609             Kane County     17089     21-Suburb: Large 41.75785
## 30616           Upshur County     54097      33-Town: Remote 39.00159
## 30721         Maricopa County      4013       11-City: Large 33.63393
## 30723         Maricopa County      4013       11-City: Large 33.63393
## 30781           Camden County     34007       13-City: Small 39.92843
## 30783             Utah County     49049    12-City: Mid-size 40.24691
## 30784             Utah County     49049     41-Rural: Fringe 40.30454
## 30787            Weber County     49057     21-Suburb: Large 41.16232
## 30788             Utah County     49049     21-Suburb: Large 40.42002
## 30849             Lake County     17097     41-Rural: Fringe 42.28294
## 30870            Weber County     49057     21-Suburb: Large 41.29310
## 30872      Santa Clara County      6085    12-City: Mid-size 37.35374
## 30875             Lake County     17097     41-Rural: Fringe 42.28231
## 30876             Lake County     17097     41-Rural: Fringe 42.28291
## 30886            Davis County     49011     21-Suburb: Large 41.15011
## 30900           Shasta County      6089    42-Rural: Distant 40.70840
## 30920      Southampton County     51175     41-Rural: Fringe 36.70316
## 30928           Fresno County      6019       11-City: Large 36.76722
## 30929           Fresno County      6019       11-City: Large 36.73571
## 30933           Fresno County      6019       11-City: Large 36.81031
## 30957         Maricopa County      4013       11-City: Large 33.42900
## 31043             Utah County     49049     41-Rural: Fringe 40.33416
## 31107             Kern County      6029     21-Suburb: Large 35.37903
## 31115             Leon County     12073     41-Rural: Fringe 30.38472
## 31168           Fresno County      6019       11-City: Large 36.77889
## 31197         Callaway County     29027     32-Town: Distant 38.84616
## 31223             Pima County      4019       11-City: Large 32.20010
## 31250             Kane County     17089     21-Suburb: Large 41.73357
## 31252           Lavaca County     48285     32-Town: Distant 29.28965
## 31298              Nye County     32023     43-Rural: Remote 38.85935
## 31299              Nye County     32023     43-Rural: Remote 38.85935
## 31314           Etowah County      1055       13-City: Small 34.01396
## 31327          Gadsden County     12039      31-Town: Fringe 30.57762
## 31328          Gadsden County     12039      31-Town: Fringe 30.57762
## 31357             Hall County     13139       13-City: Small 34.31917
## 31388       Jo Daviess County     17085      31-Town: Fringe 42.42737
## 31390       Jo Daviess County     17085      31-Town: Fringe 42.42802
## 31395       Jo Daviess County     17085      31-Town: Fringe 42.42556
## 31463        Galveston County     48167     21-Suburb: Large 29.52717
## 31464        Galveston County     48167     41-Rural: Fringe 29.42710
## 31465        Galveston County     48167  22-Suburb: Mid-size 29.38190
## 31467        Galveston County     48167      31-Town: Fringe 29.28077
## 31559       Burlington County     34005     21-Suburb: Large 40.15953
## 31645         Humboldt County      6023    42-Rural: Distant 40.76144
## 31699        Box Elder County     49003     32-Town: Distant 41.74379
## 31709          Kanawha County     54039       13-City: Small 38.35110
## 31733          Passaic County     34031     21-Suburb: Large 40.90943
## 31740          Millard County     49027     43-Rural: Remote 39.10884
## 31751          Millard County     49027     43-Rural: Remote 38.93467
## 31829        Riverside County      6065       11-City: Large 33.90675
## 31831     Spotsylvania County     51177     41-Rural: Fringe 38.20305
## 31845        Riverside County      6065       11-City: Large 33.97145
## 31850         Maricopa County      4013       11-City: Large 33.44933
## 31852          Johnson County     29101     32-Town: Distant 38.76156
## 31883             Iron County     49021      33-Town: Remote 37.74716
## 31888             Lake County     17097     21-Suburb: Large 42.44590
## 31910          Alameda County      6001       11-City: Large 37.79654
## 31941             Lake County     17097     21-Suburb: Large 42.39486
## 31942             Lake County     17097     21-Suburb: Large 42.36711
## 31957         Siskiyou County      6093    42-Rural: Distant 41.52017
## 31968        Salt Lake County     49035     21-Suburb: Large 40.70459
## 31973          Brevard County     12009     21-Suburb: Large 28.24822
## 31989         Maricopa County      4013       11-City: Large 33.44618
## 32006          Fayette County     54019     41-Rural: Fringe 37.88546
## 32010          Henrico County     51087     21-Suburb: Large 37.54418
## 32014       Sacramento County      6067       13-City: Small 38.59247
## 32036          Henrico County     51087     21-Suburb: Large 37.51702
## 32054         Maricopa County      4013       11-City: Large 33.46540
## 32060          Conecuh County      1035     41-Rural: Fringe 31.43601
## 32081           Geneva County      1061     32-Town: Distant 31.04877
## 32082             Utah County     49049       13-City: Small 40.30358
## 32142           George County     28039     32-Town: Distant 30.92047
## 32176         Maricopa County      4013       11-City: Large 33.39267
## 32179           Mobile County      1097     41-Rural: Fringe 30.50465
## 32273            Union County     34039     21-Suburb: Large 40.66210
## 32297           Navajo County      4017      33-Town: Remote 34.50791
## 32298       Washington County     49053     41-Rural: Fringe 37.06974
## 32349            Weber County     49057       13-City: Small 41.21418
## 32366      Westchester County     36119       13-City: Small 41.04860
## 32474          Clinton County     17027     32-Town: Distant 38.55289
## 32573         Greenlee County      4011     43-Rural: Remote 32.72425
## 32574           Graham County      4009     43-Rural: Remote 33.03641
## 32576           Graham County      4009      33-Town: Remote 32.80315
## 32577           Graham County      4009      33-Town: Remote 32.89303
## 32578           Graham County      4009      33-Town: Remote 32.82880
## 32579           Graham County      4009      33-Town: Remote 32.84340
## 32580         Greenlee County      4011      33-Town: Remote 33.04019
## 32581           Graham County      4009     43-Rural: Remote 33.12151
## 32639        Gilchrist County     12041     41-Rural: Fringe 29.61880
## 32640        Gilchrist County     12041     41-Rural: Fringe 29.61880
## 32641        Gilchrist County     12041     41-Rural: Fringe 29.61880
## 32642        Gilchrist County     12041     41-Rural: Fringe 29.61924
## 32651            Giles County     51071     41-Rural: Fringe 37.32846
## 32710      Santa Clara County      6085     23-Suburb: Small 37.01618
## 32733      Los Angeles County      6037       11-City: Large 34.05534
## 32738         Maricopa County      4013       11-City: Large 33.50779
## 32753           Madera County      6039     32-Town: Distant 37.34835
## 32768             Pima County      4019      31-Town: Fringe 32.43299
## 32779       Palm Beach County     12099     32-Town: Distant 26.66788
## 32784           Glades County     12043     32-Town: Distant 26.83073
## 32785           Glades County     12043     32-Town: Distant 26.83073
## 32786           Glades County     12043     32-Town: Distant 26.83075
## 32787           Glades County     12043     41-Rural: Fringe 26.80643
## 32805           Ramsey County     27123     21-Suburb: Large 45.00021
## 32822          Alameda County      6001     21-Suburb: Large 37.53978
## 32879             Lake County     17097     21-Suburb: Large 42.37564
## 32984        Salt Lake County     49035    12-City: Mid-size 40.73757
## 33021            Glenn County      6021     32-Town: Distant 39.51729
## 33083         Maricopa County      4013       11-City: Large 33.53189
## 33104           Catron County     35003     43-Rural: Remote 33.32107
## 33122             Lake County     17097     21-Suburb: Large 42.37629
## 33198     Contra Costa County      6013     21-Suburb: Large 37.87180
## 33228          Kendall County     17093     21-Suburb: Large 41.68453
## 33263      Los Angeles County      6037       11-City: Large 33.98666
## 33281         Tuolumne County      6109     32-Town: Distant 38.01037
## 33292        Salt Lake County     49035     41-Rural: Fringe 40.56498
## 33293     Contra Costa County      6013     21-Suburb: Large 37.98817
## 33317          Alameda County      6001     21-Suburb: Large 37.68784
## 33337          Ventura County      6111    12-City: Mid-size 34.26963
## 33343       Sacramento County      6067     21-Suburb: Large 38.68509
## 33344       Sacramento County      6067     21-Suburb: Large 38.67433
## 33360        Salt Lake County     49035    42-Rural: Distant 40.58870
## 33388             Will County     17197     21-Suburb: Large 41.53825
## 33416            Weber County     49057     21-Suburb: Large 41.16998
## 33473           Mobile County      1097    12-City: Mid-size 30.69005
## 33496          Douglas County     55031     43-Rural: Remote 46.23255
## 33499          Chester County     42029     21-Suburb: Large 39.98240
## 33536      Los Angeles County      6037     41-Rural: Fringe 34.79273
## 33562             Utah County     49049    42-Rural: Distant 39.95399
## 33591            Norfolk city     51710    12-City: Mid-size 36.84942
## 33592        Charlotte County     51037     43-Rural: Remote 37.03500
## 33614          Bedford County     51019     32-Town: Distant 37.32717
## 33620             Yuma County      4027       13-City: Small 32.69921
## 33666   San Bernardino County      6071    12-City: Mid-size 34.02093
## 33701           Jersey County     17083    42-Rural: Distant 38.98638
## 33758            Weber County     49057       13-City: Small 41.24273
## 33804            Grand County     49019      33-Town: Remote 38.56501
## 33805            Grand County     49019      33-Town: Remote 38.56686
## 33829             Mesa County      8077  22-Suburb: Mid-size 39.05658
## 33945        Salt Lake County     49035     21-Suburb: Large 40.69259
## 33950        Salt Lake County     49035     21-Suburb: Large 40.69194
## 33956        Salt Lake County     49035     21-Suburb: Large 40.68811
## 33971        Salt Lake County     49035     21-Suburb: Large 40.70450
## 33973        Salt Lake County     49035     21-Suburb: Large 40.71566
## 33976        Salt Lake County     49035     21-Suburb: Large 40.57389
## 33979        Salt Lake County     49035     21-Suburb: Large 40.71614
## 33994            Grant County     18053     32-Town: Distant 40.48661
## 34050        Salt Lake County     49035     21-Suburb: Large 40.63783
## 34077           Tooele County     49045     32-Town: Distant 40.59611
## 34078           Tooele County     49045     41-Rural: Fringe 40.59110
## 34079           Tooele County     49045     32-Town: Distant 40.59846
## 34124           Nevada County      6057     32-Town: Distant 39.22194
## 34145           Sonoma County      6097     21-Suburb: Large 38.36091
## 34152         Monterey County      6053     41-Rural: Fringe 36.69655
## 34183       Livingston County     17105    42-Rural: Distant 40.87875
## 34190             Lake County     17097     21-Suburb: Large 42.34920
## 34193             Lake County     17097     21-Suburb: Large 42.37625
## 34197          Grayson County     51077     43-Rural: Remote 36.62175
## 34227             Pima County      4019     32-Town: Distant 31.92944
## 34235         Maricopa County      4013     21-Suburb: Large 33.84553
## 34236         Maricopa County      4013     21-Suburb: Large 33.37843
## 34237         Maricopa County      4013     21-Suburb: Large 33.33408
## 34238         Maricopa County      4013     41-Rural: Fringe 33.54146
## 34239         Maricopa County      4013     21-Suburb: Large 33.69496
## 34240         Maricopa County      4013     41-Rural: Fringe 33.27389
## 34241         Maricopa County      4013       11-City: Large 33.61639
## 34242         Maricopa County      4013    12-City: Mid-size 33.62999
## 34243         Maricopa County      4013  22-Suburb: Mid-size 33.46522
## 34244         Maricopa County      4013  22-Suburb: Mid-size 33.46947
## 34245         Maricopa County      4013       11-City: Large 33.48433
## 34246         Maricopa County      4013     21-Suburb: Large 33.37854
## 34247         Maricopa County      4013     21-Suburb: Large 33.33584
## 34248         Maricopa County      4013     41-Rural: Fringe 33.54151
## 34249         Maricopa County      4013     21-Suburb: Large 33.69496
## 34250         Maricopa County      4013     41-Rural: Fringe 33.27389
## 34251         Maricopa County      4013       11-City: Large 33.49453
## 34252         Maricopa County      4013       11-City: Large 33.60991
## 34253         Maricopa County      4013    12-City: Mid-size 33.63437
## 34254         Maricopa County      4013       11-City: Large 33.44685
## 34255         Maricopa County      4013  22-Suburb: Mid-size 33.46947
## 34256         Maricopa County      4013       11-City: Large 33.48418
## 34302       Stanislaus County      6099    12-City: Mid-size 37.68501
## 34303       Stanislaus County      6099     21-Suburb: Large 37.72404
## 34323       Tippecanoe County     18157       13-City: Small 40.42026
## 34329            Hampton city     51650    12-City: Mid-size 37.06274
## 34331        San Diego County      6073     21-Suburb: Large 32.72936
## 34336           Peoria County     17143    12-City: Mid-size 40.69969
## 34341             Cook County     17031     21-Suburb: Large 42.09833
## 34359            Weber County     49057     21-Suburb: Large 41.29329
## 34365             Lake County     17097     21-Suburb: Large 42.32090
## 34369            Cache County     49005     23-Suburb: Small 41.78580
## 34436         Humboldt County      6023     43-Rural: Remote 41.02074
## 34439          Passaic County     34031     41-Rural: Fringe 41.13373
## 34445            Emery County     49015     43-Rural: Remote 39.00009
## 34525       Greenbrier County     54025     32-Town: Distant 37.77615
## 34559           Greene County     51079     41-Rural: Fringe 38.28113
## 34560           Greene County      1063    42-Rural: Distant 32.84736
## 34583           Greene County     18055     32-Town: Distant 39.03474
## 34719            Cache County     49005     23-Suburb: Small 41.77684
## 34743            Weber County     49057     21-Suburb: Large 41.27460
## 34752             Lake County     17097     21-Suburb: Large 42.38696
## 34754          McHenry County     17111     41-Rural: Fringe 42.39374
## 34797             Utah County     49049     21-Suburb: Large 40.37234
## 34855        Jefferson Parish     22051     21-Suburb: Large 29.91533
## 34870           Morris County     34027     21-Suburb: Large 40.83863
## 34968        Box Elder County     49003     43-Rural: Remote 41.70969
## 34969        Box Elder County     49003     43-Rural: Remote 41.70969
## 34971   San Bernardino County      6071       13-City: Small 34.05364
## 35001             Utah County     49049     21-Suburb: Large 40.37484
## 35040       Sacramento County      6067     21-Suburb: Large 38.56241
## 35065           Ramsey County     27123       11-City: Large 44.92832
## 35069        Guadalupe County     35019      33-Town: Remote 34.90842
## 35075    Santa Barbara County      6083      31-Town: Fringe 34.95808
## 35076        Salt Lake County     49035    12-City: Mid-size 40.79905
## 35077        San Diego County      6073     21-Suburb: Large 33.23007
## 35096      Los Angeles County      6037     21-Suburb: Large 34.57991
## 35134            Pasco County     12101     21-Suburb: Large 28.23453
## 35143             Gulf County     12045     41-Rural: Fringe 29.78755
## 35152       Palm Beach County     12099     21-Suburb: Large 26.48730
## 35167          Sanpete County     49039     41-Rural: Fringe 39.14292
## 35168          Sanpete County     49039     41-Rural: Fringe 39.14267
## 35169          Sanpete County     49039     41-Rural: Fringe 39.13925
## 35252            Davis County     49011     21-Suburb: Large 41.03255
## 35261            Clark County     17023     32-Town: Distant 39.38427
## 35271            Weber County     49057     21-Suburb: Large 41.16233
## 35289             Lake County     17097     21-Suburb: Large 42.41085
## 35294           Harris County     48201     21-Suburb: Large 29.68489
## 35338           Clarke County     13059    12-City: Mid-size 33.95040
## 35339             Pima County      4019       11-City: Large 32.22288
## 35428             Polk County     12105  22-Suburb: Mid-size 28.12016
## 35457             Hale County     48189      33-Town: Remote 34.19360
## 35479          Winston County      1133     41-Rural: Fringe 34.22492
## 35494          Halifax County     51083      33-Town: Remote 36.76191
## 35595            Glenn County      6021     41-Rural: Fringe 39.74634
## 35694         Hamilton County     12047     41-Rural: Fringe 30.47726
## 35695         Hamilton County     12047     41-Rural: Fringe 30.47726
## 35696         Hamilton County     12047     41-Rural: Fringe 30.47726
## 35697         Hamilton County     12047     32-Town: Distant 30.52395
## 35875            Wayne County     49055     43-Rural: Remote 38.37193
## 35962       Santa Cruz County      6087     41-Rural: Fringe 37.02465
## 35972         Maricopa County      4013     21-Suburb: Large 33.71132
## 35973            Pinal County      4021     21-Suburb: Large 33.25952
## 36024           Hardee County     12049     32-Town: Distant 27.55796
## 36025           Hardee County     12049     32-Town: Distant 27.55814
## 36026           Hardee County     12049     32-Town: Distant 27.55812
## 36038           Hardin County     48199    42-Rural: Distant 30.36863
## 36065              Ray County     29177    42-Rural: Distant 39.27231
## 36116       Burlington County     34005      31-Town: Fringe 39.97664
## 36316           Orange County      6059    12-City: Mid-size 33.63220
## 36382           Harris County     48201       11-City: Large 29.68441
## 36383           Harris County     48201     21-Suburb: Large 29.78240
## 36384           Harris County     48201     21-Suburb: Large 30.04768
## 36385           Harris County     48201       11-City: Large 29.68441
## 36402        Box Elder County     49003     32-Town: Distant 41.71759
## 36449         Harrison County     54033     32-Town: Distant 39.31007
## 36458         Harrison County     18061      31-Town: Fringe 38.20287
## 36510            Essex County     34013     21-Suburb: Large 40.84987
## 36557             Yuba County      6115  22-Suburb: Mid-size 39.14893
## 36571        Salt Lake County     49035     21-Suburb: Large 40.66927
## 36588      Los Angeles County      6037     21-Suburb: Large 34.39958
## 36661        Salt Lake County     49035     21-Suburb: Large 40.65707
## 36680         Sangamon County     17167    12-City: Mid-size 39.77065
## 36691          Alameda County      6001       13-City: Small 37.67555
## 36692             Yuma County      4027       13-City: Small 32.69550
## 36693         Maricopa County      4013  22-Suburb: Mid-size 33.45199
## 36694             Yuma County      4027     32-Town: Distant 32.49581
## 36696           Placer County      6061     41-Rural: Fringe 38.87353
## 36699             Utah County     49049     21-Suburb: Large 40.40095
## 36752        St. Johns County     12109    42-Rural: Distant 29.72227
## 36807    San Francisco County      6075       11-City: Large 37.73462
## 36808           Mohave County      4015       13-City: Small 34.45744
## 36809           Mohave County      4015       13-City: Small 34.49726
## 36821         Coconino County      4005       13-City: Small 35.19562
## 36893        Salt Lake County     49035     21-Suburb: Large 40.54346
## 36894        Salt Lake County     49035     21-Suburb: Large 40.58642
## 36966        Salt Lake County     49035    12-City: Mid-size 40.73399
## 36988        Salt Lake County     49035     21-Suburb: Large 40.60512
## 37076         Sangamon County     17167  22-Suburb: Mid-size 39.74361
## 37138        Arlington County     51013    12-City: Mid-size 38.90044
## 37158        Salt Lake County     49035     21-Suburb: Large 40.71566
## 37197         Maricopa County      4013       11-City: Large 33.64494
## 37227        Salt Lake County     49035     21-Suburb: Large 40.62306
## 37243        Frederick County     24021       13-City: Small 39.43797
## 37265          Wasatch County     49051     32-Town: Distant 40.49884
## 37373            Grand County     49019      33-Town: Remote 38.58111
## 37421           Carbon County     49007      33-Town: Remote 39.68932
## 37447        Riverside County      6065     21-Suburb: Large 33.92861
## 37458           Waller County     48473     32-Town: Distant 30.09768
## 37522           Hendry County     12051     32-Town: Distant 26.76140
## 37523           Hendry County     12051     32-Town: Distant 26.76140
## 37542          Henrico County     51087     21-Suburb: Large 37.62966
## 37575            Henry County      1067    42-Rural: Distant 31.56736
## 37581           Graham County      4009      33-Town: Remote 32.80315
## 37638           Camden County     34007       13-City: Small 39.92529
## 37668             Kane County     17089     21-Suburb: Large 41.76355
## 37731       Miami-Dade County     12086     21-Suburb: Large 25.91229
## 37751         Maricopa County      4013       11-City: Large 33.41415
## 37754         Maricopa County      4013       11-City: Large 33.37720
## 37759         Maricopa County      4013     41-Rural: Fringe 33.27737
## 37790         Coconino County      4005     32-Town: Distant 35.25797
## 37795         Maricopa County      4013     41-Rural: Fringe 33.53327
## 37841        San Diego County      6073     21-Suburb: Large 33.13539
## 37866           Jasper County     29097     23-Suburb: Small 37.14017
## 37869            Weber County     49057       13-City: Small 41.25687
## 37871            Davis County     49011     21-Suburb: Large 41.04544
## 37872       Washington County     49053       13-City: Small 37.10867
## 37877            Cache County     49005     23-Suburb: Small 41.67601
## 37892           DeKalb County     17037     21-Suburb: Large 41.64152
## 37932             Pima County      4019     41-Rural: Fringe 32.26655
## 37933      Los Angeles County      6037     21-Suburb: Large 33.86618
## 37934      Los Angeles County      6037     21-Suburb: Large 33.86888
## 37940         Hernando County     12053  22-Suburb: Mid-size 28.56435
## 37941         Hernando County     12053  22-Suburb: Mid-size 28.48347
## 37947         Hernando County     12053  22-Suburb: Mid-size 28.56411
## 37950         Hernando County     12053  22-Suburb: Mid-size 28.56925
## 37951         Hernando County     12053  22-Suburb: Mid-size 28.56850
## 37952         Hernando County     12053  22-Suburb: Mid-size 28.56647
## 37981        Salt Lake County     49035     21-Suburb: Large 40.53455
## 37982        Salt Lake County     49035     21-Suburb: Large 40.51182
## 38055       Miami-Dade County     12086     21-Suburb: Large 25.86560
## 38057       Miami-Dade County     12086     21-Suburb: Large 25.89519
## 38127             Cook County     17031     21-Suburb: Large 42.14293
## 38149          Hidalgo County     48215    12-City: Mid-size 26.24010
## 38151          Hidalgo County     48215       13-City: Small 26.21791
## 38153          Hidalgo County     48215    12-City: Mid-size 26.24014
## 38154          Hidalgo County     48215    12-City: Mid-size 26.24011
## 38160          Hidalgo County     48215     21-Suburb: Large 26.09956
## 38169             Utah County     49049     21-Suburb: Large 40.35451
## 38212           Washoe County     32031    12-City: Mid-size 39.54897
## 38214            Clark County     32003    42-Rural: Distant 36.51729
## 38238           Harris County     48201     21-Suburb: Large 29.84101
## 38251           Harris County     48201       13-City: Small 29.80251
## 38340             Lake County     18089     21-Suburb: Large 41.51190
## 38349        Riverside County      6065     21-Suburb: Large 33.93235
## 38427             Pima County      4019       11-City: Large 32.21534
## 38433        Salt Lake County     49035    12-City: Mid-size 40.72319
## 38453            Weber County     49057       13-City: Small 41.25661
## 38522        Salt Lake County     49035    12-City: Mid-size 40.71079
## 38526         Maricopa County      4013     21-Suburb: Large 33.61351
## 38541             Utah County     49049     21-Suburb: Large 40.42932
## 38560       Sacramento County      6067       11-City: Large 38.63745
## 38561        Highlands County     12055     41-Rural: Fringe 27.50228
## 38562        Highlands County     12055     41-Rural: Fringe 27.50228
## 38596            Bristol city     51520       13-City: Small 36.60052
## 38607        Highlands County     12055     41-Rural: Fringe 27.50228
## 38608        Highlands County     12055     41-Rural: Fringe 27.50133
## 38609        Highlands County     12055     41-Rural: Fringe 27.50228
## 38622            Davis County     49011     21-Suburb: Large 41.12633
## 38626           Harris County     48201       11-City: Large 29.81585
## 38627           Harris County     48201     21-Suburb: Large 29.84101
## 38628           Harris County     48201     21-Suburb: Large 29.65594
## 38629           Harris County     48201     21-Suburb: Large 29.84101
## 38631           Harris County     48201     21-Suburb: Large 29.84101
## 38632           Harris County     48201     21-Suburb: Large 29.84101
## 38688             Hill County     48217     32-Town: Distant 32.01215
## 38690             Hill County     48217    42-Rural: Distant 31.94529
## 38711            Davis County     49011       13-City: Small 41.10818
## 38736          Laclede County     29105      33-Town: Remote 37.68200
## 38787        Salt Lake County     49035     21-Suburb: Large 40.61802
## 38799        Salt Lake County     49035     21-Suburb: Large 40.65461
## 38809             Utah County     49049       13-City: Small 40.27236
## 38810            Cache County     49005       13-City: Small 41.74853
## 38815            Weber County     49057       13-City: Small 41.26131
## 38895     Hillsborough County     12057       11-City: Large 27.94927
## 38916        Salt Lake County     49035     21-Suburb: Large 40.70291
## 38933        San Mateo County      6081       13-City: Small 37.66927
## 38962        Salt Lake County     49035    12-City: Mid-size 40.73101
## 38970        Salt Lake County     49035     21-Suburb: Large 40.67836
## 39085         Maricopa County      4013    12-City: Mid-size 33.48675
## 39089       Miami-Dade County     12086     21-Suburb: Large 25.95797
## 39124             Utah County     49049     21-Suburb: Large 40.14207
## 39138           Hudson County     34017     21-Suburb: Large 40.74523
## 39173        Riverside County      6065     21-Suburb: Large 33.93362
## 39213            Davis County     49011     21-Suburb: Large 40.89178
## 39289       Washington County     28151      33-Town: Remote 33.16937
## 39457           Holmes County     12059     32-Town: Distant 30.79244
## 39458           Holmes County     12059     32-Town: Distant 30.79243
## 39459           Holmes County     12059     32-Town: Distant 30.79244
## 39466            Pinal County      4021     32-Town: Distant 33.05824
## 39480            Davis County     49011       13-City: Small 41.12051
## 39511        Baltimore County     24005       13-City: Small 39.39939
## 39525           Ramsey County     27123       11-City: Large 44.94277
## 39526            Bexar County     48029       11-City: Large 29.53832
## 39534        Jefferson County      1073    12-City: Mid-size 33.51971
## 39535        Jefferson County      1073    12-City: Mid-size 33.51971
## 39536        St. Lucie County     12111     21-Suburb: Large 27.42641
## 39585      Santa Clara County      6085       13-City: Small 37.33624
## 39592            Butte County      6007      31-Town: Fringe 39.75648
## 39600             Cook County     17031     21-Suburb: Large 41.54470
## 39636            Butte County      6007      31-Town: Fringe 39.75162
## 39638         Humboldt County      6023     43-Rural: Remote 40.24211
## 39672            Weber County     49057     21-Suburb: Large 41.16456
## 39677        Berkshire County     25003     41-Rural: Fringe 42.59537
## 39739          Barbour County      1005     32-Town: Distant 31.86799
## 39743          Gadsden County     12039      31-Town: Fringe 30.57977
## 39772          Houston County      1069       13-City: Small 31.25080
## 39775         Maricopa County      4013       11-City: Large 33.42444
## 39777         Maricopa County      4013     21-Suburb: Large 33.63554
## 39778       Providence County     44007     21-Suburb: Large 41.75318
## 39780        San Diego County      6073       11-City: Large 32.76959
## 39781             Cook County     17031       11-City: Large 41.88376
## 39795           Navajo County      4017     41-Rural: Fringe 34.86995
## 39874      Los Angeles County      6037    12-City: Mid-size 34.21039
## 39915            Weber County     49057       13-City: Small 41.24900
## 39933           Placer County      6061     21-Suburb: Large 38.89761
## 39959           Morgan County      1103       13-City: Small 34.60688
## 39961         Maricopa County      4013       11-City: Large 33.29849
## 39962         Maricopa County      4013       11-City: Large 33.29858
## 39976             Utah County     49049     21-Suburb: Large 40.36336
## 39978       Washington County     49053     41-Rural: Fringe 37.10434
## 39979        Salt Lake County     49035     21-Suburb: Large 40.65889
## 39980             Cook County     17031       11-City: Large 41.79542
## 40009        Salt Lake County     49035    12-City: Mid-size 40.74262
## 40025           Marion County     18097     21-Suburb: Large 39.70991
## 40044         Maricopa County      4013     41-Rural: Fringe 33.73301
## 40065         Escambia County     12033     21-Suburb: Large 30.43826
## 40068             Polk County     12105     21-Suburb: Large 27.87614
## 40070          Alachua County     12001    12-City: Mid-size 29.64991
## 40071             Leon County     12073    12-City: Mid-size 30.45113
## 40073          Manatee County     12081     21-Suburb: Large 27.52585
## 40074         Seminole County     12117     21-Suburb: Large 28.73574
## 40075          Broward County     12011    12-City: Mid-size 26.14925
## 40077          Collier County     12021     21-Suburb: Large 26.22072
## 40078         Pinellas County     12103    12-City: Mid-size 27.97215
## 40079           Collin County     48085       11-City: Large 33.01844
## 40081          Osceola County     12097     21-Suburb: Large 28.29891
## 40138        Chickasaw County     28017      33-Town: Remote 33.88869
## 40145          Houston County      1069       13-City: Small 31.22775
## 40146          Houston County      1069       13-City: Small 31.22592
## 40243           McLeod County     27085    42-Rural: Distant 44.96826
## 40253        Salt Lake County     49035     21-Suburb: Large 40.67704
## 40255          Lincoln Parish     22061     32-Town: Distant 32.51893
## 40354             Cook County     17031     21-Suburb: Large 42.11437
## 40383           Hudson County     34017     21-Suburb: Large 40.78507
## 40402            Pasco County     12101     21-Suburb: Large 28.36732
## 40421           Hudson County     34017     21-Suburb: Large 40.80144
## 40449             Will County     17197     21-Suburb: Large 41.54299
## 40520         Maricopa County      4013    12-City: Mid-size 33.40704
## 40521         Maricopa County      4013    12-City: Mid-size 33.40696
## 40522         Maricopa County      4013       11-City: Large 33.51324
## 40534         Humboldt County     32013      33-Town: Remote 40.97815
## 40537         Humboldt County      6023      33-Town: Remote 40.80149
## 40561      San Joaquin County      6077       11-City: Large 38.01011
## 40592        Salt Lake County     49035     21-Suburb: Large 40.67865
## 40595        Salt Lake County     49035     21-Suburb: Large 40.68879
## 40598        Salt Lake County     49035     21-Suburb: Large 40.67611
## 40657            Emery County     49015    42-Rural: Distant 39.32775
## 40730       Washington County     49053      31-Town: Fringe 37.17474
## 40732       Washington County     49053      31-Town: Fringe 37.15465
## 40733       Washington County     49053      31-Town: Fringe 37.18284
## 40735       Washington County     49053      31-Town: Fringe 37.17401
## 40762           McLeod County     27085     32-Town: Distant 44.87901
## 40763           McLeod County     27085     32-Town: Distant 44.88444
## 40789          Trinity County      6105     43-Rural: Remote 40.61785
## 40808             Lake County     17097     21-Suburb: Large 42.36563
## 40832           Washoe County     32031    12-City: Mid-size 39.51108
## 40851           Tooele County     49045     43-Rural: Remote 40.03667
## 40918       Clearwater County     16035     43-Rural: Remote 46.49811
## 41002          Flagler County     12035     21-Suburb: Large 29.47179
## 41005           Dakota County     27037     21-Suburb: Large 44.83259
## 41020             Cook County     17031       11-City: Large 41.84596
## 41021             Cook County     17031       11-City: Large 41.84596
## 41034      Los Angeles County      6037     41-Rural: Fringe 34.49284
## 41035      Los Angeles County      6037     21-Suburb: Large 34.67109
## 41036      Los Angeles County      6037     41-Rural: Fringe 34.49284
## 41038         Sangamon County     17167    12-City: Mid-size 39.78364
## 41053             Kane County     17089     21-Suburb: Large 41.78665
## 41054             Kane County     17089    12-City: Mid-size 42.04988
## 41097         Maricopa County      4013  22-Suburb: Mid-size 33.44255
## 41098         Maricopa County      4013  22-Suburb: Mid-size 33.44255
## 41099         Maricopa County      4013       11-City: Large 33.65152
## 41100         Maricopa County      4013       11-City: Large 33.51091
## 41101         Maricopa County      4013       11-City: Large 33.51076
## 41109            Pinal County      4021     41-Rural: Fringe 32.98907
## 41110         Maricopa County      4013       11-City: Large 33.56613
## 41111         Maricopa County      4013       11-City: Large 33.56571
## 41112         Maricopa County      4013       11-City: Large 33.46724
## 41113         Maricopa County      4013       11-City: Large 33.46712
## 41114         Maricopa County      4013       11-City: Large 33.39218
## 41115         Maricopa County      4013       11-City: Large 33.39224
## 41123            Pinal County      4021     41-Rural: Fringe 32.98886
## 41124            Pinal County      4021     21-Suburb: Large 33.39963
## 41125         Maricopa County      4013     21-Suburb: Large 33.61915
## 41126         Maricopa County      4013     21-Suburb: Large 33.59339
## 41139            Pinal County      4021     21-Suburb: Large 33.39965
## 41140         Maricopa County      4013     21-Suburb: Large 33.61915
## 41141         Maricopa County      4013    12-City: Mid-size 33.39423
## 41142         Maricopa County      4013     21-Suburb: Large 33.31283
## 41143         Maricopa County      4013     21-Suburb: Large 33.31272
## 41146       Miami-Dade County     12086     21-Suburb: Large 25.83930
## 41186         Imperial County      6025       13-City: Small 32.79150
## 41198         Maricopa County      4013  22-Suburb: Mid-size 33.45526
## 41241             Utah County     49049    12-City: Mid-size 40.24267
## 41257             Elko County     32007     41-Rural: Fringe 40.88057
## 41277   Prince William County     51153     41-Rural: Fringe 38.62973
## 41301           DeKalb County     17037    42-Rural: Distant 41.76589
## 41307           DeKalb County     17037    42-Rural: Distant 41.76323
## 41310           DeKalb County     17037    42-Rural: Distant 41.77093
## 41316        El Dorado County      6017    42-Rural: Distant 38.58116
## 41331      Los Angeles County      6037  22-Suburb: Mid-size 34.15116
## 41342        Salt Lake County     49035     21-Suburb: Large 40.54934
## 41344        Salt Lake County     49035    12-City: Mid-size 40.74005
## 41395     Indian River County     12061       13-City: Small 27.64498
## 41402           Shasta County      6089     43-Rural: Remote 41.01605
## 41486          Alameda County      6001       11-City: Large 37.77522
## 41488     Contra Costa County      6013     21-Suburb: Large 37.81244
## 41542   San Bernardino County      6071     21-Suburb: Large 34.00901
## 41545       Palm Beach County     12099     21-Suburb: Large 26.78611
## 41574        Salt Lake County     49035    12-City: Mid-size 40.73473
## 41577        Salt Lake County     49035    12-City: Mid-size 40.73452
## 41599         Oklahoma County     40109     21-Suburb: Large 35.45361
## 41600         Oklahoma County     40109     21-Suburb: Large 35.45361
## 41607      Los Angeles County      6037    42-Rural: Distant 34.47292
## 41608             Kern County      6029    42-Rural: Distant 35.05407
## 41609        San Diego County      6073     41-Rural: Fringe 32.78206
## 41611           Sutter County      6101    42-Rural: Distant 39.06294
## 41612           Fresno County      6019       11-City: Large 36.83864
## 41616           Harris County     48201       11-City: Large 29.64042
## 41626       Miami-Dade County     12086       13-City: Small 25.69809
## 41629            Cache County     49005     23-Suburb: Small 41.76447
## 41633       New London County      9011       13-City: Small 41.51133
## 41637         Maricopa County      4013    12-City: Mid-size 33.45783
## 41640         Maricopa County      4013     21-Suburb: Large 33.33301
## 41641         Maricopa County      4013       11-City: Large 33.58076
## 41642         Maricopa County      4013       11-City: Large 33.63967
## 41643         Maricopa County      4013     21-Suburb: Large 33.61104
## 41644           Wright County     27171      31-Town: Fringe 45.30052
## 41652          Fairfax County     51059     21-Suburb: Large 38.86477
## 41685         Maricopa County      4013       11-City: Large 33.51312
## 41686         Maricopa County      4013    12-City: Mid-size 33.40707
## 41704      Los Angeles County      6037     21-Suburb: Large 34.05097
## 41716         Monterey County      6053  22-Suburb: Mid-size 36.61265
## 41719       Miami-Dade County     12086       11-City: Large 25.76509
## 41720       Miami-Dade County     12086       11-City: Large 25.76504
## 41725       Miami-Dade County     12086       11-City: Large 25.76509
## 41735             Cook County     17031       11-City: Large 41.93932
## 41753             Inyo County      6027      33-Town: Remote 37.36073
## 41792            Butte County      6007     32-Town: Distant 39.51331
## 41847             Iron County     49021      33-Town: Remote 37.66869
## 41854             Iron County     49021      33-Town: Remote 37.68180
## 41907            Henry County     17073     32-Town: Distant 41.24194
## 42016         Hennepin County     27053       13-City: Small 45.04491
## 42029             Will County     17197     21-Suburb: Large 41.53787
## 42040       Burlington County     34005      31-Town: Fringe 39.97625
## 42054             Yuma County      4027       13-City: Small 32.68575
## 42062          Henrico County     51087     21-Suburb: Large 37.54418
## 42121 East Baton Rouge Parish     22033    12-City: Mid-size 30.47772
## 42142        Salt Lake County     49035     21-Suburb: Large 40.59323
## 42154        Sherburne County     27141     21-Suburb: Large 45.31219
## 42157        Sherburne County     27141     21-Suburb: Large 45.31216
## 42173          Volusia County     12127  22-Suburb: Mid-size 28.97794
## 42180          Ventura County      6111  22-Suburb: Mid-size 34.29475
## 42183            Henry County     17073     32-Town: Distant 41.25337
## 42252          Hidalgo County     48215    12-City: Mid-size 26.17496
## 42338            Kings County      6031       13-City: Small 36.33099
## 42388            Pinal County      4021     21-Suburb: Large 33.22156
## 42409          Rapides Parish     22079       13-City: Small 31.28950
## 42424        Hampshire County     54027    42-Rural: Distant 39.30308
## 42429          Wasatch County     49051     32-Town: Distant 40.51475
## 42448             Lake County     17097     21-Suburb: Large 42.39492
## 42485             Pima County      4019     41-Rural: Fringe 31.91336
## 42490        Salt Lake County     49035     21-Suburb: Large 40.69027
## 42495             Elko County     32007     43-Rural: Remote 41.98237
## 42523          Jackson County     18071     32-Town: Distant 38.87452
## 42525          Jackson County     55053     32-Town: Distant 44.30531
## 42526          Jackson County      1071    42-Rural: Distant 34.73048
## 42636        Alleghany County     51005     41-Rural: Fringe 37.81127
## 42637        Alleghany County     51005    42-Rural: Distant 37.78813
## 42644       Miami-Dade County     12086       11-City: Large 25.79076
## 42652          Jackson County     12063     32-Town: Distant 30.77639
## 42653          Jackson County     12063     32-Town: Distant 30.77639
## 42654          Jackson County     12063     32-Town: Distant 30.77625
## 42661            Perry County     17145     32-Town: Distant 38.00918
## 42704             Gila County      4007      33-Town: Remote 33.39241
## 42705           Graham County      4009      33-Town: Remote 32.83396
## 42706         Greenlee County      4011     41-Rural: Fringe 33.03765
## 42707         Maricopa County      4013       11-City: Large 33.44860
## 42708       Santa Cruz County      4023      33-Town: Remote 31.35562
## 42803        Salt Lake County     49035     21-Suburb: Large 40.67595
## 42845          Kanawha County     54039     41-Rural: Fringe 38.37470
## 42911         Maricopa County      4013    12-City: Mid-size 33.36984
## 42913            Weber County     49057       13-City: Small 41.21968
## 42961         Berkeley County     54003  22-Suburb: Mid-size 39.53287
## 42992            Pasco County     12101     21-Suburb: Large 28.19289
## 43046             Mono County      6051      33-Town: Remote 37.63891
## 43053         Sangamon County     17167    12-City: Mid-size 39.81335
## 43163        Nez Perce County     16069     41-Rural: Fringe 46.36523
## 43164           Canyon County     16027  22-Suburb: Mid-size 43.59966
## 43165          Fremont County     16043     41-Rural: Fringe 43.96916
## 43181        Salt Lake County     49035     21-Suburb: Large 40.70034
## 43220            Davis County     49011     41-Rural: Fringe 41.01157
## 43239        Jefferson County     48245    12-City: Mid-size 30.07907
## 43244        Jefferson County     48245  22-Suburb: Mid-size 30.00055
## 43245        Jefferson County     48245  22-Suburb: Mid-size 30.00055
## 43248        Jefferson County     12065    42-Rural: Distant 30.54470
## 43249        Jefferson County     28063     43-Rural: Remote 31.69830
## 43250        Jefferson County      1073     21-Suburb: Large 33.44639
## 43251        Jefferson County      1073     21-Suburb: Large 33.60577
## 43253        Jefferson County     12065    42-Rural: Distant 30.54198
## 43302           Bureau County     17011     32-Town: Distant 41.37744
## 43366       San Benito County      6069     43-Rural: Remote 36.51061
## 43500         Sangamon County     17167  22-Suburb: Mid-size 39.76078
## 43509         Maricopa County      4013       11-City: Large 33.63593
## 43531        Jefferson County     12065    42-Rural: Distant 30.54464
## 43532        Jefferson County     12065    42-Rural: Distant 30.54464
## 43533        Jefferson County     12065    42-Rural: Distant 30.54476
## 43564          Chilton County      1021    42-Rural: Distant 32.98446
## 43637           Summit County     49043     41-Rural: Fringe 40.75402
## 43638           Summit County     49043     41-Rural: Fringe 40.75336
## 43667           Jersey County     17083     32-Town: Distant 39.12575
## 43668           Jersey County     17083     32-Town: Distant 39.11034
## 43673           Jersey County     17083     32-Town: Distant 39.12231
## 43674           Jersey County     17083     32-Town: Distant 39.11528
## 43786             Hood County     48221     41-Rural: Fringe 32.44746
## 43794             Inyo County      6027      33-Town: Remote 37.36035
## 43800        Salt Lake County     49035     21-Suburb: Large 40.63554
## 43833       Montgomery County     48339     41-Rural: Fringe 30.39196
## 43839            Bexar County     48029       11-City: Large 29.43681
## 43840           Harris County     48201     21-Suburb: Large 30.00791
## 43841           Harris County     48201     21-Suburb: Large 29.65469
## 43843          Hidalgo County     48215       13-City: Small 26.28818
## 43858          Madison County     12079     43-Rural: Remote 30.45441
## 43909        Salt Lake County     49035     21-Suburb: Large 40.60429
## 43914      San Joaquin County      6077     41-Rural: Fringe 37.89148
## 43941           Placer County      6061    12-City: Mid-size 38.75374
## 43942        El Dorado County      6017     21-Suburb: Large 38.64766
## 43943           Placer County      6061     21-Suburb: Large 38.88161
## 43945        Riverside County      6065     21-Suburb: Large 33.68007
## 44002            Dodge County     55027     32-Town: Distant 43.62082
## 44016        Salt Lake County     49035     21-Suburb: Large 40.67851
## 44041          Hancock County     54029     41-Rural: Fringe 40.53258
## 44043        McCormick County     45065     43-Rural: Remote 33.95590
## 44151        Salt Lake County     49035     21-Suburb: Large 40.67300
## 44166           Orange County      6059     21-Suburb: Large 33.74204
## 44189             Kane County     17089     21-Suburb: Large 41.74164
## 44227             Utah County     49049     21-Suburb: Large 40.36535
## 44236     Contra Costa County      6013     21-Suburb: Large 37.91289
## 44246       Palm Beach County     12099     21-Suburb: Large 26.63015
## 44271     Spotsylvania County     51177     41-Rural: Fringe 38.15561
## 44319         Marshall County     54051     23-Suburb: Small 39.94163
## 44347           Nevada County      6057     32-Town: Distant 39.24857
## 44393         Seminole County     12117       13-City: Small 28.75779
## 44425             Lake County     17097     21-Suburb: Large 42.39858
## 44435           DuPage County     17043     21-Suburb: Large 41.85361
## 44557          Johnson County     48251     21-Suburb: Large 32.52590
## 44649        San Diego County      6073     21-Suburb: Large 33.15592
## 44763        Salt Lake County     49035     21-Suburb: Large 40.52062
## 44764        Salt Lake County     49035     21-Suburb: Large 40.58340
## 44766         Maricopa County      4013     21-Suburb: Large 33.35293
## 44768            Scott County     27139      31-Town: Fringe 44.65844
## 44778        Salt Lake County     49035     21-Suburb: Large 40.57405
## 44781        Salt Lake County     49035     21-Suburb: Large 40.59006
## 44786        Salt Lake County     49035     21-Suburb: Large 40.57398
## 44791        Salt Lake County     49035     21-Suburb: Large 40.61486
## 44829           Manassas city     51683     21-Suburb: Large 38.74745
## 44955         Atascosa County     48013     32-Town: Distant 28.92110
## 44961           Orange County      6059     21-Suburb: Large 33.55484
## 44993             Juab County     49023     32-Town: Distant 39.72080
## 44994             Juab County     49023     32-Town: Distant 39.72008
## 44995        San Diego County      6073    42-Rural: Distant 33.25550
## 45101        San Diego County      6073    42-Rural: Distant 33.07879
## 45145         Siskiyou County      6093     43-Rural: Remote 41.39216
## 45174           Lassen County      6035     43-Rural: Remote 40.83879
## 45183       Palm Beach County     12099       13-City: Small 26.92724
## 45188        Riverside County      6065     21-Suburb: Large 34.00333
## 45207          Ventura County      6111  22-Suburb: Mid-size 34.27651
## 45226        Champaign County     17019       13-City: Small 40.11017
## 45241       Burlington County     34005     21-Suburb: Large 40.13706
## 45243           Dallas County     48113       11-City: Large 32.77158
## 45244           Harris County     48201       11-City: Large 29.68441
## 45245          Johnson County     48251      31-Town: Fringe 32.34607
## 45247          Johnson County     48251      31-Town: Fringe 32.42738
## 45249       St. Joseph County     18141    12-City: Mid-size 41.66400
## 45252             Clay County     29047     21-Suburb: Large 39.23820
## 45255       Burlington County     34005     21-Suburb: Large 40.13706
## 45256       Burlington County     34005     21-Suburb: Large 40.13737
## 45259         Hamilton County     18057     21-Suburb: Large 40.05175
## 45260             Webb County     48479       11-City: Large 27.57188
## 45266             Kane County     17089     21-Suburb: Large 41.75202
## 45314        Salt Lake County     49035     21-Suburb: Large 40.72338
## 45316           Solano County      6095     23-Suburb: Small 38.35228
## 45322         Maricopa County      4013     21-Suburb: Large 33.34048
## 45323         Maricopa County      4013     21-Suburb: Large 33.35059
## 45324         Maricopa County      4013       11-City: Large 33.53986
## 45325         Maricopa County      4013       11-City: Large 33.37353
## 45326         Maricopa County      4013       11-City: Large 33.39210
## 45327         Maricopa County      4013       11-City: Large 33.46616
## 45328         Maricopa County      4013       11-City: Large 33.45054
## 45351           Wright County     27171     41-Rural: Fringe 45.25997
## 45383             Kane County     49025      33-Town: Remote 37.03855
## 45384             Kane County     49025     41-Rural: Fringe 37.03688
## 45385             Kane County     49025      33-Town: Remote 37.04968
## 45389           Harris County     48201       11-City: Large 29.66593
## 45393             Kane County     49025      33-Town: Remote 37.03590
## 45401            Weber County     49057     41-Rural: Fringe 41.20820
## 45449             Utah County     49049     21-Suburb: Large 40.32744
## 45467           Sonoma County      6097    42-Rural: Distant 38.65679
## 45549        Salt Lake County     49035     21-Suburb: Large 40.50726
## 45550        San Diego County      6073       11-City: Large 32.80148
## 45558            Davis County     49011     21-Suburb: Large 41.03273
## 45562            Davis County     49011     21-Suburb: Large 41.02852
## 45563            Davis County     49011     21-Suburb: Large 41.03561
## 45566           Fresno County      6019     32-Town: Distant 36.59190
## 45568           Wilson County     48493     41-Rural: Fringe 29.15300
## 45591        Salt Lake County     49035     21-Suburb: Large 40.64995
## 45592        Salt Lake County     49035     21-Suburb: Large 40.65591
## 45646        San Diego County      6073       11-City: Large 32.71298
## 45706         Maricopa County      4013       11-City: Large 33.43182
## 45803           Washoe County     32031    12-City: Mid-size 39.44853
## 45907            Weber County     49057       13-City: Small 41.25106
## 45918           Tucker County     54093     43-Rural: Remote 39.14920
## 45946          Kenosha County     55059  22-Suburb: Mid-size 42.58909
## 46044           Sonoma County      6097     21-Suburb: Large 38.41557
## 46105             Kern County      6029     32-Town: Distant 35.05314
## 46107             Kern County      6029       11-City: Large 35.34934
## 46166            Henry County     17073     32-Town: Distant 41.24489
## 46187           Monroe County     12087      33-Town: Remote 24.58381
## 46203       Miami-Dade County     12086     21-Suburb: Large 25.45133
## 46226         Maricopa County      4013       11-City: Large 33.29565
## 46233         Maricopa County      4013       11-City: Large 33.47610
## 46234             Pima County      4019     21-Suburb: Large 32.27672
## 46289             Bell County     48027    12-City: Mid-size 31.11439
## 46375           Orange County      6059     21-Suburb: Large 33.67632
## 46430            Davis County     49011     21-Suburb: Large 41.07524
## 46455           Mohave County      4015      33-Town: Remote 35.22357
## 46456           Mohave County      4015      33-Town: Remote 35.22245
## 46457           Mohave County      4015      33-Town: Remote 35.21854
## 46458           Mohave County      4015      33-Town: Remote 35.22248
## 46468           Fresno County      6019     32-Town: Distant 36.59694
## 46471            Kings County      6031       13-City: Small 36.33091
## 46472            Kings County      6031       13-City: Small 36.30156
## 46473            Kings County      6031       13-City: Small 36.33745
## 46475            Norfolk city     51710    12-City: Mid-size 36.86187
## 46476             Ogle County     17141    42-Rural: Distant 42.00164
## 46492         Duchesne County     49013      33-Town: Remote 40.30557
## 46500            Kings County      6031       13-City: Small 36.32625
## 46501            Kings County      6031       13-City: Small 36.32632
## 46641             Cook County     17031       11-City: Large 41.89162
## 46672             Cook County     17031       11-City: Large 41.79343
## 46673             Cook County     17031       11-City: Large 41.85859
## 46752             Cook County     17031       11-City: Large 41.89426
## 46925        Guadalupe County     48187       13-City: Small 29.65531
## 46926           Harris County     48201     21-Suburb: Large 30.04787
## 46956         Humboldt County      6023    42-Rural: Distant 40.72646
## 46970       Stanislaus County      6099    42-Rural: Distant 37.82056
## 46978        San Diego County      6073     21-Suburb: Large 33.13908
## 47007            Davis County     49011     21-Suburb: Large 41.00012
## 47096             Lake County      6033     32-Town: Distant 38.91492
## 47101           Sevier County     49041     43-Rural: Remote 38.51060
## 47254          Lubbock County     48303       11-City: Large 33.61977
## 47256             Kane County     17089     21-Suburb: Large 41.76017
## 47270           Dallas County     48113     21-Suburb: Large 32.58815
## 47303      Los Angeles County      6037       11-City: Large 34.06393
## 47324      Los Angeles County      6037     21-Suburb: Large 34.20857
## 47326      Los Angeles County      6037     21-Suburb: Large 34.19306
## 47344        San Diego County      6073    12-City: Mid-size 33.10330
## 47427        San Diego County      6073     21-Suburb: Large 33.14307
## 47433             Pima County      4019       11-City: Large 32.24833
## 47434             Pima County      4019       11-City: Large 32.19091
## 47435             Pima County      4019       11-City: Large 32.14976
## 47459      Los Angeles County      6037     21-Suburb: Large 34.01266
## 47466         San Juan County     49037     43-Rural: Remote 38.31286
## 47477          Yavapai County      4025       13-City: Small 34.54284
## 47478           Orange County      6059     21-Suburb: Large 33.61070
## 47498        Mendocino County      6045     41-Rural: Fringe 39.33756
## 47515           Hendry County     12051     32-Town: Distant 26.74881
## 47568           Bureau County     17011     41-Rural: Fringe 41.37821
## 47580          Pickens County      1107     43-Rural: Remote 33.25535
## 47581           DuPage County     17043     21-Suburb: Large 41.75528
## 47583        St. Louis County     29189     21-Suburb: Large 38.65451
## 47603       St. Joseph County     18141    12-City: Mid-size 41.67862
## 47659        Lafayette County     12067     43-Rural: Remote 30.05519
## 47660        Lafayette County     12067     43-Rural: Remote 30.05519
## 47661        Lafayette County     12067     43-Rural: Remote 30.05519
## 47662        Lafayette County     12067     43-Rural: Remote 30.05519
## 47682            Marin County      6041     41-Rural: Fringe 38.19964
## 47693         Monterey County      6053     41-Rural: Fringe 36.77292
## 47730             Lake County     17097     21-Suburb: Large 42.28380
## 47732             Lake County     17097     21-Suburb: Large 42.27529
## 47761             Lake County     17097     21-Suburb: Large 42.35397
## 47770             Lake County     12069  22-Suburb: Mid-size 28.80194
## 47775             Lake County      6033     32-Town: Distant 39.03430
## 47820             Lake County     17097     21-Suburb: Large 42.26448
## 47924        Kandiyohi County     27067      33-Town: Remote 45.14136
## 47937             Kane County     49025     43-Rural: Remote 37.52539
## 47938             Kane County     49025     43-Rural: Remote 37.52536
## 47959        Salt Lake County     49035     21-Suburb: Large 40.69894
## 48017        Box Elder County     49003     21-Suburb: Large 41.49393
## 48020             Lake County     12069  22-Suburb: Mid-size 28.83584
## 48021             Lake County     12069  22-Suburb: Mid-size 28.83584
## 48022             Lake County     12069  22-Suburb: Mid-size 28.83584
## 48034       Palm Beach County     12099     21-Suburb: Large 26.61563
## 48096             Utah County     49049       13-City: Small 40.27994
## 48136        San Diego County      6073     21-Suburb: Large 32.85385
## 48187            Davis County     49011     21-Suburb: Large 41.12456
## 48189            Greer County     40055    42-Rural: Distant 34.95736
## 48192         Sangamon County     17167  22-Suburb: Mid-size 39.75271
## 48195             Utah County     49049     21-Suburb: Large 40.36874
## 48200         Escambia County     12033       13-City: Small 30.43210
## 48275        Kandiyohi County     27067      33-Town: Remote 45.11758
## 48277             Utah County     49049    12-City: Mid-size 40.25122
## 48279            Weber County     49057     21-Suburb: Large 41.17313
## 48315          Kenosha County     55059     21-Suburb: Large 42.52281
## 48389            Lamar County      1075     43-Rural: Remote 33.74571
## 48400            Comal County     48091       13-City: Small 29.71299
## 48509            Pasco County     12101     41-Rural: Fringe 28.26169
## 48515           Lander County     32015      33-Town: Remote 40.63896
## 48534             Utah County     49049     21-Suburb: Large 40.10542
## 48594        Arlington County     51013    12-City: Mid-size 38.89607
## 48634         Sangamon County     17167    12-City: Mid-size 39.81686
## 48661       Palm Beach County     12099     21-Suburb: Large 26.58064
## 48677           Uintah County     49047     43-Rural: Remote 40.40115
## 48737             Utah County     49049     21-Suburb: Large 40.10663
## 48748    San Francisco County      6075       11-City: Large 37.75711
## 48779             Pima County      4019     21-Suburb: Large 32.19169
## 48786          LaSalle County     17099     32-Town: Distant 41.37284
## 48802      Santa Clara County      6085     21-Suburb: Large 37.37112
## 48813           Lassen County      6035      33-Town: Remote 40.37574
## 48835       Miami-Dade County     12086     41-Rural: Fringe 25.89856
## 48863      Los Angeles County      6037    12-City: Mid-size 33.82197
## 48945        San Diego County      6073       11-City: Large 32.90280
## 48956         Humboldt County      6023      33-Town: Remote 40.89939
## 48987       Washington County     49053     41-Rural: Fringe 37.15109
## 49000       Washington County     49053      31-Town: Fringe 37.20085
## 49040         Lawrence County      1079     41-Rural: Fringe 34.47666
## 49052         Sangamon County     17167    12-City: Mid-size 39.78325
## 49123            Davis County     49011     21-Suburb: Large 41.06524
## 49124            Davis County     49011     21-Suburb: Large 41.05964
## 49126        Mendocino County      6045     43-Rural: Remote 39.68942
## 49177            Davis County     49011       13-City: Small 41.09564
## 49179            Davis County     49011     21-Suburb: Large 41.09961
## 49180            Weber County     49057       13-City: Small 41.25826
## 49192         Maricopa County      4013     21-Suburb: Large 33.42188
## 49193         Maricopa County      4013     21-Suburb: Large 33.32076
## 49194         Maricopa County      4013     21-Suburb: Large 33.31974
## 49195            Pinal County      4021     32-Town: Distant 33.04930
## 49196            Pinal County      4021     21-Suburb: Large 33.19895
## 49197         Maricopa County      4013     21-Suburb: Large 33.32063
## 49232             Lake County     17097     21-Suburb: Large 42.31542
## 49240             Lake County     17097     21-Suburb: Large 42.30538
## 49247       White Pine County     32033      33-Town: Remote 39.23882
## 49255         Monterey County      6053     41-Rural: Fringe 36.67349
## 49256         Maricopa County      4013       11-City: Large 33.43039
## 49257         Maricopa County      4013       11-City: Large 33.43683
## 49258         Maricopa County      4013     21-Suburb: Large 33.33486
## 49259         Maricopa County      4013     21-Suburb: Large 33.33545
## 49262         Maricopa County      4013       11-City: Large 33.51527
## 49263        San Diego County      6073     21-Suburb: Large 32.79768
## 49269    Santa Barbara County      6083  22-Suburb: Mid-size 34.44728
## 49353              Lee County     51105    42-Rural: Distant 36.73146
## 49355              Lea County     35025     41-Rural: Fringe 32.76433
## 49429              Lee County     12071       13-City: Small 26.59960
## 49430              Lee County     12071       13-City: Small 26.59990
## 49480          Leflore County     28083      33-Town: Remote 33.49679
## 49511            Davis County     49011     21-Suburb: Large 41.06658
## 49519            Davis County     49011     41-Rural: Fringe 40.84141
## 49523             Utah County     49049     21-Suburb: Large 40.40264
## 49524       Washington County     49053       13-City: Small 37.10595
## 49526         Maricopa County      4013     21-Suburb: Large 33.30038
## 49527         Maricopa County      4013       11-City: Large 33.37447
## 49529         Maricopa County      4013  22-Suburb: Mid-size 33.45035
## 49530            Pinal County      4021     23-Suburb: Small 32.90124
## 49531         Maricopa County      4013     21-Suburb: Large 33.25991
## 49533         Maricopa County      4013     21-Suburb: Large 33.61217
## 49534            Pinal County      4021     41-Rural: Fringe 33.04231
## 49535         Maricopa County      4013     21-Suburb: Large 33.33371
## 49536             Pima County      4019     21-Suburb: Large 32.36068
## 49537         Maricopa County      4013     21-Suburb: Large 33.68514
## 49538            Pinal County      4021     21-Suburb: Large 33.25782
## 49539         Maricopa County      4013     41-Rural: Fringe 33.60305
## 49540             Cook County     17031       11-City: Large 41.88161
## 49557             Utah County     49049     21-Suburb: Large 40.39034
## 49558             Utah County     49049     21-Suburb: Large 40.40341
## 49559             Utah County     49049     21-Suburb: Large 40.39697
## 49591         Humboldt County     32013      33-Town: Remote 40.97859
## 49618             Pima County      4019     21-Suburb: Large 32.34772
## 49620             Pima County      4019     21-Suburb: Large 32.42604
## 49621          Cochise County      4003       13-City: Small 31.55157
## 49623             Pima County      4019     21-Suburb: Large 32.34772
## 49645            Kings County      6031     41-Rural: Fringe 36.29151
## 49646            Kings County      6031     41-Rural: Fringe 36.29243
## 49682      Los Angeles County      6037     21-Suburb: Large 33.93511
## 49726             Leon County     12073    12-City: Mid-size 30.43623
## 49742             Leon County     12073    12-City: Mid-size 30.43623
## 49743             Leon County     12073    12-City: Mid-size 30.43623
## 49890             Levy County     12075    42-Rural: Distant 29.44690
## 49892             Levy County     12075    42-Rural: Distant 29.45682
## 49893             Levy County     12075    42-Rural: Distant 29.45804
## 49894             Levy County     12075    42-Rural: Distant 29.45692
## 49895             Levy County     12075    42-Rural: Distant 29.45804
## 49982           Sonoma County      6097    12-City: Mid-size 38.46180
## 50014            Cache County     49005    42-Rural: Distant 41.97257
## 50039      Santa Clara County      6085     21-Suburb: Large 37.18004
## 50092          Hampden County     25013    12-City: Mid-size 42.10510
## 50097             Clay County     29047     21-Suburb: Large 39.24076
## 50099         Maricopa County      4013       11-City: Large 33.36068
## 50223             Gila County      4007      33-Town: Remote 33.40123
## 50289        Salt Lake County     49035     21-Suburb: Large 40.63899
## 50290        Salt Lake County     49035    12-City: Mid-size 40.74515
## 50295         Maricopa County      4013       11-City: Large 33.49400
## 50296          Cochise County      4003     41-Rural: Fringe 31.37373
## 50303          Liberty County     12077    42-Rural: Distant 30.42594
## 50304          Liberty County     12077    42-Rural: Distant 30.42594
## 50305          Liberty County     12077     43-Rural: Remote 30.18617
## 50315             Lake County     17097     21-Suburb: Large 42.28480
## 50355         Maricopa County      4013       11-City: Large 33.55549
## 50366      Los Angeles County      6037     21-Suburb: Large 34.68830
## 50368      Los Angeles County      6037     21-Suburb: Large 33.89856
## 50370             Pima County      4019     21-Suburb: Large 32.32266
## 50400           Carbon County     49007     41-Rural: Fringe 39.60527
## 50403         Brazoria County     48039     23-Suburb: Small 29.01094
## 50465        Limestone County      1083      31-Town: Fringe 34.77679
## 50478          Grafton County     33009     43-Rural: Remote 44.04396
## 50479          Grafton County     33009     43-Rural: Remote 44.04396
## 50493             Utah County     49049     21-Suburb: Large 40.40027
## 50495          Lincoln County     32017     43-Rural: Remote 37.79165
## 50522          Lincoln County     32017     43-Rural: Remote 37.79165
## 50561           Bureau County     17011     32-Town: Distant 41.37030
## 50830         Sangamon County     17167    12-City: Mid-size 39.79874
## 50899            Davis County     49011     21-Suburb: Large 41.08850
## 50901            Cache County     49005     23-Suburb: Small 41.63285
## 50911        Salt Lake County     49035     21-Suburb: Large 40.69026
## 50916            Weber County     49057       13-City: Small 41.28168
## 50951      San Joaquin County      6077     21-Suburb: Large 38.02373
## 50952            Marin County      6041    42-Rural: Distant 38.15188
## 50965       Miami-Dade County     12086     21-Suburb: Large 25.89829
## 50966       Miami-Dade County     12086       11-City: Large 25.77290
## 51003        San Mateo County      6081     21-Suburb: Large 37.58543
## 51022           Bergen County     34003     21-Suburb: Large 40.84869
## 51083             Utah County     49049     21-Suburb: Large 40.33884
## 51093         Sangamon County     17167    12-City: Mid-size 39.76723
## 51196          Kendall County     17093    42-Rural: Distant 41.47868
## 51203          Kendall County     17093    42-Rural: Distant 41.47805
## 51222           Meeker County     27093     32-Town: Distant 45.13274
## 51237         Maricopa County      4013  22-Suburb: Mid-size 33.49258
## 51243        San Diego County      6073     21-Suburb: Large 32.78733
## 51284             Lake County     17097     21-Suburb: Large 42.39831
## 51321         Siskiyou County      6093     43-Rural: Remote 41.71216
## 51326       Washington County     49053     41-Rural: Fringe 37.05256
## 51358           Sonoma County      6097     23-Suburb: Small 38.24066
## 51374       Livingston Parish     22063     21-Suburb: Large 30.57668
## 51419           Merced County      6047     23-Suburb: Small 37.38568
## 51459          LaSalle County     17099     32-Town: Distant 41.34628
## 51461            Wayne County     49055     43-Rural: Remote 38.40107
## 51476             Cook County     17031       11-City: Large 41.87705
## 51502             Hale County     48189      33-Town: Remote 34.19360
## 51573            Cache County     49005       13-City: Small 41.72457
## 51590            Cache County     49005       13-City: Small 41.72785
## 51594           Bureau County     17011     32-Town: Distant 41.37462
## 51613             Cass County     18017     32-Town: Distant 40.75628
## 51637          Baltimore city     24510       11-City: Large 39.34702
## 51686            Weber County     49057     21-Suburb: Large 41.32384
## 51712         Maricopa County      4013       11-City: Large 33.76385
## 51720             Utah County     49049     21-Suburb: Large 40.41778
## 51722        Salt Lake County     49035     21-Suburb: Large 40.54168
## 51728            Comal County     48091       13-City: Small 29.68556
## 51735         McLennan County     48309    42-Rural: Distant 31.54643
## 51736         McLennan County     48309    42-Rural: Distant 31.54560
## 51737            Cooke County     48097     32-Town: Distant 33.62442
## 51738          Hidalgo County     48215       13-City: Small 26.33360
## 51739              Lee County     48287      33-Town: Remote 30.17086
## 51740            Brown County     48049      33-Town: Remote 31.71279
## 51741            Duval County     12031       11-City: Large 30.33665
## 51765      Los Angeles County      6037       11-City: Large 33.80541
## 51809           Morgan County      1103       13-City: Small 34.59929
## 51811           Lassen County      6035      33-Town: Remote 40.41895
## 51910        Salt Lake County     49035     21-Suburb: Large 40.63686
## 51936        Jefferson County      8059     21-Suburb: Large 39.74348
## 51963         Harrison County     28047       13-City: Small 30.39604
## 52033             Wood County     54107       13-City: Small 39.25274
## 52055      Los Angeles County      6037     21-Suburb: Large 33.91647
## 52063      Los Angeles County      6037       11-City: Large 34.05646
## 52069           Merced County      6047     32-Town: Distant 37.06635
## 52092           Tehama County      6103     32-Town: Distant 40.02541
## 52129           Orange County     18117     32-Town: Distant 38.54980
## 52139       Williamson County     48491     41-Rural: Fringe 30.61834
## 52154          Loudoun County     51107     21-Suburb: Large 39.02622
## 52155          Loudoun County     51107     41-Rural: Fringe 39.07605
## 52204          Autauga County      1001     21-Suburb: Large 32.44819
## 52210      Santa Clara County      6085     21-Suburb: Large 37.23044
## 52219     Natchitoches Parish     22069      33-Town: Remote 31.75282
## 52222          Rapides Parish     22079       13-City: Small 31.29632
## 52285         Hennepin County     27053     21-Suburb: Large 45.00129
## 52375          Lowndes County     28087      33-Town: Remote 33.51636
## 52420 East Baton Rouge Parish     22033    12-City: Mid-size 30.41511
## 52433          Lubbock County     48303       11-City: Large 33.61977
## 52434          Lubbock County     48303       11-City: Large 33.61977
## 52462   San Bernardino County      6071    42-Rural: Distant 34.41026
## 52512       Santa Cruz County      6087     41-Rural: Fringe 37.06225
## 52544         Maricopa County      4013     41-Rural: Fringe 33.54170
## 52568             Utah County     49049       13-City: Small 40.31075
## 52677            Henry County     17073     32-Town: Distant 41.25371
## 52705      Santa Clara County      6085       11-City: Large 37.30084
## 52711          Lynchburg city     51680       13-City: Small 37.40788
## 52713          Lynchburg city     51680       13-City: Small 37.39379
## 52714          Lynchburg city     51680       13-City: Small 37.36012
## 52752           DeKalb County     17037     21-Suburb: Large 41.63937
## 52763             Will County     17197     21-Suburb: Large 41.51859
## 52785             Lyon County     32019     32-Town: Distant 39.57932
## 52794             Lake County     17097     21-Suburb: Large 42.34412
## 52828             Will County     17197     21-Suburb: Large 41.54102
## 52837       Burlington County     34005      31-Town: Fringe 39.88793
## 52847        Salt Lake County     49035    12-City: Mid-size 40.75963
## 52875             Kane County     17089     21-Suburb: Large 41.78584
## 52988            Macon County      1087     32-Town: Distant 32.43052
## 52998             Bibb County     13021    12-City: Mid-size 32.82938
## 53039             Kane County     17089     21-Suburb: Large 41.90584
## 53054            Norfolk city     51710    12-City: Mid-size 36.87905
## 53072          Madison County     12079     32-Town: Distant 30.47107
## 53073          Madison County      1089     21-Suburb: Large 34.78550
## 53075          Madison County      1089     21-Suburb: Large 34.78548
## 53176         Maricopa County      4013       11-City: Large 33.50100
## 53239          Madison County     12079     32-Town: Distant 30.47107
## 53242          Madison County     12079     32-Town: Distant 30.47107
## 53243          Madison County     12079     32-Town: Distant 30.47107
## 53244          Madison County     12079     32-Town: Distant 30.47107
## 53297           Uintah County     49047      33-Town: Remote 40.47151
## 53314           Richmond city     51760    12-City: Mid-size 37.55791
## 53319        Salt Lake County     49035     21-Suburb: Large 40.70418
## 53341         Imperial County      6025    42-Rural: Distant 32.98244
## 53392    San Francisco County      6075       11-City: Large 37.75527
## 53407       Washington County     27163     41-Rural: Fringe 45.05927
## 53461             Kent County     44003     21-Suburb: Large 41.69019
## 53472       Washington County     49053     23-Suburb: Small 37.08983
## 53473        Salt Lake County     49035     21-Suburb: Large 40.61610
## 53474            Weber County     49057     21-Suburb: Large 41.30313
## 53589        Salt Lake County     49035     21-Suburb: Large 40.72004
## 53620          Manatee County     12081       13-City: Small 27.49485
## 53705      Los Angeles County      6037     21-Suburb: Large 33.88902
## 53730          Daggett County     49009     43-Rural: Remote 40.99238
## 53733          Daggett County     49009     43-Rural: Remote 40.99156
## 53734             Utah County     49049     21-Suburb: Large 40.38245
## 53846         Coconino County      4005      33-Town: Remote 36.91204
## 53862          Sanpete County     49039     41-Rural: Fringe 39.27392
## 53863          Sanpete County     49039      33-Town: Remote 39.26447
## 53922         Humboldt County      6023     43-Rural: Remote 40.76037
## 53978             Utah County     49049     41-Rural: Fringe 40.11027
## 53985             Utah County     49049     21-Suburb: Large 40.12326
## 54026             Utah County     49049     21-Suburb: Large 40.14046
## 54028             Utah County     49049     21-Suburb: Large 40.13098
## 54138       Burlington County     34005     41-Rural: Fringe 39.98283
## 54154          McHenry County     17111      31-Town: Fringe 42.24335
## 54186         Monmouth County     34025     21-Suburb: Large 40.29775
## 54231            Weber County     49057     21-Suburb: Large 41.30330
## 54252         Maricopa County      4013       11-City: Large 33.41201
## 54264           Mercer County     34021     21-Suburb: Large 40.25301
## 54265           Mercer County     34021     21-Suburb: Large 40.25301
## 54288             Cobb County     13067     21-Suburb: Large 33.91548
## 54296            Marin County      6041       13-City: Small 38.01378
## 54301         Monterey County      6053  22-Suburb: Mid-size 36.68381
## 54336         Gonzales County     48177     43-Rural: Remote 29.26741
## 54347           Marion County     54049     32-Town: Distant 39.48373
## 54357           Marion County     54049    42-Rural: Distant 39.51227
## 54405           Marion County     12083       13-City: Small 29.19654
## 54414           Marion County     12083       13-City: Small 29.18408
## 54416           Marion County     12083     41-Rural: Fringe 29.30109
## 54426           Washoe County     32031    12-City: Mid-size 39.48884
## 54637         Marshall County      1095     41-Rural: Fringe 34.30545
## 54646             Lyon County     27083      33-Town: Remote 44.43865
## 54683          Fairfax County     51059     21-Suburb: Large 38.90656
## 54691             Lyon County     27083      33-Town: Remote 44.44306
## 54721         Marshall County      1095     41-Rural: Fringe 34.30545
## 54743         McLennan County     48309    42-Rural: Distant 31.54099
## 54765          Clayton County     13063     21-Suburb: Large 33.43449
## 54791           Martin County     12085     21-Suburb: Large 27.17089
## 54907     Contra Costa County      6013     21-Suburb: Large 38.01471
## 54946       Sacramento County      6067     21-Suburb: Large 38.61399
## 54972          Ventura County      6111     41-Rural: Fringe 34.24316
## 54976           Solano County      6095    12-City: Mid-size 38.26590
## 55018          McHenry County     17111      31-Town: Fringe 42.33916
## 55110        Salt Lake County     49035    12-City: Mid-size 40.77484
## 55121             Will County     17197     21-Suburb: Large 41.51601
## 55164          Nodaway County     29147     41-Rural: Fringe 40.34650
## 55166           Mohave County      4015     32-Town: Distant 36.95739
## 55187            Mason County     54053     41-Rural: Fringe 38.88176
## 55203             Cook County     17031       11-City: Large 41.85590
## 55238       Shenandoah County     51171    42-Rural: Distant 38.73458
## 55239       Harrisonburg city     51660       13-City: Small 38.40105
## 55291       Miami-Dade County     12086       13-City: Small 25.81312
## 55298       Miami-Dade County     12086       11-City: Large 25.76975
## 55299       Miami-Dade County     12086       11-City: Large 25.77241
## 55300       Miami-Dade County     12086       11-City: Large 25.80652
## 55306       Miami-Dade County     12086       11-City: Large 25.80652
## 55307       Miami-Dade County     12086       11-City: Large 25.73864
## 55309       Miami-Dade County     12086       11-City: Large 25.77240
## 55312       Miami-Dade County     12086       11-City: Large 25.73864
## 55314       Miami-Dade County     12086       11-City: Large 25.80652
## 55317       Miami-Dade County     12086     21-Suburb: Large 25.93099
## 55323             Pima County      4019       11-City: Large 32.13255
## 55331         Sangamon County     17167    12-City: Mid-size 39.78937
## 55369          Suffolk County     25025       11-City: Large 42.27600
## 55412         Humboldt County      6023     43-Rural: Remote 40.32170
## 55413         Humboldt County      6023     43-Rural: Remote 40.32170
## 55414         Humboldt County      6023     43-Rural: Remote 40.24821
## 55530           Monroe County     12087      33-Town: Remote 24.55327
## 55677           Summit County     49043     32-Town: Distant 40.66954
## 55748        Jefferson County     17081     41-Rural: Fringe 38.26347
## 55754         Sangamon County     17167    12-City: Mid-size 39.81021
## 55901       Washington County     27163     21-Suburb: Large 45.02421
## 55902          Carlton County     27017     32-Town: Distant 46.43984
## 55903          Goodhue County     27049     32-Town: Distant 44.55952
## 56099             Rice County     27131     32-Town: Distant 44.30106
## 56102        Box Elder County     49003     32-Town: Distant 41.70585
## 56123             Kern County      6029    42-Rural: Distant 35.30982
## 56133    San Francisco County      6075       11-City: Large 37.71345
## 56183        Salt Lake County     49035     21-Suburb: Large 40.64319
## 56184         Escambia County     12033     21-Suburb: Large 30.43826
## 56213           Oneida County     55085     43-Rural: Remote 45.80028
## 56232           Summit County     49043     32-Town: Distant 40.66961
## 56233       Montgomery County     24031     21-Suburb: Large 39.04717
## 56243           Marion County     12083       13-City: Small 29.19450
## 56295             Utah County     49049     21-Suburb: Large 40.15662
## 56337             Utah County     49049     21-Suburb: Large 40.38534
## 56358         Monmouth County     34025     21-Suburb: Large 40.30364
## 56361           Madera County      6039    42-Rural: Distant 37.25753
## 56384            Davis County     49011     21-Suburb: Large 40.89693
## 56419        Salt Lake County     49035    12-City: Mid-size 40.78046
## 56428          Ventura County      6111    12-City: Mid-size 34.19277
## 56619         Hennepin County     27053     21-Suburb: Large 44.93885
## 56678            Comal County     48091       13-City: Small 29.67266
## 56739         Monmouth County     34025     21-Suburb: Large 40.29558
## 56817        Mendocino County      6045     41-Rural: Fringe 39.12932
## 56838        Riverside County      6065     21-Suburb: Large 33.67811
## 56863          Madison County      1089    12-City: Mid-size 34.68022
## 56873         Franklin County     29071     32-Town: Distant 38.48497
## 56880           Merced County      6047       13-City: Small 37.29762
## 56904           Mercer County     54055     32-Town: Distant 37.36002
## 56918           Mercer County     34021       13-City: Small 40.24654
## 56931           Morgan County     17137     43-Rural: Remote 39.83156
## 56932           Morgan County     17137     43-Rural: Remote 39.83156
## 56933           Morgan County     17137     43-Rural: Remote 39.83156
## 56982             Utah County     49049     21-Suburb: Large 40.16748
## 57060         Maricopa County      4013       11-City: Large 33.40372
## 57140      Los Angeles County      6037       13-City: Small 34.15138
## 57141      Los Angeles County      6037       13-City: Small 34.15138
## 57144        San Diego County      6073     41-Rural: Fringe 32.78159
## 57152           Ramsey County     27123       11-City: Large 44.97510
## 57160           DeKalb County     13089     21-Suburb: Large 33.68996
## 57161           Richmond city     51760    12-City: Mid-size 37.54105
## 57167       Miami-Dade County     12086     41-Rural: Fringe 25.80978
## 57171         Maricopa County      4013       11-City: Large 33.46664
## 57198             Pima County      4019       11-City: Large 32.23003
## 57199       Santa Cruz County      4023      33-Town: Remote 31.36916
## 57226       Miami-Dade County     12086       11-City: Large 25.79957
## 57228       Miami-Dade County     12086       13-City: Small 25.78646
## 57230       Miami-Dade County     12086       11-City: Large 25.79310
## 57231       Miami-Dade County     12086     21-Suburb: Large 25.47319
## 57234       Miami-Dade County     12086       11-City: Large 25.78471
## 57238       Miami-Dade County     12086     21-Suburb: Large 25.75555
## 57252       Miami-Dade County     12086       11-City: Large 25.81057
## 57264       Miami-Dade County     12086     21-Suburb: Large 25.66080
## 57270       Miami-Dade County     12086       11-City: Large 25.77134
## 57276       Miami-Dade County     12086     21-Suburb: Large 25.83063
## 57278       Miami-Dade County     12086     21-Suburb: Large 25.70157
## 57287       Miami-Dade County     12086       13-City: Small 25.69089
## 57288       Miami-Dade County     12086       11-City: Large 25.78976
## 57289       Miami-Dade County     12086       11-City: Large 25.78976
## 57297          Alachua County     12001    42-Rural: Distant 29.50913
## 57298          Alachua County     12001    42-Rural: Distant 29.50479
## 57354        Pleasants County     54073     32-Town: Distant 39.42278
## 57379        Salt Lake County     49035     21-Suburb: Large 40.53501
## 57385           Tooele County     49045     32-Town: Distant 40.55211
## 57420       James City County     51095     41-Rural: Fringe 37.22154
## 57472        Vermilion County     17183     23-Suburb: Small 40.10163
## 57478        Middlesex County     34023     21-Suburb: Large 40.42831
## 57533        Jefferson County      1073     21-Suburb: Large 33.45073
## 57571            Weber County     49057     21-Suburb: Large 41.17706
## 57595         Maricopa County      4013       11-City: Large 33.46477
## 57596         Maricopa County      4013       11-City: Large 33.50713
## 57603        Salt Lake County     49035     21-Suburb: Large 40.54940
## 57604        Salt Lake County     49035     21-Suburb: Large 40.60889
## 57609        Salt Lake County     49035     21-Suburb: Large 40.61089
## 57656          Wasatch County     49051     32-Town: Distant 40.50828
## 57665          Stevens County     27149     41-Rural: Fringe 45.59016
## 57685             Lake County     17097     21-Suburb: Large 42.36270
## 57688          Yavapai County      4025     43-Rural: Remote 35.22106
## 57689          Yavapai County      4025     43-Rural: Remote 34.57424
## 57690          Yavapai County      4025     23-Suburb: Small 34.59975
## 57691          Yavapai County      4025      31-Town: Fringe 34.74650
## 57692          Yavapai County      4025    42-Rural: Distant 34.34645
## 57694          Yavapai County      4025       13-City: Small 34.56289
## 57695          Yavapai County      4025     43-Rural: Remote 35.32996
## 57696        San Diego County      6073     21-Suburb: Large 33.37728
## 57778         Maricopa County      4013       11-City: Large 33.65057
## 57780            Clark County     32003       11-City: Large 36.16436
## 57788         Iroquois County     17075    42-Rural: Distant 40.76954
## 57791           Beaver County     49001     43-Rural: Remote 38.39785
## 57800           Beaver County     49001     43-Rural: Remote 38.39406
## 57848        Salt Lake County     49035     21-Suburb: Large 40.68934
## 57882          Millard County     49027     43-Rural: Remote 38.96979
## 57904             Lake County     17097     41-Rural: Fringe 42.42461
## 57907             Lake County     17097     21-Suburb: Large 42.43215
## 57912       Washington County     49053       13-City: Small 37.10258
## 57913            Davis County     49011     21-Suburb: Large 40.87980
## 57925      San Joaquin County      6077     23-Suburb: Small 37.74593
## 57927         Monterey County      6053    12-City: Mid-size 36.65341
## 57966      Los Angeles County      6037     41-Rural: Fringe 34.09252
## 57984          Jackson County     29095     23-Suburb: Small 38.90740
## 57993          Yavapai County      4025       13-City: Small 34.55748
## 58065            Cache County     49005     23-Suburb: Small 41.68067
## 58141        Milwaukee County     55079       11-City: Large 43.04370
## 58185          Mineral County     54057     32-Town: Distant 39.42805
## 58204           Beaver County     49001     43-Rural: Remote 38.20841
## 58205           Beaver County     49001     43-Rural: Remote 38.20844
## 58219            Mingo County     54059    42-Rural: Distant 37.67700
## 58222          Yavapai County      4025      31-Town: Fringe 34.79926
## 58355            Kings County      6031     32-Town: Distant 36.09773
## 58359      Santa Clara County      6085    12-City: Mid-size 37.39129
## 58363         Monterey County      6053    42-Rural: Distant 36.39020
## 58371            Pinal County      4021     23-Suburb: Small 32.89572
## 58373            Clark County     32003       11-City: Large 36.17985
## 58383         Maricopa County      4013    12-City: Mid-size 33.58349
## 58393         Monterey County      6053    12-City: Mid-size 36.68752
## 58400          Alameda County      6001     21-Suburb: Large 37.52817
## 58405      Los Angeles County      6037     21-Suburb: Large 34.41583
## 58420        St. Louis County     29189      31-Town: Fringe 38.49074
## 58432           Orange County      6059       11-City: Large 33.72067
## 58489        St. Johns County     12109     23-Suburb: Small 29.89787
## 58492      Rock Island County     17161       13-City: Small 41.42442
## 58502            Anoka County     27003     21-Suburb: Large 45.17873
## 58505        Sherburne County     27141       13-City: Small 45.54173
## 58506       Washington County     27163     21-Suburb: Large 45.02783
## 58520            Grand County     49019      33-Town: Remote 38.56838
## 58530           Mobile County      1097    12-City: Mid-size 30.62435
## 58536             Cole County     29051       13-City: Small 38.57751
## 58537             Cole County     29051       13-City: Small 38.57743
## 58554            Modoc County      6049     43-Rural: Remote 41.44659
## 58555            Modoc County      6049      33-Town: Remote 41.48016
## 58571           Mohave County      4015      33-Town: Remote 35.10111
## 58572           Mohave County      4015     41-Rural: Fringe 35.15845
## 58573           Mohave County      4015      33-Town: Remote 35.10108
## 58600   San Bernardino County      6071     41-Rural: Fringe 34.59568
## 58635             Juab County     49023    42-Rural: Distant 39.81310
## 58658           Shasta County      6089       13-City: Small 40.53787
## 58701         Monmouth County     34025     21-Suburb: Large 40.26602
## 58702         Monmouth County     34025     21-Suburb: Large 40.26584
## 58707             Mono County      6051     43-Rural: Remote 38.25711
## 58741           Monroe County      1099     41-Rural: Fringe 31.48341
## 58747           Monroe County     54063    42-Rural: Distant 37.48331
## 58800           Monroe County     12087      33-Town: Remote 24.57699
## 58813           Sevier County     49041    42-Rural: Distant 38.63234
## 58814        Salt Lake County     49035     21-Suburb: Large 40.70484
## 58817          Loudoun County     51107     21-Suburb: Large 39.11521
## 58821           Monroe County     12087      33-Town: Remote 24.56355
## 58822           Monroe County     12087      33-Town: Remote 24.56355
## 58823           Monroe County     12087      33-Town: Remote 24.56355
## 58824           Monroe County     12087      33-Town: Remote 24.56355
## 58843           Carbon County     49007     41-Rural: Fringe 39.60575
## 58848      Santa Clara County      6085       13-City: Small 37.31450
## 58930        Salt Lake County     49035     21-Suburb: Large 40.54858
## 58953        Berkshire County     25003    42-Rural: Distant 42.17908
## 58954         Monterey County      6053  22-Suburb: Mid-size 36.60548
## 58981         Maricopa County      4013     21-Suburb: Large 33.52541
## 58985         Coconino County      4005       13-City: Small 35.20047
## 58987         Maricopa County      4013       11-City: Large 33.57026
## 58988         Maricopa County      4013     21-Suburb: Large 33.33575
## 58989       Santa Cruz County      4023    42-Rural: Distant 31.61597
## 58991         Maricopa County      4013       11-City: Large 33.39398
## 58992         Maricopa County      4013       11-City: Large 33.43038
## 58995         Maricopa County      4013       11-City: Large 33.45940
## 59000             Cook County     17031       11-City: Large 41.77461
## 59006             Pima County      4019       11-City: Large 32.26511
## 59007             Pima County      4019       11-City: Large 32.26512
## 59016         San Juan County     49037     43-Rural: Remote 37.26046
## 59031       Montgomery County     51121       13-City: Small 37.12790
## 59035       Montgomery County      1101    12-City: Mid-size 32.42499
## 59038       Montgomery County     48339       13-City: Small 30.31877
## 59076       Montgomery County      1101    12-City: Mid-size 32.32903
## 59081        Salt Lake County     49035     21-Suburb: Large 40.70938
## 59091         San Juan County     49037     43-Rural: Remote 37.87062
## 59108         San Juan County     49037     43-Rural: Remote 37.87537
## 59129            Essex County     34013     21-Suburb: Large 40.75405
## 59158         San Juan County     49037     43-Rural: Remote 37.00487
## 59205           Glades County     12043     32-Town: Distant 26.83073
## 59331           Morgan County      1103     41-Rural: Fringe 34.44874
## 59335           Morgan County      1103    42-Rural: Distant 34.41329
## 59346           Morgan County     49029     32-Town: Distant 41.03853
## 59351           Morgan County     49029     32-Town: Distant 41.03732
## 59355           Morgan County     49029     32-Town: Distant 41.03727
## 59359            Davis County     49011     21-Suburb: Large 41.05171
## 59360           Morgan County     49029     32-Town: Distant 41.03715
## 59416        Salt Lake County     49035     21-Suburb: Large 40.68062
## 59421          Sanpete County     49039    42-Rural: Distant 39.52748
## 59447           Morris County     34027     21-Suburb: Large 40.83212
## 59472           Morris County     34027     21-Suburb: Large 40.82705
## 59477            Clark County     32003       11-City: Large 36.14883
## 59478           Morris County     34027     21-Suburb: Large 40.82703
## 59482        Whiteside County     17195     32-Town: Distant 41.80172
## 59489        Whiteside County     17195     32-Town: Distant 41.79934
## 59491        Whiteside County     17195     32-Town: Distant 41.80172
## 59534             Cook County     17031     21-Suburb: Large 41.85467
## 59564        St. Lucie County     12111     21-Suburb: Large 27.42611
## 59677            Weber County     49057       13-City: Small 41.24160
## 59716           Harris County     48201       11-City: Large 29.66070
## 59758            Cache County     49005       13-City: Small 41.74822
## 59759             Utah County     49049     21-Suburb: Large 40.37061
## 59770            Weber County     49057       13-City: Small 41.20476
## 59848        Jefferson County      8059     21-Suburb: Large 39.64777
## 59861            Cache County     49005     23-Suburb: Small 41.62878
## 59864        Del Norte County      6015    42-Rural: Distant 41.84661
## 59865       Santa Cruz County      6087  22-Suburb: Mid-size 37.02593
## 59868        San Diego County      6073    42-Rural: Distant 32.73389
## 59870           Morgan County     49029    42-Rural: Distant 41.14707
## 59875        Salt Lake County     49035     21-Suburb: Large 40.58685
## 59877            Davis County     49011     21-Suburb: Large 41.02902
## 59881           Madera County      6039     32-Town: Distant 37.34812
## 59886          Alameda County      6001     41-Rural: Fringe 37.80555
## 59901          Yavapai County      4025       13-City: Small 34.54274
## 59917             Utah County     49049     21-Suburb: Large 40.41977
## 59922             Pima County      4019     21-Suburb: Large 32.32483
## 59924         Coconino County      4005       13-City: Small 35.16257
## 59928        Salt Lake County     49035     21-Suburb: Large 40.62320
## 59933             Utah County     49049     41-Rural: Fringe 40.30427
## 59967   San Bernardino County      6071    12-City: Mid-size 34.02094
## 60008             Utah County     49049       13-City: Small 40.29595
## 60040            Davis County     49011     21-Suburb: Large 41.10480
## 60041        Salt Lake County     49035    12-City: Mid-size 40.73922
## 60043        Box Elder County     49003     21-Suburb: Large 41.49537
## 60058           Madera County      6039       13-City: Small 36.93925
## 60068        Salt Lake County     49035     21-Suburb: Large 40.54093
## 60081            Cache County     49005     41-Rural: Fringe 41.71111
## 60084        Hunterdon County     34019     41-Rural: Fringe 40.64969
## 60089             Utah County     49049     21-Suburb: Large 40.45066
## 60098             Cook County     17031       11-City: Large 41.88837
## 60099           Isanti County     27059     32-Town: Distant 45.57898
## 60113           Summit County     49043     32-Town: Distant 40.66832
## 60118         Monterey County      6053  22-Suburb: Mid-size 36.60713
## 60162         Morrison County     27097     32-Town: Distant 45.97534
## 60254      Los Angeles County      6037     41-Rural: Fringe 34.23102
## 60255           Shasta County      6089      33-Town: Remote 40.88449
## 60276        Salt Lake County     49035     21-Suburb: Large 40.58184
## 60285             Utah County     49049     21-Suburb: Large 40.03935
## 60289             Utah County     49049     21-Suburb: Large 40.03606
## 60300          Sanpete County     49039     32-Town: Distant 39.54573
## 60329         Fauquier County     51061     41-Rural: Fringe 38.68209
## 60346            Davis County     49011     21-Suburb: Large 40.87263
## 60368            Davis County     49011     21-Suburb: Large 40.86471
## 60375         Imperial County      6025    42-Rural: Distant 33.04405
## 60464            Weber County     49057     21-Suburb: Large 41.15829
## 60517        Salt Lake County     49035     21-Suburb: Large 40.66161
## 60528        Salt Lake County     49035     21-Suburb: Large 40.65445
## 60558          Colbert County      1033       13-City: Small 34.74199
## 60606           Hendry County     12051     32-Town: Distant 26.76140
## 60658         Duchesne County     49013    42-Rural: Distant 40.19505
## 60662             Will County     17197     21-Suburb: Large 41.44017
## 60679      San Joaquin County      6077     41-Rural: Fringe 37.88959
## 60682          Audrain County     29007     32-Town: Distant 39.16695
## 60683        St. Louis County     27137     41-Rural: Fringe 46.91667
## 60689        Frederick County     51069     23-Suburb: Small 39.19843
## 60721             Cook County     17031       11-City: Large 41.82526
## 60755        Nantucket County     25019     32-Town: Distant 41.26988
## 60764             Napa County      6055     23-Suburb: Small 38.27942
## 60765             Napa County      6055     23-Suburb: Small 38.27942
## 60768             Napa County      6055     23-Suburb: Small 38.27931
## 60787           Uintah County     49047     41-Rural: Fringe 40.42752
## 60859           Nassau County     12089     41-Rural: Fringe 30.60855
## 60860           Nassau County     12089     41-Rural: Fringe 30.60984
## 60862           Nassau County     12089      31-Town: Fringe 30.67201
## 60863           Nassau County     12089      31-Town: Fringe 30.67205
## 60864           Nassau County     12089      31-Town: Fringe 30.67197
## 60865           Nassau County     12089      31-Town: Fringe 30.67200
## 60932        San Diego County      6073     21-Suburb: Large 32.66946
## 60938        San Diego County      6073     21-Suburb: Large 32.75561
## 60940           Apache County      4001      33-Town: Remote 36.15809
## 60941           Apache County      4001     43-Rural: Remote 35.71221
## 60942           Navajo County      4017      33-Town: Remote 36.72584
## 60943           Navajo County      4017     43-Rural: Remote 36.11475
## 60944           Apache County      4001     43-Rural: Remote 36.96252
## 60945           Apache County      4001     43-Rural: Remote 36.57613
## 60946           Apache County      4001     43-Rural: Remote 35.19924
## 60947         Coconino County      4005      33-Town: Remote 36.12692
## 60948           Apache County      4001      33-Town: Remote 35.75023
## 60956       Sacramento County      6067       11-City: Large 38.65726
## 60994         San Juan County     49037     43-Rural: Remote 37.05971
## 61018        Salt Lake County     49035     21-Suburb: Large 40.62650
## 61021           Navajo County      4017      33-Town: Remote 33.83244
## 61022           Navajo County      4017      33-Town: Remote 34.14962
## 61023           Navajo County      4017      33-Town: Remote 34.90637
## 61024           Navajo County      4017    42-Rural: Distant 34.95903
## 61025           Navajo County      4017     43-Rural: Remote 34.43562
## 61027             Gila County      4007      33-Town: Remote 34.23725
## 61028           Apache County      4001      33-Town: Remote 34.12062
## 61029           Navajo County      4017     41-Rural: Fringe 34.26116
## 61030           Navajo County      4017      33-Town: Remote 34.50696
## 61031           Apache County      4001      33-Town: Remote 34.50198
## 61032           Navajo County      4017      33-Town: Remote 35.02782
## 61051             Wake County     37183       11-City: Large 35.77035
## 61054           Ramsey County     27123     21-Suburb: Large 45.01486
## 61055       Washington County     27163     21-Suburb: Large 44.96125
## 61065             Lake County     17097     21-Suburb: Large 42.32402
## 61070          Madison County      1089    12-City: Mid-size 34.74278
## 61073             Utah County     49049     21-Suburb: Large 40.15882
## 61077             Juab County     49023     32-Town: Distant 39.72033
## 61140        Salt Lake County     49035     21-Suburb: Large 40.71150
## 61161            Bexar County     48029       11-City: Large 29.52139
## 61222       Cumberland County     17035    42-Rural: Distant 39.32042
## 61225         Duchesne County     49013    42-Rural: Distant 40.42817
## 61229           Bureau County     17011    42-Rural: Distant 41.29497
## 61270           Grundy County     17063    42-Rural: Distant 41.41098
## 61284           Nevada County      6057     32-Town: Distant 39.25521
## 61296            Clark County     32003       11-City: Large 36.16790
## 61298            Clark County     32003       11-City: Large 36.16195
## 61356             Kane County     17089    12-City: Mid-size 42.03655
## 61357         Sangamon County     17167    42-Rural: Distant 39.73041
## 61359         Sangamon County     17167    42-Rural: Distant 39.72814
## 61360         Sangamon County     17167    42-Rural: Distant 39.72814
## 61369            Bowie County     48037     32-Town: Distant 33.47050
## 61376        Worcester County     25027    42-Rural: Distant 42.31747
## 61378            Comal County     48091       13-City: Small 29.71869
## 61379            Comal County     48091       13-City: Small 29.69333
## 61380        Guadalupe County     48187     41-Rural: Fringe 29.63874
## 61384          Henrico County     51087     21-Suburb: Large 37.55047
## 61386            Weber County     49057       13-City: Small 41.22782
## 61438          Lubbock County     48303     41-Rural: Fringe 33.72964
## 61450           Shelby County      1117     41-Rural: Fringe 33.17809
## 61453             Kane County     17089     21-Suburb: Large 41.89360
## 61455   Prince William County     51153     21-Suburb: Large 38.76328
## 61456        Arlington County     51013    12-City: Mid-size 38.88904
## 61457         Portsmouth city     51740       13-City: Small 36.82759
## 61459             Kane County     17089     21-Suburb: Large 41.90685
## 61463            Mower County     27099     41-Rural: Fringe 43.67665
## 61464   Prince William County     51153     21-Suburb: Large 38.76714
## 61563           Hopewell city     51670     21-Suburb: Large 37.30300
## 61586        Jefferson County      1073     21-Suburb: Large 33.40228
## 61588        Riverside County      6065     21-Suburb: Large 33.93328
## 61591         Maricopa County      4013       11-City: Large 33.40807
## 61600            Hampton city     51650    12-City: Mid-size 37.06274
## 61611        Middlesex County     34023     21-Suburb: Large 40.34309
## 61612         Monmouth County     34025     21-Suburb: Large 40.25790
## 61637           Juneau County     55057    42-Rural: Distant 43.88138
## 61697      Los Angeles County      6037     21-Suburb: Large 33.96271
## 61699          Orleans Parish     22071       11-City: Large 29.96293
## 61754       Montgomery County     51121       13-City: Small 37.13374
## 61766         Maricopa County      4013    12-City: Mid-size 33.41544
## 61767         Maricopa County      4013    12-City: Mid-size 33.41526
## 61781          Henrico County     51087     21-Suburb: Large 37.66243
## 61802             Cook County     17031     21-Suburb: Large 42.09009
## 61803             Cook County     17031     21-Suburb: Large 42.09464
## 61843      Los Angeles County      6037       11-City: Large 34.03248
## 61845         Maricopa County      4013       11-City: Large 33.52263
## 61866          Kendall County     17093    42-Rural: Distant 41.54312
## 61868          Kendall County     17093    42-Rural: Distant 41.54194
## 61876            Essex County     34013       11-City: Large 40.72760
## 62013        Salt Lake County     49035    12-City: Mid-size 40.79665
## 62051       Newport News city     51700    12-City: Mid-size 36.97734
## 62125         Maricopa County      4013       11-City: Large 33.40192
## 62139        Salt Lake County     49035    12-City: Mid-size 40.71000
## 62140            Cache County     49005     23-Suburb: Small 41.68650
## 62141            Marin County      6041     41-Rural: Fringe 38.06842
## 62144             Kane County     17089     21-Suburb: Large 41.77792
## 62147         Nicholas County     54067    42-Rural: Distant 38.32737
## 62185       Miami-Dade County     12086     21-Suburb: Large 25.74142
## 62192        Riverside County      6065     21-Suburb: Large 33.92974
## 62266          McHenry County     17111     21-Suburb: Large 42.47146
## 62267            Bexar County     48029       11-City: Large 29.43681
## 62269            Bexar County     48029     21-Suburb: Large 29.49061
## 62305             Cook County     17031       11-City: Large 41.69824
## 62309            Otero County     35035      33-Town: Remote 32.91404
## 62310         Santa Fe County     35049       13-City: Small 35.67729
## 62312            Davis County     49011     21-Suburb: Large 41.09941
## 62315             Utah County     49049       13-City: Small 40.29025
## 62316         Maricopa County      4013       11-City: Large 33.37850
## 62317         Maricopa County      4013     21-Suburb: Large 33.51592
## 62339             Cook County     17031       11-City: Large 41.79983
## 62340             Cook County     17031       11-City: Large 41.89230
## 62341             Cook County     17031       11-City: Large 41.73456
## 62342             Cook County     17031       11-City: Large 41.70673
## 62343             Cook County     17031       11-City: Large 41.87919
## 62344             Cook County     17031       11-City: Large 41.76525
## 62345             Cook County     17031       11-City: Large 41.86921
## 62346             Cook County     17031       11-City: Large 41.89556
## 62347             Cook County     17031       11-City: Large 41.73450
## 62348             Cook County     17031       11-City: Large 41.92484
## 62349             Cook County     17031       11-City: Large 41.77872
## 62350             Cook County     17031       11-City: Large 41.88238
## 62351             Cook County     17031       11-City: Large 41.90011
## 62352             Cook County     17031       11-City: Large 41.91501
## 62353             Cook County     17031       11-City: Large 41.89525
## 62354             Cook County     17031       11-City: Large 41.90748
## 62355             Cook County     17031       11-City: Large 41.86526
## 62373            Roanoke city     51770       13-City: Small 37.30135
## 62408             Lake County     12069  22-Suburb: Mid-size 28.81149
## 62409        Highlands County     12055     41-Rural: Fringe 27.50228
## 62410      Los Angeles County      6037     21-Suburb: Large 34.47111
## 62414             Lake County     12069  22-Suburb: Mid-size 28.83361
## 62415             Lake County     12069  22-Suburb: Mid-size 28.81287
## 62445            Norfolk city     51710    12-City: Mid-size 36.87898
## 62446            Norfolk city     51710    12-City: Mid-size 36.87900
## 62450            Norfolk city     51710    12-City: Mid-size 36.86649
## 62453            Norfolk city     51710    12-City: Mid-size 36.86930
## 62456    San Francisco County      6075       11-City: Large 37.75384
## 62523             Kern County      6029       11-City: Large 35.42426
## 62531             Kern County      6029     21-Suburb: Large 35.42416
## 62557          Brevard County     12009       13-City: Small 28.61422
## 62574          Baldwin County      1003     32-Town: Distant 30.86558
## 62644            Cache County     49005     41-Rural: Fringe 41.91146
## 62678         Coconino County      4005       13-City: Small 35.19233
## 62679         Randolph County     29175     32-Town: Distant 39.42066
## 62687             Lake County     17097     21-Suburb: Large 42.32803
## 62693             Clay County     18021     41-Rural: Fringe 39.51589
## 62731      Santa Clara County      6085    12-City: Mid-size 37.35281
## 62755            Davis County     49011       13-City: Small 41.10252
## 62756            Davis County     49011     21-Suburb: Large 41.06710
## 62788            Bexar County     48029       11-City: Large 29.43681
## 62803             Lake County     17097     21-Suburb: Large 42.36891
## 62866         Columbia County     12023     32-Town: Distant 30.17730
## 62978        San Mateo County      6081     21-Suburb: Large 37.56794
## 63014             Kern County      6029     32-Town: Distant 35.59482
## 63041             Cook County     17031       11-City: Large 41.85862
## 63042             Cook County     17031       11-City: Large 41.86438
## 63044            Davis County     49011     21-Suburb: Large 41.09003
## 63058       Livingston Parish     22063     41-Rural: Fringe 30.59869
## 63094       Miami-Dade County     12086     21-Suburb: Large 25.89678
## 63111          Suffolk County     36103     21-Suburb: Large 40.79340
## 63144            Weber County     49057     21-Suburb: Large 41.31467
## 63145            Weber County     49057     21-Suburb: Large 41.30805
## 63151           Orange County      6059       11-City: Large 33.83658
## 63152           Panola County     28107    42-Rural: Distant 34.52306
## 63169       Miami-Dade County     12086     21-Suburb: Large 25.89644
## 63173            Weber County     49057     21-Suburb: Large 41.18967
## 63174            Cache County     49005     23-Suburb: Small 41.78332
## 63175        Box Elder County     49003     32-Town: Distant 41.72130
## 63206             Utah County     49049     21-Suburb: Large 40.41080
## 63211         Maricopa County      4013       11-City: Large 33.57891
## 63239            Weber County     49057       13-City: Small 41.25103
## 63240             Rich County     49033    42-Rural: Distant 41.82298
## 63279          Sanpete County     49039     41-Rural: Fringe 39.53545
## 63280          Sanpete County     49039    42-Rural: Distant 39.52343
## 63291           Sevier County     49041     43-Rural: Remote 38.96418
## 63292           Sevier County     49041     43-Rural: Remote 38.96001
## 63344        Salt Lake County     49035     21-Suburb: Large 40.49760
## 63363           Washoe County     32031    12-City: Mid-size 39.47381
## 63365        Salt Lake County     49035    12-City: Mid-size 40.80352
## 63379           Summit County     49043    42-Rural: Distant 40.91595
## 63380           Summit County     49043    42-Rural: Distant 40.91605
## 63381           Summit County     49043    42-Rural: Distant 40.91592
## 63382           Summit County     49043    42-Rural: Distant 40.91307
## 63397       Palm Beach County     12099     21-Suburb: Large 26.78060
## 63509             Kane County     17089     21-Suburb: Large 41.91066
## 63511             Kane County     17089     21-Suburb: Large 41.91066
## 63519         Pinellas County     12103       11-City: Large 27.82159
## 63615             Elko County     32007      33-Town: Remote 40.84013
## 63616            Union County     35059     43-Rural: Remote 36.43541
## 63622         Coconino County      4005     23-Suburb: Small 35.22510
## 63623           Navajo County      4017     41-Rural: Fringe 34.48090
## 63672          Carlton County     27017      31-Town: Fringe 46.71732
## 63674          Carlton County     27017      31-Town: Fringe 46.71732
## 63685         Richmond County     51159    42-Rural: Distant 37.94464
## 63686         Richmond County     51159    42-Rural: Distant 37.94464
## 63687         Richmond County     51159    42-Rural: Distant 37.94463
## 63698          Fairfax County     51059     21-Suburb: Large 38.82538
## 63703         Alexandria city     51510    12-City: Mid-size 38.81221
## 63711             Cook County     17031     21-Suburb: Large 42.10247
## 63741           Tooele County     49045     32-Town: Distant 40.53547
## 63749        St. Louis County     27137      33-Town: Remote 47.51415
## 63756         Coconino County      4005       13-City: Small 35.19962
## 63780          Yavapai County      4025       13-City: Small 34.55106
## 63802            Davis County     49011     21-Suburb: Large 41.09516
## 63818             Utah County     49049       13-City: Small 40.32802
## 63821          Olmsted County     27109    12-City: Mid-size 44.03177
## 63822       Washington Parish     22117     41-Rural: Fringe 30.80424
## 63834        Churchill County     32001      33-Town: Remote 39.47953
## 63903        Whiteside County     17195     32-Town: Distant 41.81282
## 64038        Salt Lake County     49035     41-Rural: Fringe 40.80663
## 64095           Cibola County     35006     41-Rural: Fringe 35.18070
## 64146          McHenry County     17111      31-Town: Fringe 42.34051
## 64246             Pima County      4019       11-City: Large 32.22774
## 64284            Marin County      6041     21-Suburb: Large 38.05562
## 64285            Marin County      6041     21-Suburb: Large 38.09517
## 64321           Nueces County     48355       11-City: Large 27.64615
## 64322           Nueces County     48355       11-City: Large 27.69323
## 64323           Nueces County     48355       11-City: Large 27.84172
## 64327           Sutter County      6101     41-Rural: Fringe 39.18700
## 64334         Maricopa County      4013       11-City: Large 33.45331
## 64368          Nodaway County     29147      33-Town: Remote 40.33325
## 64381         Santa Fe County     35049     23-Suburb: Small 35.65963
## 64460             Utah County     49049     21-Suburb: Large 40.33548
## 64502             Lake County     17097     21-Suburb: Large 42.30241
## 64599            Davis County     49011     21-Suburb: Large 40.88312
## 64601        Salt Lake County     49035     21-Suburb: Large 40.49308
## 64612           Fresno County      6019    42-Rural: Distant 37.03750
## 64629             Kane County     17089     21-Suburb: Large 41.76428
## 64646          Ventura County      6111  22-Suburb: Mid-size 34.17984
## 64679             Kane County     17089     21-Suburb: Large 42.10809
## 64684             Utah County     49049    12-City: Mid-size 40.23371
## 64733        Salt Lake County     49035     21-Suburb: Large 40.59759
## 64739             Lake County     17097     21-Suburb: Large 42.39431
## 64753       Washington County     17189    42-Rural: Distant 38.26080
## 64766        Salt Lake County     49035     21-Suburb: Large 40.61498
## 64783             Dane County     55025     41-Rural: Fringe 42.95109
## 64796          Alameda County      6001       11-City: Large 37.77513
## 64797          Alameda County      6001       11-City: Large 37.78589
## 64911        Salt Lake County     49035     21-Suburb: Large 40.67742
## 64913            Comal County     48091     41-Rural: Fringe 29.72450
## 64984        Salt Lake County     49035     21-Suburb: Large 40.64499
## 65028            Ocean County     34029       13-City: Small 40.09381
## 65030        San Diego County      6073       11-City: Large 32.92809
## 65046            Ocean County     34029     21-Suburb: Large 40.00607
## 65056       Santa Cruz County      6087     41-Rural: Fringe 37.16838
## 65063            Ocean County     34029     21-Suburb: Large 39.84067
## 65064            Ocean County     34029     21-Suburb: Large 39.97622
## 65072           Monroe County     12087     32-Town: Distant 25.01341
## 65075            Ocean County     34029     21-Suburb: Large 39.97622
## 65076          Ventura County      6111    12-City: Mid-size 34.15960
## 65129           Camden County     34007       13-City: Small 39.94869
## 65134           Orange County     12095     21-Suburb: Large 28.57772
## 65136           Orange County     12095     21-Suburb: Large 28.57772
## 65172      Los Angeles County      6037    12-City: Mid-size 34.19933
## 65175             Utah County     49049     21-Suburb: Large 40.36144
## 65186         Maricopa County      4013     41-Rural: Fringe 33.43364
## 65193            Davis County     49011     21-Suburb: Large 40.86969
## 65194            Weber County     49057       13-City: Small 41.20422
## 65211             Cook County     17031       11-City: Large 41.90017
## 65214            Weber County     49057       13-City: Small 41.21301
## 65219            Weber County     49057       13-City: Small 41.24130
## 65220            Weber County     49057       13-City: Small 41.23198
## 65281         Okaloosa County     12091     32-Town: Distant 30.74964
## 65282         Okaloosa County     12091     41-Rural: Fringe 30.69897
## 65285         Okaloosa County     12091       13-City: Small 30.40598
## 65286         Okaloosa County     12091     32-Town: Distant 30.74960
## 65287         Okaloosa County     12091       13-City: Small 30.40609
## 65288         Okaloosa County     12091     41-Rural: Fringe 30.69897
## 65309       Okeechobee County     12093     32-Town: Distant 27.23687
## 65310       Okeechobee County     12093     32-Town: Distant 27.23687
## 65311       Okeechobee County     12093     32-Town: Distant 27.23653
## 65323         Oklahoma County     40109     21-Suburb: Large 35.45362
## 65324         Oklahoma County     40109     21-Suburb: Large 35.45362
## 65325         Oklahoma County     40109     21-Suburb: Large 35.45362
## 65329       Washington County     40147     32-Town: Distant 36.72864
## 65330       Washington County     40147     32-Town: Distant 36.72864
## 65333         Muskogee County     40101     32-Town: Distant 35.75529
## 65334         Muskogee County     40101     32-Town: Distant 35.75529
## 65335           Murray County     40099      33-Town: Remote 34.51212
## 65336           Murray County     40099      33-Town: Remote 34.51210
## 65389            Marin County      6041     21-Suburb: Large 38.00476
## 65404          Wasatch County     49051     32-Town: Distant 40.49498
## 65405           Tooele County     49045     32-Town: Distant 40.65043
## 65429        Worcester County     25027     41-Rural: Fringe 42.10858
## 65430        San Diego County      6073       11-City: Large 32.74672
## 65485             Kern County      6029     21-Suburb: Large 35.41494
## 65559             Kane County     17089     21-Suburb: Large 41.74160
## 65575          McHenry County     17111      31-Town: Fringe 42.31622
## 65602       Palm Beach County     12099     21-Suburb: Large 26.37683
## 65622        Salt Lake County     49035     21-Suburb: Large 40.68434
## 65623        Salt Lake County     49035     21-Suburb: Large 40.66788
## 65636         Maricopa County      4013       11-City: Large 33.47994
## 65637         Maricopa County      4013       11-City: Large 33.47993
## 65638         Maricopa County      4013     21-Suburb: Large 33.55126
## 65639         Maricopa County      4013    12-City: Mid-size 33.44295
## 65640         Maricopa County      4013     21-Suburb: Large 33.58132
## 65641             Pima County      4019       11-City: Large 32.13647
## 65642         Maricopa County      4013       11-City: Large 33.63858
## 65643             Cook County     17031       11-City: Large 41.87493
## 65644          Cochise County      4003      33-Town: Remote 31.34882
## 65687      San Joaquin County      6077       11-City: Large 37.90906
## 65711        Sherburne County     27141     21-Suburb: Large 45.32108
## 65712            Davis County     49011     21-Suburb: Large 40.98080
## 65755              Lee County      1081       13-City: Small 32.65599
## 65761        Salt Lake County     49035    12-City: Mid-size 40.77245
## 65768             Pima County      4019      31-Town: Fringe 32.45429
## 65793      Los Angeles County      6037    12-City: Mid-size 34.15228
## 65794      Los Angeles County      6037    12-City: Mid-size 34.15228
## 65795           Orange County      6059     21-Suburb: Large 33.47434
## 65796      Los Angeles County      6037     21-Suburb: Large 34.13963
## 65797      Los Angeles County      6037     21-Suburb: Large 34.43835
## 65799             Dale County      1045      31-Town: Fringe 31.45605
## 65800             Dale County      1045      31-Town: Fringe 31.45578
## 65821      Los Angeles County      6037     21-Suburb: Large 34.09767
## 65822   San Bernardino County      6071     21-Suburb: Large 34.06346
## 65823   San Bernardino County      6071    12-City: Mid-size 34.08301
## 65824       Sacramento County      6067     21-Suburb: Large 38.64827
## 65825   San Bernardino County      6071    12-City: Mid-size 34.47145
## 65833        Salt Lake County     49035     21-Suburb: Large 40.51610
## 65834        Salt Lake County     49035     21-Suburb: Large 40.65552
## 65835        Salt Lake County     49035     21-Suburb: Large 40.62104
## 65837            Pinal County      4021    42-Rural: Distant 32.60841
## 65859           Orange County      6059       11-City: Large 33.83794
## 65861            Essex County     34013     21-Suburb: Large 40.77829
## 65899           Orange County      6059       11-City: Large 33.85215
## 65905         Maricopa County      4013       11-City: Large 33.47308
## 65919         Maricopa County      4013       11-City: Large 33.54495
## 65956             Utah County     49049      31-Town: Fringe 39.96551
## 65980             Utah County     49049       13-City: Small 40.31652
## 65981            Davis County     49011     21-Suburb: Large 40.84269
## 66018             Dane County     55025     41-Rural: Fringe 42.95217
## 66035             Utah County     49049       13-City: Small 40.29214
## 66036             Utah County     49049       13-City: Small 40.31087
## 66037             Utah County     49049       13-City: Small 40.29063
## 66044         Humboldt County      6023     43-Rural: Remote 41.28703
## 66049     Contra Costa County      6013     21-Suburb: Large 37.85101
## 66059            Weber County     49057     21-Suburb: Large 41.29631
## 66083        San Mateo County      6081     21-Suburb: Large 37.38075
## 66089         Hennepin County     27053     41-Rural: Fringe 45.00919
## 66186            Piute County     49031     43-Rural: Remote 38.45079
## 66187            Piute County     49031     43-Rural: Remote 38.45081
## 66188          Osceola County     12097     21-Suburb: Large 28.24660
## 66220          Osceola County     12097     21-Suburb: Large 28.24660
## 66221          Osceola County     12097     21-Suburb: Large 28.24660
## 66222          Osceola County     12097     21-Suburb: Large 28.24660
## 66228        Winnebago County     55139       13-City: Small 44.07177
## 66242         Hennepin County     27053     21-Suburb: Large 45.08796
## 66267          Kendall County     17093     21-Suburb: Large 41.68390
## 66370       Washington County     49053       13-City: Small 37.10787
## 66397           Tooele County     49045     32-Town: Distant 40.56641
## 66455         Sangamon County     17167    12-City: Mid-size 39.78961
## 66470             Inyo County      6027     43-Rural: Remote 36.80298
## 66471             Inyo County      6027     43-Rural: Remote 36.80298
## 66496             Elko County     32007     43-Rural: Remote 41.94312
## 66509          Calhoun County      1015       13-City: Small 33.61122
## 66543           Orange County      6059     21-Suburb: Large 33.62878
## 66544           Orange County      6059     21-Suburb: Large 33.62920
## 66558          Tillman County     40141    42-Rural: Distant 34.50478
## 66560     Pottawatomie County     40125     41-Rural: Fringe 35.24965
## 66569          Webster County     29225    42-Rural: Distant 37.15364
## 66592           Dallas County     48113       11-City: Large 32.77158
## 66593           Dallas County     48113       11-City: Large 32.77158
## 66594           Dallas County     48113       11-City: Large 32.77158
## 66595           Dallas County     48113       11-City: Large 32.77158
## 66601           Bailey County     48017      33-Town: Remote 34.22407
## 66602             Lamb County     48279     43-Rural: Remote 34.06306
## 66620          Alachua County     12001    12-City: Mid-size 29.64040
## 66631          Alachua County     12001    12-City: Mid-size 29.64866
## 66632          Henrico County     51087     21-Suburb: Large 37.66192
## 66640       Miami-Dade County     12086       11-City: Large 25.80939
## 66641            Pasco County     12101     21-Suburb: Large 28.26815
## 66643         Hernando County     12053  22-Suburb: Mid-size 28.47913
## 66648          Volusia County     12127       13-City: Small 29.27938
## 66651          Broward County     12011     21-Suburb: Large 26.15654
## 66653            Duval County     12031       11-City: Large 30.35358
## 66660          Yavapai County      4025     23-Suburb: Small 34.57971
## 66669      Los Angeles County      6037    12-City: Mid-size 34.14001
## 66681        Mendocino County      6045     43-Rural: Remote 38.91325
## 66687       Santa Cruz County      6087    42-Rural: Distant 37.01177
## 66691        Salt Lake County     49035    12-City: Mid-size 40.79298
## 66698      Los Angeles County      6037       11-City: Large 34.15888
## 66705         Monterey County      6053     43-Rural: Remote 35.91983
## 66706        San Diego County      6073     21-Suburb: Large 33.21139
## 66747             Page County     51139    42-Rural: Distant 38.60114
## 66758         Coconino County      4005      33-Town: Remote 36.91488
## 66775           Sevier County     49041      33-Town: Remote 38.77553
## 66794         Maricopa County      4013     41-Rural: Fringe 33.42489
## 66822            Butte County      6007     32-Town: Distant 39.43645
## 66844           Bergen County     34003     21-Suburb: Large 40.83844
## 66852          Brevard County     12009       13-City: Small 28.04866
## 66855       Palm Beach County     12099     21-Suburb: Large 26.65259
## 66859       Palm Beach County     12099     21-Suburb: Large 26.82395
## 66871       Palm Beach County     12099     21-Suburb: Large 26.81622
## 66876      Los Angeles County      6037     21-Suburb: Large 34.22217
## 66902       Palm Beach County     12099     21-Suburb: Large 26.65351
## 66908         Maricopa County      4013  22-Suburb: Mid-size 33.47755
## 66966          Manatee County     12081     21-Suburb: Large 27.64002
## 66967         Florence County     45041     41-Rural: Fringe 34.21457
## 67008        San Diego County      6073     21-Suburb: Large 33.15957
## 67038         Maricopa County      4013       11-City: Large 33.49400
## 67043              Bay County     12005       13-City: Small 30.15195
## 67056         Garfield County     49017     43-Rural: Remote 37.82169
## 67057         Garfield County     49017     43-Rural: Remote 37.82181
## 67058         Garfield County     49017     43-Rural: Remote 37.82083
## 67063       San Benito County      6069     43-Rural: Remote 36.60679
## 67078       Washington County     49053       13-City: Small 37.11355
## 67110          Norfolk County     25021     21-Suburb: Large 42.17603
## 67116        Salt Lake County     49035     21-Suburb: Large 40.54114
## 67117      Los Angeles County      6037     21-Suburb: Large 34.20876
## 67119            Butte County      6007      31-Town: Fringe 39.77300
## 67121         Maricopa County      4013     21-Suburb: Large 33.63009
## 67132         Maricopa County      4013     21-Suburb: Large 33.59990
## 67138            Butte County      6007      31-Town: Fringe 39.77860
## 67151         Maricopa County      4013     21-Suburb: Large 33.31723
## 67155         Maricopa County      4013     21-Suburb: Large 33.56484
## 67158       Sacramento County      6067       13-City: Small 38.60963
## 67230           Summit County     49043     32-Town: Distant 40.66718
## 67295        Salt Lake County     49035     21-Suburb: Large 40.57027
## 67326             Utah County     49049     21-Suburb: Large 40.11080
## 67339        Box Elder County     49003     43-Rural: Remote 41.82144
## 67340        Box Elder County     49003     43-Rural: Remote 41.82144
## 67360          Yavapai County      4025     23-Suburb: Small 34.60049
## 67361             Utah County     49049     21-Suburb: Large 40.03866
## 67366       Palm Beach County     12099     21-Suburb: Large 26.55916
## 67487        Salt Lake County     49035     21-Suburb: Large 40.65841
## 67488            Davis County     49011     21-Suburb: Large 41.14652
## 67558        Salt Lake County     49035    12-City: Mid-size 40.74845
## 67620           Summit County     49043     32-Town: Distant 40.69748
## 67621           Summit County     49043     32-Town: Distant 40.69720
## 67642             Iron County     49021      33-Town: Remote 37.84578
## 67643             Iron County     49021      33-Town: Remote 37.84477
## 67681           Placer County      6061     21-Suburb: Large 38.89760
## 67693      Los Angeles County      6037     21-Suburb: Large 34.20495
## 67703            Pasco County     12101     23-Suburb: Small 28.35183
## 67709            Pasco County     12101     41-Rural: Fringe 28.37640
## 67715       Sacramento County      6067       13-City: Small 38.61749
## 67733           Dallas County     48113       11-City: Large 32.77158
## 67743          Passaic County     34031     21-Suburb: Large 40.90056
## 67756       Santa Cruz County      4023    42-Rural: Distant 31.54521
## 67773       Miami-Dade County     12086     21-Suburb: Large 25.83277
## 67774         Maricopa County      4013       11-City: Large 33.46819
## 67802        San Diego County      6073     21-Suburb: Large 33.28701
## 67803        San Diego County      6073     21-Suburb: Large 33.10465
## 67806           Sonoma County      6097     21-Suburb: Large 38.35443
## 67812              Nye County     32023      33-Town: Remote 36.19108
## 67818         Maricopa County      4013       11-City: Large 33.47232
## 67822             Cook County     17031       11-City: Large 41.93960
## 67831          Goodhue County     27049     41-Rural: Fringe 44.53680
## 67861        Jefferson Parish     22051     41-Rural: Fringe 29.89248
## 68022          Yavapai County      4025    42-Rural: Distant 34.90767
## 68038             Pima County      4019       11-City: Large 32.22320
## 68039             Pima County      4019       11-City: Large 32.23118
## 68053              Lee County     17103    42-Rural: Distant 41.69043
## 68057              Lee County     17103    42-Rural: Distant 41.69140
## 68079             Kane County     17089     21-Suburb: Large 41.84704
## 68080             Kane County     17089     21-Suburb: Large 41.83035
## 68113             Utah County     49049     21-Suburb: Large 40.02851
## 68115             Utah County     49049     21-Suburb: Large 40.02826
## 68118             Pima County      4019      33-Town: Remote 32.37375
## 68119             Pima County      4019       11-City: Large 32.26898
## 68120             Pima County      4019     41-Rural: Fringe 32.01845
## 68121             Pima County      4019       11-City: Large 32.22773
## 68122             Pima County      4019       11-City: Large 32.14570
## 68123             Pima County      4019       11-City: Large 32.16649
## 68124             Pima County      4019     21-Suburb: Large 32.34311
## 68125             Pima County      4019     43-Rural: Remote 31.82321
## 68126             Pima County      4019     21-Suburb: Large 32.37458
## 68127             Pima County      4019     21-Suburb: Large 32.30586
## 68128             Pima County      4019       11-City: Large 32.24442
## 68130             Pima County      4019       11-City: Large 32.20543
## 68131             Pima County      4019      31-Town: Fringe 32.05758
## 68132             Pima County      4019       11-City: Large 32.13608
## 68133             Pima County      4019     41-Rural: Fringe 32.08838
## 68134             Pima County      4019       11-City: Large 32.27446
## 68135             Pima County      4019       11-City: Large 32.21488
## 68136             Pima County      4019     41-Rural: Fringe 32.40861
## 68137             Pima County      4019     41-Rural: Fringe 32.36691
## 68138             Pima County      4019     21-Suburb: Large 32.37948
## 68139             Pima County      4019       11-City: Large 32.20554
## 68140             Pima County      4019       11-City: Large 32.21732
## 68141             Pima County      4019       11-City: Large 32.18288
## 68142             Pima County      4019       11-City: Large 32.22739
## 68143       Santa Cruz County      4023      33-Town: Remote 31.50463
## 68144             Pima County      4019     21-Suburb: Large 32.29865
## 68145             Pima County      4019     32-Town: Distant 31.95915
## 68146             Pima County      4019       11-City: Large 32.22638
## 68147            Pinal County      4021     41-Rural: Fringe 32.59777
## 68148             Pima County      4019       11-City: Large 32.17595
## 68149             Pima County      4019     21-Suburb: Large 32.12751
## 68150             Pima County      4019       11-City: Large 32.14274
## 68151             Pima County      4019     21-Suburb: Large 32.28582
## 68152             Pima County      4019       11-City: Large 32.22276
## 68153             Pima County      4019       11-City: Large 32.22693
## 68154             Pima County      4019       11-City: Large 32.22739
## 68155             Pima County      4019     21-Suburb: Large 32.09208
## 68156             Pima County      4019     41-Rural: Fringe 31.97054
## 68157       Santa Cruz County      4023      33-Town: Remote 31.36714
## 68158       Santa Cruz County      4023      33-Town: Remote 31.34061
## 68209             Kern County      6029     43-Rural: Remote 34.85761
## 68303        Winnebago County     17201    42-Rural: Distant 42.30640
## 68304        Winnebago County     17201    42-Rural: Distant 42.31030
## 68307        Winnebago County     17201    42-Rural: Distant 42.30188
## 68338  San Luis Obispo County      6079       13-City: Small 35.28128
## 68449         Maricopa County      4013       11-City: Large 33.49172
## 68464        Milwaukee County     55079       11-City: Large 43.04986
## 68468        San Mateo County      6081     21-Suburb: Large 37.61239
## 68474         Santa Fe County     35049     41-Rural: Fringe 35.56206
## 68501           Nevada County      6057     41-Rural: Fringe 39.25604
## 68568         Maricopa County      4013  22-Suburb: Mid-size 33.49561
## 68579         Maricopa County      4013     21-Suburb: Large 33.57978
## 68580           Peoria County     17143     21-Suburb: Large 40.68953
## 68597       Montgomery County     24031     21-Suburb: Large 39.17883
## 68598          Hockley County     48219    42-Rural: Distant 33.45983
## 68698            Perry County     28111    42-Rural: Distant 31.19809
## 68774         Pershing County     32027     43-Rural: Remote 40.18314
## 68782             Will County     17197     21-Suburb: Large 41.52687
## 68801             Cook County     17031       11-City: Large 41.82793
## 68802             Cook County     17031       11-City: Large 41.74600
## 68803             Cook County     17031       11-City: Large 41.85636
## 68804             Cook County     17031       11-City: Large 41.74600
## 68811        Salt Lake County     49035     21-Suburb: Large 40.59834
## 68839           Greene County      1063    42-Rural: Distant 32.84639
## 68870         Petersburg city     51730     21-Suburb: Large 37.22722
## 68940           Greene County     29077    12-City: Mid-size 37.19767
## 69031        Salt Lake County     49035     21-Suburb: Large 40.69051
## 69060         Maricopa County      4013       11-City: Large 33.49143
## 69064     Chesterfield County     51041     21-Suburb: Large 37.38791
## 69066           Shasta County      6089       13-City: Small 40.57578
## 69068         Maricopa County      4013       11-City: Large 33.54862
## 69070         Maricopa County      4013       11-City: Large 33.48122
## 69071         Maricopa County      4013       11-City: Large 33.39511
## 69072         Maricopa County      4013       11-City: Large 33.39425
## 69073         Maricopa County      4013       11-City: Large 33.40504
## 69096       Blue Earth County     27013       13-City: Small 44.16669
## 69099           Dallas County      1047     32-Town: Distant 32.40834
## 69100         Hennepin County     27053       13-City: Small 45.02095
## 69117         Siskiyou County      6093     43-Rural: Remote 41.96370
## 69153          Wapello County     19179      33-Town: Remote 40.99805
## 69157        St. Johns County     12109     41-Rural: Fringe 29.92204
## 69161         Nottoway County     51135    42-Rural: Distant 37.26374
## 69170            Henry County     51089     41-Rural: Fringe 36.73786
## 69184          Alameda County      6001     21-Suburb: Large 37.82249
## 69186    Prince Edward County     51147      33-Town: Remote 37.31958
## 69232         Morrison County     27097    42-Rural: Distant 45.97844
## 69244             Pike County      1109      33-Town: Remote 31.80630
## 69289           Mohave County      4015     32-Town: Distant 34.85159
## 69290         Maricopa County      4013       11-City: Large 33.56842
## 69314             Pima County      4019     41-Rural: Fringe 31.97065
## 69324             Pima County      4019     21-Suburb: Large 32.31316
## 69330             Pima County      4019       11-City: Large 32.23915
## 69331             Pima County      4019       11-City: Large 32.23929
## 69332             Pima County      4019       11-City: Large 32.23320
## 69333             Pima County      4019       11-City: Large 32.16129
## 69334             Pima County      4019       11-City: Large 32.16284
## 69394         Coconino County      4005       13-City: Small 35.19167
## 69420           Amador County      6005    42-Rural: Distant 38.41149
## 69518       Washington County     49053       13-City: Small 37.11992
## 69519       Washington County     49053       13-City: Small 37.11143
## 69533       Miami-Dade County     12086     21-Suburb: Large 25.76934
## 69551       Miami-Dade County     12086     21-Suburb: Large 25.76020
## 69552       Miami-Dade County     12086     21-Suburb: Large 25.76020
## 69576       Burlington County     34005    42-Rural: Distant 39.68343
## 69581         Pinellas County     12103     21-Suburb: Large 27.90261
## 69583         Pinellas County     12103     21-Suburb: Large 27.89953
## 69594         Pinellas County     12103     21-Suburb: Large 27.90316
## 69595         Pinellas County     12103     21-Suburb: Large 27.90314
## 69596         Pinellas County     12103       13-City: Small 27.91278
## 69688           Carbon County     49007      33-Town: Remote 39.60323
## 69689         Maricopa County      4013       11-City: Large 33.40013
## 69690       Santa Cruz County      4023      33-Town: Remote 31.36955
## 69695            Pinal County      4021     23-Suburb: Small 32.88661
## 69696         Maricopa County      4013    12-City: Mid-size 33.39322
## 69698         Maricopa County      4013    12-City: Mid-size 33.39325
## 69699         Maricopa County      4013    12-City: Mid-size 33.38268
## 69701         Maricopa County      4013     21-Suburb: Large 33.69577
## 69766           Merced County      6047     32-Town: Distant 37.24899
## 69774             Utah County     49049     21-Suburb: Large 40.37723
## 69792             Will County     17197     21-Suburb: Large 41.42937
## 69794         Maricopa County      4013       11-City: Large 33.49081
## 69802        Salt Lake County     49035     21-Suburb: Large 40.68781
## 69803            Weber County     49057     21-Suburb: Large 41.26410
## 69957     Pittsylvania County     51143    42-Rural: Distant 36.76423
## 69958            Piute County     49031     43-Rural: Remote 38.24558
## 69963        San Diego County      6073     21-Suburb: Large 33.12439
## 69964            Butte County      6007       13-City: Small 39.74757
## 69965           Sonoma County      6097    12-City: Mid-size 38.46598
## 69970           Martin County     12085     21-Suburb: Large 27.14387
## 69971       Miami-Dade County     12086       11-City: Large 25.78899
## 69973       Washington County     27163     21-Suburb: Large 44.82987
## 69986            Weber County     49057     21-Suburb: Large 41.30252
## 70053          Kendall County     17093     21-Suburb: Large 41.65673
## 70059           Collin County     48085  22-Suburb: Mid-size 33.24866
## 70115             Weld County      8123    12-City: Mid-size 40.45106
## 70143         Maricopa County      4013       11-City: Large 33.61180
## 70148          Sanpete County     49039     41-Rural: Fringe 39.53632
## 70157        Salt Lake County     49035     21-Suburb: Large 40.70917
## 70173             Utah County     49049     21-Suburb: Large 40.36041
## 70177             Utah County     49049     21-Suburb: Large 40.37156
## 70240           Nevada County      6057     41-Rural: Fringe 39.05127
## 70286           Orange County      6059     21-Suburb: Large 33.72015
## 70351          Fairfax County     51059     21-Suburb: Large 38.80604
## 70365           Plumas County      6063      33-Town: Remote 39.93599
## 70366           Plumas County      6063     41-Rural: Fringe 39.93390
## 70367           Plumas County      6063      33-Town: Remote 39.93618
## 70397        Salt Lake County     49035     21-Suburb: Large 40.65636
## 70469       Newport News city     51700    12-City: Mid-size 37.08477
## 70504         Maricopa County      4013       11-City: Large 33.62327
## 70505             Utah County     49049       13-City: Small 40.27858
## 70524             Polk County     12105     21-Suburb: Large 28.03234
## 70528             Polk County     12105  22-Suburb: Mid-size 28.14240
## 70529            Weber County     49057       13-City: Small 41.21730
## 70535             Polk County     12105     21-Suburb: Large 28.03222
## 70536             Polk County     12105     21-Suburb: Large 28.03234
## 70586          Broward County     12011    12-City: Mid-size 26.26853
## 70658             Utah County     49049     21-Suburb: Large 40.35890
## 70674             Napa County      6055    42-Rural: Distant 38.62315
## 70755         Monmouth County     34025     21-Suburb: Large 40.43947
## 70769           Martin County     12085     21-Suburb: Large 27.14660
## 70808           Porter County     18127     21-Suburb: Large 41.47744
## 70809           Porter County     18127     21-Suburb: Large 41.50086
## 70851           Plumas County      6063     41-Rural: Fringe 39.93390
## 70883       Washington County     49053       13-City: Small 37.10787
## 70889          Carroll County     24013     23-Suburb: Small 39.56037
## 70895          Broward County     12011    12-City: Mid-size 26.18715
## 71038         Powhatan County     51145    42-Rural: Distant 37.52209
## 71047            Pinal County      4021     23-Suburb: Small 32.87973
## 71048             Pima County      4019       11-City: Large 32.16934
## 71049             Yuma County      4027     32-Town: Distant 32.50064
## 71050          Cochise County      4003       13-City: Small 31.53244
## 71051             Yuma County      4027      31-Town: Fringe 32.59773
## 71053          Cochise County      4003      33-Town: Remote 31.34673
## 71064       Blue Earth County     27013       13-City: Small 44.16739
## 71161          McHenry County     17111     21-Suburb: Large 42.27042
## 71180          Alachua County     12001  22-Suburb: Mid-size 29.62137
## 71182           DeKalb County     17037     21-Suburb: Large 41.65739
## 71226           Ramsey County     27123     21-Suburb: Large 45.02866
## 71238          McHenry County     17111      31-Town: Fringe 42.27916
## 71260         Pinellas County     12103       13-City: Small 27.91278
## 71263           Richmond city     51760    12-City: Mid-size 37.54452
## 71264            Bexar County     48029       11-City: Large 29.35615
## 71267         Maricopa County      4013       11-City: Large 33.46489
## 71271             Gulf County     12045    42-Rural: Distant 30.10520
## 71272         Columbia County     12023     32-Town: Distant 30.18858
## 71273       Miami-Dade County     12086     21-Suburb: Large 25.71689
## 71278         Hennepin County     27053       11-City: Large 45.00429
## 71279  Prince George's County     24033     21-Suburb: Large 38.81869
## 71280           Martin County     12085     21-Suburb: Large 27.14387
## 71281         Hennepin County     27053       11-City: Large 44.94591
## 71285         Maricopa County      4013       11-City: Large 33.49564
## 71337        Riverside County      6065     21-Suburb: Large 33.68348
## 71338   San Bernardino County      6071     41-Rural: Fringe 34.14993
## 71339        Salt Lake County     49035     21-Suburb: Large 40.50726
## 71344          Ventura County      6111       13-City: Small 34.23839
## 71345        Riverside County      6065       11-City: Large 33.97892
## 71368          Yavapai County      4025     41-Rural: Fringe 34.58218
## 71380    San Francisco County      6075       11-City: Large 37.79780
## 71384             Pima County      4019       11-City: Large 32.26532
## 71389           Cabell County     54011  22-Suburb: Mid-size 38.43383
## 71390         Harrison County     54033     41-Rural: Fringe 39.22400
## 71468      San Joaquin County      6077     23-Suburb: Small 37.74561
## 71473         Maricopa County      4013     21-Suburb: Large 33.34181
## 71482    Prince Edward County     51147      33-Town: Remote 37.26706
## 71491   Prince William County     51153     41-Rural: Fringe 38.63255
## 71499           Mercer County     54055     32-Town: Distant 37.36921
## 71500       Mille Lacs County     27095     32-Town: Distant 45.57043
## 71507       Mille Lacs County     27095     32-Town: Distant 45.57024
## 71527       Mille Lacs County     27095     32-Town: Distant 45.57032
## 71577           Bergen County     34003     21-Suburb: Large 40.99407
## 71586       Montgomery County      1101    12-City: Mid-size 32.34835
## 71588          Russell County     51167     32-Town: Distant 36.90094
## 71595           Grundy County     17063     21-Suburb: Large 41.45449
## 71598      Northampton County     51131     43-Rural: Remote 37.40387
## 71599       Montgomery County     48339     21-Suburb: Large 30.13339
## 71600       Montgomery County     48339     41-Rural: Fringe 30.19703
## 71602         Fluvanna County     51065    42-Rural: Distant 37.87407
## 71603         Powhatan County     51145    42-Rural: Distant 37.54588
## 71608           Martin County     12085     21-Suburb: Large 27.19958
## 71609          Olmsted County     27109    12-City: Mid-size 44.01631
## 71611            Perry County     17145     32-Town: Distant 38.00918
## 71613          Lowndes County      1085    42-Rural: Distant 32.15128
## 71614         Atlantic County     34001  22-Suburb: Mid-size 39.42045
## 71615       Burlington County     34005     21-Suburb: Large 40.01397
## 71616         Cape May County     34009     41-Rural: Fringe 39.09888
## 71617           Mercer County     34021     21-Suburb: Large 40.24735
## 71618         Monmouth County     34025     21-Suburb: Large 40.26598
## 71619           Warren County     34041     41-Rural: Fringe 40.76623
## 71627        Box Elder County     49003     21-Suburb: Large 41.46080
## 71669         Maricopa County      4013       11-City: Large 33.62361
## 71696        Salt Lake County     49035     41-Rural: Fringe 40.48505
## 71700            Cache County     49005     23-Suburb: Small 41.70831
## 71715             Utah County     49049    12-City: Mid-size 40.24249
## 71716             Utah County     49049    12-City: Mid-size 40.24689
## 71717             Utah County     49049    12-City: Mid-size 40.24868
## 71718             Utah County     49049    12-City: Mid-size 40.23451
## 71719             Utah County     49049    12-City: Mid-size 40.22515
## 72527          Pulaski County     51155     41-Rural: Fringe 37.09115
## 72555          Fairfax County     51059     21-Suburb: Large 38.77603
## 72606           Putnam County     54079  22-Suburb: Mid-size 38.53509
## 72618           Putnam County     12107     32-Town: Distant 29.63118
## 72637           Putnam County     12107     32-Town: Distant 29.64806
## 72638           Putnam County     12107     32-Town: Distant 29.64806
## 72639           Putnam County     12107     32-Town: Distant 29.64806
## 72651       Santa Cruz County      4023      33-Town: Remote 31.34066
## 72671        Salt Lake County     49035     21-Suburb: Large 40.58712
## 72684             Kern County      6029       11-City: Large 35.35773
## 72695          Fairfax County     51059     21-Suburb: Large 38.77890
## 72756            Weber County     49057     21-Suburb: Large 41.19161
## 72762     Spotsylvania County     51177     41-Rural: Fringe 38.18068
## 72814           Clarke County     28023     43-Rural: Remote 32.03465
## 72922        San Diego County      6073     21-Suburb: Large 33.02139
## 72923        San Diego County      6073     21-Suburb: Large 33.02140
## 72959           Racine County     55101  22-Suburb: Mid-size 42.70988
## 72980             Knox County     17095     32-Town: Distant 40.94779
## 72981             Knox County     17095     32-Town: Distant 40.94611
## 72983           Warren County     17187     32-Town: Distant 40.91264
## 72986           Camden County     34007       13-City: Small 39.95095
## 72991             Kern County      6029       11-City: Large 35.36607
## 73021        Riverside County      6065     21-Suburb: Large 33.93225
## 73095            Logan County     54045     41-Rural: Fringe 37.82695
## 73146      Los Angeles County      6037     21-Suburb: Large 33.89822
## 73180   San Bernardino County      6071    12-City: Mid-size 34.01289
## 73185             Utah County     49049     21-Suburb: Large 40.35943
## 73220         Maricopa County      4013  22-Suburb: Mid-size 33.47284
## 73300         Randolph County     54083      33-Town: Remote 38.89034
## 73303         Randolph County      1111     43-Rural: Remote 33.29771
## 73304         Randolph County      1111     43-Rural: Remote 33.29772
## 73355         Stafford County     51179     21-Suburb: Large 38.40963
## 73356            Brown County     27015     32-Town: Distant 44.29978
## 73395        San Mateo County      6081     21-Suburb: Large 37.46107
## 73437            Pinal County      4021     43-Rural: Remote 33.06486
## 73473           Racine County     55101     41-Rural: Fringe 42.79797
## 73489      Santa Clara County      6085     21-Suburb: Large 37.23385
## 73527         Maricopa County      4013     21-Suburb: Large 33.59555
## 73528         Maricopa County      4013       11-City: Large 33.52534
## 73537           Sonoma County      6097     41-Rural: Fringe 38.39146
## 73551          St. Louis city     29510       11-City: Large 38.65632
## 73554        Middlesex County     34023     21-Suburb: Large 40.57182
## 73573            Davis County     49011     21-Suburb: Large 40.94796
## 73582             Utah County     49049     21-Suburb: Large 40.16605
## 73601           Bureau County     17011    42-Rural: Distant 41.29548
## 73603        Salt Lake County     49035     41-Rural: Fringe 40.48317
## 73604           Richmond city     51760    12-City: Mid-size 37.60157
## 73643           Tehama County      6103     41-Rural: Fringe 40.17344
## 73656             Juab County     49023     32-Town: Distant 39.71095
## 73676           Sevier County     49041     41-Rural: Fringe 38.76256
## 73688         Beltrami County     27007     43-Rural: Remote 47.87851
## 73712       Washington County     49053     23-Suburb: Small 37.16555
## 73781           Shasta County      6089     41-Rural: Fringe 40.59544
## 73782           Shasta County      6089       13-City: Small 40.62958
## 73790         Waushara County     55137    42-Rural: Distant 44.05376
## 73792           Orange County     51137     41-Rural: Fringe 38.23918
## 73816           DeSoto County     12027     32-Town: Distant 27.22102
## 73846        Salt Lake County     49035     21-Suburb: Large 40.71337
## 73862            Marin County      6041     21-Suburb: Large 37.88152
## 73901            Kings County      6031     32-Town: Distant 36.00395
## 73908             Utah County     49049     21-Suburb: Large 40.11709
## 73927        Buena Vista city     51530     32-Town: Distant 37.73683
## 73928            Roanoke city     51770       13-City: Small 37.28330
## 73931            Boone County     17007     21-Suburb: Large 42.25482
## 73933            Henry County     17073    42-Rural: Distant 41.41507
## 73954     King William County     51101    42-Rural: Distant 37.74186
## 73955         Stafford County     51179     41-Rural: Fringe 38.38150
## 73956        Winnebago County     17201     41-Rural: Fringe 42.30326
## 73957         Monmouth County     34025     41-Rural: Fringe 40.27033
## 73958     Pittsylvania County     51143    42-Rural: Distant 36.79017
## 73959            Wythe County     51197     32-Town: Distant 36.94243
## 73965           Mercer County     34021     21-Suburb: Large 40.25180
## 73968             Wise County     51195     32-Town: Distant 36.98058
## 73971         Stafford County     51179  22-Suburb: Mid-size 38.33303
## 73988         Maricopa County      4013       11-City: Large 33.62070
## 73989         Maricopa County      4013       11-City: Large 33.67785
## 74028             Utah County     49049     21-Suburb: Large 40.43051
## 74032            Davis County     49011     21-Suburb: Large 41.03046
## 74068             Lake County      6033     32-Town: Distant 39.11167
## 74094            Scott County     51169  22-Suburb: Mid-size 36.64105
## 74122        Riverside County      6065     21-Suburb: Large 33.92737
## 74159         Columbia County     12023     32-Town: Distant 30.18858
## 74161          Bristol County     25005     21-Suburb: Large 41.70592
## 74198         Maricopa County      4013       11-City: Large 33.40192
## 74199       Sacramento County      6067     21-Suburb: Large 38.63291
## 74294             Rich County     49033     43-Rural: Remote 41.66470
## 74298             Rich County     49033    42-Rural: Distant 41.82283
## 74300             Rich County     49033     43-Rural: Remote 41.66470
## 74369          Volusia County     12127       13-City: Small 29.21723
## 74414             Cook County     17031       11-City: Large 41.78367
## 74432           Harris County     48201       11-City: Large 29.99968
## 74444           Sevier County     49041      33-Town: Remote 38.76723
## 74447           Sevier County     49041      33-Town: Remote 38.76832
## 74462           Dallas County     48113       11-City: Large 32.92216
## 74476        San Diego County      6073     21-Suburb: Large 33.15529
## 74511           Richmond city     51760    12-City: Mid-size 37.55194
## 74515     Contra Costa County      6013     21-Suburb: Large 37.91110
## 74516     Contra Costa County      6013     21-Suburb: Large 37.91110
## 74522         Richmond County     51159    42-Rural: Distant 37.93111
## 74529           Lassen County      6035     41-Rural: Fringe 40.37176
## 74531         Waukesha County     55133     21-Suburb: Large 43.12053
## 74538          McHenry County     17111     41-Rural: Fringe 42.47603
## 74552           Richmond city     51760    12-City: Mid-size 37.54112
## 74554           Richmond city     51760    12-City: Mid-size 37.54967
## 74558       Miami-Dade County     12086     21-Suburb: Large 25.60446
## 74562           Richmond city     51760    12-City: Mid-size 37.57903
## 74563          McHenry County     17111     41-Rural: Fringe 42.44643
## 74634             Polk County     12105       13-City: Small 28.07659
## 74659        Salt Lake County     49035     21-Suburb: Large 40.61897
## 74676         Maricopa County      4013       11-City: Large 33.79019
## 74677            Cache County     49005     23-Suburb: Small 41.68554
## 74680             Utah County     49049     21-Suburb: Large 40.44562
## 74681         Sangamon County     17167    12-City: Mid-size 39.82879
## 74751            Pasco County     12101     21-Suburb: Large 28.27124
## 74784          McHenry County     17111    42-Rural: Distant 42.19232
## 74800        Salt Lake County     49035    12-City: Mid-size 40.73860
## 74805             Pima County      4019       11-City: Large 32.27413
## 74809   San Bernardino County      6071      31-Town: Fringe 34.24773
## 74912        Tom Green County     48451    12-City: Mid-size 31.43163
## 74940           Ripley County     18137    42-Rural: Distant 39.24570
## 74993        El Dorado County      6017     41-Rural: Fringe 38.65194
## 75052            Duval County     12031       11-City: Large 30.17699
## 75053            Duval County     12031       11-City: Large 30.22829
## 75078            Cache County     49005     23-Suburb: Small 41.72312
## 75084           Sonoma County      6097     41-Rural: Fringe 38.22615
## 75087          Ventura County      6111    12-City: Mid-size 34.15519
## 75109            Pasco County     12101     21-Suburb: Large 28.26763
## 75122             Utah County     49049     21-Suburb: Large 40.39407
## 75141        San Diego County      6073     21-Suburb: Large 32.85358
## 75194         Maricopa County      4013       11-City: Large 33.39498
## 75213      Rock Island County     17161     41-Rural: Fringe 41.61406
## 75237      Rock Island County     17161     41-Rural: Fringe 41.62153
## 75241            Weber County     49057     21-Suburb: Large 41.18321
## 75244      Rock Island County     17161     41-Rural: Fringe 41.61743
## 75268        Salt Lake County     49035     21-Suburb: Large 40.61150
## 75272         Hennepin County     27053     21-Suburb: Large 45.01142
## 75283        Jefferson Parish     22051     21-Suburb: Large 29.93838
## 75295        Riverside County      6065       11-City: Large 33.97888
## 75400            Cache County     49005       13-City: Small 41.73557
## 75407        Salt Lake County     49035     21-Suburb: Large 40.59268
## 75408       Washington County     49053     23-Suburb: Small 37.09692
## 75421        Jefferson County     30043     43-Rural: Remote 46.22746
## 75422        Jefferson County     30043     43-Rural: Remote 46.22746
## 75429        Salt Lake County     49035     21-Suburb: Large 40.52446
## 75439        Salt Lake County     49035     21-Suburb: Large 40.51221
## 75483        Salt Lake County     49035     21-Suburb: Large 40.64523
## 75499             Utah County     49049     21-Suburb: Large 40.10192
## 75500             Utah County     49049     21-Suburb: Large 40.39231
## 75530         Red Lake County     27125     43-Rural: Remote 47.83997
## 75536      Los Angeles County      6037     41-Rural: Fringe 34.09153
## 75545          Jackson County     54035    42-Rural: Distant 38.82244
## 75554            Roanoke city     51770       13-City: Small 37.25632
## 75555        Botetourt County     51023  22-Suburb: Mid-size 37.34260
## 75563        Riverside County      6065     41-Rural: Fringe 33.75889
## 75581         Hennepin County     27053     21-Suburb: Large 45.03231
## 75637             Lake County     17097     21-Suburb: Large 42.35919
## 75694        Salt Lake County     49035     21-Suburb: Large 40.67565
## 75725              Ada County     16001    12-City: Mid-size 43.61561
## 75745           Cabell County     54011  22-Suburb: Mid-size 38.41805
## 75922       Sacramento County      6067       11-City: Large 38.64681
## 75976             Utah County     49049    12-City: Mid-size 40.26524
## 76028             Ogle County     17141    42-Rural: Distant 41.98105
## 76076         Rockdale County     13247     21-Suburb: Large 33.68623
## 76137           Placer County      6061     21-Suburb: Large 38.80341
## 76138           Placer County      6061     21-Suburb: Large 38.79152
## 76139           Placer County      6061     21-Suburb: Large 38.80389
## 76174             Utah County     49049     21-Suburb: Large 40.37954
## 76226            Weber County     49057     21-Suburb: Large 41.17714
## 76227          Wasatch County     49051     32-Town: Distant 40.49693
## 76235             Utah County     49049     21-Suburb: Large 40.33660
## 76239           Shasta County      6089       13-City: Small 40.61980
## 76257          Stearns County     27145      31-Town: Fringe 45.46431
## 76286           Jersey County     17083     32-Town: Distant 39.11988
## 76287         Macoupin County     17117     32-Town: Distant 39.26532
## 76288             Lake County     17097     21-Suburb: Large 42.45453
## 76291            White County     17193    42-Rural: Distant 37.97826
## 76405           Phelps County     29161      33-Town: Remote 37.95075
## 76435        Salt Lake County     49035     21-Suburb: Large 40.68516
## 76488             Ohio County     54069       13-City: Small 40.07137
## 76530             Lake County     17097     21-Suburb: Large 42.27811
## 76670         Duchesne County     49013      33-Town: Remote 40.30430
## 76683       Palm Beach County     12099    12-City: Mid-size 26.73042
## 76703        Salt Lake County     49035     21-Suburb: Large 40.70120
## 76704            Weber County     49057     21-Suburb: Large 41.17141
## 76721        Salt Lake County     49035     21-Suburb: Large 40.72227
## 76728      Los Angeles County      6037       11-City: Large 34.05618
## 76771        Salt Lake County     49035     21-Suburb: Large 40.52983
## 76793        Salt Lake County     49035     21-Suburb: Large 40.51755
## 76795             Kane County     17089     21-Suburb: Large 41.73340
## 76820        Salt Lake County     49035    12-City: Mid-size 40.79038
## 76824           Tooele County     49045     32-Town: Distant 40.62660
## 76849        Salt Lake County     49035     21-Suburb: Large 40.70603
## 76996            Marin County      6041     21-Suburb: Large 38.00343
## 77018           Chaves County     35005    42-Rural: Distant 33.14083
## 77091    Prince George County     51149    42-Rural: Distant 37.03558
## 77094             Cook County     17031       11-City: Large 41.90781
## 77111      Los Angeles County      6037     21-Suburb: Large 33.98337
## 77151            Weber County     49057     21-Suburb: Large 41.17711
## 77156            Weber County     49057     21-Suburb: Large 41.16529
## 77167            Weber County     49057     21-Suburb: Large 41.16291
## 77194       Palm Beach County     12099     21-Suburb: Large 26.70843
## 77218        McDonough County     17109      33-Town: Remote 40.45549
## 77242         Maricopa County      4013       11-City: Large 33.60874
## 77264        St. Clair County      1115    42-Rural: Distant 33.83211
## 77417          Russell County     51167     32-Town: Distant 36.90131
## 77448         Franklin County      1059     32-Town: Distant 34.52507
## 77612           Colusa County      6011     41-Rural: Fringe 39.16037
## 77625             Clay County     29047     21-Suburb: Large 39.23142
## 77651         Maricopa County      4013       11-City: Large 33.39918
## 77656             Pima County      4019       11-City: Large 32.25176
## 77683       Sacramento County      6067       13-City: Small 38.56607
## 77686             Yolo County      6113     21-Suburb: Large 38.57577
## 77696            Pinal County      4021     32-Town: Distant 33.04744
## 77698            Pinal County      4021     32-Town: Distant 33.04738
## 77731         Maricopa County      4013       11-City: Large 33.61452
## 77733        San Diego County      6073       11-City: Large 32.92613
## 77738             Utah County     49049     21-Suburb: Large 40.15111
## 77745             Utah County     49049     41-Rural: Fringe 40.30672
## 77831            Anoka County     27003     41-Rural: Fringe 45.40006
## 77833            Bexar County     48029       11-City: Large 29.40739
## 77892             Utah County     49049     21-Suburb: Large 40.05820
## 77894             Utah County     49049     41-Rural: Fringe 40.06385
## 77903             Utah County     49049     21-Suburb: Large 40.05362
## 77928           Sevier County     49041     43-Rural: Remote 38.96211
## 77972           Carbon County     49007      33-Town: Remote 39.68972
## 78005        Salt Lake County     49035    12-City: Mid-size 40.75085
## 78006        Salt Lake County     49035    12-City: Mid-size 40.79447
## 78008        Salt Lake County     49035    12-City: Mid-size 40.79598
## 78009        Salt Lake County     49035    12-City: Mid-size 40.72106
## 78010         Maricopa County      4013     41-Rural: Fringe 33.46670
## 78011         Maricopa County      4013     41-Rural: Fringe 33.50691
## 78066           Mercer County     54055     41-Rural: Fringe 37.33169
## 78095          Volusia County     12127     41-Rural: Fringe 29.02227
## 78160      Los Angeles County      6037     21-Suburb: Large 34.06335
## 78168       San Benito County      6069     32-Town: Distant 36.84637
## 78176   San Bernardino County      6071    12-City: Mid-size 34.11054
## 78179        San Mateo County      6081     21-Suburb: Large 37.50888
## 78183        San Mateo County      6081     21-Suburb: Large 37.50127
## 78193        San Diego County      6073       11-City: Large 32.77005
## 78198        San Diego County      6073     21-Suburb: Large 33.20487
## 78202        San Diego County      6073     21-Suburb: Large 32.63428
## 78203        San Diego County      6073    42-Rural: Distant 33.26548
## 78217    San Francisco County      6075       11-City: Large 37.77611
## 78228        Riverside County      6065  22-Suburb: Mid-size 33.78685
## 78243      San Joaquin County      6077       11-City: Large 37.95463
## 78245      San Joaquin County      6077       11-City: Large 37.90906
## 78255            Duval County     12031       11-City: Large 30.20481
## 78263            Duval County     12031       11-City: Large 30.20480
## 78265        San Diego County      6073    42-Rural: Distant 33.27433
## 78272         San Juan County     49037      33-Town: Remote 37.62959
## 78279          Alameda County      6001     21-Suburb: Large 37.66894
## 78296        San Diego County      6073     21-Suburb: Large 33.14128
## 78306        San Mateo County      6081       13-City: Small 37.52602
## 78311        San Mateo County      6081     21-Suburb: Large 37.56616
## 78312          Ventura County      6111    12-City: Mid-size 34.17721
## 78313    San Francisco County      6075       11-City: Large 37.72161
## 78332          Cochise County      4003     32-Town: Distant 31.96599
## 78340            Emery County     49015     43-Rural: Remote 39.08134
## 78346   San Bernardino County      6071     21-Suburb: Large 34.05522
## 78348         Maricopa County      4013     21-Suburb: Large 33.34942
## 78351            Pinal County      4021     21-Suburb: Large 33.17848
## 78399            Weber County     49057     21-Suburb: Large 41.17983
## 78400           Juneau County     55057      33-Town: Remote 43.80850
## 78405            Davis County     49011     21-Suburb: Large 41.06348
## 78408         Sangamon County     17167    12-City: Mid-size 39.76466
## 78436       Washington County     13303      33-Town: Remote 32.96659
## 78482       Washington County     49053       13-City: Small 37.12355
## 78492           DeKalb County     17037     21-Suburb: Large 41.63959
## 78494           DeKalb County     17037     21-Suburb: Large 41.64071
## 78522        Salt Lake County     49035     21-Suburb: Large 40.59286
## 78570        Mendocino County      6045      33-Town: Remote 39.41370
## 78584    Santa Barbara County      6083  22-Suburb: Mid-size 34.45199
## 78585    Santa Barbara County      6083  22-Suburb: Mid-size 34.45137
## 78586    Santa Barbara County      6083  22-Suburb: Mid-size 34.86565
## 78587    Santa Barbara County      6083  22-Suburb: Mid-size 34.45141
## 78588    Santa Barbara County      6083  22-Suburb: Mid-size 34.45118
## 78591    Santa Barbara County      6083       13-City: Small 34.42531
## 78595      Santa Clara County      6085     23-Suburb: Small 37.00377
## 78597          Ventura County      6111    42-Rural: Distant 34.37627
## 78601       Washington County     49053     23-Suburb: Small 37.13709
## 78603      Los Angeles County      6037     21-Suburb: Large 34.45049
## 78606       Santa Cruz County      6087     23-Suburb: Small 36.93832
## 78609       Santa Cruz County      6087       13-City: Small 36.98724
## 78652          Hidalgo County     48215     21-Suburb: Large 26.17043
## 78663      Los Angeles County      6037       13-City: Small 34.02230
## 78670         Monterey County      6053  22-Suburb: Mid-size 36.73393
## 78671        Riverside County      6065     21-Suburb: Large 33.67683
## 78685       Santa Rosa County     12113     21-Suburb: Large 30.62423
## 78686            Pinal County      4021     32-Town: Distant 33.07383
## 78689       Santa Rosa County     12113     21-Suburb: Large 30.62423
## 78690       Santa Rosa County     12113     41-Rural: Fringe 30.64801
## 78699    Santa Barbara County      6083     32-Town: Distant 34.61653
## 78702       Palm Beach County     12099     21-Suburb: Large 26.57387
## 78708             Utah County     49049      31-Town: Fringe 39.97432
## 78744           Hudson County     34017     21-Suburb: Large 40.76521
## 78787         Sarasota County     12115     21-Suburb: Large 27.27939
## 78788         Sarasota County     12115     21-Suburb: Large 27.27926
## 78797             Utah County     49049     41-Rural: Fringe 40.33577
## 78841             Will County     17197     21-Suburb: Large 41.54340
## 78842             Pima County      4019       11-City: Large 32.27453
## 78908          Chatham County     13051    12-City: Mid-size 32.06058
## 78926             Mono County      6051     43-Rural: Remote 38.56833
## 78955       Greenville County     45045       13-City: Small 34.84313
## 78956       Darlington County     45031     32-Town: Distant 34.37331
## 78963      Los Angeles County      6037    42-Rural: Distant 34.47264
## 79001             Utah County     49049       13-City: Small 40.28872
## 79055           Tooele County     49045     32-Town: Distant 40.54940
## 79162             Cook County     17031     21-Suburb: Large 41.64717
## 79249            Duval County     12031       11-City: Large 30.26927
## 79257        San Diego County      6073     21-Suburb: Large 32.99483
## 79413            Scott County     51169  22-Suburb: Mid-size 36.64174
## 79443        Salt Lake County     49035     21-Suburb: Large 40.69367
## 79478         Maricopa County      4013       11-City: Large 33.58170
## 79484         Seminole County     12117       13-City: Small 28.77698
## 79485         Seminole County     12117       13-City: Small 28.80201
## 79544            Duval County     12031       11-City: Large 30.32875
## 79545        Strafford County     33017     23-Suburb: Small 43.21494
## 79573           Peoria County     17143     21-Suburb: Large 40.63758
## 79582            Duval County     12031       11-City: Large 30.22121
## 79583            Duval County     12031       11-City: Large 30.35911
## 79610           Sonoma County      6097     21-Suburb: Large 38.40125
## 79634       Palm Beach County     12099     21-Suburb: Large 26.64219
## 79638          Fairfax County     51059     21-Suburb: Large 38.85726
## 79644       Miami-Dade County     12086     21-Suburb: Large 25.93445
## 79645       Miami-Dade County     12086       11-City: Large 25.79468
## 79646       Miami-Dade County     12086     21-Suburb: Large 25.59928
## 79647       Miami-Dade County     12086     21-Suburb: Large 25.83993
## 79672          Yavapai County      4025     41-Rural: Fringe 34.86590
## 79673         Coconino County      4005     32-Town: Distant 34.86270
## 79681            Comal County     48091       13-City: Small 29.70877
## 79689             Utah County     49049     21-Suburb: Large 40.39827
## 79698         Siskiyou County      6093     43-Rural: Remote 41.84210
## 79700            Bexar County     48029       11-City: Large 29.35557
## 79722      Los Angeles County      6037       11-City: Large 33.79667
## 79723         Maricopa County      4013       11-City: Large 33.49411
## 79724         Maricopa County      4013       11-City: Large 33.44646
## 79770         Seminole County     12117       13-City: Small 28.75783
## 79789       Palm Beach County     12099     21-Suburb: Large 26.74661
## 79795         Seminole County     12117       13-City: Small 28.75784
## 79817         Crawford County     55023     43-Rural: Remote 43.26519
## 79825         Crawford County     55023     43-Rural: Remote 43.26519
## 79834         Crawford County     55023     43-Rural: Remote 43.26516
## 79850         Hennepin County     27053     21-Suburb: Large 44.93414
## 79864         Maricopa County      4013       11-City: Large 33.38759
## 79875         Maricopa County      4013       11-City: Large 33.38715
## 79887            Pinal County      4021     32-Town: Distant 33.05559
## 79889         Maricopa County      4013       11-City: Large 33.38759
## 79891           Navajo County      4017     41-Rural: Fringe 34.28403
## 79892           Navajo County      4017     41-Rural: Fringe 34.28430
## 79894       Bernalillo County     35001     21-Suburb: Large 35.11840
## 79942             Utah County     49049     21-Suburb: Large 40.38841
## 79945           Jasper County     17079    42-Rural: Distant 38.93632
## 79946          Ventura County      6111      31-Town: Fringe 34.40111
## 79959           Tooele County     49045     32-Town: Distant 40.51370
## 79974         Hennepin County     27053     21-Suburb: Large 44.86449
## 80014        San Diego County      6073     21-Suburb: Large 32.79978
## 80015           Sevier County     49041      33-Town: Remote 38.76881
## 80073             Cook County     17031     21-Suburb: Large 42.13449
## 80104            Weber County     49057       13-City: Small 41.17396
## 80225          Norfolk County     25021     21-Suburb: Large 42.10685
## 80241             Utah County     49049       13-City: Small 40.30702
## 80273           Shasta County      6089       13-City: Small 40.57627
## 80286           Shasta County      6089       13-City: Small 40.54684
## 80443             Utah County     49049     21-Suburb: Large 40.38902
## 80474           Amador County      6005    42-Rural: Distant 38.48173
## 80477          Augusta County     51015     41-Rural: Fringe 38.11577
## 80479           Staunton city     51790       13-City: Small 38.14956
## 80480           Staunton city     51790       13-City: Small 38.17524
## 80569            Pasco County     12101     41-Rural: Fringe 28.30578
## 80570             Polk County     12105     41-Rural: Fringe 27.90396
## 80603           Madera County      6039       13-City: Small 36.98366
## 80604           Madera County      6039     23-Suburb: Small 36.98333
## 80605           Madera County      6039       13-City: Small 36.98380
## 80615        Mendocino County      6045    42-Rural: Distant 39.52168
## 80653            Butte County      6007     23-Suburb: Small 39.72748
## 80752           Navajo County      4017     43-Rural: Remote 36.60044
## 80789             Inyo County      6027     43-Rural: Remote 35.97849
## 80834      Los Angeles County      6037       11-City: Large 34.04500
## 80835          Alachua County     12001  22-Suburb: Mid-size 29.66237
## 80885           Nevada County      6057     32-Town: Distant 39.21192
## 80889             Utah County     49049     21-Suburb: Large 40.10918
## 80891           Sierra County      6091    42-Rural: Distant 39.58453
## 80892            Butte County      6007     32-Town: Distant 39.50096
## 80893             Mono County      6051      33-Town: Remote 37.64161
## 80900           Nevada County      6057     32-Town: Distant 39.32474
## 80920    Santa Barbara County      6083     43-Rural: Remote 34.94368
## 80928           Nevada County      6057     41-Rural: Fringe 39.07411
## 80929           Washoe County     32031    12-City: Mid-size 39.64167
## 80944             Kern County      6029      33-Town: Remote 35.64544
## 80969          Cochise County      4003       13-City: Small 31.55547
## 80990           Monroe County     12087      33-Town: Remote 24.57925
## 80991             Cook County     17031     21-Suburb: Large 42.08319
## 81005      Santa Clara County      6085       11-City: Large 37.27856
## 81039        Salt Lake County     49035     21-Suburb: Large 40.51581
## 81041        El Dorado County      6017     43-Rural: Remote 38.77279
## 81048        Salt Lake County     49035     21-Suburb: Large 40.65937
## 81067        Salt Lake County     49035     21-Suburb: Large 40.58934
## 81093           Summit County     49043     41-Rural: Fringe 40.72232
## 81094           Summit County     49043     41-Rural: Fringe 40.72232
## 81149            Union County     34039     21-Suburb: Large 40.66070
## 81217         Siskiyou County      6093     32-Town: Distant 41.73845
## 81306             Pima County      4019       11-City: Large 32.21514
## 81307        El Dorado County      6017      31-Town: Fringe 38.69975
## 81314            Cache County     49005     23-Suburb: Small 41.82609
## 81328            Pinal County      4021    42-Rural: Distant 33.11642
## 81346        Salt Lake County     49035     21-Suburb: Large 40.69049
## 81359         Maricopa County      4013       11-City: Large 33.37967
## 81364             Utah County     49049     21-Suburb: Large 40.42505
## 81376         Maricopa County      4013      31-Town: Fringe 33.40765
## 81384          Yavapai County      4025       13-City: Small 34.54134
## 81401             Utah County     49049    12-City: Mid-size 40.20770
## 81411      Santa Clara County      6085       13-City: Small 37.39405
## 81434     Contra Costa County      6013     21-Suburb: Large 37.90873
## 81621            Smyth County     51173     32-Town: Distant 36.81101
## 81653       Washington County     49053       13-City: Small 37.13224
## 81654       Washington County     49053       13-City: Small 37.12899
## 81665            Davis County     49011     41-Rural: Fringe 41.02187
## 81669             Utah County     49049     41-Rural: Fringe 40.37766
## 81670            Weber County     49057    42-Rural: Distant 41.30786
## 81681        Box Elder County     49003     43-Rural: Remote 41.96941
## 81702          Douglas County     27041     41-Rural: Fringe 45.86120
## 81709           Harris County     48201       11-City: Large 29.80251
## 81761          Wasatch County     49051     41-Rural: Fringe 40.47880
## 81771         Monterey County      6053     32-Town: Distant 36.42758
## 81772         Monterey County      6053     32-Town: Distant 36.42889
## 81778             Lake County     27075     41-Rural: Fringe 47.04971
## 81817       Miami-Dade County     12086       13-City: Small 25.68060
## 81818       Miami-Dade County     12086       13-City: Small 25.68053
## 81848          Broward County     12011     21-Suburb: Large 25.99257
## 81854            Duval County     12031       11-City: Large 30.33837
## 81855            Duval County     12031       11-City: Large 30.41863
## 81857       Miami-Dade County     12086     21-Suburb: Large 25.48596
## 81882       Miami-Dade County     12086     21-Suburb: Large 25.48052
## 81894       Miami-Dade County     12086     21-Suburb: Large 25.47160
## 81917           Sonoma County      6097     21-Suburb: Large 38.51225
## 81918           Sonoma County      6097     21-Suburb: Large 38.51252
## 81919           Sonoma County      6097     21-Suburb: Large 38.51225
## 81920           Sonoma County      6097     21-Suburb: Large 38.51231
## 81938            Pinal County      4021     21-Suburb: Large 33.35347
## 81941             Pima County      4019       11-City: Large 32.22060
## 81942             Pima County      4019       11-City: Large 32.18176
## 81943         Maricopa County      4013       11-City: Large 33.46511
## 81944             Pima County      4019     21-Suburb: Large 32.30835
## 81945         Maricopa County      4013     21-Suburb: Large 33.64384
## 81978         Maricopa County      4013     21-Suburb: Large 33.25774
## 82019          Brevard County     12009       13-City: Small 28.08773
## 82029          Baldwin County      1003      31-Town: Fringe 30.54952
## 82053            Grant County     54023      33-Town: Remote 39.00108
## 82064            Bronx County     36005       11-City: Large 40.81695
## 82078            Cache County     49005     23-Suburb: Small 41.63388
## 82096            Texas County     29215     43-Rural: Remote 37.50547
## 82123            Davis County     49011       13-City: Small 41.10286
## 82125        Mendocino County      6045     43-Rural: Remote 38.91343
## 82138         Siskiyou County      6093      33-Town: Remote 41.32008
## 82159            Davis County     49011     21-Suburb: Large 40.86214
## 82186        Berkshire County     25003    42-Rural: Distant 42.16093
## 82297           Marion County     18097     21-Suburb: Large 39.70835
## 82353        Salt Lake County     49035     21-Suburb: Large 40.50578
## 82355        San Mateo County      6081     21-Suburb: Large 37.56190
## 82372          Clatsop County     41007     41-Rural: Fringe 46.14299
## 82376        Salt Lake County     49035     21-Suburb: Large 40.56511
## 82377        Salt Lake County     49035     21-Suburb: Large 40.54767
## 82381        Salt Lake County     49035     21-Suburb: Large 40.65024
## 82472         Maricopa County      4013       11-City: Large 33.39170
## 82487            Weber County     49057     21-Suburb: Large 41.15969
## 82497        Salt Lake County     49035     21-Suburb: Large 40.49965
## 82525         Maricopa County      4013       11-City: Large 33.41268
## 82548         Maricopa County      4013       11-City: Large 33.37354
## 82549         Maricopa County      4013       11-City: Large 33.37353
## 82575             Utah County     49049       13-City: Small 40.28818
## 82576             Rich County     49033     43-Rural: Remote 41.66496
## 82581         Maricopa County      4013       11-City: Large 33.43861
## 82606          Sanpete County     49039      33-Town: Remote 39.26476
## 82618           Sevier County     49041    42-Rural: Distant 38.63047
## 82619           Sevier County     49041    42-Rural: Distant 38.63139
## 82677           Summit County     49043     32-Town: Distant 40.64192
## 82678           Summit County     49043     32-Town: Distant 40.63909
## 82679           Summit County     49043     32-Town: Distant 40.63880
## 82680           Summit County     49043     32-Town: Distant 40.63891
## 82683           Sutter County      6101    42-Rural: Distant 38.81110
## 82694       Palm Beach County     12099     21-Suburb: Large 26.49803
## 82717         Maricopa County      4013       11-City: Large 33.41247
## 82718        Salt Lake County     49035     21-Suburb: Large 40.59863
## 82742            Davis County     49011     21-Suburb: Large 41.13175
## 82752           Grundy County     17063    42-Rural: Distant 41.17460
## 82787        Worcester County     25027     21-Suburb: Large 42.29311
## 82788             Cook County     17031       11-City: Large 41.70478
## 82793      Mississippi County     29133     32-Town: Distant 36.89508
## 82848             Pima County      4019       11-City: Large 32.23596
## 82877         Chesapeake city     51550     21-Suburb: Large 36.79277
## 82880             Pima County      4019       11-City: Large 32.25170
## 82888      Los Angeles County      6037    12-City: Mid-size 33.82426
## 82928         Humboldt County      6023     43-Rural: Remote 40.09738
## 82949      Doña Ana County     35013    42-Rural: Distant 32.24930
## 82958         Atlantic County     34001     41-Rural: Fringe 39.53661
## 82967         Sangamon County     17167  22-Suburb: Mid-size 39.75496
## 82975             Pima County      4019       11-City: Large 32.13528
## 82996        Salt Lake County     49035     21-Suburb: Large 40.52092
## 83016        Salt Lake County     49035     21-Suburb: Large 40.58463
## 83040            Bexar County     48029     41-Rural: Fringe 29.22207
## 83041         Ouachita Parish     22073       13-City: Small 32.45184
## 83045             Pima County      4019       11-City: Large 32.19132
## 83058       San Benito County      6069     41-Rural: Fringe 36.80077
## 83096        Brunswick County     51025     41-Rural: Fringe 36.80997
## 83107        Whiteside County     17195     32-Town: Distant 41.80037
## 83111        Dinwiddie County     51053     21-Suburb: Large 37.20751
## 83142             Iron County     49021      33-Town: Remote 37.66411
## 83179       Washington County     49053       13-City: Small 37.10791
## 83189          Hidalgo County     48215    12-City: Mid-size 26.24011
## 83192         Maricopa County      4013       11-City: Large 33.45373
## 83199       Miami-Dade County     12086     21-Suburb: Large 25.72266
## 83223             Yuma County      4027       13-City: Small 32.70862
## 83233          Pulaski County     51155      31-Town: Fringe 37.05894
## 83254            Smyth County     51173     32-Town: Distant 36.83315
## 83255          Carroll County     51035     41-Rural: Fringe 36.74289
## 83288           Crosby County     48107     43-Rural: Remote 33.65838
## 83297        Jefferson County      1073    12-City: Mid-size 33.50514
## 83305             Utah County     49049     21-Suburb: Large 40.11152
## 83306             Utah County     49049     21-Suburb: Large 40.10211
## 83313             Utah County     49049     21-Suburb: Large 40.08582
## 83315       Palm Beach County     12099       13-City: Small 26.39660
## 83322      Santa Clara County      6085    12-City: Mid-size 37.39368
## 83337           Washoe County     32031     21-Suburb: Large 39.55192
## 83387            Weber County     49057       13-City: Small 41.23198
## 83389        Salt Lake County     49035     21-Suburb: Large 40.58146
## 83393         Hennepin County     27053     21-Suburb: Large 44.89925
## 83395        St. Louis County     27137       13-City: Small 46.78906
## 83398           Dakota County     27037     21-Suburb: Large 44.88524
## 83408            Marin County      6041    42-Rural: Distant 38.24594
## 83409        San Diego County      6073     21-Suburb: Large 32.63168
## 83410       Santa Cruz County      6087  22-Suburb: Mid-size 36.98396
## 83411         Monterey County      6053      33-Town: Remote 36.21185
## 83412      San Joaquin County      6077     21-Suburb: Large 38.02373
## 83416      Los Angeles County      6037       11-City: Large 34.05624
## 83417          Alameda County      6001     21-Suburb: Large 37.68750
## 83419           Collin County     48085  22-Suburb: Mid-size 33.21525
## 83425            Scott County     27139     21-Suburb: Large 44.79427
## 83430         Angelina County     48005      33-Town: Remote 31.35985
## 83436            Davis County     49011     21-Suburb: Large 40.85265
## 83437             Utah County     49049     21-Suburb: Large 40.35272
## 83446           Ramsey County     27123     21-Suburb: Large 45.06579
## 83485        San Diego County      6073    42-Rural: Distant 33.09669
## 83527          Jackson County     29095       11-City: Large 38.94997
## 83549       Miami-Dade County     12086       11-City: Large 25.77966
## 83550       Miami-Dade County     12086     21-Suburb: Large 25.92873
## 83555       Miami-Dade County     12086       11-City: Large 25.77962
## 83562     Spotsylvania County     51177  22-Suburb: Mid-size 38.23199
## 83589          Sanpete County     49039    42-Rural: Distant 39.47777
## 83615            Cache County     49005     23-Suburb: Small 41.70944
## 83617             Utah County     49049    12-City: Mid-size 40.20937
## 83621          El Paso County      8041       11-City: Large 38.78662
## 83644          McHenry County     17111     21-Suburb: Large 42.44482
## 83675         Mariposa County      6043     43-Rural: Remote 37.47176
## 83693             Utah County     49049     21-Suburb: Large 40.01539
## 83694           DeSoto County     12027    42-Rural: Distant 27.11230
## 83695        Salt Lake County     49035     21-Suburb: Large 40.65444
## 83774       Washington County     49053    42-Rural: Distant 37.18926
## 83775           Colfax County     35007     43-Rural: Remote 36.38700
## 83781         Sangamon County     17167    12-City: Mid-size 39.77891
## 83783         Tuolumne County      6109     41-Rural: Fringe 38.03138
## 83805         Sangamon County     17167    12-City: Mid-size 39.80077
## 83816         Sangamon County     17167    12-City: Mid-size 39.78322
## 83835         Sangamon County     17167    12-City: Mid-size 39.77893
## 83841          Hampden County     25013    12-City: Mid-size 42.12024
## 83867             Utah County     49049     21-Suburb: Large 40.34929
## 83886             Utah County     49049     21-Suburb: Large 40.15504
## 83888             Utah County     49049     21-Suburb: Large 40.16373
## 83912        Salt Lake County     49035     21-Suburb: Large 40.53261
## 83927           Placer County      6061    42-Rural: Distant 39.16910
## 83947        St. Clair County     17163     21-Suburb: Large 38.58673
## 83957          Stearns County     27145       13-City: Small 45.57460
## 83958        St. Croix County     55109     32-Town: Distant 45.13049
## 83995        St. Johns County     12109     23-Suburb: Small 29.94200
## 84024            Macon County     17115       13-City: Small 39.82674
## 84061        St. Johns County     12109     23-Suburb: Small 29.90742
## 84094       Washington County     49053     41-Rural: Fringe 37.08807
## 84100       St. Helena Parish     22091    42-Rural: Distant 30.82964
## 84121        St. Johns County     12109     23-Suburb: Small 29.89587
## 84122        St. Johns County     12109     23-Suburb: Small 29.94205
## 84128        St. Johns County     12109     23-Suburb: Small 29.92438
## 84129        St. Johns County     12109     23-Suburb: Small 29.92438
## 84130        St. Johns County     12109     23-Suburb: Small 29.92438
## 84132          St. Louis city     29510       11-City: Large 38.63792
## 84135         Hennepin County     27053     21-Suburb: Large 44.96295
## 84138        St. Lucie County     12111     21-Suburb: Large 27.45336
## 84141        St. Lucie County     12111     21-Suburb: Large 27.42595
## 84289         Chippewa County     55017     32-Town: Distant 44.94898
## 84314           Tooele County     49045     32-Town: Distant 40.62562
## 84315           Tooele County     49045     32-Town: Distant 40.63670
## 84316        Salt Lake County     49035     21-Suburb: Large 40.70557
## 84364         Coconino County      4005    42-Rural: Distant 35.30553
## 84381            Davis County     49011     21-Suburb: Large 40.97925
## 84414          Fayette County     19065     43-Rural: Remote 42.68918
## 84442         Maricopa County      4013       11-City: Large 33.46537
## 84521             Yuma County      4027    42-Rural: Distant 32.69161
## 84524             Yuma County      4027       13-City: Small 32.69168
## 84525             Yuma County      4027       13-City: Small 32.69764
## 84526             Yuma County      4027     41-Rural: Fringe 32.68568
## 84527             Yuma County      4027       13-City: Small 32.67431
## 84528             Yuma County      4027     41-Rural: Fringe 32.50116
## 84529             Yuma County      4027       13-City: Small 32.68505
## 84530             Yuma County      4027       13-City: Small 32.71839
## 84535             Lake County     18089       13-City: Small 41.55698
## 84591        Botetourt County     51023     41-Rural: Fringe 37.43529
## 84599          Russell County     51167     32-Town: Distant 36.90094
## 84624         Maricopa County      4013       11-City: Large 33.42414
## 84679         Maricopa County      4013     21-Suburb: Large 33.80972
## 84684       White Pine County     32033      33-Town: Remote 39.24854
## 84717           Tooele County     49045     32-Town: Distant 40.53633
## 84791              Lee County     17103    42-Rural: Distant 41.84698
## 84822            Davis County     49011     21-Suburb: Large 40.93120
## 84857       Washington County     27163     21-Suburb: Large 45.04111
## 84910    San Francisco County      6075       11-City: Large 37.79449
## 84912      San Joaquin County      6077       11-City: Large 37.95458
## 84913      San Joaquin County      6077       11-City: Large 37.95370
## 84940             Napa County      6055     41-Rural: Fringe 38.24395
## 85144        Arlington County     51013    12-City: Mid-size 38.90040
## 85152           Tulare County      6107     23-Suburb: Small 36.15185
## 85280         Angelina County     48005     41-Rural: Fringe 31.30467
## 85282         Angelina County     48005     41-Rural: Fringe 31.30459
## 85283         Angelina County     48005      33-Town: Remote 31.33397
## 85289       St. Joseph County     18141    12-City: Mid-size 41.65662
## 85292          Hidalgo County     48215    12-City: Mid-size 26.17496
## 85295         Maricopa County      4013     21-Suburb: Large 33.68268
## 85296         Maricopa County      4013    12-City: Mid-size 33.44934
## 85301       Okeechobee County     12093     32-Town: Distant 27.23687
## 85305           Marion County     12083       13-City: Small 29.18398
## 85353             Kane County     17089     21-Suburb: Large 41.79096
## 85356            Falls County     48145     32-Town: Distant 31.30913
## 85357             Kane County     17089     21-Suburb: Large 42.10779
## 85362          Russell County      1113     21-Suburb: Large 32.47725
## 85365          McHenry County     17111     21-Suburb: Large 42.16185
## 85398             Kane County     17089     21-Suburb: Large 42.13381
## 85399         Maricopa County      4013    42-Rural: Distant 33.20130
## 85400         Maricopa County      4013  22-Suburb: Mid-size 33.47017
## 85402             Pima County      4019       11-City: Large 32.06750
## 85403             Yuma County      4027    42-Rural: Distant 32.49393
## 85404       Washington County     49053       13-City: Small 37.10389
## 85412            Mower County     27099    42-Rural: Distant 43.56833
## 85413             Iron County     49021      33-Town: Remote 37.67490
## 85435         Maricopa County      4013     21-Suburb: Large 33.25783
## 85534      Los Angeles County      6037     21-Suburb: Large 34.40792
## 85589        Salt Lake County     49035     21-Suburb: Large 40.49091
## 85590        Salt Lake County     49035     21-Suburb: Large 40.51267
## 85591        Salt Lake County     49035     21-Suburb: Large 40.47324
## 85606        Salt Lake County     49035     21-Suburb: Large 40.47985
## 85630        Riverside County      6065       11-City: Large 33.93558
## 85642             Utah County     49049       13-City: Small 40.27854
## 85660   San Bernardino County      6071     41-Rural: Fringe 34.41282
## 85688            Cache County     49005     23-Suburb: Small 41.83599
## 85689            Clark County     32003       11-City: Large 36.16433
## 85692        Riverside County      6065       11-City: Large 33.93558
## 85697            Weber County     49057       13-City: Small 41.24584
## 85733           Sumter County     12119    42-Rural: Distant 28.73638
## 85738           Sumter County     12119     41-Rural: Fringe 28.65918
## 85741           Sumter County     12119     41-Rural: Fringe 28.65918
## 85757         Maricopa County      4013       11-City: Large 33.39390
## 85768         Maricopa County      4013       11-City: Large 33.39503
## 85785       Palm Beach County     12099     21-Suburb: Large 26.77737
## 85790         Hernando County     12053     41-Rural: Fringe 28.56460
## 85791         Hernando County     12053  22-Suburb: Mid-size 28.48824
## 85795             Utah County     49049       13-City: Small 40.30080
## 85831            Pasco County     12101     21-Suburb: Large 28.20071
## 85969      Los Angeles County      6037     21-Suburb: Large 33.80134
## 85970             Utah County     49049    12-City: Mid-size 40.23513
## 85971       Washington County     49053       13-City: Small 37.05450
## 85973        Salt Lake County     49035     21-Suburb: Large 40.54632
## 85974            Cache County     49005     23-Suburb: Small 41.83155
## 86024            Davis County     49011     21-Suburb: Large 41.13728
## 86049        Salt Lake County     49035     21-Suburb: Large 40.60126
## 86051            Davis County     49011     21-Suburb: Large 41.14263
## 86052       Washington County     49053       13-City: Small 37.11686
## 86065             Utah County     49049    12-City: Mid-size 40.22636
## 86067          Jackson County     29095     21-Suburb: Large 39.10765
## 86081        St. Louis County     27137       13-City: Small 46.78905
## 86096            Pinal County      4021     21-Suburb: Large 33.40926
## 86101       Cumberland County     51049     43-Rural: Remote 37.49286
## 86180           Sussex County     10005     23-Suburb: Small 38.65139
## 86205           Sutter County      6101     41-Rural: Fringe 39.18575
## 86233         Suwannee County     12121      33-Town: Remote 30.30265
## 86234         Suwannee County     12121      33-Town: Remote 30.30265
## 86235         Suwannee County     12121      33-Town: Remote 30.30265
## 86254            Scott County     27139     21-Suburb: Large 44.79266
## 86342         Maricopa County      4013       11-City: Large 33.60588
## 86438        San Diego County      6073       11-City: Large 32.95443
## 86494         Maricopa County      4013       11-City: Large 33.52331
## 86498            Davis County     49011     21-Suburb: Large 41.08877
## 86499            Davis County     49011     21-Suburb: Large 41.10906
## 86503            Davis County     49011     21-Suburb: Large 41.10539
## 86504            Davis County     49011     21-Suburb: Large 41.09305
## 86506            Davis County     49011     21-Suburb: Large 41.09225
## 86511         Maricopa County      4013       11-City: Large 33.46639
## 86522             Will County     17197     21-Suburb: Large 41.52276
## 86533           Thomas County     13275     32-Town: Distant 30.80949
## 86570            Weber County     49057     21-Suburb: Large 41.17007
## 86584         Duchesne County     49013     43-Rural: Remote 40.35360
## 86585         Duchesne County     49013     43-Rural: Remote 40.35360
## 86593             Pike County     28113      33-Town: Remote 31.24623
## 86616             Will County     17197     21-Suburb: Large 41.54350
## 86640             Kern County      6029     32-Town: Distant 35.14626
## 86691        Talladega County      1121     41-Rural: Fringe 33.42228
## 86693        Talladega County      1121    42-Rural: Distant 33.31846
## 86781         Escambia County     12033       13-City: Small 30.44696
## 86782         Maricopa County      4013    12-City: Mid-size 33.36540
## 86788         Seminole County     12117       13-City: Small 28.80307
## 86827          Tarrant County     48439       11-City: Large 32.72998
## 86828          Tarrant County     48439     21-Suburb: Large 32.57520
## 86829          Tarrant County     48439       11-City: Large 32.73002
## 86831          Tarrant County     48439     21-Suburb: Large 32.80620
## 86832          Tarrant County     48439       11-City: Large 32.75927
## 86834          Tarrant County     48439       11-City: Large 32.79686
## 86835          Tarrant County     48439     21-Suburb: Large 32.93785
## 86839          Tarrant County     48439       11-City: Large 32.72998
## 86892   San Bernardino County      6071     21-Suburb: Large 34.57968
## 86893        San Diego County      6073     21-Suburb: Large 33.15163
## 86898            Weber County     49057       13-City: Small 41.22807
## 86906           Taylor County     48441    12-City: Mid-size 32.48943
## 86917           Taylor County     54091     32-Town: Distant 39.33830
## 86966             Utah County     49049     21-Suburb: Large 40.04301
## 86967            Davis County     49011     21-Suburb: Large 40.90700
## 86970           Taylor County     12123     41-Rural: Fringe 30.12110
## 86971           Taylor County     12123     41-Rural: Fringe 30.12115
## 86984        Salt Lake County     49035     21-Suburb: Large 40.65551
## 86985        Salt Lake County     49035     21-Suburb: Large 40.67953
## 86991         Tazewell County     51185     32-Town: Distant 37.12755
## 87055        Arlington County     51013    12-City: Mid-size 38.86452
## 87058     Virginia Beach city     51810       11-City: Large 36.74255
## 87061       Monongalia County     54061       13-City: Small 39.61102
## 87097           Martin County     12085      31-Town: Fringe 27.02074
## 87099         Hamilton County     12047     41-Rural: Fringe 30.52337
## 87101       Miami-Dade County     12086     21-Suburb: Large 25.83277
## 87107           Tehama County      6103     32-Town: Distant 40.17831
## 87125           Mohave County      4015       13-City: Small 34.49103
## 87126           Mohave County      4015       13-City: Small 34.49104
## 87127          Telfair County     13271      33-Town: Remote 32.06773
## 87148        Riverside County      6065    12-City: Mid-size 33.52695
## 87151        Riverside County      6065     21-Suburb: Large 33.60427
## 87152        Riverside County      6065     21-Suburb: Large 33.60468
## 87158         Maricopa County      4013    12-City: Mid-size 33.39238
## 87243           Uintah County     49047      33-Town: Remote 40.45222
## 87251        Salt Lake County     49035     21-Suburb: Large 40.58331
## 87284          Terrell County     13273     41-Rural: Fringe 31.75427
## 87331        Galveston County     48167     41-Rural: Fringe 29.42710
## 87332           Harris County     48201       11-City: Large 29.72848
## 87341           Walker County     48471     32-Town: Distant 30.74158
## 87342           Walker County     48471     32-Town: Distant 30.74158
## 87343           Walker County     48471     32-Town: Distant 30.74158
## 87346           Travis County     48453       11-City: Large 30.31532
## 87347           Travis County     48453       11-City: Large 30.25462
## 87401        Highlands County     12055     23-Suburb: Small 27.47797
## 87407            Norfolk city     51710    12-City: Mid-size 36.90573
## 87430        St. Louis County     27137       13-City: Small 46.78908
## 87447            Cache County     49005     23-Suburb: Small 41.71420
## 87456          Volusia County     12127       13-City: Small 29.21330
## 87457      Los Angeles County      6037       11-City: Large 34.03251
## 87465            Suffolk city     51800     41-Rural: Fringe 36.78467
## 87487          Jackson County     12063     32-Town: Distant 30.95152
## 87501           Etowah County      1055     23-Suburb: Small 33.99633
## 87505           Travis County     48453       11-City: Large 30.33907
## 87511         Maricopa County      4013       11-City: Large 33.58002
## 87519          Hanover County     51085     41-Rural: Fringe 37.68792
## 87521           Mohave County      4015     41-Rural: Fringe 35.18885
## 87523   Prince William County     51153     21-Suburb: Large 38.75661
## 87525            Pinal County      4021     23-Suburb: Small 32.88283
## 87532          Hanover County     51085     41-Rural: Fringe 37.68792
## 87535        San Diego County      6073     21-Suburb: Large 32.83493
## 87542             Pima County      4019     21-Suburb: Large 32.44354
## 87555         Lawrence County      1079     41-Rural: Fringe 34.47814
## 87570       Palm Beach County     12099    12-City: Mid-size 26.76356
## 87590            Comal County     48091       13-City: Small 29.69594
## 87603         Maricopa County      4013      31-Town: Fringe 33.38765
## 87604         Maricopa County      4013     41-Rural: Fringe 33.47315
## 87605         Maricopa County      4013  22-Suburb: Mid-size 33.44400
## 87608            Union County     12125     41-Rural: Fringe 30.01773
## 87611         Maricopa County      4013       11-City: Large 33.37618
## 87617         Coconino County      4005       13-City: Small 35.20844
## 87618          Newport County     44005     21-Suburb: Large 41.52316
## 87623          Collier County     12021     32-Town: Distant 26.40826
## 87636          Volusia County     12127  22-Suburb: Mid-size 28.89509
## 87639         Fauquier County     51061    42-Rural: Distant 38.62386
## 87640     Virginia Beach city     51810       11-City: Large 36.84336
## 87648             Pima County      4019       11-City: Large 32.22025
## 87662       Miami-Dade County     12086     21-Suburb: Large 25.89062
## 87663             Gila County      4007    42-Rural: Distant 34.31860
## 87664             Cook County     17031     21-Suburb: Large 42.10537
## 87676      Northampton County     51131     43-Rural: Remote 37.40379
## 87749           Etowah County      1055       13-City: Small 34.01387
## 87752        St. Johns County     12109     41-Rural: Fringe 29.92026
## 87775           Richmond city     51760    12-City: Mid-size 37.58605
## 87828             Yuba County      6115  22-Suburb: Mid-size 39.14787
## 87832            Cache County     49005     23-Suburb: Small 41.77933
## 87833            Cache County     49005     23-Suburb: Small 41.69022
## 87880             Will County     17197     21-Suburb: Large 41.53021
## 87915        Salt Lake County     49035     21-Suburb: Large 40.64492
## 87931             Lake County     17097     21-Suburb: Large 42.34727
## 87963            Weber County     49057       13-City: Small 41.20395
## 87997        Salt Lake County     49035     21-Suburb: Large 40.64346
## 88027             Dane County     55025     41-Rural: Fringe 43.02448
## 88044             Will County     17197     21-Suburb: Large 41.50525
## 88153       Washington County     49053      31-Town: Fringe 37.16503
## 88164        Box Elder County     49003     21-Suburb: Large 41.46396
## 88171          McHenry County     17111     21-Suburb: Large 42.22069
## 88172             Iron County     49021     41-Rural: Fringe 37.76454
## 88173             Iron County     49021     41-Rural: Fringe 37.76391
## 88191             Will County     17197     21-Suburb: Large 41.44312
## 88212             Utah County     49049     21-Suburb: Large 40.36684
## 88265             Pima County      4019       11-City: Large 32.22728
## 88266             Pima County      4019       11-City: Large 32.22226
## 88281         Chesapeake city     51550     21-Suburb: Large 36.71853
## 88283            Norfolk city     51710    12-City: Mid-size 36.85119
## 88314            Duval County     12031       11-City: Large 30.37437
## 88394             Utah County     49049     21-Suburb: Large 40.45034
## 88418             Utah County     49049     21-Suburb: Large 40.33711
## 88419             Utah County     49049       13-City: Small 40.32293
## 88420          Wasatch County     49051     32-Town: Distant 40.49688
## 88421             Utah County     49049    12-City: Mid-size 40.23969
## 88423             Utah County     49049    12-City: Mid-size 40.28015
## 88445             Juab County     49023    42-Rural: Distant 39.95922
## 88446             Juab County     49023    42-Rural: Distant 39.95654
## 88449             Mono County      6051     43-Rural: Remote 37.95570
## 88500       Miami-Dade County     12086     21-Suburb: Large 25.50623
## 88509           Mobile County      1097     21-Suburb: Large 30.74060
## 88586         Maricopa County      4013     21-Suburb: Large 33.44990
## 88590            Davis County     49011     21-Suburb: Large 40.90117
## 88595             Pima County      4019       11-City: Large 32.16296
## 88640           Harris County     48201     21-Suburb: Large 30.09253
## 88672       Washington County     49053       13-City: Small 37.07345
## 88706           Tooele County     49045     41-Rural: Fringe 40.52622
## 88707           Tooele County     49045     32-Town: Distant 40.52980
## 88708           Tooele County     49045     32-Town: Distant 40.52884
## 88709           Tooele County     49045     41-Rural: Fringe 40.53044
## 88753         Monterey County      6053  22-Suburb: Mid-size 36.57804
## 88760        San Diego County      6073       11-City: Large 32.91419
## 88893           Summit County     49043     32-Town: Distant 40.71515
## 88894           Summit County     49043     32-Town: Distant 40.71529
## 88918         Hennepin County     27053     21-Suburb: Large 44.95526
## 88926             Polk County     12105     21-Suburb: Large 27.87550
## 88928          Fairfax County     51059     21-Suburb: Large 38.76373
## 88931       Washington County     27163     21-Suburb: Large 44.83258
## 88932           Carver County     27019      31-Town: Fringe 44.83869
## 88957             Utah County     49049     41-Rural: Fringe 40.44607
## 88966           Travis County     48453     21-Suburb: Large 30.44643
## 88969           Travis County     48453       11-City: Large 30.27207
## 89013           Summit County     49043     32-Town: Distant 40.66933
## 89016           Monroe County     12087     32-Town: Distant 24.95802
## 89023           Shasta County      6089  22-Suburb: Mid-size 40.46642
## 89025             Utah County     49049    12-City: Mid-size 40.20958
## 89065           Mercer County     34021       13-City: Small 40.24438
## 89069       San Benito County      6069     41-Rural: Fringe 36.80109
## 89105      Los Angeles County      6037     21-Suburb: Large 33.97173
## 89106          Yavapai County      4025     41-Rural: Fringe 34.63573
## 89107         Sangamon County     17167    42-Rural: Distant 39.84925
## 89108         Sangamon County     17167    42-Rural: Distant 39.84927
## 89109         Sangamon County     17167    42-Rural: Distant 39.84927
## 89130           Sutter County      6101       13-City: Small 39.13909
## 89153          Alameda County      6001     23-Suburb: Small 37.69966
## 89210          Trinity County      6105     43-Rural: Remote 40.74971
## 89211          Trinity County      6105     43-Rural: Remote 40.74971
## 89212          Trinity County      6105     43-Rural: Remote 40.73733
## 89247       Shenandoah County     51171    42-Rural: Distant 38.73458
## 89274           Graham County      4009      33-Town: Remote 32.83300
## 89353             Pike County      1109     41-Rural: Fringe 31.81094
## 89406         San Juan County     49037     43-Rural: Remote 37.00042
## 89414           Harris County     48201       11-City: Large 29.72335
## 89417       Washington County     49053     41-Rural: Fringe 37.19016
## 89433            Grant County     18053     32-Town: Distant 40.53773
## 89447             Pima County      4019       11-City: Large 32.23705
## 89448             Pima County      4019       11-City: Large 32.26549
## 89449             Pima County      4019       11-City: Large 32.24356
## 89450             Pima County      4019       11-City: Large 32.22178
## 89451             Pima County      4019       11-City: Large 32.13323
## 89453             Pima County      4019       11-City: Large 32.27172
## 89454             Pima County      4019       11-City: Large 32.23699
## 89480           Tulare County      6107    42-Rural: Distant 35.88477
## 89481    San Francisco County      6075       11-City: Large 37.79923
## 89531         Tuolumne County      6109     32-Town: Distant 37.97904
## 89533              Lee County     28081      33-Town: Remote 34.24916
## 89554            Suffolk city     51800     21-Suburb: Large 36.69873
## 89569           Turner County     13287     32-Town: Distant 31.70497
## 89601       Miami-Dade County     12086     21-Suburb: Large 25.81143
## 89604        Jefferson County     12065    42-Rural: Distant 30.49084
## 89609           Orange County     51137     41-Rural: Fringe 38.23913
## 89636       Tuscaloosa County      1125       13-City: Small 33.18707
## 89638       Tuscaloosa County      1125       13-City: Small 33.15238
## 89744       Twin Falls County     16083      33-Town: Remote 42.55674
## 89769        San Diego County      6073     21-Suburb: Large 33.17801
## 89778        Salt Lake County     49035     21-Suburb: Large 40.65451
## 89783           Nevada County      6057    42-Rural: Distant 39.37353
## 89788             Knox County     18083      33-Town: Remote 38.67974
## 89826            Weber County     49057       13-City: Small 41.24447
## 89890         Sangamon County     17167    12-City: Mid-size 39.79921
## 89900          Broward County     12011    12-City: Mid-size 26.10361
## 89902           Mobile County      1097    12-City: Mid-size 30.69281
## 89919           Uintah County     49047     41-Rural: Fringe 40.46440
## 89920           Uintah County     49047      33-Town: Remote 40.45770
## 89921           Uintah County     49047      33-Town: Remote 40.45236
## 89922           Uintah County     49047    42-Rural: Distant 40.28225
## 89923        Salt Lake County     49035    12-City: Mid-size 40.74208
## 89924            Weber County     49057     21-Suburb: Large 41.15321
## 89925           Uintah County     49047      33-Town: Remote 40.45201
## 89950        Middlesex County     34023     21-Suburb: Large 40.52570
## 89973        Del Norte County      6015      33-Town: Remote 41.75090
## 90028            Union County     12125     41-Rural: Fringe 30.01774
## 90050            Union County     12125     32-Town: Distant 30.01843
## 90102           Uintah County     49047      33-Town: Remote 40.30099
## 90115           Nevada County      6057     32-Town: Distant 39.20543
## 90117           Nevada County      6057     32-Town: Distant 39.20461
## 90134        Salt Lake County     49035     21-Suburb: Large 40.60715
## 90154            Union County     34039     21-Suburb: Large 40.62006
## 90167         Humboldt County      6023      33-Town: Remote 40.86312
## 90175            Union County     12125     32-Town: Distant 30.01842
## 90176            Union County     12125     32-Town: Distant 30.01532
## 90177            Union County     12125     32-Town: Distant 30.01842
## 90204         Harrison County     54033     32-Town: Distant 39.31007
## 90207           Ramsey County     27123       11-City: Large 44.94342
## 90221         Harrison County     54033     32-Town: Distant 39.30999
## 90249           Orange County      6059    12-City: Mid-size 33.77445
## 90255             Cook County     17031       11-City: Large 41.81403
## 90256             Cook County     17031       11-City: Large 41.82747
## 90257             Cook County     17031       11-City: Large 41.81119
## 90258             Cook County     17031       11-City: Large 41.78030
## 90281          Ventura County      6111    12-City: Mid-size 34.21750
## 90325        Champaign County     17019       13-City: Small 40.11316
## 90347           Shasta County      6089       13-City: Small 40.58738
## 90348      Santa Clara County      6085       11-City: Large 37.29104
## 90383        Salt Lake County     49035     21-Suburb: Large 40.69022
## 90385   San Bernardino County      6071    12-City: Mid-size 34.06903
## 90386    Santa Barbara County      6083     43-Rural: Remote 34.93224
## 90387         Monterey County      6053    42-Rural: Distant 35.86298
## 90405           Dallas County     48113     21-Suburb: Large 32.74052
## 90414           Dallas County     48113       11-City: Large 32.80228
## 90520        San Diego County      6073       11-City: Large 32.75539
## 90531             Cook County     17031       11-City: Large 41.83104
## 90532             Cook County     17031       11-City: Large 41.78199
## 90533             Cook County     17031       11-City: Large 41.86273
## 90541        Champaign County     17019       13-City: Small 40.12558
## 90569            Davis County     49011     21-Suburb: Large 41.02910
## 90570            Davis County     49011     21-Suburb: Large 40.88209
## 90571             Utah County     49049       13-City: Small 40.28322
## 90572        Salt Lake County     49035     21-Suburb: Large 40.69256
## 90573            Weber County     49057     21-Suburb: Large 41.16923
## 90574             Utah County     49049     21-Suburb: Large 40.36156
## 90575       Washington County     49053       13-City: Small 37.10787
## 90576       Washington County     49053       13-City: Small 37.10783
## 90578        Salt Lake County     49035     21-Suburb: Large 40.67404
## 90615          Henrico County     51087     21-Suburb: Large 37.66223
## 90619          Yavapai County      4025     41-Rural: Fringe 34.58899
## 90620          Yavapai County      4025     32-Town: Distant 34.72522
## 90621          Yavapai County      4025     32-Town: Distant 34.72524
## 90622          Yavapai County      4025     32-Town: Distant 34.71649
## 90623          Yavapai County      4025     41-Rural: Fringe 34.84675
## 90627            Davis County     49011     21-Suburb: Large 41.08361
## 90689         Maricopa County      4013       11-City: Large 33.35417
## 90690         Maricopa County      4013       11-City: Large 33.49149
## 90694   San Bernardino County      6071    12-City: Mid-size 34.06903
## 90720       Washington County     49053      31-Town: Fringe 37.18451
## 90726          Augusta County     51015     41-Rural: Fringe 38.11584
## 90748        Salt Lake County     49035     21-Suburb: Large 40.70466
## 90787             Kane County     49025     43-Rural: Remote 37.27854
## 90802        Salt Lake County     49035     21-Suburb: Large 40.55115
## 90807        Salt Lake County     49035     21-Suburb: Large 40.67983
## 90810           Tulare County      6107    12-City: Mid-size 36.31247
## 90825          Ventura County      6111     21-Suburb: Large 34.43796
## 90831       Sacramento County      6067       11-City: Large 38.63861
## 90835           Sonoma County      6097     23-Suburb: Small 38.23815
## 90846         Maricopa County      4013    12-City: Mid-size 33.39406
## 90855           Fresno County      6019      31-Town: Fringe 36.69833
## 90856            Weber County     49057    42-Rural: Distant 41.29256
## 90858             Kane County     49025     43-Rural: Remote 37.27529
## 90879      San Joaquin County      6077       11-City: Large 37.98431
## 90951            Weber County     49057     21-Suburb: Large 41.18091
## 90952            Davis County     49011     21-Suburb: Large 40.87571
## 90953             Utah County     49049     21-Suburb: Large 40.35835
## 90981           Canyon County     16027  22-Suburb: Mid-size 43.62393
## 91064           Dallas County     19049     41-Rural: Fringe 41.52897
## 91146        Salt Lake County     49035     21-Suburb: Large 40.71224
## 91180            Clark County     32003       11-City: Large 36.16611
## 91223         Maricopa County      4013     21-Suburb: Large 33.33571
## 91266          Ventura County      6111    12-City: Mid-size 34.30118
## 91274      San Joaquin County      6077       11-City: Large 37.90815
## 91277            Weber County     49057     21-Suburb: Large 41.26904
## 91293          McHenry County     17111      31-Town: Fringe 42.33921
## 91298          Yavapai County      4025     32-Town: Distant 34.73522
## 91322           Concho County     48095     43-Rural: Remote 31.50366
## 91345           Uintah County     49047      33-Town: Remote 40.45325
## 91367             Lake County     17097     21-Suburb: Large 42.22736
## 91377           Tooele County     49045     43-Rural: Remote 40.09351
## 91425             Kern County      6029       11-City: Large 35.41692
## 91468          St. Louis city     29510       11-City: Large 38.63346
## 91481         Berkeley County     54003       13-City: Small 39.44599
## 91528         Maricopa County      4013       11-City: Large 33.49065
## 91537         Maricopa County      4013       11-City: Large 33.39276
## 91543           Harris County     48201       11-City: Large 29.62527
## 91544           Harris County     48201       11-City: Large 29.78779
## 91586            Davis County     49011     21-Suburb: Large 40.90068
## 91587        Salt Lake County     49035     21-Suburb: Large 40.64695
## 91607         Maricopa County      4013       11-City: Large 33.50378
## 91622           Sonoma County      6097     21-Suburb: Large 38.46630
## 91682      Los Angeles County      6037     21-Suburb: Large 34.07454
## 91709       Cumberland County     34011       13-City: Small 39.49357
## 91724             Utah County     49049     21-Suburb: Large 40.28928
## 91761        San Diego County      6073     21-Suburb: Large 32.57415
## 91781     Virginia Beach city     51810       11-City: Large 36.75193
## 91813           Richmond city     51760    12-City: Mid-size 37.54252
## 91827        Riverside County      6065     21-Suburb: Large 33.82343
## 91841             Pima County      4019       11-City: Large 32.14610
## 91868       Washington County     49053     41-Rural: Fringe 37.16924
## 91872         Maricopa County      4013       11-City: Large 33.46648
## 91873         Maricopa County      4013       11-City: Large 33.43945
## 91898         Maricopa County      4013       11-City: Large 33.45067
## 91899             Utah County     49049     21-Suburb: Large 40.36340
## 91923          Ventura County      6111    12-City: Mid-size 34.19853
## 91928        Salt Lake County     49035     21-Suburb: Large 40.66309
## 91950          St. Louis city     29510       11-City: Large 38.63341
## 91975          Volusia County     12127     21-Suburb: Large 29.14982
## 91979          Volusia County     12127     21-Suburb: Large 29.14982
## 91988        Hunterdon County     34019     41-Rural: Fringe 40.68164
## 91998            Davis County     49011     21-Suburb: Large 41.14115
## 92024          Chilton County      1021     41-Rural: Fringe 32.83214
## 92100             Kane County     17089     21-Suburb: Large 41.75115
## 92120           DeKalb County     17037     21-Suburb: Large 41.64818
## 92183           Danville city     51590     32-Town: Distant 36.58269
## 92189           Wabash County     18169     41-Rural: Fringe 40.82814
## 92217           Carver County     27019     41-Rural: Fringe 44.83605
## 92258     Contra Costa County      6013     41-Rural: Fringe 37.89760
## 92275            Weber County     49057     21-Suburb: Large 41.30475
## 92365          Wakulla County     12129     32-Town: Distant 30.17583
## 92369          Wakulla County     12129     32-Town: Distant 30.17672
## 92385             Utah County     49049    12-City: Mid-size 40.28956
## 92422           Walker County      1127     32-Town: Distant 33.83472
## 92423           Walker County      1127     32-Town: Distant 33.83456
## 92489        Tom Green County     48451     41-Rural: Fringe 31.37171
## 92490        Tom Green County     48451     41-Rural: Fringe 31.37369
## 92493          Runnels County     48399    42-Rural: Distant 31.60996
## 92494           Concho County     48095     43-Rural: Remote 31.50362
## 92495        Tom Green County     48451     41-Rural: Fringe 31.37369
## 92519         Mitchell County     48335     41-Rural: Fringe 32.38369
## 92526        Salt Lake County     49035    12-City: Mid-size 40.74789
## 92547           Waller County     48473    42-Rural: Distant 30.06315
## 92555      Los Angeles County      6037       11-City: Large 34.01081
## 92632            Comal County     48091       13-City: Small 29.67246
## 92693             Cook County     17031       11-City: Large 41.80119
## 92700      San Joaquin County      6077     41-Rural: Fringe 38.10032
## 92754           Walton County     12131     41-Rural: Fringe 30.78355
## 92763           Walton County     12131     32-Town: Distant 30.74151
## 92771           Walton County     12131     41-Rural: Fringe 30.72068
## 92791          Passaic County     34031     21-Suburb: Large 41.01455
## 92792          Passaic County     34031     21-Suburb: Large 41.01432
## 92870              Nye County     32023     43-Rural: Remote 38.20368
## 92972           Warren County     34041     41-Rural: Fringe 40.78175
## 92974           Warren County     34041     41-Rural: Fringe 40.76623
## 93049             Kent County     44003       13-City: Small 41.70473
## 93051          Wasatch County     49051     32-Town: Distant 40.49965
## 93052        Salt Lake County     49035     21-Suburb: Large 40.67783
## 93053          Wasatch County     49051     32-Town: Distant 40.51072
## 93054            Davis County     49011     21-Suburb: Large 40.84941
## 93055            Davis County     49011       13-City: Small 41.11328
## 93056        Salt Lake County     49035    12-City: Mid-size 40.77003
## 93057             Utah County     49049    12-City: Mid-size 40.24777
## 93058            Weber County     49057       13-City: Small 41.20190
## 93059        Salt Lake County     49035     21-Suburb: Large 40.66642
## 93068           Waseca County     27161     32-Town: Distant 44.09460
## 93116       Washington County     51191     23-Suburb: Small 36.72277
## 93117       Washington County      1129     43-Rural: Remote 31.45318
## 93120       Washington County     55131     23-Suburb: Small 43.41425
## 93154             Lake County     17097     21-Suburb: Large 42.35682
## 93349             Will County     17197     21-Suburb: Large 41.51600
## 93394         Sangamon County     17167    12-City: Mid-size 39.79666
## 93416       Washington County     49053       13-City: Small 37.05375
## 93433       Washington County     49053     23-Suburb: Small 37.13577
## 93434        Salt Lake County     49035    12-City: Mid-size 40.77934
## 93438            Davis County     49011     21-Suburb: Large 40.88269
## 93457            Weber County     49057     21-Suburb: Large 41.17963
## 93459          Yavapai County      4025       13-City: Small 34.54236
## 93466       Washington County     12133     32-Town: Distant 30.77453
## 93490           Washoe County     32031    12-City: Mid-size 39.51181
## 93519       Washington County     49053     32-Town: Distant 37.00600
## 93520       Washington County     49053     32-Town: Distant 37.00599
## 93521        Tom Green County     48451    42-Rural: Distant 31.66940
## 93680         Mahnomen County     27087     43-Rural: Remote 47.18099
## 93685             Lake County     17097     21-Suburb: Large 42.26742
## 93696             Lake County     17097     21-Suburb: Large 42.36408
## 93722            Dodge County     55027     32-Town: Distant 43.62887
## 93746           Mohave County      4015      33-Town: Remote 35.24397
## 93747           Mohave County      4015       13-City: Small 34.49434
## 93748           Mohave County      4015      33-Town: Remote 35.10642
## 93749           La Paz County      4012     32-Town: Distant 34.14198
## 93750           Mohave County      4015     32-Town: Distant 34.89434
## 93752           Mohave County      4015      33-Town: Remote 35.19269
## 93757            Duval County     12031       11-City: Large 30.24796
## 93816             Ware County     13299     41-Rural: Fringe 31.25363
## 93861            Wayne County     49055     43-Rural: Remote 38.34372
## 93873            Wayne County     49055     43-Rural: Remote 38.34162
## 93967           Merced County      6047       13-City: Small 37.28887
## 93976             Webb County     48479     41-Rural: Fringe 27.48679
## 94003            Weber County     49057     21-Suburb: Large 41.32323
## 94004            Weber County     49057       13-City: Small 41.24438
## 94006            Weber County     49057     21-Suburb: Large 41.16706
## 94007            Weber County     49057       13-City: Small 41.19437
## 94113           Summit County     49043     41-Rural: Fringe 40.75221
## 94114    San Francisco County      6075       11-City: Large 37.78307
## 94142        Salt Lake County     49035     21-Suburb: Large 40.57810
## 94191       Palm Beach County     12099     21-Suburb: Large 26.65010
## 94200           Carbon County     49007    42-Rural: Distant 39.54519
## 94227             Elko County     32007     43-Rural: Remote 41.10835
## 94241           Fulton County     13121     21-Suburb: Large 33.61499
## 94249         Hennepin County     27053       11-City: Large 44.94190
## 94257            Cache County     49005     41-Rural: Fringe 41.64959
## 94289           Tooele County     49045      33-Town: Remote 40.73670
## 94324            Pasco County     12101     21-Suburb: Large 28.25607
## 94349             Cook County     17031     21-Suburb: Large 41.93277
## 94362        Worcester County     25027     21-Suburb: Large 42.29311
## 94369             Kane County     17089     21-Suburb: Large 41.79096
## 94396       Palm Beach County     12099     21-Suburb: Large 26.36229
## 94403            Davis County     49011     21-Suburb: Large 40.89498
## 94460             Clay County     27027     41-Rural: Fringe 46.84864
## 94467        Henderson County     17071    42-Rural: Distant 40.84910
## 94468          Stearns County     27145     32-Town: Distant 45.72971
## 94501            Davis County     49011     21-Suburb: Large 41.14054
## 94534             Juab County     49023     43-Rural: Remote 39.64419
## 94535             Juab County     49023     43-Rural: Remote 39.64358
## 94696            Weber County     49057     21-Suburb: Large 41.18439
## 94701           Dakota County     27037     21-Suburb: Large 44.89105
## 94719        Salt Lake County     49035    12-City: Mid-size 40.77474
## 94738        Salt Lake County     49035     21-Suburb: Large 40.60115
## 94742        San Mateo County      6081     21-Suburb: Large 37.54991
## 94782        Salt Lake County     49035     21-Suburb: Large 40.60390
## 94783        Salt Lake County     49035     21-Suburb: Large 40.61454
## 94784        Salt Lake County     49035     21-Suburb: Large 40.61948
## 94790        Salt Lake County     49035     21-Suburb: Large 40.66317
## 94798        Salt Lake County     49035     21-Suburb: Large 40.69915
## 94800             Lake County     18089     21-Suburb: Large 41.46661
## 94948           Nueces County     48355       11-City: Large 27.75691
## 94976         Maricopa County      4013       11-City: Large 33.47938
## 94997            Davis County     49011     21-Suburb: Large 41.12071
## 95001            Davis County     49011     21-Suburb: Large 41.11862
## 95007          Fairfax County     51059     21-Suburb: Large 38.77597
## 95064           Tooele County     49045     32-Town: Distant 40.52490
## 95100            Essex County     34013       11-City: Large 40.74211
## 95109       Stanislaus County      6099     32-Town: Distant 37.32065
## 95116           Sonoma County      6097     21-Suburb: Large 38.40742
## 95141       Palm Beach County     12099     41-Rural: Fringe 26.72096
## 95151         Hennepin County     27053     21-Suburb: Large 44.90105
## 95176        Salt Lake County     49035     21-Suburb: Large 40.70349
## 95198        Hampshire County     54027    42-Rural: Distant 39.34275
## 95199        Hampshire County     54027    42-Rural: Distant 39.34194
## 95200        Hampshire County     54027    42-Rural: Distant 39.33919
## 95206            Weber County     49057     41-Rural: Fringe 41.25049
## 95232         Maricopa County      4013  22-Suburb: Mid-size 33.43980
## 95233         Maricopa County      4013     21-Suburb: Large 33.55365
## 95234         Maricopa County      4013       11-City: Large 33.67718
## 95235         Maricopa County      4013     21-Suburb: Large 33.85245
## 95236         Maricopa County      4013      31-Town: Fringe 33.37609
## 95237         Maricopa County      4013     21-Suburb: Large 33.62561
## 95238         Maricopa County      4013     21-Suburb: Large 33.61612
## 95240         Maricopa County      4013     21-Suburb: Large 33.51086
## 95241         Maricopa County      4013       11-City: Large 33.56620
## 95242         Maricopa County      4013     21-Suburb: Large 33.65359
## 95243         Maricopa County      4013  22-Suburb: Mid-size 33.43774
## 95244         Maricopa County      4013     21-Suburb: Large 33.59018
## 95245         Maricopa County      4013      31-Town: Fringe 33.32774
## 95246         Maricopa County      4013     21-Suburb: Large 33.53914
## 95247         Maricopa County      4013       11-City: Large 33.62599
## 95248         Maricopa County      4013       11-City: Large 33.62512
## 95249         Maricopa County      4013     21-Suburb: Large 33.53229
## 95250         Maricopa County      4013     21-Suburb: Large 33.60321
## 95251         Maricopa County      4013  22-Suburb: Mid-size 33.42574
## 95252         Maricopa County      4013     21-Suburb: Large 33.68509
## 95254         Maricopa County      4013  22-Suburb: Mid-size 33.49475
## 95255         Maricopa County      4013       11-City: Large 33.59582
## 95256         Maricopa County      4013     21-Suburb: Large 33.68981
## 95257         Maricopa County      4013       11-City: Large 33.65657
## 95258         Maricopa County      4013       11-City: Large 33.64172
## 95259         Maricopa County      4013     21-Suburb: Large 33.58638
## 95261         Maricopa County      4013       11-City: Large 33.68048
## 95262         Maricopa County      4013     21-Suburb: Large 33.54574
## 95263         Maricopa County      4013       11-City: Large 33.71801
## 95264         Maricopa County      4013       11-City: Large 33.58369
## 95265         Maricopa County      4013     41-Rural: Fringe 33.58382
## 95266         Maricopa County      4013       11-City: Large 33.41840
## 95267         Maricopa County      4013       11-City: Large 33.56690
## 95268         Maricopa County      4013     21-Suburb: Large 33.67668
## 95269         Maricopa County      4013       11-City: Large 33.61285
## 95270         Maricopa County      4013     21-Suburb: Large 33.44889
## 95271         Maricopa County      4013    42-Rural: Distant 33.49181
## 95272         Maricopa County      4013     21-Suburb: Large 33.62616
## 95273         Maricopa County      4013     41-Rural: Fringe 33.49452
## 95275         Maricopa County      4013       11-City: Large 33.53812
## 95276         Maricopa County      4013  22-Suburb: Mid-size 33.48996
## 95277         Maricopa County      4013     41-Rural: Fringe 33.95472
## 95278         Maricopa County      4013     21-Suburb: Large 33.63440
## 95279         Maricopa County      4013     41-Rural: Fringe 33.41851
## 95303        Salt Lake County     49035     21-Suburb: Large 40.63769
## 95335 East Baton Rouge Parish     22033    12-City: Mid-size 30.43061
## 95343       Washington County     44009  22-Suburb: Mid-size 41.37673
## 95401        Salt Lake County     49035     21-Suburb: Large 40.65641
## 95413           DeKalb County     29063     32-Town: Distant 39.76439
## 95417           Cibola County     35006      33-Town: Remote 35.14055
## 95429         Buchanan County     29021       13-City: Small 39.76816
## 95430         Buchanan County     29021       13-City: Small 39.76809
## 95442         Maricopa County      4013       11-City: Large 33.49370
## 95444           Placer County      6061     21-Suburb: Large 38.81234
## 95446           Staunton city     51790     41-Rural: Fringe 38.14248
## 95486             Utah County     49049     21-Suburb: Large 40.44801
## 95534             Utah County     49049     21-Suburb: Large 40.36401
## 95549        Salt Lake County     49035     21-Suburb: Large 40.62023
## 95550         Maricopa County      4013       11-City: Large 33.49661
## 95551         Maricopa County      4013     21-Suburb: Large 33.55381
## 95593             Utah County     49049       13-City: Small 40.27617
## 95670             Utah County     49049    12-City: Mid-size 40.25423
## 95748             Utah County     49049     21-Suburb: Large 40.16747
## 95752        Salt Lake County     49035     21-Suburb: Large 40.59481
## 95806          McHenry County     17111      31-Town: Fringe 42.30364
## 95886           Wetzel County     54103     41-Rural: Fringe 39.61487
## 95930             Yuba County      6115     41-Rural: Fringe 39.00661
## 96039           Navajo County      4017     43-Rural: Remote 35.60439
## 96120            Cache County     49005    42-Rural: Distant 41.92639
## 96180          Alameda County      6001     21-Suburb: Large 37.55006
## 96209         San Juan County     49037     43-Rural: Remote 37.26046
## 96241            Davis County     49011     21-Suburb: Large 41.06363
## 96369             Lake County     17097     21-Suburb: Large 42.37237
## 96399      Los Angeles County      6037     21-Suburb: Large 33.99596
## 96408        Salt Lake County     49035    12-City: Mid-size 40.73468
## 96409        Salt Lake County     49035     21-Suburb: Large 40.69523
## 96426          Wichita County     48485    12-City: Mid-size 33.92917
## 96450         Wicomico County     24045     23-Suburb: Small 38.36507
## 96498           Wilcox County      1131     43-Rural: Remote 31.99461
## 96502         Sangamon County     17167    12-City: Mid-size 39.82791
## 96541            Butte County      6007       13-City: Small 39.76118
## 96544           Nassau County     12089     41-Rural: Fringe 30.63290
## 96572          Alachua County     12001  22-Suburb: Mid-size 29.61202
## 96689        Box Elder County     49003     21-Suburb: Large 41.40852
## 96726             Kern County      6029       11-City: Large 35.41037
## 96834       Miami-Dade County     12086     21-Suburb: Large 25.86661
## 96927        Salt Lake County     49035     21-Suburb: Large 40.69102
## 96945           Sierra County      6091    42-Rural: Distant 39.58457
## 97010      Los Angeles County      6037     21-Suburb: Large 34.13243
## 97070             Knox County     17095    42-Rural: Distant 40.92746
## 97071             Knox County     17095    42-Rural: Distant 40.92746
## 97072             Knox County     17095    42-Rural: Distant 40.92746
## 97073       Williamson County     48491     41-Rural: Fringe 30.61834
## 97074       Williamson County     48491     41-Rural: Fringe 30.61834
## 97075       Williamson County     17199       13-City: Small 37.73801
## 97078       Williamson County     48491     41-Rural: Fringe 30.61834
## 97080       Williamson County     48491      31-Town: Fringe 30.57780
## 97084       Williamson County     48491     21-Suburb: Large 30.63376
## 97085       Williamson County     48491     21-Suburb: Large 30.66794
## 97087       Williamson County     48491     41-Rural: Fringe 30.61834
## 97091       Williamson County     48491     41-Rural: Fringe 30.64626
## 97159        Mendocino County      6045      33-Town: Remote 39.41733
## 97166        Kandiyohi County     27067      33-Town: Remote 45.11478
## 97181        Salt Lake County     49035     21-Suburb: Large 40.57716
## 97187          Yavapai County      4025       13-City: Small 34.57900
## 97220       San Benito County      6069    42-Rural: Distant 36.73555
## 97244           Tooele County     49045     41-Rural: Fringe 40.58766
## 97255        Salt Lake County     49035     21-Suburb: Large 40.51002
## 97258             Cook County     17031     21-Suburb: Large 42.10409
## 97267             Utah County     49049     21-Suburb: Large 40.38977
## 97335           Wilson County     48493     41-Rural: Fringe 29.15300
## 97338           Wilson County     48493     41-Rural: Fringe 29.15300
## 97339           Wilson County     48493     41-Rural: Fringe 29.15300
## 97452             Utah County     49049     21-Suburb: Large 40.03677
## 97453            Cache County     49005       13-City: Small 41.73007
## 97541       Rockingham County     33015     41-Rural: Fringe 42.79520
## 97546       Rockingham County     33015     41-Rural: Fringe 42.77637
## 97564            Davis County     49011     21-Suburb: Large 41.01355
## 97614             Utah County     49049       13-City: Small 40.32121
## 97769           Sutter County      6101    42-Rural: Distant 39.06285
## 97803          Winston County      1133     43-Rural: Remote 34.16503
## 97824           Summit County     49043     32-Town: Distant 40.69180
## 97879            Pasco County     12101     21-Suburb: Large 28.18954
## 97908             Wise County     51195     32-Town: Distant 36.97923
## 97909             Wise County     51195     32-Town: Distant 36.98248
## 97960        Winnebago County     17201    12-City: Mid-size 42.22580
## 98030         Freeborn County     27047    42-Rural: Distant 43.57216
## 98031          Audrain County     29007      33-Town: Remote 39.31798
## 98032          Audrain County     29007      33-Town: Remote 39.31798
## 98034          Audrain County     29007      33-Town: Remote 39.31802
## 98051             Wood County     54107       13-City: Small 39.24257
## 98063             Cook County     17031     21-Suburb: Large 42.12893
## 98197             Will County     17197     21-Suburb: Large 41.51935
## 98206             Lake County     17097     21-Suburb: Large 42.35185
## 98261             Lake County     17097     21-Suburb: Large 42.37712
## 98267             Lake County     17097     21-Suburb: Large 42.36536
## 98288             Lake County     17097     21-Suburb: Large 42.35427
## 98299           Sonoma County      6097      31-Town: Fringe 38.31204
## 98309        Milwaukee County     55079       11-City: Large 43.03690
## 98310        Milwaukee County     55079       11-City: Large 43.04296
## 98359         Monmouth County     34025     21-Suburb: Large 40.28090
## 98435          Augusta County     51015     23-Suburb: Small 38.11794
## 98437        Salt Lake County     49035     21-Suburb: Large 40.71602
## 98450            Cache County     49005       13-City: Small 41.71981
## 98454            Davis County     49011     21-Suburb: Large 40.86895
## 98455            Davis County     49011     21-Suburb: Large 40.87792
## 98471       Newport News city     51700    12-City: Mid-size 37.17137
## 98485       Chittenden County     50007  22-Suburb: Mid-size 44.50219
## 98506          McHenry County     17111      31-Town: Fringe 42.31191
## 98511          McHenry County     17111     41-Rural: Fringe 42.35213
## 98512        Salt Lake County     49035     21-Suburb: Large 40.64144
## 98617             Cook County     17031     21-Suburb: Large 41.68901
## 98619             Cook County     17031     21-Suburb: Large 41.68886
## 98627           Nobles County     27105      33-Town: Remote 43.62652
## 98628           Nobles County     27105      33-Town: Remote 43.62649
## 98644             Cook County     17031     21-Suburb: Large 41.68805
## 98645             Cook County     17031     21-Suburb: Large 41.69132
## 98693           Wright County     27171      31-Town: Fringe 45.19177
## 98711         Randolph County     54083      33-Town: Remote 38.93584
## 98787          Wyoming County     54109    42-Rural: Distant 37.59097
## 98807            Wythe County     51197     32-Town: Distant 36.94054
## 98885             Cook County     17031       11-City: Large 41.73002
## 98886             Cook County     17031       11-City: Large 41.90264
## 98887             Cook County     17031       11-City: Large 41.93791
## 98888             Cook County     17031       11-City: Large 41.90164
## 98889             Cook County     17031       11-City: Large 41.89519
## 98890             Cook County     17031       11-City: Large 41.86508
## 98891             Cook County     17031       11-City: Large 41.75158
## 98892             Cook County     17031       11-City: Large 41.88265
## 98893             Cook County     17031       11-City: Large 41.85707
## 98894             Cook County     17031       11-City: Large 41.85468
## 98895             Cook County     17031       11-City: Large 41.84159
## 98897             Cook County     17031       11-City: Large 41.77395
## 98898             Cook County     17031       11-City: Large 41.88015
## 98899             Cook County     17031       11-City: Large 41.74616
## 98901             Cook County     17031       11-City: Large 41.87707
## 98902             Cook County     17031       11-City: Large 41.89065
## 98903             Cook County     17031       11-City: Large 41.90200
## 98904             Cook County     17031       11-City: Large 41.83172
## 98905          Kendall County     17093     21-Suburb: Large 41.65176
## 98965             Yolo County      6113     23-Suburb: Small 38.69393
## 99046       Stanislaus County      6099    12-City: Mid-size 37.64108
## 99047         Mariposa County      6043     43-Rural: Remote 37.54485
## 99056             Cook County     17031     21-Suburb: Large 42.06487
## 99070        Box Elder County     49003     21-Suburb: Large 41.49436
## 99073           Harris County     48201       11-City: Large 29.67852
## 99074           Harris County     48201     21-Suburb: Large 29.67027
## 99085           Mohave County      4015      33-Town: Remote 35.03381
## 99086           Harris County     48201       11-City: Large 29.75201
## 99129        Salt Lake County     49035     21-Suburb: Large 40.69014
## 99148             Pima County      4019       11-City: Large 32.19278
## 99149           Mercer County     34021     21-Suburb: Large 40.24375
## 99170          Alameda County      6001       11-City: Large 37.84737
## 99174           Sutter County      6101       13-City: Small 39.12403
## 99175             Yuba County      6115  22-Suburb: Mid-size 39.14715
## 99176             Yuba County      6115  22-Suburb: Mid-size 39.14999
## 99181   San Bernardino County      6071     21-Suburb: Large 34.00931
## 99203             Yuma County      4027       13-City: Small 32.71652
## 99265          El Paso County      8041       11-City: Large 38.82391
## 99294            Pasco County     12101     23-Suburb: Small 28.24966
## 99333          Olmsted County     27109      31-Town: Fringe 44.02949
##        Longitude
## 3      -93.57477
## 4      -93.59692
## 108    -87.86273
## 129    -88.04488
## 133   -119.24259
## 163    -92.65047
## 177    -82.00065
## 209   -112.01150
## 210   -112.03210
## 212    -84.85224
## 263   -101.71285
## 283    -70.95375
## 397    -80.41314
## 398    -80.39656
## 399    -80.43579
## 400    -80.41314
## 404    -77.66266
## 406   -110.91226
## 407   -110.99446
## 413    -77.48163
## 421   -110.98374
## 422   -111.11613
## 427   -117.27836
## 432    -74.42661
## 446    -74.55273
## 455    -74.34022
## 457   -111.85337
## 458    -74.52915
## 496   -114.59549
## 497   -119.77508
## 499    -81.16552
## 506    -77.55705
## 508   -112.00365
## 516   -110.99921
## 517   -112.20239
## 518   -112.13061
## 535   -110.79554
## 536   -110.76371
## 537   -110.83603
## 544   -111.99996
## 545   -117.29845
## 546    -80.16430
## 552   -111.79308
## 574   -111.99234
## 575   -111.06524
## 579    -88.11973
## 584    -92.93588
## 591   -112.22438
## 637   -121.62084
## 661    -77.07945
## 680   -112.33239
## 681   -112.33217
## 688    -88.24436
## 717   -117.27466
## 803   -111.92551
## 805   -111.82377
## 807   -112.10993
## 849   -111.89969
## 875    -87.94505
## 898   -112.11828
## 899    -86.80875
## 915    -79.40735
## 919    -74.27403
## 924   -115.76506
## 925    -83.16954
## 929    -80.46277
## 930    -77.32673
## 932    -82.31898
## 933    -80.25019
## 936    -76.11893
## 937    -82.18218
## 938    -82.69166
## 942    -80.10746
## 943    -84.38071
## 950    -77.51715
## 951    -77.32342
## 952    -71.72181
## 959    -76.10146
## 969   -110.86922
## 1028  -113.17318
## 1072  -112.07145
## 1105  -111.57947
## 1106  -111.57947
## 1139  -111.59106
## 1140  -111.65512
## 1141  -111.59054
## 1144   -82.27195
## 1145   -82.28144
## 1150   -82.28155
## 1151   -82.31909
## 1160  -122.28727
## 1163  -122.09833
## 1247   -89.61401
## 1252   -74.66962
## 1290  -109.47684
## 1318  -111.81315
## 1335   -77.08016
## 1336   -77.27891
## 1337   -77.16300
## 1338   -77.42504
## 1345   -93.25087
## 1347   -93.39071
## 1358   -93.39071
## 1431   -95.35921
## 1470   -91.51299
## 1506   -93.39129
## 1557   -92.22379
## 1633   -95.41728
## 1656  -112.13355
## 1660  -116.95415
## 1661  -116.95415
## 1692   -85.14849
## 1693   -85.16844
## 1738   -87.44257
## 1766   -86.51249
## 1837  -122.07141
## 1844  -121.23205
## 1853  -120.69693
## 1857   -75.05433
## 1877   -87.78885
## 1902   -80.20223
## 1906  -119.80913
## 1907  -119.78078
## 1921  -111.79653
## 1922  -111.77034
## 1932   -94.80724
## 1940  -111.86115
## 1952  -111.86591
## 1971  -110.94381
## 1972  -117.29296
## 1974  -117.29827
## 1987  -110.29025
## 1989  -110.28906
## 1992  -111.86841
## 2008   -80.40409
## 2014  -110.97228
## 2016   -78.44353
## 2017   -78.41213
## 2020   -77.69162
## 2027   -81.71404
## 2034   -84.37921
## 2036   -85.96236
## 2038   -85.16967
## 2054   -77.12243
## 2057   -98.15678
## 2060   -83.71790
## 2061   -85.70326
## 2067  -122.19551
## 2160  -119.71050
## 2162  -120.77769
## 2163  -120.77770
## 2194  -119.80374
## 2195  -119.69778
## 2210   -89.33395
## 2212   -89.33331
## 2213   -89.33720
## 2219  -112.14911
## 2230  -111.70459
## 2236   -78.13269
## 2242  -112.02022
## 2251  -111.78095
## 2252  -111.79843
## 2253  -111.85630
## 2254  -112.00447
## 2266  -111.90388
## 2268  -111.66998
## 2269  -111.73701
## 2270  -111.72330
## 2271  -111.80120
## 2272  -111.57059
## 2273  -111.65278
## 2274  -111.48778
## 2275  -111.60121
## 2279  -111.97783
## 2280  -111.89471
## 2281  -111.90111
## 2282  -111.90309
## 2283  -111.69136
## 2284  -111.92850
## 2288   -80.30794
## 2297  -112.09018
## 2298  -110.92644
## 2299  -114.62353
## 2300  -114.62520
## 2310   -70.94255
## 2334   -82.73616
## 2335   -86.60043
## 2342   -84.33244
## 2343   -82.41370
## 2348   -81.46366
## 2350   -80.13970
## 2351   -80.15800
## 2352   -80.14533
## 2355   -81.06361
## 2440   -82.77630
## 2442   -74.86067
## 2552   -87.83691
## 2669   -74.80116
## 2682   -80.20690
## 2704   -74.00815
## 2720  -114.04159
## 2724   -93.19421
## 2743   -76.55828
## 2786   -85.82284
## 2832  -122.19390
## 2842  -112.02705
## 2846  -118.04353
## 2847  -118.10665
## 2857   -80.12720
## 2886  -112.00013
## 2887  -121.82677
## 2888  -121.82486
## 2926  -110.23325
## 2927  -109.71812
## 2928  -111.39361
## 2929  -110.92773
## 2930  -112.47990
## 2931  -114.64967
## 2932  -110.77094
## 2941  -111.56250
## 2943  -111.55620
## 3000  -121.81372
## 3009  -117.18959
## 3049   -77.41153
## 3129   -82.09288
## 3130   -80.28657
## 3155  -111.97342
## 3274  -112.06556
## 3275  -111.87350
## 3276  -112.33355
## 3277  -111.68212
## 3278  -112.34158
## 3279  -112.06449
## 3280  -112.05112
## 3281  -112.08125
## 3282  -112.34158
## 3284  -110.91950
## 3287  -112.12891
## 3288  -111.78437
## 3289  -112.11969
## 3290  -112.11966
## 3291  -112.11959
## 3295  -112.07108
## 3296  -112.02678
## 3297  -111.98041
## 3299  -112.27330
## 3300  -112.06979
## 3301  -112.07107
## 3330   -89.95774
## 3512  -113.63321
## 3544  -111.59480
## 3613  -112.25733
## 3646  -117.29490
## 3666  -111.90239
## 3667  -111.88430
## 3668  -112.02648
## 3673  -112.10125
## 3674  -110.99001
## 3675  -110.99001
## 3763  -117.20901
## 3770  -109.54971
## 3771  -109.56143
## 3772  -112.08757
## 3780   -89.30010
## 3781   -89.22969
## 3782   -89.29479
## 3791   -87.67127
## 3796  -111.37147
## 3797  -111.24119
## 3798  -112.13293
## 3799  -109.59163
## 3800  -109.56273
## 3801  -111.33560
## 3802  -111.37131
## 3803  -110.71187
## 3804  -110.71843
## 3825  -111.71930
## 3834   -87.72678
## 3835   -87.72188
## 3837   -80.19450
## 3841   -77.46991
## 3898  -118.13056
## 3914  -111.84470
## 3915  -112.06360
## 3916  -111.92099
## 3917  -111.95047
## 3918  -112.06363
## 3919  -112.06396
## 3920  -111.68205
## 3921  -111.67389
## 3922  -111.68200
## 3931   -98.54752
## 3934   -98.54751
## 3953  -111.77742
## 3986   -94.20373
## 3987  -112.03166
## 4006  -121.35429
## 4034   -74.63376
## 4042   -80.09784
## 4051   -74.57093
## 4053   -74.57063
## 4196   -82.00616
## 4204  -114.02342
## 4283   -97.75605
## 4308   -86.45428
## 4309   -86.47354
## 4332  -111.55411
## 4384  -118.11195
## 4472   -97.24869
## 4497  -111.84359
## 4513  -114.64695
## 4514  -106.94064
## 4534   -87.61735
## 4547   -94.56787
## 4557   -91.18148
## 4576   -83.87881
## 4592  -111.93437
## 4622   -75.55004
## 4623   -75.72564
## 4626  -123.35363
## 4635   -95.42090
## 4644  -119.79501
## 4690   -82.12959
## 4695   -82.11832
## 4727   -82.11836
## 4728   -82.11832
## 4800  -117.63615
## 4807  -111.75627
## 4948   -87.75406
## 4949  -116.87818
## 4950  -116.87520
## 4952  -116.87847
## 5054   -82.30265
## 5128   -80.13704
## 5137  -111.72763
## 5164  -116.85593
## 5174  -111.77223
## 5189   -71.02719
## 5305  -111.97540
## 5306  -111.83912
## 5307  -111.81030
## 5308  -111.84276
## 5310  -111.63379
## 5311  -112.39812
## 5312  -112.39812
## 5313  -111.61596
## 5314  -110.94480
## 5315  -110.94446
## 5316  -112.27030
## 5317  -112.27009
## 5318  -112.01407
## 5319  -112.07131
## 5320  -112.01429
## 5321  -112.09997
## 5322  -112.43164
## 5323   -98.59017
## 5324   -98.49112
## 5325   -98.52537
## 5326  -111.80644
## 5327  -111.92507
## 5328  -110.87105
## 5329  -110.91092
## 5347  -112.02690
## 5348   -97.37852
## 5375  -111.95357
## 5457   -80.24413
## 5532   -85.67886
## 5533   -85.67886
## 5534   -85.67886
## 5588  -117.19169
## 5623   -76.60607
## 5670  -111.82026
## 5672   -81.76381
## 5735  -111.84583
## 5737  -112.16288
## 5738  -112.15864
## 5803  -116.98623
## 5809   -70.94329
## 5825  -112.63817
## 5829   -92.99445
## 5834  -112.64160
## 5873   -81.19339
## 5885   -79.52510
## 5908   -79.52517
## 5937   -86.07582
## 5967  -112.01410
## 5968  -111.86823
## 5989   -89.21248
## 6059  -112.62934
## 6075   -97.23000
## 6114  -111.86864
## 6122  -111.95856
## 6131  -111.82990
## 6152   -88.18479
## 6156   -89.90530
## 6184   -93.77019
## 6263  -120.71467
## 6397   -94.90367
## 6416   -81.75374
## 6426   -80.37339
## 6428   -80.15991
## 6441  -111.95097
## 6456   -88.30866
## 6463  -111.99302
## 6506  -120.29626
## 6508  -111.61662
## 6509  -111.78606
## 6510  -111.68365
## 6531  -111.67649
## 6541   -89.67158
## 6574  -112.12211
## 6575  -112.09237
## 6616  -111.95675
## 6617  -111.96148
## 6684   -94.16047
## 6685   -94.21214
## 6687   -94.16047
## 6710  -110.24813
## 6723   -74.05693
## 6729   -74.05402
## 6753  -122.27313
## 6872  -121.84988
## 6933   -86.99922
## 6965   -92.08427
## 7127   -98.47277
## 7128   -98.47277
## 7129   -98.47277
## 7130   -98.46685
## 7135   -98.47277
## 7146   -87.13597
## 7166  -122.53835
## 7200  -124.13111
## 7211  -119.80846
## 7213   -93.32594
## 7214   -81.36016
## 7252  -121.89833
## 7263  -111.66419
## 7264  -111.66424
## 7280  -121.70248
## 7296   -97.11925
## 7338  -111.94669
## 7351  -111.85092
## 7424   -93.19433
## 7430   -81.67613
## 7470  -120.99708
## 7498   -89.65621
## 7522  -111.99177
## 7523   -90.65222
## 7576  -112.02332
## 7588  -100.45928
## 7659  -118.83720
## 7709  -109.48069
## 7752  -111.84445
## 7753  -111.68731
## 7769   -87.64386
## 7770   -87.59450
## 7816   -93.31236
## 7825  -113.56414
## 7828  -113.59284
## 7829   -93.29667
## 7836  -123.35885
## 7839  -121.95695
## 7843   -86.56171
## 7844   -86.57256
## 7900  -112.32427
## 7922   -78.26150
## 7931   -78.49660
## 7963   -81.24578
## 7976  -111.84257
## 7995  -112.04085
## 7996  -109.55141
## 8003  -111.95646
## 8030  -114.59428
## 8046   -77.90207
## 8068   -85.20697
## 8084   -80.11257
## 8108  -122.36192
## 8136   -84.58046
## 8173   -92.45556
## 8252  -112.32326
## 8255  -111.97585
## 8257  -111.84576
## 8260  -111.95726
## 8261  -111.83595
## 8262  -111.71587
## 8284  -110.15904
## 8313   -81.80955
## 8319   -88.83116
## 8352   -92.73142
## 8358   -92.73146
## 8441   -79.86398
## 8470  -111.42117
## 8480  -111.88507
## 8481   -82.30844
## 8485  -111.87140
## 8486  -111.88166
## 8487  -111.88287
## 8604  -112.02631
## 8606  -112.00880
## 8663   -80.08336
## 8677   -81.17932
## 8679   -80.34726
## 8728   -82.11266
## 8729   -82.11285
## 8730   -82.11266
## 8735  -112.34156
## 8748  -120.80496
## 8768  -112.34803
## 8808   -93.07748
## 8859  -123.62794
## 8902   -95.40297
## 8905   -95.24119
## 8910   -96.39617
## 8928   -79.89285
## 8942   -96.57576
## 9056   -80.73292
## 9063   -80.75716
## 9065   -80.75716
## 9066   -80.75716
## 9073   -98.53457
## 9107   -88.25259
## 9201   -81.59333
## 9218  -111.84528
## 9227   -80.73743
## 9228  -118.85618
## 9239  -111.59787
## 9271   -76.98009
## 9272   -76.98009
## 9305  -111.87428
## 9327  -111.82625
## 9406   -93.04591
## 9491  -111.66094
## 9694   -93.29770
## 9787  -123.36100
## 9814  -111.60797
## 9863  -111.82085
## 9878   -80.10463
## 9879   -80.19926
## 9880   -80.17082
## 9885   -80.18367
## 9886   -80.18367
## 9887   -80.25223
## 10043  -80.37296
## 10044 -110.40226
## 10095  -90.58784
## 10096  -90.58784
## 10145 -111.86931
## 10159 -112.09433
## 10160 -112.09222
## 10174 -122.38019
## 10177  -94.81105
## 10178  -82.04914
## 10314 -119.16065
## 10330 -119.46478
## 10373 -112.09606
## 10402 -112.51034
## 10426 -122.11495
## 10432  -85.71274
## 10487 -122.17719
## 10491 -111.96210
## 10525 -111.82887
## 10538  -77.27851
## 10565  -78.92089
## 10567  -74.64023
## 10569  -74.89927
## 10591  -74.82193
## 10597  -74.82237
## 10621 -121.67173
## 10644  -80.84893
## 10650  -93.28155
## 10655  -93.21675
## 10702  -80.02725
## 10767  -86.62654
## 10776  -89.66886
## 10782  -76.41125
## 10789 -111.81898
## 10793 -111.81642
## 10805 -121.80445
## 10816 -118.78901
## 10817 -112.05437
## 10823 -112.03772
## 10928  -88.28652
## 10937  -88.26883
## 10938  -85.98902
## 10948  -88.31955
## 10957  -87.33510
## 10962 -109.54714
## 11016  -93.55949
## 11017 -111.76554
## 11021 -118.13434
## 11030 -116.78012
## 11033  -82.37236
## 11059 -111.84537
## 11065 -111.80494
## 11125 -116.93196
## 11156  -93.16188
## 11192  -71.08667
## 11230  -85.75824
## 11231  -85.75826
## 11255  -85.04861
## 11256  -85.04861
## 11257  -85.04861
## 11258  -85.04861
## 11259  -81.01426
## 11263 -112.39783
## 11272 -117.54899
## 11273 -117.54899
## 11299 -121.39954
## 11300 -121.37426
## 11301 -121.33976
## 11302 -120.91183
## 11303 -116.64311
## 11307 -121.96549
## 11308 -121.96335
## 11309 -117.37942
## 11310 -117.96898
## 11312 -117.54903
## 11313 -117.54903
## 11314 -122.99891
## 11351  -96.84577
## 11405 -111.94758
## 11422 -119.05953
## 11439 -111.62762
## 11440 -111.63387
## 11483  -75.06721
## 11484 -121.93744
## 11512  -75.10847
## 11513  -75.10847
## 11514  -75.10847
## 11522 -112.22370
## 11534  -87.73968
## 11535  -87.55016
## 11539 -122.30658
## 11541  -97.65771
## 11543  -97.68157
## 11544  -97.65917
## 11546  -97.65926
## 11547  -97.21913
## 11551  -97.82180
## 11582 -112.04401
## 11589 -106.63206
## 11591 -120.67657
## 11612 -114.58835
## 11621  -79.18224
## 11683  -76.39451
## 11685  -80.78129
## 11728 -112.27368
## 11869 -111.91048
## 11872 -111.65235
## 11876 -117.99615
## 11877 -122.16650
## 11881 -111.75034
## 11900 -112.16667
## 11908 -111.80951
## 11911 -110.85743
## 11912 -110.80018
## 11913 -111.82064
## 11914 -111.62850
## 11925 -113.06290
## 11926 -112.46546
## 11927 -111.67988
## 11928 -110.97321
## 11929 -113.06269
## 11930 -112.30777
## 11931 -111.96162
## 11932 -111.80646
## 11935 -111.86893
## 11936 -111.88023
## 11937 -111.88081
## 11967  -74.79920
## 11968  -74.79938
## 11975  -81.50810
## 12070 -110.79730
## 12083 -111.02357
## 12088 -117.28382
## 12114  -92.50939
## 12123  -90.17480
## 12131  -93.14555
## 12138  -81.59602
## 12149 -119.07515
## 12163 -112.11761
## 12164 -112.11768
## 12165 -112.03166
## 12166 -112.01331
## 12167  -86.10486
## 12168  -86.63088
## 12190  -79.13442
## 12221  -88.13552
## 12227 -112.01896
## 12228  -98.12525
## 12243  -87.75027
## 12249 -116.11023
## 12307 -117.32939
## 12310  -87.83751
## 12316 -117.22865
## 12348 -110.29920
## 12427 -114.66434
## 12480 -117.23750
## 12501  -80.73661
## 12523  -85.62967
## 12540  -80.73500
## 12567 -119.76389
## 12591 -118.33482
## 12677  -81.56279
## 12746  -88.23956
## 12749  -88.24146
## 12756 -112.09223
## 12764 -117.31920
## 12783 -121.92413
## 12806 -111.67571
## 12905 -111.01641
## 12912 -110.78448
## 12934 -110.79348
## 12965 -120.95908
## 12974  -87.69250
## 12976  -87.76539
## 12979  -81.61581
## 13071 -111.62348
## 13072 -111.45944
## 13073 -111.66877
## 13075 -111.65166
## 13076 -112.52109
## 13077 -112.13798
## 13079 -111.45662
## 13080 -112.19269
## 13081 -111.45944
## 13082 -111.73699
## 13085 -111.52878
## 13086 -111.38845
## 13087 -112.05250
## 13088 -111.54423
## 13089 -111.58026
## 13090 -111.55560
## 13091 -111.71271
## 13111  -79.03534
## 13117  -89.94887
## 13156 -113.07282
## 13176 -113.05718
## 13230  -77.24539
## 13233 -113.09037
## 13240 -113.07083
## 13262 -112.09829
## 13269 -111.82520
## 13270 -111.76637
## 13275 -113.07044
## 13290 -112.10579
## 13335 -118.25930
## 13338 -118.24091
## 13340 -118.19778
## 13424 -111.95607
## 13428 -111.65369
## 13442 -109.98503
## 13448  -94.56804
## 13467 -110.28968
## 13468 -109.55481
## 13469 -109.54742
## 13470 -109.55260
## 13471 -110.30253
## 13483  -77.48173
## 13487 -111.91269
## 13588 -123.10501
## 13595 -111.87807
## 13602 -111.87657
## 13623  -71.60419
## 13625  -80.75716
## 13677 -111.96515
## 13704  -89.92285
## 13755 -116.87799
## 13816  -86.09370
## 13964  -89.92293
## 14045  -94.20777
## 14047  -94.12629
## 14061  -86.09987
## 14062 -106.76496
## 14068 -117.88006
## 14102 -111.84445
## 14112 -111.73367
## 14118  -91.36957
## 14124  -75.65220
## 14129 -120.86658
## 14136  -77.44937
## 14142  -79.12172
## 14161  -79.20551
## 14205 -118.31913
## 14221 -121.29318
## 14226  -95.07305
## 14229 -112.12922
## 14237 -120.94945
## 14371  -97.09406
## 14373  -97.09406
## 14375  -97.09406
## 14377  -97.12092
## 14379 -112.18377
## 14387 -111.73880
## 14436  -85.38148
## 14458 -111.82539
## 14464 -111.54810
## 14465 -112.07094
## 14516 -110.89713
## 14520  -88.21700
## 14526 -111.88460
## 14531  -77.40667
## 14618  -80.19516
## 14671  -82.67387
## 14768  -73.99688
## 14876  -82.14516
## 14877  -82.14622
## 14880  -78.49470
## 14882  -78.52067
## 14883  -78.46378
## 14899  -80.21039
## 14912 -121.72637
## 15111  -85.68649
## 15116  -92.47795
## 15161 -111.60803
## 15172  -75.01354
## 15173 -111.68923
## 15175  -75.01348
## 15212  -76.23740
## 15213  -76.86109
## 15215  -76.29918
## 15297  -77.66266
## 15298  -77.49964
## 15304  -77.50005
## 15365  -82.71067
## 15370  -87.61844
## 15371  -87.65432
## 15373  -87.69503
## 15376 -120.97751
## 15377 -120.97748
## 15395 -121.83319
## 15442  -88.27907
## 15448 -111.84595
## 15451 -111.90211
## 15452 -112.08147
## 15454 -110.91035
## 15458 -121.57892
## 15473 -106.62156
## 15508  -86.62310
## 15587  -92.84369
## 15666  -89.27973
## 15778 -118.78337
## 15789 -111.79749
## 15809  -85.32363
## 15822  -87.58776
## 15823  -87.66998
## 15824  -87.60550
## 15825  -87.68107
## 15826  -87.71073
## 15828  -87.65705
## 15829  -87.72719
## 15830  -87.61706
## 15831  -87.64551
## 15832  -87.66912
## 15833  -87.62125
## 15834  -87.77653
## 15835  -87.69287
## 15843 -121.36142
## 15898 -112.27314
## 15899 -112.27322
## 15943  -80.32172
## 15950  -82.49720
## 15957  -82.34237
## 15958  -82.34237
## 15960 -111.87487
## 15966  -86.82578
## 15970 -110.97020
## 15981  -80.33567
## 16010 -122.28573
## 16141 -115.09936
## 16190  -74.31265
## 16218 -112.31158
## 16247 -121.00720
## 16271 -117.05548
## 16273 -117.08003
## 16307  -81.95306
## 16308  -88.44618
## 16332  -96.72307
## 16357  -81.74547
## 16359  -81.74684
## 16360  -81.74547
## 16403 -111.83735
## 16411 -121.96905
## 16483 -112.00471
## 16498  -87.86201
## 16525  -85.48218
## 16526  -85.48218
## 16623 -110.85436
## 16633  -80.92811
## 16767 -112.04750
## 16805  -88.91125
## 16811  -92.46148
## 16816 -118.24609
## 16828 -111.29649
## 16913  -90.06124
## 16918 -116.14339
## 16926 -118.38804
## 16948 -117.29282
## 16950  -95.10478
## 16952  -95.10478
## 16953 -122.13678
## 16963 -117.90086
## 17019  -77.45502
## 17046 -122.71186
## 17116 -119.66049
## 17160 -110.92747
## 17231  -87.59268
## 17232 -117.66991
## 17282 -117.01113
## 17334  -81.75820
## 17335  -81.76387
## 17344  -96.63307
## 17345  -96.63465
## 17347  -96.53666
## 17447  -77.39047
## 17510 -117.20498
## 17538 -119.10508
## 17599 -111.97549
## 17600 -111.93885
## 17611  -82.64147
## 17612  -82.64166
## 17613  -82.64180
## 17639  -96.54505
## 17641  -85.91123
## 17651 -111.89319
## 17775  -77.57545
## 17787  -82.99069
## 17793  -77.20176
## 17800 -118.19646
## 17802 -117.21870
## 17803 -117.21870
## 17805 -122.03580
## 17815 -122.17770
## 17823  -95.39511
## 17845 -117.11217
## 17850  -93.08051
## 17856 -117.69644
## 17895 -118.83052
## 17896 -118.83052
## 17897 -118.83052
## 17901 -110.81612
## 17907  -93.30133
## 17925 -118.20656
## 17936 -110.05715
## 17977 -111.84535
## 17978 -109.62712
## 18066 -120.76287
## 18067 -120.76276
## 18074  -88.11197
## 18168 -122.06974
## 18169 -122.02456
## 18170  -94.54003
## 18171  -96.44197
## 18173  -80.73611
## 18174  -82.14727
## 18176  -81.66611
## 18177  -81.28413
## 18178 -111.95782
## 18216  -87.68143
## 18232 -112.04880
## 18254 -111.70720
## 18273  -90.48815
## 18285 -122.41497
## 18338  -86.20205
## 18375 -112.22701
## 18378 -112.28840
## 18379 -112.02136
## 18386 -112.01965
## 18387 -112.07359
## 18392 -112.02592
## 18393 -110.98368
## 18408 -111.89499
## 18423 -119.80829
## 18424 -119.78370
## 18425 -119.79657
## 18431 -113.45196
## 18432 -113.62709
## 18468 -119.57247
## 18490 -121.28674
## 18508 -112.11050
## 18553 -111.87001
## 18557  -94.37173
## 18567 -112.11179
## 18574  -79.08837
## 18614 -117.58663
## 18642 -117.18717
## 18677 -122.21158
## 18719  -74.66447
## 18726 -122.69983
## 18762 -122.29207
## 18787 -111.85186
## 18792 -122.31591
## 18795 -111.81573
## 18796 -111.05217
## 18840 -112.19483
## 18861 -112.09054
## 18877 -116.49266
## 18878 -119.90324
## 18879 -120.80900
## 18881  -98.12136
## 18890  -81.85348
## 18891  -81.43791
## 18900  -77.59056
## 18932  -87.39682
## 18973 -115.05593
## 18994 -123.25431
## 19047  -76.32372
## 19102 -114.66970
## 19111  -71.43736
## 19115  -77.28874
## 19147 -112.02966
## 19169 -122.68143
## 19183 -117.56953
## 19190 -120.14833
## 19232  -88.44363
## 19238 -111.94274
## 19246 -110.81951
## 19257  -91.93828
## 19258  -86.26772
## 19288 -111.88366
## 19292 -119.29167
## 19293 -119.29173
## 19294 -119.86981
## 19295 -119.87025
## 19296 -119.78926
## 19354 -112.02617
## 19388 -111.97035
## 19389 -111.83086
## 19451 -113.52567
## 19461  -83.78106
## 19474  -94.48125
## 19486 -122.36335
## 19492  -99.76301
## 19568 -101.24788
## 19612  -76.93072
## 19626  -82.18638
## 19649  -81.69785
## 19659  -86.84093
## 19664  -93.38842
## 19690  -87.74609
## 19712 -112.32748
## 19719 -112.19999
## 19748  -88.32251
## 19756  -88.34044
## 19776 -110.29961
## 19777 -109.88829
## 19778 -109.48983
## 19779 -110.23789
## 19781 -109.53842
## 19782 -109.22319
## 19783 -110.21944
## 19784 -110.06997
## 19785 -109.68170
## 19786 -109.84206
## 19788  -81.38502
## 19832  -87.05347
## 19833  -86.85689
## 19835  -86.84079
## 19837  -86.84046
## 19860  -75.26091
## 19892  -75.04624
## 19900  -75.04624
## 19928 -122.00961
## 20031 -110.78131
## 20032 -110.77143
## 20033 -110.83322
## 20034 -110.91220
## 20035 -110.47400
## 20036 -111.11125
## 20061  -82.33825
## 20099  -95.58369
## 20101 -112.09902
## 20161 -118.37648
## 20167  -83.18771
## 20175  -80.48095
## 20182  -97.95745
## 20196 -109.72714
## 20223  -93.20476
## 20247 -112.02017
## 20266  -96.86899
## 20268  -87.01663
## 20272  -96.86899
## 20273  -96.86899
## 20335 -111.76972
## 20413  -87.85104
## 20424 -111.40353
## 20545 -121.98127
## 20590 -111.99288
## 20654 -111.97368
## 20662  -77.21241
## 20695 -111.93110
## 20712 -109.47880
## 20715 -121.73314
## 20719  -80.50763
## 20764 -100.45177
## 20770  -82.13221
## 20774 -111.99990
## 20775  -80.21250
## 20826  -71.45816
## 20887  -88.45093
## 20927  -86.97354
## 21008  -88.96605
## 21027  -88.24151
## 21040 -112.16966
## 21073 -111.76230
## 21095 -117.11236
## 21101  -85.84060
## 21115  -84.27584
## 21117  -85.84060
## 21137 -117.24969
## 21140 -117.24621
## 21143 -124.20919
## 21161 -122.15301
## 21251  -82.43579
## 21283 -122.56371
## 21287  -80.08683
## 21309 -112.57464
## 21325 -112.56908
## 21329 -112.57196
## 21331 -112.57470
## 21374 -120.80019
## 21440  -96.94263
## 21446  -97.11256
## 21451  -97.11256
## 21479  -83.93191
## 21480  -84.39064
## 21490  -86.16501
## 21549 -112.18173
## 21551 -112.13630
## 21554 -113.56732
## 21555 -111.75472
## 21556 -113.56366
## 21563 -112.02225
## 21569 -112.30241
## 21580 -112.22707
## 21585 -110.97633
## 21591 -118.16402
## 21596 -110.88805
## 21602 -110.77625
## 21607 -114.59845
## 21608 -111.88792
## 21610 -111.94477
## 21618 -112.10969
## 21619 -114.60855
## 21633 -115.09948
## 21638 -111.98752
## 21641 -115.22761
## 21646  -87.70087
## 21647  -87.70088
## 21656 -122.26404
## 21680  -81.86312
## 21681  -81.86373
## 21693 -110.76654
## 21698  -83.56891
## 21827  -90.05634
## 21837 -111.63765
## 21849 -111.86893
## 21850 -112.03554
## 21855 -113.61477
## 21859  -93.28155
## 21913 -117.06663
## 21914 -116.85044
## 21916 -117.09229
## 21917 -116.93542
## 21975 -111.82988
## 22012  -88.11672
## 22028 -121.97261
## 22029 -121.42440
## 22033 -121.84856
## 22041 -115.29050
## 22049 -119.08643
## 22088 -109.84498
## 22096 -112.02208
## 22097 -109.54129
## 22101  -94.19874
## 22109  -87.73046
## 22113  -87.64388
## 22114  -85.22713
## 22115  -85.22713
## 22117  -92.96583
## 22125  -80.18991
## 22133  -80.18991
## 22134  -80.18991
## 22135  -80.18991
## 22136  -80.26837
## 22137  -80.18991
## 22138  -80.18991
## 22139  -80.18991
## 22157  -83.13271
## 22168 -113.57753
## 22172 -113.58075
## 22174 -113.52005
## 22175 -113.62154
## 22176  -83.13263
## 22177  -83.13271
## 22178  -83.13277
## 22179  -83.13277
## 22180  -83.13271
## 22199 -111.67178
## 22202 -121.83406
## 22218 -111.87518
## 22386  -81.83791
## 22450  -83.80099
## 22538 -120.62877
## 22554  -85.38110
## 22573 -119.73008
## 22583 -119.73008
## 22596  -89.46142
## 22626  -89.66143
## 22627 -112.05225
## 22646  -77.55511
## 22699  -74.75812
## 22736 -122.24109
## 22752 -112.03023
## 22913  -71.19638
## 22991 -111.85307
## 22992 -111.86098
## 23002  -88.27632
## 23004  -88.27618
## 23059  -82.79155
## 23060  -88.07134
## 23087 -111.87113
## 23115 -111.93104
## 23144  -89.67249
## 23161 -110.40451
## 23162 -110.40450
## 23167 -115.67268
## 23195 -112.74753
## 23204 -106.98826
## 23228  -81.85192
## 23337 -122.27648
## 23364  -86.76937
## 23444  -81.58608
## 23446  -81.48024
## 23447  -81.51744
## 23448  -81.58009
## 23449  -81.55453
## 23450  -81.80749
## 23452  -81.77371
## 23455  -81.65035
## 23456  -81.65035
## 23458  -81.65035
## 23578 -112.33587
## 23579 -112.58977
## 23580 -112.16212
## 23581 -112.12592
## 23582 -112.41544
## 23583 -112.16227
## 23584 -112.13605
## 23656 -111.92905
## 23667 -112.11259
## 23668 -112.11239
## 23669 -112.17405
## 23670 -111.79616
## 23673 -123.02073
## 23737 -119.28086
## 23762 -112.01176
## 23768 -109.89457
## 23773 -111.85359
## 23858 -114.86539
## 23861  -92.97081
## 23872 -111.84094
## 23891  -92.23680
## 23895 -111.89351
## 23932  -88.30768
## 23935  -90.39853
## 23938 -118.14245
## 23939 -121.04738
## 23949 -117.99807
## 23951  -88.10322
## 23952  -93.24702
## 23953  -92.46205
## 23959 -117.77683
## 23964  -81.83650
## 23965  -93.77191
## 23971 -115.76675
## 23972  -74.18541
## 23974  -74.17211
## 23975  -74.21914
## 23979  -93.04051
## 23980  -93.50375
## 23985  -93.79335
## 23988  -92.10043
## 23991  -93.30010
## 24066  -89.65484
## 24073  -87.86361
## 24074 -112.28259
## 24088 -118.08656
## 24093 -112.01365
## 24101  -93.28252
## 24122  -71.60419
## 24128  -88.28147
## 24186  -98.17315
## 24379 -111.85530
## 24396  -88.29653
## 24412 -111.97550
## 24467 -111.91874
## 24500 -111.61811
## 24521 -111.88381
## 24546  -74.15832
## 24564  -91.99541
## 24599  -90.51580
## 24600  -90.51580
## 24634 -117.93763
## 24636 -111.86610
## 24639 -109.98134
## 24642 -111.77764
## 24701 -111.79036
## 24706 -111.66882
## 24756  -81.05448
## 24757  -80.62293
## 24794 -110.13900
## 24819  -76.73594
## 24852 -111.99540
## 24866  -83.15189
## 24871 -111.85472
## 24899 -110.81112
## 24994 -111.79358
## 25047 -120.83944
## 25049 -111.62158
## 25075 -111.56242
## 25090  -92.46205
## 25107  -80.05664
## 25125 -122.10062
## 25126  -86.27644
## 25167 -110.93426
## 25168 -110.97564
## 25191 -111.64921
## 25192 -111.85975
## 25335  -77.13319
## 25364 -111.93491
## 25372  -68.14538
## 25375 -111.80886
## 25389 -111.81298
## 25390 -111.99702
## 25391 -111.81598
## 25392 -111.61827
## 25440  -88.07068
## 25444  -74.93378
## 25445  -88.29203
## 25458 -111.89348
## 25459 -110.93264
## 25465  -88.21165
## 25475 -114.66904
## 25478 -117.38013
## 25482  -80.09370
## 25483  -80.66437
## 25486 -112.11649
## 25487 -111.61522
## 25488 -111.80160
## 25498  -85.64413
## 25520  -90.10219
## 25578  -89.63907
## 25653  -88.03494
## 25693 -111.93746
## 25748 -115.56707
## 25797 -120.48877
## 25808 -117.21514
## 25842  -86.10299
## 25858  -84.93001
## 25867  -82.13236
## 25868  -88.16031
## 25877  -94.94109
## 25917 -119.17173
## 25932  -90.31547
## 25958 -117.14416
## 26038  -89.66705
## 26092 -119.35484
## 26097 -111.97324
## 26112 -111.97859
## 26114  -93.55949
## 26118 -112.09720
## 26166 -122.55355
## 26172  -79.83510
## 26286 -111.84464
## 26289 -111.99927
## 26327  -93.55459
## 26389  -86.21564
## 26433 -111.70620
## 26530  -97.52209
## 26532  -97.52200
## 26590 -111.86169
## 26602 -111.02151
## 26606 -122.28188
## 26632  -94.41176
## 26677  -88.10608
## 26701 -112.07145
## 26702 -112.11128
## 26703 -118.16861
## 26707  -77.34415
## 26728 -119.83301
## 26748 -111.94427
## 26753 -119.10600
## 26761 -111.93913
## 26774  -95.49691
## 26776  -95.48940
## 26777  -95.34797
## 26778  -95.50771
## 26780  -95.50771
## 26797  -86.80875
## 26838 -113.03064
## 26844  -89.66142
## 26851  -92.38829
## 26852  -92.56207
## 26856 -111.86591
## 26860  -76.46466
## 26875 -113.71556
## 26886 -113.71989
## 26888 -120.03397
## 26889 -112.00284
## 26890 -112.06448
## 26892 -111.86903
## 26907 -111.06717
## 26915 -111.58063
## 26916 -111.58647
## 26924  -97.59427
## 26930 -118.44652
## 26947  -85.95840
## 27064  -74.86700
## 27066 -111.58665
## 27069 -111.94238
## 27070 -111.59385
## 27071 -113.65520
## 27073 -120.99404
## 27076  -87.29321
## 27078  -87.26820
## 27082  -87.23241
## 27083  -87.23693
## 27085  -87.22142
## 27086  -87.22142
## 27087  -87.22142
## 27089  -87.09576
## 27098 -117.05517
## 27106 -121.83203
## 27111  -80.24526
## 27115  -81.30900
## 27121 -113.95245
## 27151 -112.00940
## 27157  -74.18531
## 27175  -74.19204
## 27176  -74.18389
## 27188 -106.10848
## 27229 -112.35008
## 27238  -80.18965
## 27266 -112.15318
## 27283  -86.04341
## 27390 -112.11337
## 27478  -87.84002
## 27487  -88.07285
## 27489  -77.48173
## 27524  -88.53744
## 27577 -111.83352
## 27606 -111.56250
## 27607 -111.98190
## 27608 -111.86150
## 27609 -111.75771
## 27610 -111.86459
## 27611 -111.76105
## 27612 -111.85098
## 27613 -111.68380
## 27614 -111.84278
## 27615 -111.93169
## 27616 -111.53850
## 27617 -111.94864
## 27618 -111.92684
## 27619 -111.91803
## 27620 -111.80893
## 27621 -111.61772
## 27622 -112.01525
## 27623 -111.86821
## 27625 -111.84953
## 27627 -111.71040
## 27628 -111.68346
## 27629 -111.76681
## 27630 -111.84277
## 27631 -111.86817
## 27632 -111.69814
## 27633 -111.70135
## 27634 -111.81470
## 27635 -111.92134
## 27636 -111.90750
## 27637 -111.79602
## 27638 -111.81261
## 27639 -111.82553
## 27640 -111.99055
## 27641 -111.77346
## 27642 -111.74908
## 27643 -111.77845
## 27644 -111.86459
## 27645 -111.60569
## 27646 -111.67383
## 27647 -111.87079
## 27648 -111.90546
## 27650 -111.70596
## 27651 -111.61369
## 27652 -111.61389
## 27653 -111.75986
## 27654 -111.76131
## 27656 -111.94133
## 27657 -111.85030
## 27658 -111.72344
## 27671  -75.72020
## 27689  -95.41728
## 27690  -95.41726
## 27691  -87.64889
## 27692  -87.69105
## 27693  -87.55666
## 27697  -95.47794
## 27728 -112.30088
## 27730  -80.23780
## 27737  -80.27394
## 27749  -86.95172
## 27756 -119.13451
## 27804  -82.34174
## 27805  -76.60613
## 27851  -75.51149
## 27896  -93.79151
## 27913 -109.32162
## 27935  -77.28692
## 27937  -77.31381
## 27942  -86.91506
## 27946  -86.90806
## 27977 -111.94022
## 27998 -122.01355
## 28085 -100.40296
## 28086 -100.40296
## 28087 -100.40296
## 28089 -100.40296
## 28090 -100.40296
## 28091 -100.40296
## 28093 -100.40296
## 28095 -100.40296
## 28101 -100.40296
## 28107  -92.86828
## 28120  -89.62595
## 28198  -93.57564
## 28202 -111.42601
## 28204 -100.40296
## 28205  -93.18073
## 28209 -100.71852
## 28211 -100.40296
## 28213  -99.92471
## 28230 -112.06157
## 28248 -112.03689
## 28304  -77.20668
## 28335  -86.83383
## 28336  -86.83383
## 28338  -77.14178
## 28339 -111.92797
## 28340 -118.36563
## 28341  -80.24527
## 28346  -92.47467
## 28348 -120.43471
## 28354  -84.28854
## 28400 -117.90099
## 28432  -90.43696
## 28445 -111.89286
## 28450 -111.88926
## 28454  -90.43703
## 28472 -112.03267
## 28475  -88.09907
## 28508 -111.85561
## 28547  -81.14706
## 28574 -112.05504
## 28579  -82.30760
## 28585  -93.28570
## 28606  -89.63600
## 28628  -87.95162
## 28659  -96.08819
## 28660  -96.06783
## 28661  -96.06783
## 28730 -111.13482
## 28754 -113.05372
## 28781  -87.63202
## 28791 -112.11752
## 28830  -92.01081
## 28842 -112.33654
## 28843 -112.33916
## 28921  -92.71830
## 28922  -93.57402
## 28932  -98.15678
## 28933  -98.15678
## 28989  -82.66016
## 28991  -89.33496
## 28994 -122.40215
## 28995 -122.45990
## 28996 -122.40214
## 29010  -81.24570
## 29013 -111.66878
## 29016 -111.64591
## 29022  -90.74104
## 29026 -109.39438
## 29100  -88.54680
## 29101  -76.99083
## 29105  -92.94379
## 29128  -92.91572
## 29178  -87.68373
## 29195 -111.38481
## 29207  -98.15743
## 29208  -97.63663
## 29216  -81.57114
## 29218  -81.57109
## 29230 -116.87045
## 29251 -122.44763
## 29300 -101.34657
## 29311  -81.46777
## 29318  -92.19195
## 29395 -106.63206
## 29398 -120.32180
## 29406 -111.66715
## 29407 -112.01336
## 29410 -111.92663
## 29411 -111.92656
## 29422 -111.65778
## 29423 -112.01180
## 29428 -111.79380
## 29527  -80.06655
## 29546  -86.64934
## 29569  -79.97997
## 29587  -88.05501
## 29596 -121.66697
## 29652 -123.32746
## 29669  -87.86658
## 29702  -95.80950
## 29757 -112.03524
## 29795 -114.58820
## 29818 -123.26477
## 29871 -121.08116
## 29882 -113.53741
## 29937 -111.64142
## 29939 -111.71828
## 29953 -111.73550
## 29977  -74.19983
## 30024 -111.98126
## 30028 -111.87257
## 30029 -112.03526
## 30031  -88.90070
## 30058 -111.94059
## 30153  -75.07956
## 30256  -82.54280
## 30260  -95.06461
## 30325  -87.86524
## 30333  -84.87617
## 30347 -111.74530
## 30349  -71.40598
## 30489 -112.35726
## 30490 -112.07128
## 30502 -111.66998
## 30505 -111.92305
## 30521  -84.87617
## 30590  -75.55009
## 30609  -88.30441
## 30616  -80.22539
## 30721 -111.99725
## 30723 -111.99725
## 30781  -75.10810
## 30783 -111.67927
## 30784 -111.75472
## 30787 -112.09099
## 30788 -111.82031
## 30849  -88.07445
## 30870 -112.09149
## 30872 -122.03464
## 30875  -88.07443
## 30876  -88.07178
## 30886 -112.02854
## 30900 -122.63512
## 30920  -76.96361
## 30928 -119.79789
## 30929 -119.79074
## 30933 -119.76460
## 30957 -112.07048
## 31043 -112.01607
## 31107 -119.10870
## 31115  -84.22350
## 31168 -119.76395
## 31197  -91.92249
## 31223 -110.91013
## 31250  -88.31137
## 31252  -97.14236
## 31298 -117.93233
## 31299 -117.93233
## 31314  -86.02095
## 31327  -84.57754
## 31328  -84.57754
## 31357  -83.79167
## 31388  -90.44017
## 31390  -90.44227
## 31395  -90.44120
## 31463  -95.20279
## 31464  -94.98024
## 31465  -95.10572
## 31467  -94.80574
## 31559  -74.67692
## 31645 -124.06150
## 31699 -112.16319
## 31709  -81.62993
## 31733  -74.17963
## 31740 -113.95245
## 31751 -114.03568
## 31829 -117.49933
## 31831  -77.59080
## 31845 -117.38389
## 31850 -111.99710
## 31852  -93.70724
## 31883 -113.05751
## 31888  -88.06040
## 31910 -122.26319
## 31941  -88.14094
## 31942  -88.13575
## 31957 -122.52407
## 31968 -112.05235
## 31973  -80.73657
## 31989 -111.83165
## 32006  -81.16654
## 32010  -77.32663
## 32014 -121.38915
## 32036  -77.37680
## 32054 -112.06614
## 32060  -86.95078
## 32081  -85.89407
## 32082 -111.71156
## 32142  -88.59618
## 32176 -112.02078
## 32179  -88.20898
## 32273  -74.21647
## 32297 -110.07738
## 32298 -113.52171
## 32349 -111.96883
## 32366  -73.76409
## 32474  -89.53811
## 32573 -109.10982
## 32574 -109.96205
## 32576 -109.71104
## 32577 -109.82685
## 32578 -109.72650
## 32579 -109.75393
## 32580 -109.32031
## 32581 -110.10960
## 32639  -82.82120
## 32640  -82.82120
## 32641  -82.82120
## 32642  -82.82019
## 32651  -80.70368
## 32710 -121.56173
## 32733 -118.33150
## 32738 -112.08345
## 32753 -119.64129
## 32768 -111.21465
## 32779  -80.67995
## 32784  -81.10326
## 32785  -81.10326
## 32786  -81.10344
## 32787  -81.44148
## 32805  -93.04032
## 32822 -121.98561
## 32879  -87.84155
## 32984 -111.93076
## 33021 -122.20961
## 33083 -112.14075
## 33104 -108.88597
## 33122  -87.86425
## 33198 -122.16263
## 33228  -88.34274
## 33263 -118.42102
## 33281 -120.28228
## 33292 -112.01479
## 33293 -122.08810
## 33317 -122.07019
## 33337 -119.24577
## 33343 -121.21429
## 33344 -121.19545
## 33360 -111.63816
## 33388  -88.04484
## 33416 -112.00723
## 33473  -88.16157
## 33496  -91.75384
## 33499  -75.81848
## 33536 -118.85414
## 33562 -111.89908
## 33591  -76.29055
## 33592  -78.45755
## 33614  -79.52509
## 33620 -114.66908
## 33666 -117.58383
## 33701  -90.42095
## 33758 -111.95698
## 33804 -109.54537
## 33805 -109.54786
## 33829 -108.53252
## 33945 -111.97786
## 33950 -111.94485
## 33956 -111.87637
## 33971 -111.88477
## 33973 -111.88973
## 33976 -111.80759
## 33979 -111.88934
## 33994  -85.60779
## 34050 -111.90903
## 34077 -112.45840
## 34078 -112.46466
## 34079 -112.46794
## 34124 -121.07715
## 34145 -122.78541
## 34152 -121.70111
## 34183  -88.77328
## 34190  -88.04448
## 34193  -88.05292
## 34197  -81.14715
## 34227 -110.99601
## 34235 -112.13711
## 34236 -111.73688
## 34237 -111.85723
## 34238 -111.88974
## 34239 -112.23836
## 34240 -111.79031
## 34241 -112.01395
## 34242 -111.91814
## 34243 -112.36303
## 34244 -112.37464
## 34245 -111.96199
## 34246 -111.73591
## 34247 -111.84324
## 34248 -111.89087
## 34249 -112.23836
## 34250 -111.79031
## 34251 -112.09543
## 34252 -112.03186
## 34253 -111.88180
## 34254 -112.05163
## 34255 -112.37464
## 34256 -111.96150
## 34302 -121.01139
## 34303 -121.07843
## 34323  -86.87184
## 34329  -76.41160
## 34331 -116.85315
## 34336  -89.58054
## 34341  -87.72126
## 34359 -111.95999
## 34365  -87.86829
## 34369 -111.82877
## 34436 -123.86714
## 34439  -74.26007
## 34445 -110.17258
## 34525  -80.47068
## 34559  -78.41578
## 34560  -87.90043
## 34583  -87.16545
## 34719 -111.82182
## 34743 -111.97964
## 34752  -87.83524
## 34754  -88.38624
## 34797 -111.79726
## 34855  -90.05845
## 34870  -74.51061
## 34968 -113.88351
## 34969 -113.88351
## 34971 -117.21672
## 35001 -111.73764
## 35040 -121.35272
## 35065  -93.06920
## 35069 -104.70299
## 35075 -120.57634
## 35076 -111.92657
## 35077 -117.24999
## 35096 -118.10867
## 35134  -82.71709
## 35143  -85.29133
## 35152  -80.08707
## 35167 -111.81687
## 35168 -111.81132
## 35169 -111.82044
## 35252 -111.91956
## 35261  -87.69093
## 35271 -111.96495
## 35289  -87.86410
## 35294  -95.12572
## 35338  -83.40032
## 35339 -110.95145
## 35428  -81.62285
## 35457 -101.71285
## 35479  -87.60755
## 35494  -78.92730
## 35595 -122.00912
## 35694  -82.93525
## 35695  -82.93525
## 35696  -82.93525
## 35697  -82.95786
## 35875 -110.71523
## 35962 -121.99063
## 35972 -112.21461
## 35973 -111.56236
## 36024  -81.81398
## 36025  -81.81415
## 36026  -81.81419
## 36038  -94.31801
## 36065  -93.83693
## 36116  -74.58697
## 36316 -117.90909
## 36382  -95.41728
## 36383  -95.51466
## 36384  -95.53344
## 36385  -95.41728
## 36402 -112.17737
## 36449  -80.35547
## 36458  -86.12236
## 36510  -74.28557
## 36557 -121.59957
## 36571 -111.96565
## 36588 -118.49257
## 36661 -111.93426
## 36680  -89.64152
## 36691 -121.88268
## 36692 -114.61758
## 36693 -112.37941
## 36694 -114.75284
## 36696 -121.13609
## 36699 -111.93406
## 36752  -81.48945
## 36807 -122.38920
## 36808 -114.28646
## 36809 -114.33150
## 36821 -111.65856
## 36893 -111.93205
## 36894 -111.94983
## 36966 -111.87311
## 36988 -112.01390
## 37076  -89.61517
## 37138  -77.11109
## 37158 -111.88973
## 37197 -112.08324
## 37227 -111.93293
## 37243  -77.41340
## 37265 -111.42466
## 37373 -109.55530
## 37421 -110.85883
## 37447 -116.89763
## 37458  -96.07325
## 37522  -81.43790
## 37523  -81.43790
## 37542  -77.51118
## 37575  -85.25238
## 37581 -109.71104
## 37638  -75.10631
## 37668  -88.28041
## 37731  -80.24463
## 37751 -111.83210
## 37754 -112.14990
## 37759 -111.65848
## 37790 -112.18208
## 37795 -112.32716
## 37841 -117.05385
## 37866  -94.46020
## 37869 -111.98014
## 37871 -111.99164
## 37872 -113.58758
## 37877 -111.85572
## 37892  -88.61948
## 37932 -110.73479
## 37933 -118.39671
## 37934 -118.39092
## 37940  -82.37775
## 37941  -82.45113
## 37947  -82.38171
## 37950  -82.37774
## 37951  -82.37811
## 37952  -82.37770
## 37981 -112.03141
## 37982 -112.03512
## 38055  -80.27699
## 38057  -80.30743
## 38127  -87.86871
## 38149  -98.23897
## 38151  -98.31049
## 38153  -98.23899
## 38154  -98.23907
## 38160  -98.25947
## 38169 -111.99304
## 38212 -119.78147
## 38214 -115.58660
## 38238  -95.18561
## 38251  -94.98954
## 38340  -87.34511
## 38349 -116.98279
## 38427 -110.95212
## 38433 -111.84362
## 38453 -111.95758
## 38522 -111.84024
## 38526 -112.39578
## 38541 -111.80327
## 38560 -121.43507
## 38561  -81.41887
## 38562  -81.41887
## 38596  -82.15461
## 38607  -81.41887
## 38608  -81.42042
## 38609  -81.41887
## 38622 -111.91431
## 38626  -95.36018
## 38627  -95.18561
## 38628  -95.01422
## 38629  -95.18561
## 38631  -95.18561
## 38632  -95.18561
## 38688  -97.12903
## 38690  -97.31927
## 38711 -112.00540
## 38736  -92.67755
## 38787 -111.86857
## 38799 -111.88523
## 38809 -111.68036
## 38810 -111.79904
## 38815 -111.95067
## 38895  -82.45214
## 38916 -111.96951
## 38933 -122.42447
## 38962 -111.82294
## 38970 -112.03315
## 39085 -111.94026
## 39089  -80.28077
## 39124 -111.56555
## 39138  -74.02815
## 39173 -116.86479
## 39213 -111.86053
## 39289  -90.85542
## 39457  -85.67188
## 39458  -85.67201
## 39459  -85.67188
## 39466 -112.04433
## 39480 -112.04420
## 39511  -76.60613
## 39525  -93.10801
## 39526  -98.42006
## 39534  -86.80875
## 39535  -86.80875
## 39536  -80.37122
## 39585 -122.04849
## 39592 -121.62659
## 39600  -87.69230
## 39636 -121.61155
## 39638 -124.12346
## 39672 -112.12148
## 39677  -73.11750
## 39739  -85.15158
## 39743  -84.58054
## 39772  -85.38899
## 39775 -112.22420
## 39777 -112.18007
## 39778  -71.50807
## 39780 -117.17983
## 39781  -87.66815
## 39795 -110.15592
## 39874 -118.33390
## 39915 -111.94428
## 39933 -121.32937
## 39959  -86.97601
## 39961 -111.97812
## 39962 -111.97888
## 39976 -111.92783
## 39978 -113.48997
## 39979 -111.91069
## 39980  -87.68278
## 40009 -111.89030
## 40025  -86.07940
## 40044 -111.96634
## 40065  -87.23489
## 40068  -81.84703
## 40070  -82.30064
## 40071  -84.33847
## 40073  -82.56248
## 40074  -81.36291
## 40075  -80.17271
## 40077  -81.75859
## 40078  -82.74413
## 40079  -96.74644
## 40081  -81.36136
## 40138  -88.99554
## 40145  -85.39290
## 40146  -85.40093
## 40243  -94.05007
## 40253 -111.81571
## 40255  -92.63609
## 40354  -87.74564
## 40383  -74.05735
## 40402  -82.64372
## 40421  -74.04700
## 40449  -88.12696
## 40520 -111.92223
## 40521 -111.92225
## 40522 -112.06435
## 40534 -117.72286
## 40537 -124.14944
## 40561 -121.31716
## 40592 -112.02633
## 40595 -112.03760
## 40598 -112.01854
## 40657 -110.96352
## 40730 -113.29574
## 40732 -113.29945
## 40733 -113.29411
## 40735 -113.29470
## 40762  -94.39094
## 40763  -94.39294
## 40789 -123.44897
## 40808  -87.85041
## 40832 -119.75082
## 40851 -113.98599
## 40918 -115.79798
## 41002  -81.24411
## 41005  -93.04690
## 41020  -87.68585
## 41021  -87.68585
## 41034 -118.19598
## 41035 -118.12602
## 41036 -118.19598
## 41038  -89.63464
## 41053  -88.35471
## 41054  -88.31064
## 41097 -112.33831
## 41098 -112.33831
## 41099 -112.11599
## 41100 -112.10039
## 41101 -112.10016
## 41109 -111.53742
## 41110 -112.13480
## 41111 -112.13477
## 41112 -112.20483
## 41113 -112.20557
## 41114 -111.62234
## 41115 -111.62264
## 41123 -111.53856
## 41124 -111.56672
## 41125 -112.39659
## 41126 -112.37796
## 41139 -111.56619
## 41140 -112.39659
## 41141 -111.91356
## 41142 -111.78899
## 41143 -111.78898
## 41146  -80.29416
## 41186 -115.55892
## 41198 -112.40877
## 41241 -111.68718
## 41257 -115.72686
## 41277  -77.43741
## 41301  -88.87456
## 41307  -88.87607
## 41310  -88.77062
## 41316 -120.57753
## 41331 -118.74935
## 41342 -111.88258
## 41344 -111.81687
## 41395  -80.40487
## 41402 -121.90744
## 41486 -122.17719
## 41488 -121.97767
## 41542 -117.03582
## 41545  -80.06516
## 41574 -111.88721
## 41577 -111.88713
## 41599  -97.36985
## 41600  -97.36985
## 41607 -118.19670
## 41608 -119.40381
## 41609 -116.85097
## 41611 -121.83736
## 41612 -119.75034
## 41616  -95.50691
## 41626  -80.37287
## 41629 -111.82143
## 41633  -72.07765
## 41637 -111.93010
## 41640 -111.84099
## 41641 -112.13202
## 41642 -112.05059
## 41643 -112.17044
## 41644  -93.78243
## 41652  -77.22911
## 41685 -112.06452
## 41686 -111.92226
## 41704 -117.81958
## 41716 -121.82705
## 41719  -80.23641
## 41720  -80.23651
## 41725  -80.23638
## 41735  -87.74100
## 41753 -118.43418
## 41792 -121.55316
## 41847 -113.07169
## 41854 -113.13279
## 41907  -89.93281
## 42016  -93.51071
## 42029  -88.04749
## 42040  -74.58850
## 42054 -114.66432
## 42062  -77.32663
## 42121  -91.15225
## 42142 -111.97487
## 42154  -93.57555
## 42157  -93.57556
## 42173  -81.23086
## 42180 -118.84353
## 42183  -89.89163
## 42252  -98.23458
## 42338 -119.66630
## 42388 -111.54855
## 42409  -92.48478
## 42424  -78.64445
## 42429 -111.40947
## 42448  -87.84746
## 42485 -110.98078
## 42490 -112.00189
## 42495 -114.66885
## 42523  -86.03621
## 42525  -90.79145
## 42526  -85.96396
## 42636  -79.85256
## 42637  -79.90985
## 42644  -80.20956
## 42652  -85.22720
## 42653  -85.22720
## 42654  -85.22713
## 42661  -89.22994
## 42704 -110.77426
## 42705 -109.71847
## 42706 -109.29706
## 42707 -112.07704
## 42708 -110.92795
## 42803 -111.87598
## 42845  -81.76000
## 42911 -111.91063
## 42913 -111.95962
## 42961  -77.97891
## 42992  -82.66812
## 43046 -118.96352
## 43053  -89.68472
## 43163 -117.03528
## 43164 -116.53349
## 43165 -111.71508
## 43181 -111.84461
## 43220 -111.95824
## 43239  -94.09342
## 43244  -94.04203
## 43245  -94.04203
## 43248  -83.87313
## 43249  -91.07744
## 43250  -86.99157
## 43251  -86.76233
## 43253  -83.87313
## 43302  -89.47478
## 43366 -121.07815
## 43500  -89.63398
## 43509 -112.16652
## 43531  -83.87354
## 43532  -83.87354
## 43533  -83.87360
## 43564  -86.72960
## 43637 -111.56687
## 43638 -111.56818
## 43667  -90.32909
## 43668  -90.32859
## 43673  -90.32392
## 43674  -90.34016
## 43786  -97.80255
## 43794 -118.43334
## 43800 -112.02051
## 43833  -95.47834
## 43839  -98.47277
## 43840  -95.26295
## 43841  -95.01479
## 43843  -98.15683
## 43858  -83.61568
## 43909 -111.96592
## 43914 -121.19908
## 43941 -121.26632
## 43942 -121.06970
## 43943 -121.26910
## 43945 -116.30070
## 44002  -88.73619
## 44016 -111.93463
## 44041  -80.62069
## 44043  -82.41818
## 44151 -112.00430
## 44166 -117.99743
## 44189  -88.29994
## 44227 -111.73924
## 44236 -122.35500
## 44246  -80.11637
## 44271  -77.59927
## 44319  -80.75346
## 44347 -121.01673
## 44393  -81.28416
## 44425  -87.83815
## 44435  -88.00642
## 44557  -97.34445
## 44649 -117.21151
## 44763 -111.94496
## 44764 -111.97504
## 44766 -111.88435
## 44768  -93.64322
## 44778 -111.88781
## 44781 -112.00636
## 44786 -111.95667
## 44791 -111.86152
## 44829  -77.46756
## 44955  -98.54723
## 44961 -117.72079
## 44993 -111.82314
## 44994 -111.82547
## 44995 -116.37980
## 45101 -116.59486
## 45145 -123.49626
## 45174 -120.51301
## 45183  -80.10498
## 45188 -117.41700
## 45207 -118.75497
## 45226  -88.18369
## 45241  -74.72171
## 45243  -96.86899
## 45244  -95.41728
## 45245  -97.38750
## 45247  -97.09927
## 45249  -86.24900
## 45252  -94.45229
## 45255  -74.72171
## 45256  -74.72197
## 45259  -85.99393
## 45260  -99.48172
## 45266  -88.30700
## 45314 -111.93016
## 45316 -121.99078
## 45322 -111.84284
## 45323 -111.77158
## 45324 -112.13791
## 45325 -112.07170
## 45326 -112.03710
## 45327 -112.06370
## 45328 -111.76896
## 45351  -93.67086
## 45383 -112.52795
## 45384 -112.53022
## 45385 -112.52970
## 45389  -95.35419
## 45393 -112.52542
## 45401 -112.06233
## 45449 -111.72290
## 45467 -123.34202
## 45549 -111.96003
## 45550 -117.12664
## 45558 -111.98857
## 45562 -111.93597
## 45563 -111.93562
## 45566 -119.43630
## 45568  -98.15678
## 45591 -112.00433
## 45592 -111.98740
## 45646 -117.04209
## 45706 -112.04935
## 45803 -119.73473
## 45907 -111.94587
## 45918  -79.44248
## 45946  -87.85335
## 46044 -122.55374
## 46105 -118.17223
## 46107 -118.96683
## 46166  -89.90873
## 46187  -81.74419
## 46203  -80.43523
## 46226 -112.06055
## 46233 -112.07022
## 46234 -110.91424
## 46289  -97.67527
## 46375 -117.98989
## 46430 -111.95356
## 46455 -114.02821
## 46456 -114.02526
## 46457 -114.02564
## 46458 -114.02735
## 46468 -119.45367
## 46471 -119.66567
## 46472 -119.65389
## 46473 -119.63070
## 46475  -76.30185
## 46476  -89.10537
## 46492 -109.99846
## 46500 -119.64967
## 46501 -119.64965
## 46641  -87.74689
## 46672  -87.64112
## 46673  -87.72178
## 46752  -87.72678
## 46925  -98.11195
## 46926  -95.53325
## 46956 -123.94439
## 46970 -120.67286
## 46978 -117.12070
## 47007 -111.90524
## 47096 -122.60772
## 47101 -111.87998
## 47254 -101.87379
## 47256  -88.30120
## 47270  -96.75519
## 47303 -118.17001
## 47324 -118.20580
## 47326 -118.17913
## 47344 -117.24156
## 47427 -117.20337
## 47433 -110.85513
## 47434 -110.81879
## 47435 -110.97889
## 47459 -117.89855
## 47466 -109.25218
## 47477 -112.46234
## 47478 -117.69112
## 47498 -123.30576
## 47515  -81.39905
## 47568  -89.21687
## 47580  -88.16844
## 47581  -87.95510
## 47583  -90.41924
## 47603  -86.31364
## 47659  -83.16954
## 47660  -83.16954
## 47661  -83.16954
## 47662  -83.16954
## 47682 -122.71578
## 47693 -121.60498
## 47730  -87.85667
## 47732  -87.84441
## 47761  -87.98619
## 47770  -81.73292
## 47775 -122.91478
## 47820  -87.84027
## 47924  -95.01394
## 47937 -110.70833
## 47938 -110.70825
## 47959 -112.06903
## 48017 -112.01819
## 48020  -81.68845
## 48021  -81.68845
## 48022  -81.68845
## 48034  -80.06582
## 48096 -111.70292
## 48136 -116.94055
## 48187 -112.08227
## 48189  -99.36588
## 48192  -89.62671
## 48195 -111.92830
## 48200  -87.23328
## 48275  -95.04812
## 48277 -111.71066
## 48279 -112.02962
## 48315  -88.24539
## 48389  -88.10969
## 48400  -98.11769
## 48509  -82.48128
## 48515 -116.93171
## 48534 -111.65626
## 48594  -77.12672
## 48634  -89.63966
## 48661  -80.06366
## 48677 -109.79875
## 48737 -111.63404
## 48748 -122.41283
## 48779 -110.97044
## 48786  -88.82579
## 48802 -122.10651
## 48813 -120.58094
## 48835  -80.37897
## 48863 -118.35625
## 48945 -117.18410
## 48956 -124.08373
## 48987 -113.66196
## 49000 -113.27085
## 49040  -87.29674
## 49052  -89.65433
## 49123 -111.95925
## 49124 -111.97290
## 49126 -123.48921
## 49177 -111.99405
## 49179 -111.96699
## 49180 -111.94969
## 49192 -111.61339
## 49193 -111.80540
## 49194 -111.80546
## 49195 -112.01533
## 49196 -111.61825
## 49197 -111.77563
## 49232  -87.85383
## 49240  -87.84367
## 49247 -114.86751
## 49255 -121.76439
## 49256 -111.80477
## 49257 -111.70613
## 49258 -111.70333
## 49259 -111.70584
## 49262 -112.05686
## 49263 -116.95786
## 49269 -119.83261
## 49353  -83.08642
## 49355 -103.22477
## 49429  -81.85367
## 49430  -81.85348
## 49480  -90.19130
## 49511 -112.02720
## 49519 -111.94729
## 49523 -111.79721
## 49524 -113.57745
## 49526 -111.70252
## 49527 -112.15275
## 49529 -112.32464
## 49530 -111.73242
## 49531 -111.78835
## 49533 -112.20180
## 49534 -112.00606
## 49535 -111.82523
## 49536 -111.04130
## 49537 -112.22780
## 49538 -111.57421
## 49539 -112.37239
## 49540  -87.73375
## 49557 -111.84052
## 49558 -111.83709
## 49559 -111.85107
## 49591 -117.72248
## 49618 -111.09687
## 49620 -110.99588
## 49621 -110.28791
## 49623 -111.09687
## 49645 -119.82331
## 49646 -119.82236
## 49682 -118.35179
## 49726  -84.27920
## 49742  -84.27920
## 49743  -84.27920
## 49890  -82.63479
## 49892  -82.63478
## 49893  -82.63477
## 49894  -82.63477
## 49895  -82.63477
## 49982 -122.71600
## 50014 -111.85194
## 50039 -121.99027
## 50092  -72.59313
## 50097  -94.44777
## 50099 -111.68669
## 50223 -110.77580
## 50289 -111.89576
## 50290 -111.88449
## 50295 -112.15530
## 50296 -109.52726
## 50303  -84.98089
## 50304  -84.98089
## 50305  -84.93938
## 50315  -87.96651
## 50355 -112.13373
## 50366 -118.13750
## 50368 -118.21945
## 50370 -111.03635
## 50400 -110.81691
## 50403  -95.41960
## 50465  -86.96209
## 50478  -71.67395
## 50479  -71.67395
## 50493 -111.76371
## 50495 -114.38895
## 50522 -114.38895
## 50561  -89.45950
## 50830  -89.64010
## 50899 -111.97679
## 50901 -111.85589
## 50911 -111.87909
## 50916 -111.96518
## 50951 -121.33797
## 50952 -122.71072
## 50965  -80.35541
## 50966  -80.21039
## 51003 -122.49896
## 51022  -73.99175
## 51083 -111.71455
## 51093  -89.72337
## 51196  -88.48157
## 51203  -88.48166
## 51222  -94.52325
## 51237 -112.35709
## 51243 -116.95235
## 51284  -87.85261
## 51321 -122.38812
## 51326 -113.53576
## 51358 -122.62711
## 51374  -90.95204
## 51419 -120.72861
## 51459  -88.84237
## 51461 -111.64117
## 51476  -87.70502
## 51502 -101.71285
## 51573 -111.84346
## 51590 -111.83859
## 51594  -89.47007
## 51613  -86.32957
## 51637  -76.58753
## 51686 -111.99783
## 51712 -111.96734
## 51720 -111.77485
## 51722 -111.82639
## 51728  -98.14365
## 51735  -96.84170
## 51736  -96.84418
## 51737  -97.09094
## 51738  -98.11493
## 51739  -96.89918
## 51740  -99.00338
## 51741  -81.57204
## 51765 -118.14927
## 51809  -86.98398
## 51811 -120.66218
## 51910 -111.87548
## 51936 -105.20692
## 51963  -88.92825
## 52033  -81.56402
## 52055 -118.12929
## 52063 -118.25745
## 52069 -120.83902
## 52092 -122.09428
## 52129  -86.47706
## 52139  -97.65902
## 52154  -77.37358
## 52155  -77.54924
## 52204  -86.42164
## 52210 -121.96643
## 52219  -93.09592
## 52222  -92.49781
## 52285  -93.32202
## 52375  -88.36691
## 52420  -91.17314
## 52433 -101.87379
## 52434 -101.87379
## 52462 -116.90760
## 52512 -122.08168
## 52544 -112.34223
## 52568 -111.72875
## 52677  -89.92249
## 52705 -122.00380
## 52711  -79.14736
## 52713  -79.13714
## 52714  -79.18562
## 52752  -88.61926
## 52763  -88.11678
## 52785 -119.24028
## 52794  -87.85486
## 52828  -88.09473
## 52837  -74.58195
## 52847 -111.86738
## 52875  -88.27471
## 52988  -85.71954
## 52998  -83.55262
## 53039  -88.29371
## 53054  -76.30289
## 53072  -83.40970
## 53073  -86.52295
## 53075  -86.52295
## 53176 -112.04974
## 53239  -83.40970
## 53242  -83.40970
## 53243  -83.40970
## 53244  -83.40970
## 53297 -109.57977
## 53314  -77.45363
## 53319 -112.09475
## 53341 -115.42298
## 53392 -122.42809
## 53407  -92.92880
## 53461  -71.52347
## 53472 -113.49790
## 53473 -111.94130
## 53474 -111.98746
## 53589 -111.97313
## 53620  -82.56480
## 53705 -118.38837
## 53730 -109.72580
## 53733 -109.72594
## 53734 -111.74843
## 53846 -111.45919
## 53862 -111.63942
## 53863 -111.63983
## 53922 -123.87038
## 53978 -111.61335
## 53985 -111.60602
## 54026 -111.57575
## 54028 -111.58079
## 54138  -74.67843
## 54154  -88.58756
## 54186  -74.06441
## 54231 -111.97458
## 54252 -112.17887
## 54264  -74.81319
## 54265  -74.81319
## 54288  -84.58000
## 54296 -122.55028
## 54301 -121.80642
## 54336  -97.63663
## 54347  -80.15422
## 54357  -80.29974
## 54405  -82.17451
## 54414  -82.11510
## 54416  -82.19408
## 54426 -119.77843
## 54637  -86.28585
## 54646  -95.78481
## 54683  -77.21176
## 54691  -95.79373
## 54721  -86.28585
## 54743  -96.82906
## 54765  -84.30608
## 54791  -80.24257
## 54907 -122.13146
## 54946 -121.34116
## 54972 -119.10589
## 54976 -122.02926
## 55018  -88.44438
## 55110 -111.91256
## 55121  -88.13843
## 55164  -94.81378
## 55166 -112.98207
## 55187  -82.12098
## 55203  -87.73013
## 55238  -78.64576
## 55239  -78.90210
## 55291  -80.13938
## 55298  -80.20233
## 55299  -80.21121
## 55300  -80.20954
## 55306  -80.20954
## 55307  -80.24497
## 55309  -80.21122
## 55312  -80.24497
## 55314  -80.20954
## 55317  -80.34288
## 55323 -110.97603
## 55331  -89.62137
## 55369  -71.10321
## 55412 -124.28555
## 55413 -124.28555
## 55414 -124.16267
## 55530  -81.78956
## 55677 -111.49290
## 55748  -88.94932
## 55754  -89.64808
## 55901  -92.80340
## 55902  -92.75841
## 55903  -92.49787
## 56099  -93.27529
## 56102 -112.16833
## 56123 -119.62090
## 56133 -122.42343
## 56183 -111.88214
## 56184  -87.23489
## 56213  -89.62982
## 56232 -111.49291
## 56233  -77.02671
## 56243  -82.17610
## 56295 -111.62862
## 56337 -111.85848
## 56358  -74.04438
## 56361 -119.71681
## 56384 -111.88879
## 56419 -111.94671
## 56428 -118.84177
## 56619  -93.33970
## 56678  -98.11939
## 56739  -74.06466
## 56817 -123.16531
## 56838 -117.19852
## 56863  -86.57874
## 56873  -90.76997
## 56880 -120.48800
## 56904  -81.10462
## 56918  -74.79943
## 56931  -90.55465
## 56932  -90.55465
## 56933  -90.55465
## 56982 -111.63591
## 57060 -111.83639
## 57140 -118.02216
## 57141 -118.02216
## 57144 -116.85085
## 57152  -93.16219
## 57160  -84.33613
## 57161  -77.43304
## 57167  -80.41821
## 57171 -112.08299
## 57198 -110.97052
## 57199 -110.93242
## 57226  -80.19692
## 57228  -80.13332
## 57230  -80.24174
## 57231  -80.48286
## 57234  -80.17642
## 57238  -80.33968
## 57252  -80.22503
## 57264  -80.31563
## 57270  -80.23599
## 57276  -80.29444
## 57278  -80.40521
## 57287  -80.36903
## 57288  -80.19044
## 57289  -80.19044
## 57297  -82.28658
## 57298  -82.28984
## 57354  -81.18021
## 57379 -111.99722
## 57385 -112.27833
## 57420  -76.61175
## 57472  -87.66174
## 57478  -74.48941
## 57533  -86.91576
## 57571 -112.05367
## 57595 -112.21670
## 57596 -112.09927
## 57603 -111.88257
## 57604 -111.90307
## 57609 -111.88367
## 57656 -111.46949
## 57665  -95.90823
## 57685  -87.84762
## 57688 -112.48622
## 57689 -113.18409
## 57690 -112.34854
## 57691 -112.45203
## 57692 -112.15663
## 57694 -112.47795
## 57695 -112.87401
## 57696 -117.25399
## 57778 -111.97876
## 57780 -115.09948
## 57788  -87.57232
## 57791 -113.01353
## 57800 -113.01976
## 57848 -111.85865
## 57882 -112.32941
## 57904  -87.99352
## 57907  -88.01277
## 57912 -113.53196
## 57913 -111.87530
## 57925 -121.42433
## 57927 -121.63976
## 57966 -118.83739
## 57984  -94.37473
## 57993 -112.48311
## 58065 -111.82436
## 58141  -87.92483
## 58185  -78.98742
## 58204 -112.92685
## 58205 -112.92677
## 58219  -82.17714
## 58222 -112.49312
## 58355 -119.57087
## 58359 -121.98213
## 58363 -121.36475
## 58371 -111.72487
## 58373 -115.13706
## 58383 -111.80084
## 58393 -121.62480
## 58400 -121.98415
## 58405 -118.55278
## 58420  -90.70095
## 58432 -117.90903
## 58489  -81.31588
## 58492  -90.58599
## 58502  -93.12386
## 58505  -94.11766
## 58506  -92.78708
## 58520 -109.54366
## 58530  -88.17640
## 58536  -92.17138
## 58537  -92.17111
## 58554 -120.87073
## 58555 -120.54473
## 58571 -114.62559
## 58572 -114.54629
## 58573 -114.62563
## 58600 -117.33652
## 58635 -111.85039
## 58658 -122.38821
## 58701  -74.07501
## 58702  -74.07497
## 58707 -119.22860
## 58741  -87.33070
## 58747  -80.65772
## 58800  -81.75083
## 58813 -112.12256
## 58814 -111.99703
## 58817  -77.58214
## 58821  -81.79740
## 58822  -81.79740
## 58823  -81.79740
## 58824  -81.79740
## 58843 -110.81279
## 58848 -122.05619
## 58930 -111.95683
## 58953  -73.21609
## 58954 -121.92969
## 58981 -111.94385
## 58985 -111.63143
## 58987 -112.05116
## 58988 -111.87129
## 58989 -111.05031
## 58991 -111.76965
## 58992 -111.78750
## 58995 -111.80147
## 59000  -87.67536
## 59006 -110.95209
## 59007 -110.95207
## 59016 -109.30481
## 59031  -80.41525
## 59035  -86.28670
## 59038  -95.45359
## 59076  -86.24574
## 59081 -112.00772
## 59091 -109.34732
## 59108 -109.34700
## 59129  -74.25581
## 59158 -110.17775
## 59205  -81.10326
## 59331  -86.84324
## 59335  -86.70502
## 59346 -111.67348
## 59351 -111.67586
## 59355 -111.67328
## 59359 -111.91971
## 59360 -111.67112
## 59416 -111.80733
## 59421 -111.58694
## 59447  -74.52003
## 59472  -74.50128
## 59477 -115.11323
## 59478  -74.50128
## 59482  -89.96640
## 59489  -89.97023
## 59491  -89.96640
## 59534  -87.75944
## 59564  -80.37123
## 59677 -111.95895
## 59716  -95.30173
## 59758 -111.83034
## 59759 -111.75848
## 59770 -111.94766
## 59848 -105.08851
## 59861 -111.83063
## 59864 -123.96256
## 59865 -121.94949
## 59868 -116.49271
## 59870 -111.75441
## 59875 -111.92681
## 59877 -111.92528
## 59881 -119.64128
## 59886 -121.57730
## 59901 -112.46235
## 59917 -111.79069
## 59922 -111.04374
## 59924 -111.66921
## 59928 -112.01646
## 59933 -112.02658
## 59967 -117.58384
## 60008 -111.71111
## 60040 -111.92809
## 60041 -111.93020
## 60043 -112.00636
## 60058 -120.06935
## 60068 -111.98879
## 60081 -111.97037
## 60084  -74.86288
## 60089 -111.77640
## 60098  -87.75574
## 60099  -93.22117
## 60113 -111.48750
## 60118 -121.83439
## 60162  -94.33026
## 60254 -117.66251
## 60255 -121.64968
## 60276 -111.88278
## 60285 -111.67763
## 60289 -111.74734
## 60300 -111.45369
## 60329  -77.78342
## 60346 -111.86115
## 60368 -111.87074
## 60375 -115.41773
## 60464 -112.03441
## 60517 -111.88691
## 60528 -111.88925
## 60558  -87.64360
## 60606  -81.43790
## 60658 -110.05581
## 60662  -88.21573
## 60679 -121.20012
## 60682  -91.88444
## 60683  -92.32984
## 60689  -78.14464
## 60721  -87.66750
## 60755  -70.09880
## 60764 -122.25676
## 60765 -122.25676
## 60768 -122.25672
## 60787 -109.49588
## 60859  -81.62342
## 60860  -81.62346
## 60862  -81.45443
## 60863  -81.45453
## 60864  -81.45444
## 60865  -81.45445
## 60932 -117.07650
## 60938 -117.01275
## 60940 -109.58181
## 60941 -109.53286
## 60942 -110.24567
## 60943 -110.21606
## 60944 -109.38116
## 60945 -109.05576
## 60946 -109.31363
## 60947 -111.22304
## 60948 -109.04872
## 60956 -121.49423
## 60994 -110.77992
## 61018 -112.00249
## 61021 -109.97059
## 61022 -109.96654
## 61023 -110.17014
## 61024 -110.32204
## 61025 -110.58750
## 61027 -111.33151
## 61028 -109.28791
## 61029 -110.04908
## 61030 -110.08275
## 61031 -109.38875
## 61032 -110.68900
## 61051  -78.67739
## 61054  -92.99847
## 61055  -92.97197
## 61065  -87.85525
## 61070  -86.59751
## 61073 -111.61178
## 61077 -111.82698
## 61140 -112.01480
## 61161  -98.45668
## 61222  -88.45980
## 61225 -110.03328
## 61229  -89.79157
## 61270  -88.51229
## 61284 -121.03032
## 61296 -115.12963
## 61298 -115.27771
## 61356  -88.27618
## 61357  -89.91294
## 61359  -89.91049
## 61360  -89.91049
## 61369  -94.42504
## 61376  -72.12196
## 61378  -98.14995
## 61379  -98.12280
## 61380  -98.11810
## 61384  -77.34423
## 61386 -111.96259
## 61438 -101.84119
## 61450  -86.63088
## 61453  -88.31739
## 61455  -77.50748
## 61456  -77.09285
## 61457  -76.33358
## 61459  -88.29376
## 61463  -92.92533
## 61464  -77.44708
## 61563  -77.28885
## 61586  -86.95816
## 61588 -116.88958
## 61591 -111.82116
## 61600  -76.41179
## 61611  -74.39830
## 61612  -74.07413
## 61637  -90.13181
## 61697 -118.35265
## 61699  -90.04929
## 61754  -80.42355
## 61766 -111.91906
## 61767 -111.92238
## 61781  -77.48152
## 61802  -87.76469
## 61803  -87.71917
## 61843 -118.44463
## 61845 -112.06579
## 61866  -88.57873
## 61868  -88.57920
## 61876  -74.19534
## 62013 -111.93235
## 62051  -76.43018
## 62125 -112.07145
## 62139 -111.86670
## 62140 -111.84998
## 62141 -122.70376
## 62144  -88.29460
## 62147  -80.64985
## 62185  -80.29454
## 62192 -116.87588
## 62266  -88.30533
## 62267  -98.47277
## 62269  -98.60163
## 62305  -87.63116
## 62309 -105.95806
## 62310 -105.95718
## 62312 -111.98363
## 62315 -111.69045
## 62316 -111.67534
## 62317 -111.89074
## 62339  -87.72754
## 62340  -87.66128
## 62341  -87.55751
## 62342  -87.60276
## 62343  -87.67842
## 62344  -87.60399
## 62345  -87.70993
## 62346  -87.66448
## 62347  -87.65136
## 62348  -87.77027
## 62349  -87.63545
## 62350  -87.62700
## 62351  -87.66287
## 62352  -87.72973
## 62353  -87.71807
## 62354  -87.64553
## 62355  -87.67562
## 62373  -79.94200
## 62408  -81.72922
## 62409  -81.41887
## 62410 -118.63982
## 62414  -81.69035
## 62415  -81.72821
## 62445  -76.30300
## 62446  -76.30277
## 62450  -76.20795
## 62453  -76.20945
## 62456 -122.50377
## 62523 -119.13570
## 62531 -119.10895
## 62557  -80.85315
## 62574  -87.78373
## 62644 -111.81299
## 62678 -111.63756
## 62679  -92.43200
## 62687  -87.85318
## 62693  -87.17010
## 62731 -122.03750
## 62755 -112.01105
## 62756 -111.99822
## 62788  -98.47277
## 62803  -87.83459
## 62866  -82.57239
## 62978 -122.36277
## 63014 -119.34960
## 63041  -87.70882
## 63042  -87.70140
## 63044 -111.98627
## 63058  -90.94565
## 63094  -80.18428
## 63111  -73.26723
## 63144 -111.96139
## 63145 -111.96586
## 63151 -117.95076
## 63152  -89.94460
## 63169  -80.25532
## 63173 -112.03122
## 63174 -111.81233
## 63175 -112.16590
## 63206 -111.88789
## 63211 -112.15000
## 63239 -111.94589
## 63240 -111.32108
## 63279 -111.44780
## 63280 -111.57117
## 63291 -111.86570
## 63292 -111.86297
## 63344 -111.96141
## 63363 -119.77552
## 63365 -111.94742
## 63379 -111.39419
## 63380 -111.39585
## 63381 -111.39605
## 63382 -111.39127
## 63397  -80.09290
## 63509  -88.32132
## 63511  -88.32132
## 63519  -82.65669
## 63615 -115.76675
## 63616 -103.12370
## 63622 -111.58452
## 63623 -110.09736
## 63672  -92.44845
## 63674  -92.44845
## 63685  -76.74794
## 63686  -76.74794
## 63687  -76.74795
## 63698  -77.28747
## 63703  -77.13556
## 63711  -87.78115
## 63741 -112.31249
## 63749  -92.55439
## 63756 -111.60617
## 63780 -112.47187
## 63802 -111.97044
## 63818 -111.69421
## 63821  -92.46717
## 63822  -89.85806
## 63834 -118.78566
## 63903  -89.96390
## 64038 -111.94037
## 64095 -107.79810
## 64146  -88.44477
## 64246 -110.98827
## 64284 -122.52481
## 64285 -122.57104
## 64321  -97.29182
## 64322  -97.37127
## 64323  -97.56841
## 64327 -121.67908
## 64334 -112.02899
## 64368  -94.87570
## 64381 -106.00406
## 64460 -111.69807
## 64502  -87.91326
## 64599 -111.85525
## 64601 -111.86718
## 64612 -119.45350
## 64629  -88.28586
## 64646 -118.77690
## 64679  -88.27302
## 64684 -111.63276
## 64733 -112.04702
## 64739  -87.86844
## 64753  -89.50031
## 64766 -111.86138
## 64783  -89.39776
## 64796 -122.21300
## 64797 -122.21962
## 64911 -111.78939
## 64913  -98.17396
## 64984 -111.83367
## 65028  -74.22346
## 65030 -117.21470
## 65046  -74.22443
## 65056 -122.13478
## 65063  -74.18459
## 65064  -74.19734
## 65072  -80.51210
## 65075  -74.19736
## 65076 -119.14832
## 65129  -75.08062
## 65134  -81.40395
## 65136  -81.40395
## 65172 -118.16127
## 65175 -111.77968
## 65186 -112.50252
## 65193 -111.93332
## 65194 -111.97228
## 65211  -87.62907
## 65214 -111.94817
## 65219 -111.97657
## 65220 -111.95782
## 65281  -86.57165
## 65282  -86.52225
## 65285  -86.60682
## 65286  -86.57229
## 65287  -86.60724
## 65288  -86.52225
## 65309  -80.83191
## 65310  -80.83191
## 65311  -80.83155
## 65323  -97.37016
## 65324  -97.37016
## 65325  -97.37016
## 65329  -95.95050
## 65330  -95.95050
## 65333  -95.32465
## 65334  -95.32465
## 65335  -96.95230
## 65336  -96.95230
## 65389 -122.52162
## 65404 -111.38935
## 65405 -112.30091
## 65429  -72.10054
## 65430 -117.18910
## 65485 -119.08886
## 65559  -88.28069
## 65575  -88.45878
## 65602  -80.18837
## 65622 -111.82355
## 65623 -111.82896
## 65636 -111.99627
## 65637 -111.99375
## 65638 -112.15222
## 65639 -111.92746
## 65640 -112.26420
## 65641 -111.00221
## 65642 -112.12284
## 65643  -87.68640
## 65644 -109.53258
## 65687 -121.23247
## 65711  -93.55949
## 65712 -111.88659
## 65755  -85.36793
## 65761 -111.87856
## 65768 -111.21659
## 65793 -118.07867
## 65794 -118.07867
## 65795 -117.68547
## 65796 -117.98817
## 65797 -118.56380
## 65799  -85.63431
## 65800  -85.63589
## 65821 -118.09128
## 65822 -117.42953
## 65823 -117.29342
## 65824 -121.32890
## 65825 -117.33673
## 65833 -111.95552
## 65834 -111.99252
## 65835 -111.96965
## 65837 -110.76027
## 65859 -117.94193
## 65861  -74.22953
## 65899 -117.80513
## 65905 -111.97270
## 65919 -112.09691
## 65956 -111.78080
## 65980 -111.67786
## 65981 -111.90642
## 66018  -89.39502
## 66035 -111.68378
## 66036 -111.71175
## 66037 -111.70698
## 66044 -124.05825
## 66049 -122.14698
## 66059 -111.98723
## 66083 -122.21784
## 66089  -93.65219
## 66186 -112.23324
## 66187 -112.23335
## 66188  -81.29286
## 66220  -81.29286
## 66221  -81.29286
## 66222  -81.29286
## 66228  -88.56025
## 66242  -93.39071
## 66267  -88.34326
## 66370 -113.58600
## 66397 -112.30644
## 66455  -89.69556
## 66470 -118.19671
## 66471 -118.19671
## 66496 -116.09732
## 66509  -85.83138
## 66543 -117.70048
## 66544 -117.65838
## 66558  -98.97967
## 66560  -96.94437
## 66569  -92.87551
## 66592  -96.86899
## 66593  -96.86899
## 66594  -96.86899
## 66595  -96.86899
## 66601 -102.73255
## 66602 -102.52938
## 66620  -82.33525
## 66631  -82.31302
## 66632  -77.48173
## 66640  -80.22018
## 66641  -82.67594
## 66643  -82.50975
## 66648  -81.05916
## 66651  -80.14700
## 66653  -81.60190
## 66660 -112.34857
## 66669 -118.26290
## 66681 -123.69268
## 66687 -122.19460
## 66691 -111.94053
## 66698 -118.58772
## 66705 -121.46608
## 66706 -117.31346
## 66747  -78.48604
## 66758 -111.45144
## 66775 -112.08972
## 66794 -112.58316
## 66822 -121.54655
## 66844  -73.99353
## 66852  -80.61802
## 66855  -80.17967
## 66859  -80.10256
## 66871  -80.08538
## 66876 -118.21849
## 66902  -80.10286
## 66908 -112.34861
## 66966  -82.53840
## 66967  -79.77273
## 67008 -117.18580
## 67038 -112.12408
## 67043  -85.66104
## 67056 -112.42871
## 67057 -112.42830
## 67058 -112.43815
## 67063 -120.85952
## 67078 -113.53758
## 67110  -71.12522
## 67116 -111.97578
## 67117 -118.18774
## 67119 -121.59674
## 67121 -112.39556
## 67132 -112.43469
## 67138 -121.58935
## 67151 -111.89248
## 67155 -112.29703
## 67158 -121.37041
## 67230 -111.49704
## 67295 -111.82396
## 67326 -111.64332
## 67339 -113.33030
## 67340 -113.33030
## 67360 -112.32000
## 67361 -111.73123
## 67366  -80.14432
## 67487 -111.87701
## 67488 -112.05396
## 67558 -111.92562
## 67620 -111.54166
## 67621 -111.54151
## 67642 -112.82845
## 67643 -112.83086
## 67681 -121.32921
## 67693 -118.13502
## 67703  -82.20498
## 67709  -82.54923
## 67715 -121.40399
## 67733  -96.86899
## 67743  -74.22749
## 67756 -110.75743
## 67773  -80.24192
## 67774 -111.67732
## 67802 -117.21928
## 67803 -117.21872
## 67806 -122.71027
## 67812 -116.00310
## 67818 -112.06552
## 67822  -87.70542
## 67831  -92.51713
## 67861  -90.17848
## 68022 -112.47956
## 68038 -110.97059
## 68039 -110.96673
## 68053  -88.97766
## 68057  -88.97768
## 68079  -88.32956
## 68080  -88.29109
## 68113 -111.73351
## 68115 -111.73759
## 68118 -112.85954
## 68119 -110.97505
## 68120 -110.77597
## 68121 -111.01614
## 68122 -110.98985
## 68123 -110.81711
## 68124 -111.02716
## 68125 -111.83532
## 68126 -110.97266
## 68127 -110.89914
## 68128 -110.91525
## 68130 -111.00961
## 68131 -110.72156
## 68132 -110.90406
## 68133 -110.76473
## 68134 -110.99648
## 68135 -110.93464
## 68136 -111.02070
## 68137 -111.22081
## 68138 -111.04891
## 68139 -110.84516
## 68140 -110.95686
## 68141 -110.97951
## 68142 -110.89036
## 68143 -111.01861
## 68144 -110.78764
## 68145 -110.97366
## 68146 -110.80809
## 68147 -110.63040
## 68148 -110.82252
## 68149 -111.07109
## 68150 -110.94585
## 68151 -110.75608
## 68152 -110.93895
## 68153 -110.96164
## 68154 -110.89036
## 68155 -110.80905
## 68156 -110.93292
## 68157 -110.94916
## 68158 -110.94086
## 68209 -119.20942
## 68303  -89.36110
## 68304  -89.36140
## 68307  -89.35724
## 68338 -120.64986
## 68449 -112.25432
## 68464  -87.94338
## 68468 -122.42833
## 68474 -106.06075
## 68501 -121.19893
## 68568 -112.33531
## 68579 -112.25000
## 68580  -89.69638
## 68597  -77.26850
## 68598 -102.48542
## 68698  -88.99473
## 68774 -118.47991
## 68782  -88.11651
## 68801  -87.62443
## 68802  -87.65215
## 68803  -87.62827
## 68804  -87.65215
## 68811 -111.84756
## 68839  -87.91872
## 68870  -77.38991
## 68940  -93.28667
## 69031 -111.99105
## 69060 -112.04862
## 69064  -77.49967
## 69066 -122.35469
## 69068 -112.10124
## 69070 -112.08813
## 69071 -112.07393
## 69072 -112.07170
## 69073 -112.05555
## 69096  -94.00019
## 69099  -87.00388
## 69100  -93.42575
## 69117 -121.92404
## 69153  -92.41663
## 69157  -81.49712
## 69161  -78.13269
## 69170  -79.87116
## 69184 -122.23321
## 69186  -78.42224
## 69232  -94.09698
## 69244  -85.97291
## 69289 -114.59440
## 69290 -112.11126
## 69314 -110.93301
## 69324 -111.02760
## 69330 -110.97141
## 69331 -110.97089
## 69332 -110.90921
## 69333 -111.00196
## 69334 -110.97047
## 69394 -111.66666
## 69420 -120.63982
## 69518 -113.52596
## 69519 -113.53786
## 69533  -80.36169
## 69551  -80.44133
## 69552  -80.44133
## 69576  -74.53018
## 69581  -82.70578
## 69583  -82.70497
## 69594  -82.69938
## 69595  -82.69938
## 69596  -82.79155
## 69688 -110.79945
## 69689 -111.85872
## 69690 -110.93199
## 69695 -111.75807
## 69696 -111.97186
## 69698 -111.97182
## 69699 -111.90997
## 69701 -112.20491
## 69766 -121.01124
## 69774 -111.78389
## 69792  -88.22724
## 69794 -112.20280
## 69802 -111.97256
## 69803 -112.01794
## 69957  -79.38908
## 69958 -112.22177
## 69963 -117.20879
## 69964 -121.79228
## 69965 -122.72880
## 69970  -80.20069
## 69971  -80.19101
## 69973  -92.95667
## 69986 -112.08507
## 70053  -88.53297
## 70059  -96.63309
## 70115 -104.71336
## 70143 -111.94784
## 70148 -111.45098
## 70157 -112.08640
## 70173 -111.72486
## 70177 -111.73815
## 70240 -121.06681
## 70286 -117.97522
## 70351  -77.18159
## 70365 -120.94334
## 70366 -120.91147
## 70367 -120.94369
## 70397 -111.93237
## 70469  -76.46455
## 70504 -112.01421
## 70505 -111.73257
## 70524  -81.91087
## 70528  -81.82124
## 70529 -111.94298
## 70535  -81.91121
## 70536  -81.91087
## 70586  -80.14840
## 70658 -111.96702
## 70674 -122.43897
## 70755  -74.12363
## 70769  -80.20748
## 70808  -87.06007
## 70809  -87.06956
## 70851 -120.91147
## 70883 -113.58600
## 70889  -76.99182
## 70895  -80.17178
## 71038  -77.80257
## 71047 -111.75130
## 71048 -110.94491
## 71049 -114.78596
## 71050 -110.25577
## 71051 -114.70480
## 71053 -109.55385
## 71064  -93.99835
## 71161  -88.31421
## 71180  -82.30318
## 71182  -88.62943
## 71226  -93.01627
## 71238  -88.44365
## 71260  -82.79155
## 71263  -77.39873
## 71264  -98.45097
## 71267 -112.21708
## 71271  -85.19975
## 71272  -82.64281
## 71273  -80.34452
## 71278  -93.29729
## 71279  -76.98111
## 71280  -80.20069
## 71281  -93.22775
## 71285 -112.22220
## 71337 -117.33578
## 71338 -116.03604
## 71339 -111.96003
## 71344 -119.02085
## 71345 -117.38045
## 71368 -112.29981
## 71380 -122.46097
## 71384 -110.94687
## 71389  -82.20333
## 71390  -80.38666
## 71468 -121.42497
## 71473 -111.84097
## 71482  -78.40362
## 71491  -77.41908
## 71499  -81.10323
## 71500  -93.59724
## 71507  -93.57948
## 71527  -93.58370
## 71577  -74.01108
## 71586  -86.35557
## 71588  -82.05765
## 71595  -88.26253
## 71598  -75.91047
## 71599  -95.22021
## 71600  -95.75348
## 71602  -78.26174
## 71603  -77.91916
## 71608  -80.24304
## 71609  -92.47181
## 71611  -89.22994
## 71613  -86.68166
## 71614  -74.57063
## 71615  -74.82183
## 71616  -74.79957
## 71617  -74.79987
## 71618  -74.07501
## 71619  -74.93525
## 71627 -112.04061
## 71669 -112.01441
## 71696 -112.00435
## 71700 -111.81691
## 71715 -111.68709
## 71716 -111.66367
## 71717 -111.65957
## 71718 -111.64752
## 71719 -111.64124
## 72527  -80.71705
## 72555  -77.07020
## 72606  -81.92363
## 72618  -81.69448
## 72637  -81.63008
## 72638  -81.63008
## 72639  -81.63008
## 72651 -110.94101
## 72671 -111.81649
## 72684 -119.08361
## 72695  -77.07111
## 72756 -112.09676
## 72762  -77.51768
## 72814  -88.72078
## 72922 -117.20676
## 72923 -117.20679
## 72959  -87.90266
## 72980  -90.36551
## 72981  -90.36772
## 72983  -90.65426
## 72986  -75.11665
## 72991 -119.01324
## 73021 -117.24761
## 73095  -81.94276
## 73146 -118.05042
## 73180 -117.58962
## 73185 -111.98504
## 73220 -112.33154
## 73300  -79.85217
## 73303  -85.48185
## 73304  -85.48183
## 73355  -77.42153
## 73356  -94.44669
## 73395 -122.13336
## 73437 -110.91220
## 73473  -88.01379
## 73489 -121.96731
## 73527 -112.21100
## 73528 -112.15097
## 73537 -122.84989
## 73551  -90.29808
## 73554  -74.24191
## 73573 -111.88437
## 73582 -111.63105
## 73601  -89.50934
## 73603 -111.97790
## 73604  -77.44971
## 73643 -122.25128
## 73656 -111.82946
## 73676 -112.09580
## 73688  -95.01453
## 73712 -113.67354
## 73781 -122.32297
## 73782 -122.39822
## 73790  -89.10771
## 73792  -78.12019
## 73816  -81.86313
## 73846 -111.93970
## 73862 -122.46474
## 73901 -120.13825
## 73908 -111.62894
## 73927  -79.35117
## 73928  -79.94007
## 73931  -88.83221
## 73933  -90.01597
## 73954  -77.12974
## 73955  -77.44352
## 73956  -89.15320
## 73957  -74.08052
## 73958  -79.38893
## 73959  -81.10309
## 73965  -74.65844
## 73968  -82.57048
## 73971  -77.47469
## 73988 -112.11512
## 73989 -112.09194
## 74028 -111.83255
## 74032 -111.92760
## 74068 -122.91030
## 74094  -82.57585
## 74122 -116.88512
## 74159  -82.64281
## 74161  -71.15282
## 74198 -112.07145
## 74199 -121.19989
## 74294 -111.18827
## 74298 -111.32115
## 74300 -111.18827
## 74369  -81.04958
## 74414  -87.72603
## 74432  -95.41858
## 74444 -112.09422
## 74447 -112.08623
## 74462  -96.73103
## 74476 -117.14087
## 74511  -77.43831
## 74515 -122.35525
## 74516 -122.35525
## 74522  -76.73903
## 74529 -120.63938
## 74531  -88.27473
## 74538  -88.31360
## 74552  -77.43178
## 74554  -77.42468
## 74558  -80.35330
## 74562  -77.46999
## 74563  -88.31064
## 74634  -81.65424
## 74659 -111.84053
## 74676 -112.12067
## 74677 -111.82984
## 74680 -111.81000
## 74681  -89.64371
## 74751  -82.68765
## 74784  -88.63176
## 74800 -111.91480
## 74805 -110.96782
## 74809 -117.20706
## 74912 -100.44016
## 74940  -85.09705
## 74993 -121.06024
## 75052  -81.60427
## 75053  -81.58870
## 75078 -111.82178
## 75084 -122.58665
## 75087 -118.83094
## 75109  -82.62092
## 75122 -111.87582
## 75141 -116.94014
## 75194 -112.16707
## 75213  -90.26875
## 75237  -90.26888
## 75241 -112.00746
## 75244  -90.26907
## 75268 -111.90163
## 75272  -93.37997
## 75283  -90.16864
## 75295 -117.38041
## 75400 -111.80708
## 75407 -111.92605
## 75408 -113.51914
## 75421 -112.11594
## 75422 -112.11594
## 75429 -111.95960
## 75439 -111.94449
## 75483 -111.91179
## 75499 -111.66484
## 75500 -111.92280
## 75530  -95.85637
## 75536 -118.83817
## 75545  -81.56096
## 75554  -79.98471
## 75555  -79.85959
## 75563 -117.23477
## 75581  -93.37962
## 75637  -87.84735
## 75694 -111.97417
## 75725 -116.24450
## 75745  -82.29174
## 75922 -121.42038
## 75976 -111.65035
## 76028  -89.22220
## 76076  -84.05509
## 76137 -121.28727
## 76138 -121.22852
## 76139 -121.29861
## 76174 -111.97728
## 76226 -112.08510
## 76227 -111.42634
## 76235 -111.70265
## 76239 -122.40225
## 76257  -94.42819
## 76286  -90.32952
## 76287  -89.89781
## 76288  -87.83214
## 76291  -88.32499
## 76405  -91.75137
## 76435 -111.96187
## 76488  -80.72190
## 76530  -87.90470
## 76670 -109.99632
## 76683  -80.06553
## 76703 -111.86755
## 76704 -111.98054
## 76721 -111.92961
## 76728 -118.25726
## 76771 -111.94287
## 76793 -111.97867
## 76795  -88.32419
## 76820 -111.92262
## 76824 -112.29400
## 76849 -111.82089
## 76996 -122.60671
## 77018 -104.54274
## 77091  -77.37969
## 77094  -87.66459
## 77111 -117.88814
## 77151 -112.03214
## 77156 -112.03160
## 77167 -112.04952
## 77194  -80.21043
## 77218  -90.67429
## 77242 -112.13324
## 77264  -86.24780
## 77417  -82.05651
## 77448  -87.73930
## 77612 -122.13678
## 77625  -94.57192
## 77651 -112.03999
## 77656 -110.93499
## 77683 -121.29842
## 77686 -121.54093
## 77696 -112.01505
## 77698 -112.01499
## 77731 -112.05970
## 77733 -117.20386
## 77738 -111.59900
## 77745 -111.89506
## 77831  -93.37104
## 77833  -98.41349
## 77892 -111.67654
## 77894 -111.67208
## 77903 -111.67669
## 77928 -111.86385
## 77972 -110.86465
## 78005 -111.88599
## 78006 -111.93130
## 78008 -111.92128
## 78009 -111.83337
## 78010 -111.86308
## 78011 -111.83836
## 78066  -81.12746
## 78095  -81.05089
## 78160 -117.72194
## 78168 -121.41156
## 78176 -117.29376
## 78179 -122.28605
## 78183 -122.24760
## 78193 -117.17956
## 78198 -117.30819
## 78202 -117.07684
## 78203 -116.38153
## 78217 -122.40649
## 78228 -116.96471
## 78243 -121.34253
## 78245 -121.23247
## 78255  -81.61014
## 78263  -81.61012
## 78265 -116.64311
## 78272 -109.47712
## 78279 -122.11482
## 78296 -117.16829
## 78306 -122.26290
## 78311 -122.27348
## 78312 -119.18565
## 78313 -122.44510
## 78332 -110.29931
## 78340 -111.14004
## 78346 -117.33240
## 78348 -111.70500
## 78351 -111.59362
## 78399 -112.03235
## 78400  -90.10128
## 78405 -112.02521
## 78408  -89.69126
## 78436  -82.80379
## 78482 -113.53082
## 78492  -88.61513
## 78494  -88.61965
## 78522 -111.88196
## 78570 -123.35587
## 78584 -119.76964
## 78585 -119.76934
## 78586 -120.43374
## 78587 -119.76951
## 78588 -119.76932
## 78591 -119.67916
## 78595 -121.57739
## 78597 -118.99990
## 78601 -113.65229
## 78603 -118.62462
## 78606 -121.77169
## 78609 -122.03854
## 78652  -97.98160
## 78663 -118.47899
## 78670 -121.64901
## 78671 -117.17805
## 78685  -87.04073
## 78686 -112.02835
## 78689  -87.04073
## 78690  -87.09977
## 78699 -120.08296
## 78702  -80.10368
## 78708 -111.79407
## 78744  -74.04051
## 78787  -82.53221
## 78788  -82.53220
## 78797 -111.92052
## 78841  -88.06841
## 78842 -110.96149
## 78908  -81.16565
## 78926 -119.50892
## 78955  -82.40199
## 78956  -80.06439
## 78963 -118.19646
## 79001 -111.68700
## 79055 -112.29461
## 79162  -87.62609
## 79249  -81.75938
## 79257 -117.26514
## 79413  -82.56262
## 79443 -112.07762
## 79478 -111.96120
## 79484  -81.25524
## 79485  -81.25697
## 79544  -81.55683
## 79545  -70.92051
## 79573  -89.67059
## 79582  -81.61486
## 79583  -81.41848
## 79610 -122.82406
## 79634  -80.10746
## 79638  -77.20176
## 79644  -80.23978
## 79645  -80.20825
## 79646  -80.39036
## 79647  -80.22731
## 79672 -111.82000
## 79673 -111.76642
## 79681  -98.13927
## 79689 -111.84188
## 79698 -123.19312
## 79700  -98.45638
## 79722 -118.13679
## 79723 -112.05036
## 79724 -111.73543
## 79770  -81.28414
## 79789  -80.31135
## 79795  -81.28423
## 79817  -90.95709
## 79825  -90.95709
## 79834  -90.95710
## 79850  -93.41292
## 79864 -111.81494
## 79875 -111.81497
## 79887 -112.01020
## 79889 -111.81494
## 79891 -110.12170
## 79892 -110.12137
## 79894 -106.62795
## 79942 -111.79653
## 79945  -88.02612
## 79946 -118.91679
## 79959 -112.32224
## 79974  -93.29778
## 80014 -116.92200
## 80015 -112.09208
## 80073  -87.85133
## 80104 -111.94226
## 80225  -71.16599
## 80241 -111.68715
## 80273 -122.37267
## 80286 -122.38548
## 80443 -111.80266
## 80474 -120.83945
## 80477  -78.98858
## 80479  -79.08499
## 80480  -79.08743
## 80569  -82.48298
## 80570  -81.80118
## 80603 -120.06693
## 80604 -120.06885
## 80605 -120.06628
## 80615 -123.45366
## 80653 -121.81584
## 80752 -110.65637
## 80789 -116.27318
## 80834 -118.25141
## 80835  -82.41766
## 80885 -121.06294
## 80889 -111.62312
## 80891 -120.36912
## 80892 -121.54066
## 80893 -118.95862
## 80900 -120.20911
## 80920 -119.67473
## 80928 -121.11258
## 80929 -119.88022
## 80944 -117.68074
## 80969 -110.26292
## 80990  -81.77338
## 80991  -88.01872
## 81005 -121.86577
## 81039 -112.02351
## 81041 -120.31138
## 81048 -112.02819
## 81067 -111.84421
## 81093 -111.48627
## 81094 -111.48627
## 81149  -74.17234
## 81217 -122.63756
## 81306 -110.86481
## 81307 -120.82185
## 81314 -111.82487
## 81328 -111.88523
## 81346 -111.80091
## 81359 -111.99722
## 81364 -111.84647
## 81376 -112.59220
## 81384 -112.45629
## 81401 -111.62814
## 81411 -122.06198
## 81434 -122.20036
## 81621  -81.61773
## 81653 -113.63520
## 81654 -113.63490
## 81665 -111.95967
## 81669 -111.87770
## 81670 -111.83303
## 81681 -112.70970
## 81702  -95.39576
## 81709  -95.45427
## 81761 -111.49856
## 81771 -121.31852
## 81772 -121.32674
## 81778  -91.66539
## 81817  -80.35222
## 81818  -80.35218
## 81848  -80.20802
## 81854  -81.56147
## 81855  -81.66503
## 81857  -80.47779
## 81882  -80.46736
## 81894  -80.47070
## 81917 -122.79813
## 81918 -122.79835
## 81919 -122.79811
## 81920 -122.79813
## 81938 -111.45782
## 81941 -110.84548
## 81942 -110.86947
## 81943 -111.97720
## 81944 -111.01681
## 81945 -112.25461
## 81978 -111.68087
## 82019  -80.62345
## 82029  -87.69625
## 82053  -79.12031
## 82064  -73.91204
## 82078 -111.86909
## 82096  -91.87368
## 82123 -112.00803
## 82125 -123.69721
## 82138 -122.30544
## 82159 -111.88817
## 82186  -73.41592
## 82297  -86.09046
## 82353 -111.98778
## 82355 -122.33731
## 82372 -123.90716
## 82376 -111.95535
## 82377 -111.93220
## 82381 -111.99705
## 82472 -112.06797
## 82487 -111.96365
## 82497 -111.89907
## 82525 -111.99369
## 82548 -112.07158
## 82549 -112.07170
## 82575 -111.68668
## 82576 -111.18948
## 82581 -112.20435
## 82606 -111.63673
## 82618 -112.13150
## 82619 -112.11503
## 82677 -111.27334
## 82678 -111.27249
## 82679 -111.26932
## 82680 -111.26931
## 82683 -121.54300
## 82694  -80.08443
## 82717 -111.99371
## 82718 -111.93998
## 82742 -111.94768
## 82752  -88.27780
## 82787  -71.60419
## 82788  -87.52815
## 82793  -89.35105
## 82848 -110.99001
## 82877  -76.22510
## 82880 -110.93499
## 82888 -118.32726
## 82928 -123.79716
## 82949 -106.95010
## 82958  -74.63375
## 82967  -89.64927
## 82975 -110.98274
## 82996 -111.95677
## 83016 -111.97435
## 83040  -98.44196
## 83041  -92.10946
## 83045 -110.94240
## 83058 -121.36509
## 83096  -77.77299
## 83107  -89.96779
## 83111  -77.45299
## 83142 -113.06990
## 83179 -113.59004
## 83189  -98.23898
## 83192 -112.15253
## 83199  -80.33919
## 83223 -114.62426
## 83233  -80.77954
## 83254  -81.51127
## 83255  -80.79464
## 83288 -101.24788
## 83297  -86.80354
## 83305 -111.66129
## 83306 -111.64128
## 83313 -111.60911
## 83315  -80.14359
## 83322 -122.01968
## 83337 -119.76856
## 83387 -111.95782
## 83389 -111.88083
## 83393  -93.34883
## 83395  -92.10027
## 83398  -93.10853
## 83408 -122.90214
## 83409 -117.05821
## 83410 -121.98547
## 83411 -121.12775
## 83412 -121.33797
## 83416 -118.25739
## 83417 -122.07015
## 83419  -96.62677
## 83425  -93.52486
## 83430  -94.72387
## 83436 -111.93227
## 83437 -111.75203
## 83446  -93.19433
## 83485 -116.64525
## 83527  -94.55086
## 83549  -80.21515
## 83550  -80.16901
## 83555  -80.21516
## 83562  -77.55659
## 83589 -111.49329
## 83615 -111.82659
## 83617 -111.62602
## 83621 -104.77475
## 83644  -88.23705
## 83675 -119.90324
## 83693 -111.73892
## 83694  -81.98915
## 83695 -111.84243
## 83774 -112.99929
## 83775 -104.62605
## 83781  -89.62059
## 83783 -120.40704
## 83805  -89.66095
## 83816  -89.65439
## 83835  -89.62055
## 83841  -72.54989
## 83867 -111.91267
## 83886 -111.58817
## 83888 -111.59804
## 83912 -111.86231
## 83927 -120.14836
## 83947  -90.05592
## 83957  -94.16880
## 83958  -92.57064
## 83995  -81.33922
## 84024  -88.93247
## 84061  -81.31860
## 84094 -113.50279
## 84100  -90.69775
## 84121  -81.31422
## 84122  -81.33930
## 84128  -81.34588
## 84129  -81.34588
## 84130  -81.34588
## 84132  -90.26471
## 84135  -93.37893
## 84138  -80.40988
## 84141  -80.37117
## 84289  -90.95497
## 84314 -112.30329
## 84315 -112.29643
## 84316 -111.95914
## 84364 -111.29728
## 84381 -111.88218
## 84414  -91.64883
## 84442 -112.00517
## 84521 -114.02324
## 84524 -114.66856
## 84525 -114.66492
## 84526 -114.51068
## 84527 -114.63602
## 84528 -114.76273
## 84529 -114.62310
## 84530 -114.62767
## 84535  -87.36945
## 84591  -79.90509
## 84599  -82.05764
## 84624 -111.83005
## 84679 -112.06662
## 84684 -114.89061
## 84717 -112.29272
## 84791  -89.02326
## 84822 -111.87991
## 84857  -92.80567
## 84910 -122.40884
## 84912 -121.28687
## 84913 -121.28617
## 84940 -122.32069
## 85144  -77.11153
## 85152 -119.05815
## 85280  -94.74254
## 85282  -94.74251
## 85283  -94.75824
## 85289  -86.24021
## 85292  -98.23458
## 85295 -112.23539
## 85296 -111.92507
## 85301  -80.83191
## 85305  -82.11460
## 85353  -88.35076
## 85356  -96.87649
## 85357  -88.27423
## 85362  -85.01634
## 85365  -88.34122
## 85398  -88.26982
## 85399 -112.64198
## 85400 -112.44583
## 85402 -110.86710
## 85403 -114.64375
## 85404 -113.56374
## 85412  -92.71641
## 85413 -113.07200
## 85435 -111.68127
## 85534 -118.46707
## 85589 -111.94269
## 85590 -111.85144
## 85591 -111.91873
## 85606 -111.90973
## 85630 -117.48133
## 85642 -111.73323
## 85660 -117.38275
## 85688 -111.83454
## 85689 -115.09937
## 85692 -117.48133
## 85697 -111.96158
## 85733  -82.06122
## 85738  -82.14727
## 85741  -82.14727
## 85757 -112.13403
## 85768 -111.77043
## 85785  -80.08116
## 85790  -82.49590
## 85791  -82.46336
## 85795 -111.71234
## 85831  -82.50751
## 85969 -118.36469
## 85970 -111.64763
## 85971 -113.53358
## 85973 -111.84766
## 85974 -111.82107
## 86024 -112.02973
## 86049 -112.05480
## 86051 -112.03034
## 86052 -113.61533
## 86065 -111.68614
## 86067  -94.36272
## 86081  -92.10029
## 86096 -111.56463
## 86101  -78.24802
## 86180  -75.61614
## 86205 -121.67808
## 86233  -82.99069
## 86234  -82.99069
## 86235  -82.99069
## 86254  -93.47200
## 86342 -111.99016
## 86438 -117.19884
## 86494 -112.11775
## 86498 -112.08202
## 86499 -112.05517
## 86503 -112.06273
## 86504 -112.06560
## 86506 -112.06378
## 86511 -112.05399
## 86522  -88.04372
## 86533  -83.99219
## 86570 -111.98019
## 86584 -110.70818
## 86585 -110.70818
## 86593  -90.46405
## 86616  -88.11689
## 86640 -119.46038
## 86691  -86.07742
## 86693  -86.19753
## 86781  -87.22253
## 86782 -111.94862
## 86788  -81.25585
## 86827  -97.39052
## 86828  -97.37502
## 86829  -97.39052
## 86831  -97.25445
## 86832  -97.34557
## 86834  -97.30625
## 86835  -97.24821
## 86839  -97.39052
## 86892 -117.41781
## 86893 -117.19898
## 86898 -111.93903
## 86906  -99.74374
## 86917  -80.03324
## 86966 -111.74047
## 86967 -111.87488
## 86970  -83.56991
## 86971  -83.56991
## 86984 -111.93698
## 86985 -111.94439
## 86991  -81.50818
## 87055  -77.08862
## 87058  -76.07451
## 87061  -79.95705
## 87097  -80.46277
## 87099  -82.98443
## 87101  -80.24192
## 87107 -122.24549
## 87125 -114.31727
## 87126 -114.31730
## 87127  -82.91042
## 87148 -117.11255
## 87151 -117.08577
## 87152 -117.08610
## 87158 -111.91878
## 87243 -109.56520
## 87251 -111.97367
## 87284  -84.43349
## 87331  -94.98024
## 87332  -95.56198
## 87341  -95.54021
## 87342  -95.54005
## 87343  -95.54035
## 87346  -97.73911
## 87347  -97.74902
## 87401  -81.42473
## 87407  -76.23628
## 87430  -92.10028
## 87447 -111.82170
## 87456  -81.03970
## 87457 -118.44457
## 87465  -76.64457
## 87487  -85.49425
## 87501  -86.10487
## 87505  -97.69445
## 87511 -111.98383
## 87519  -77.38953
## 87521 -114.06094
## 87523  -77.52143
## 87525 -111.72036
## 87532  -77.38956
## 87535 -116.75537
## 87542 -110.98235
## 87555  -87.29646
## 87570  -80.09104
## 87590  -98.13171
## 87603 -112.57464
## 87604 -112.51806
## 87605 -112.43630
## 87608  -82.33659
## 87611 -112.04851
## 87617 -111.61672
## 87618  -71.29910
## 87623  -81.42085
## 87636  -81.28272
## 87639  -77.69165
## 87640  -76.15950
## 87648 -110.83361
## 87662  -80.23195
## 87663 -111.13879
## 87664  -87.74693
## 87676  -75.91043
## 87749  -86.01005
## 87752  -81.40193
## 87775  -77.46153
## 87828 -121.59116
## 87832 -111.82903
## 87833 -111.86427
## 87880  -88.14684
## 87915 -112.02562
## 87931  -87.85674
## 87963 -111.95901
## 87997 -112.03277
## 88027  -89.04494
## 88044  -88.06073
## 88153 -113.29961
## 88164 -112.03975
## 88171  -88.22947
## 88172 -113.08026
## 88173 -113.08182
## 88191  -88.23500
## 88212 -111.93347
## 88265 -110.82312
## 88266 -111.02480
## 88281  -76.25256
## 88283  -76.19301
## 88314  -81.71875
## 88394 -111.78726
## 88418 -111.71268
## 88419 -111.69147
## 88420 -111.39246
## 88421 -111.66815
## 88423 -111.64626
## 88445 -112.10482
## 88446 -112.11337
## 88449 -119.12047
## 88500  -80.39207
## 88509  -88.08234
## 88586 -112.26939
## 88590 -111.87541
## 88595 -110.97249
## 88640  -95.63070
## 88672 -113.60955
## 88706 -112.32427
## 88707 -112.30803
## 88708 -112.31045
## 88709 -112.34914
## 88753 -121.71585
## 88760 -117.22346
## 88893 -111.50310
## 88894 -111.50311
## 88918  -93.39959
## 88926  -81.84630
## 88928  -77.07935
## 88931  -92.96164
## 88932  -93.79335
## 88957 -111.89087
## 88966  -97.63653
## 88969  -97.75605
## 89013 -111.49038
## 89016  -80.57185
## 89023 -122.33276
## 89025 -111.63369
## 89065  -74.80644
## 89069 -121.33584
## 89105 -118.07946
## 89106 -112.40556
## 89107  -89.41346
## 89108  -89.41372
## 89109  -89.41372
## 89130 -121.65224
## 89153 -121.81279
## 89210 -122.92402
## 89211 -122.92402
## 89212 -122.94789
## 89247  -78.64575
## 89274 -109.70578
## 89353  -85.95199
## 89406 -110.17741
## 89414  -95.35581
## 89417 -113.65937
## 89433  -85.66738
## 89447 -110.99044
## 89448 -110.97232
## 89449 -110.79525
## 89450 -111.02473
## 89451 -110.99941
## 89453 -110.97105
## 89454 -110.99048
## 89480 -119.48539
## 89481 -122.43506
## 89531 -120.39128
## 89533  -88.72687
## 89554  -76.62140
## 89569  -83.64195
## 89601  -80.31037
## 89604  -83.88006
## 89609  -78.12013
## 89636  -87.57901
## 89638  -87.52182
## 89744 -114.47185
## 89769 -117.15688
## 89778 -111.86127
## 89783 -120.99521
## 89788  -87.53104
## 89826 -112.00208
## 89890  -89.68370
## 89900  -80.18633
## 89902  -88.11724
## 89919 -109.56479
## 89920 -109.54689
## 89921 -109.54109
## 89922 -109.86303
## 89923 -111.84596
## 89924 -111.92578
## 89925 -109.52895
## 89950  -74.47026
## 89973 -124.20102
## 90028  -82.33659
## 90050  -82.33856
## 90102 -109.97650
## 90115 -121.03840
## 90117 -121.03751
## 90134 -111.87306
## 90154  -74.37035
## 90167 -124.07606
## 90175  -82.33856
## 90176  -82.33954
## 90177  -82.33856
## 90204  -80.35547
## 90207  -93.10701
## 90221  -80.35533
## 90249 -117.80892
## 90255  -87.60868
## 90256  -87.60820
## 90257  -87.59813
## 90258  -87.59747
## 90281 -118.87682
## 90325  -88.22526
## 90347 -122.40456
## 90348 -121.87394
## 90383 -111.81187
## 90385 -117.54899
## 90386 -119.60926
## 90387 -120.80562
## 90405  -96.99863
## 90414  -96.77651
## 90520 -117.20337
## 90531  -87.61379
## 90532  -87.63444
## 90533  -87.66007
## 90541  -88.20219
## 90569 -111.92511
## 90570 -111.89845
## 90571 -111.71758
## 90572 -111.88224
## 90573 -112.00561
## 90574 -111.78283
## 90575 -113.58600
## 90576 -113.58610
## 90578 -111.88199
## 90615  -77.48260
## 90619 -111.85689
## 90620 -112.00638
## 90621 -112.00636
## 90622 -112.00508
## 90623 -111.83110
## 90627 -111.99855
## 90689 -111.97541
## 90690 -112.04837
## 90694 -117.54899
## 90720 -113.30480
## 90726  -78.98867
## 90748 -112.01652
## 90787 -112.63792
## 90802 -111.89145
## 90807 -111.96666
## 90810 -119.33250
## 90825 -119.28328
## 90831 -121.38136
## 90835 -122.62901
## 90846 -111.89313
## 90855 -119.56029
## 90856 -111.80751
## 90858 -112.63617
## 90879 -121.33774
## 90951 -112.03884
## 90952 -111.86819
## 90953 -111.71947
## 90981 -116.68249
## 91064  -93.95302
## 91146 -111.94418
## 91180 -115.11101
## 91223 -111.85000
## 91266 -119.29136
## 91274 -121.23062
## 91277 -112.01703
## 91293  -88.44439
## 91298 -112.00944
## 91322  -99.92472
## 91345 -109.54244
## 91367  -87.94878
## 91377 -112.43300
## 91425 -119.13735
## 91468  -90.19468
## 91481  -77.96413
## 91528 -112.19416
## 91537 -112.09449
## 91543  -95.47162
## 91544  -95.34264
## 91586 -111.88274
## 91587 -111.91159
## 91607 -112.02105
## 91622 -122.77295
## 91682 -117.92756
## 91709  -74.98801
## 91724 -111.73686
## 91761 -117.11152
## 91781  -76.05963
## 91813  -77.43016
## 91827 -116.53723
## 91841 -110.99032
## 91868 -113.66652
## 91872 -112.15686
## 91873 -112.08183
## 91898 -111.76887
## 91899 -111.92770
## 91923 -119.17914
## 91928 -111.94772
## 91950  -90.19472
## 91975  -81.02565
## 91979  -81.02565
## 91988  -74.89202
## 91998 -112.05562
## 92024  -86.67362
## 92100  -88.29158
## 92120  -88.61773
## 92183  -79.38899
## 92189  -85.84933
## 92217  -93.82697
## 92258 -122.20652
## 92275 -112.03744
## 92365  -84.37541
## 92369  -84.37935
## 92385 -111.65744
## 92422  -87.26229
## 92423  -87.26530
## 92489 -100.30900
## 92490 -100.30769
## 92493  -99.96139
## 92494  -99.92469
## 92495 -100.30769
## 92519 -100.83770
## 92526 -111.94615
## 92547  -95.92582
## 92555 -118.27372
## 92632  -98.11941
## 92693  -87.61228
## 92700 -121.31096
## 92754  -86.10363
## 92763  -86.12543
## 92771  -86.09856
## 92791  -74.29854
## 92792  -74.29827
## 92870 -116.17477
## 92972  -75.02860
## 92974  -74.93525
## 93049  -71.40924
## 93051 -111.41224
## 93052 -111.79721
## 93053 -111.41108
## 93054 -111.93103
## 93055 -112.02224
## 93056 -111.85750
## 93057 -111.64198
## 93058 -111.94353
## 93059 -111.84997
## 93068  -93.50975
## 93116  -81.95189
## 93117  -88.20436
## 93120  -88.18045
## 93154  -87.86202
## 93349  -88.07337
## 93394  -89.62060
## 93416 -113.56365
## 93433 -113.50393
## 93434 -111.89585
## 93438 -111.88935
## 93457 -111.97698
## 93459 -112.46527
## 93466  -85.55284
## 93490 -119.75028
## 93519 -112.96797
## 93520 -112.96806
## 93521 -100.72014
## 93680  -95.93954
## 93685  -88.14731
## 93696  -87.86248
## 93722  -88.73045
## 93746 -114.01036
## 93747 -114.31756
## 93748 -114.59990
## 93749 -114.28848
## 93750 -114.57008
## 93752 -114.06010
## 93757  -81.75347
## 93816  -82.40604
## 93861 -111.55198
## 93873 -111.54529
## 93967 -120.43201
## 93976  -99.33857
## 94003 -111.98536
## 94004 -112.00408
## 94006 -111.96769
## 94007 -111.94438
## 94113 -111.59255
## 94114 -122.42991
## 94142 -111.98956
## 94191  -80.26505
## 94200 -110.73974
## 94227 -114.97020
## 94241  -84.51834
## 94249  -93.26161
## 94257 -111.93939
## 94289 -114.03715
## 94324  -82.31221
## 94349  -87.87205
## 94362  -71.60419
## 94369  -88.35076
## 94396  -80.24881
## 94403 -111.90067
## 94460  -96.72307
## 94467  -90.90084
## 94468  -94.94403
## 94501 -112.08027
## 94534 -113.88879
## 94535 -113.88935
## 94696 -112.07580
## 94701  -93.07748
## 94719 -111.90044
## 94738 -112.02156
## 94742 -122.36734
## 94782 -111.95926
## 94783 -111.94155
## 94784 -111.95284
## 94790 -112.00254
## 94798 -111.97418
## 94800  -87.47354
## 94948  -97.45272
## 94976 -112.14188
## 94997 -112.07964
## 95001 -112.09807
## 95007  -77.07018
## 95064 -112.31082
## 95100  -74.20314
## 95109 -121.02411
## 95116 -122.82527
## 95141  -80.68239
## 95151  -93.42134
## 95176 -112.03565
## 95198  -78.75324
## 95199  -78.75231
## 95200  -78.75044
## 95206 -112.08043
## 95232 -112.34327
## 95233 -112.15888
## 95234 -112.11895
## 95235 -112.14025
## 95236 -112.57548
## 95237 -112.19529
## 95238 -112.23091
## 95240 -112.25729
## 95241 -112.12603
## 95242 -112.17000
## 95243 -112.39932
## 95244 -112.33987
## 95245 -112.42189
## 95246 -112.19344
## 95247 -112.14371
## 95248 -111.95901
## 95249 -112.22115
## 95250 -112.18900
## 95251 -112.30922
## 95252 -112.26503
## 95254 -112.37739
## 95255 -112.13715
## 95256 -112.20430
## 95257 -112.04379
## 95258 -111.99755
## 95259 -112.24045
## 95261 -112.00835
## 95262 -112.25276
## 95263 -112.13828
## 95264 -112.01946
## 95265 -112.45929
## 95266 -112.20630
## 95267 -112.07581
## 95268 -112.24020
## 95269 -112.09670
## 95270 -112.26384
## 95271 -112.87295
## 95272 -112.38634
## 95273 -112.49196
## 95275 -112.10595
## 95276 -112.29297
## 95277 -112.77929
## 95278 -112.44444
## 95279 -112.57486
## 95303 -111.97290
## 95335  -91.13439
## 95343  -71.82183
## 95401 -112.01076
## 95413  -94.22925
## 95417 -107.81740
## 95429  -94.80879
## 95430  -94.80876
## 95442 -112.20023
## 95444 -121.29875
## 95446  -79.02749
## 95486 -111.79032
## 95534 -111.92306
## 95549 -111.96345
## 95550 -112.20257
## 95551 -112.24556
## 95593 -111.69741
## 95670 -111.68846
## 95748 -111.62379
## 95752 -111.94958
## 95806  -88.47535
## 95886  -80.84197
## 95930 -121.43035
## 96039 -110.06622
## 96120 -111.81324
## 96180 -122.03797
## 96209 -109.30481
## 96241 -111.95288
## 96369  -87.85497
## 96399 -118.06512
## 96408 -111.88361
## 96409 -112.03362
## 96426  -98.49574
## 96450  -75.57945
## 96498  -87.28628
## 96502  -89.61484
## 96541 -121.84008
## 96544  -81.64081
## 96572  -82.42167
## 96689 -112.03717
## 96726 -119.09921
## 96834  -80.22910
## 96927 -111.84449
## 96945 -120.36910
## 97010 -117.84752
## 97070  -90.02171
## 97071  -90.02171
## 97072  -90.02171
## 97073  -97.65902
## 97074  -97.65902
## 97075  -88.91759
## 97078  -97.65902
## 97080  -97.41636
## 97084  -97.67827
## 97085  -97.68901
## 97087  -97.65902
## 97091  -97.67094
## 97159 -123.35405
## 97166  -95.05879
## 97181 -111.84850
## 97187 -112.48324
## 97220 -121.27966
## 97244 -112.44849
## 97255 -111.87706
## 97258  -87.73010
## 97267 -111.88457
## 97335  -98.15678
## 97338  -98.15678
## 97339  -98.15678
## 97452 -111.74105
## 97453 -111.82274
## 97541  -71.32224
## 97546  -71.31584
## 97564 -111.92341
## 97614 -111.69682
## 97769 -121.83694
## 97803  -87.39906
## 97824 -111.54321
## 97879  -82.32680
## 97908  -82.56969
## 97909  -82.56828
## 97960  -89.05932
## 98030  -93.28281
## 98031  -91.47683
## 98032  -91.47688
## 98034  -91.47689
## 98051  -81.54792
## 98063  -87.88060
## 98197  -88.06310
## 98206  -87.97045
## 98261  -87.95778
## 98267  -87.97605
## 98288  -87.97108
## 98299 -122.49735
## 98309  -87.98219
## 98310  -87.95371
## 98359  -74.05835
## 98435  -78.99142
## 98437 -111.88988
## 98450 -111.85877
## 98454 -111.89534
## 98455 -111.89924
## 98471  -76.52699
## 98485  -73.14473
## 98506  -88.45419
## 98511  -88.42436
## 98512 -111.85314
## 98617  -87.78895
## 98619  -87.79094
## 98627  -95.61282
## 98628  -95.61286
## 98644  -87.77980
## 98645  -87.80321
## 98693  -93.87287
## 98711  -79.86319
## 98787  -81.51277
## 98807  -81.10075
## 98885  -87.60672
## 98886  -87.69597
## 98887  -87.72680
## 98888  -87.70730
## 98889  -87.76032
## 98890  -87.72476
## 98891  -87.64202
## 98892  -87.62738
## 98893  -87.64515
## 98894  -87.69532
## 98895  -87.62546
## 98897  -87.61571
## 98898  -87.74227
## 98899  -87.57890
## 98901  -87.67410
## 98902  -87.70320
## 98903  -87.74918
## 98904  -87.62711
## 98905  -88.45314
## 98965 -121.76462
## 99046 -121.00000
## 99047 -119.64805
## 99056  -88.01530
## 99070 -112.02653
## 99073  -95.52688
## 99074  -94.99595
## 99085 -114.59559
## 99086  -95.37232
## 99129 -111.87892
## 99148 -110.94254
## 99149  -74.75302
## 99170 -122.28362
## 99174 -121.64583
## 99175 -121.59196
## 99176 -121.60005
## 99181 -117.01926
## 99203 -114.62639
## 99265 -104.85279
## 99294  -82.18238
## 99333  -92.65844
##                                                   Title.I.School.Status
## 3                                  2-Title I targeted assistance school
## 4                                  2-Title I targeted assistance school
## 108                                                                <NA>
## 129                                                                <NA>
## 133                                                                 n/a
## 163                                                                <NA>
## 177                                                                 n/a
## 209                                              6-Not a Title I school
## 210                                              6-Not a Title I school
## 212                                         5-Title I schoolwide school
## 263                                              6-Not a Title I school
## 283                                              6-Not a Title I school
## 397                                         5-Title I schoolwide school
## 398                                         5-Title I schoolwide school
## 399                     4-Title I schoolwide eligible school-No program
## 400                                         5-Title I schoolwide school
## 404                                                                 n/a
## 406                                         5-Title I schoolwide school
## 407                                              6-Not a Title I school
## 413                                                                 n/a
## 421                                              6-Not a Title I school
## 422                                              6-Not a Title I school
## 427                                                                <NA>
## 432                                              6-Not a Title I school
## 446                                              6-Not a Title I school
## 455                                              6-Not a Title I school
## 457                                         5-Title I schoolwide school
## 458                                              6-Not a Title I school
## 496   3-Title I schoolwide eligible-Title I targeted assistance program
## 497                                              6-Not a Title I school
## 499                                                                 n/a
## 506                                                                 n/a
## 508                                         5-Title I schoolwide school
## 516                                              6-Not a Title I school
## 517                                         5-Title I schoolwide school
## 518                                         5-Title I schoolwide school
## 535                                              6-Not a Title I school
## 536                                              6-Not a Title I school
## 537                                              6-Not a Title I school
## 544                                         5-Title I schoolwide school
## 545                                                                 n/a
## 546                                                                 n/a
## 552                                         5-Title I schoolwide school
## 574                                              6-Not a Title I school
## 575                                              6-Not a Title I school
## 579                                                                <NA>
## 584                                2-Title I targeted assistance school
## 591                                         5-Title I schoolwide school
## 637                                                                <NA>
## 661                                                                 n/a
## 680                                         5-Title I schoolwide school
## 681                                         5-Title I schoolwide school
## 688                                                                 n/a
## 717                                                                <NA>
## 803                                              6-Not a Title I school
## 805                                         5-Title I schoolwide school
## 807                                              6-Not a Title I school
## 849                                         5-Title I schoolwide school
## 875                                                                <NA>
## 898                                              6-Not a Title I school
## 899                                                                 n/a
## 915                                                                 n/a
## 919                                                                 n/a
## 924                                              6-Not a Title I school
## 925                                                                 n/a
## 929                                                                 n/a
## 930                                                                 n/a
## 932                                                                 n/a
## 933                                                                 n/a
## 936                                                                 n/a
## 937                                                                 n/a
## 938                                                                 n/a
## 942                                                                 n/a
## 943                                                                 n/a
## 950                                                                 n/a
## 951                                                                 n/a
## 952                                              6-Not a Title I school
## 959                                                                 n/a
## 969                                              6-Not a Title I school
## 1028                                                                n/a
## 1072                                             6-Not a Title I school
## 1105                                        5-Title I schoolwide school
## 1106                                        5-Title I schoolwide school
## 1139           1-Title I targeted assistance eligible school-No program
## 1140                                                                n/a
## 1141                                        5-Title I schoolwide school
## 1144                                             6-Not a Title I school
## 1145                                                                n/a
## 1150                                             6-Not a Title I school
## 1151                                                                n/a
## 1160                                                               <NA>
## 1163                                                                n/a
## 1247                                                               <NA>
## 1252                                                                n/a
## 1290                                        5-Title I schoolwide school
## 1318                                             6-Not a Title I school
## 1335                                                                n/a
## 1336                                                                n/a
## 1337                                                                n/a
## 1338                                                                n/a
## 1345                                        5-Title I schoolwide school
## 1347                                        5-Title I schoolwide school
## 1358                                        5-Title I schoolwide school
## 1431                                             6-Not a Title I school
## 1470                                        5-Title I schoolwide school
## 1506                                        5-Title I schoolwide school
## 1557                                                                n/a
## 1633                                             6-Not a Title I school
## 1656                                        5-Title I schoolwide school
## 1660                                                               <NA>
## 1661                                                               <NA>
## 1692                                             6-Not a Title I school
## 1693                                             6-Not a Title I school
## 1738                                                                n/a
## 1766                                                                n/a
## 1837                                                                n/a
## 1844           1-Title I targeted assistance eligible school-No program
## 1853                                                               <NA>
## 1857                                                                n/a
## 1877                                                                n/a
## 1902                                             6-Not a Title I school
## 1906                                                                n/a
## 1907                                                                n/a
## 1921                                             6-Not a Title I school
## 1922                                             6-Not a Title I school
## 1932                                                                n/a
## 1940                                             6-Not a Title I school
## 1952                                             6-Not a Title I school
## 1971                                        5-Title I schoolwide school
## 1972                                                               <NA>
## 1974                                                               <NA>
## 1987                                             6-Not a Title I school
## 1989                               2-Title I targeted assistance school
## 1992                                             6-Not a Title I school
## 2008                                                                n/a
## 2014                                        5-Title I schoolwide school
## 2016                                                                n/a
## 2017                                                                n/a
## 2020                                                                n/a
## 2027                    4-Title I schoolwide eligible school-No program
## 2034                                                                n/a
## 2036                                                                n/a
## 2038                                                                n/a
## 2054                                             6-Not a Title I school
## 2057                                             6-Not a Title I school
## 2060                                                                n/a
## 2061                                                                n/a
## 2067                                                               <NA>
## 2160                                             6-Not a Title I school
## 2162                                                                n/a
## 2163                                                               <NA>
## 2194                                                               <NA>
## 2195                                                                n/a
## 2210                                                               <NA>
## 2212                                                               <NA>
## 2213                                                               <NA>
## 2219                               2-Title I targeted assistance school
## 2230                                        5-Title I schoolwide school
## 2236                                                                n/a
## 2242                                             6-Not a Title I school
## 2251                                             6-Not a Title I school
## 2252                                             6-Not a Title I school
## 2253                                        5-Title I schoolwide school
## 2254                                        5-Title I schoolwide school
## 2266                               2-Title I targeted assistance school
## 2268                               2-Title I targeted assistance school
## 2269           1-Title I targeted assistance eligible school-No program
## 2270           1-Title I targeted assistance eligible school-No program
## 2271           1-Title I targeted assistance eligible school-No program
## 2272                                        5-Title I schoolwide school
## 2273           1-Title I targeted assistance eligible school-No program
## 2274                                        5-Title I schoolwide school
## 2275                    4-Title I schoolwide eligible school-No program
## 2279                                        5-Title I schoolwide school
## 2280                                             6-Not a Title I school
## 2281                                             6-Not a Title I school
## 2282                                             6-Not a Title I school
## 2283                                        5-Title I schoolwide school
## 2284                                        5-Title I schoolwide school
## 2288                                                                n/a
## 2297                                        5-Title I schoolwide school
## 2298                                        5-Title I schoolwide school
## 2299                                        5-Title I schoolwide school
## 2300                                        5-Title I schoolwide school
## 2310                                             6-Not a Title I school
## 2334                                             6-Not a Title I school
## 2335                                             6-Not a Title I school
## 2342                                             6-Not a Title I school
## 2343                                             6-Not a Title I school
## 2348                                             6-Not a Title I school
## 2350           1-Title I targeted assistance eligible school-No program
## 2351                    4-Title I schoolwide eligible school-No program
## 2352                                             6-Not a Title I school
## 2355                                             6-Not a Title I school
## 2440                                                                n/a
## 2442                                                               <NA>
## 2552                                                               <NA>
## 2669                                                               <NA>
## 2682                                             6-Not a Title I school
## 2704                                        5-Title I schoolwide school
## 2720                                        5-Title I schoolwide school
## 2724                                        5-Title I schoolwide school
## 2743                                             6-Not a Title I school
## 2786                                                                n/a
## 2832                                                                n/a
## 2842                                        5-Title I schoolwide school
## 2846                                                               <NA>
## 2847                                                                n/a
## 2857                                                                n/a
## 2886                                        5-Title I schoolwide school
## 2887                                                               <NA>
## 2888                                                               <NA>
## 2926                                                                n/a
## 2927                                                                n/a
## 2928                                             6-Not a Title I school
## 2929                                             6-Not a Title I school
## 2930                                             6-Not a Title I school
## 2931                                             6-Not a Title I school
## 2932                                                                n/a
## 2941                                                                n/a
## 2943                                        5-Title I schoolwide school
## 3000                                                                n/a
## 3009                                                                n/a
## 3049                                                                n/a
## 3129                                             6-Not a Title I school
## 3130           1-Title I targeted assistance eligible school-No program
## 3155                                             6-Not a Title I school
## 3274                                             6-Not a Title I school
## 3275                                             6-Not a Title I school
## 3276                                             6-Not a Title I school
## 3277                                             6-Not a Title I school
## 3278                                             6-Not a Title I school
## 3279                                        5-Title I schoolwide school
## 3280                                                               <NA>
## 3281                                             6-Not a Title I school
## 3282                                        5-Title I schoolwide school
## 3284                                        5-Title I schoolwide school
## 3287                                        5-Title I schoolwide school
## 3288                                        5-Title I schoolwide school
## 3289                                        5-Title I schoolwide school
## 3290                                        5-Title I schoolwide school
## 3291                                        5-Title I schoolwide school
## 3295                                             6-Not a Title I school
## 3296                                                                n/a
## 3297                                             6-Not a Title I school
## 3299                                        5-Title I schoolwide school
## 3300                                             6-Not a Title I school
## 3301                                             6-Not a Title I school
## 3330                                                               <NA>
## 3512                                             6-Not a Title I school
## 3544                                             6-Not a Title I school
## 3613                                        5-Title I schoolwide school
## 3646                                                               <NA>
## 3666                                             6-Not a Title I school
## 3667                               2-Title I targeted assistance school
## 3668                               2-Title I targeted assistance school
## 3673                                        5-Title I schoolwide school
## 3674                                        5-Title I schoolwide school
## 3675                                        5-Title I schoolwide school
## 3763                                                               <NA>
## 3770                                        5-Title I schoolwide school
## 3771                                             6-Not a Title I school
## 3772                                        5-Title I schoolwide school
## 3780                                                               <NA>
## 3781                                                               <NA>
## 3782                                                                n/a
## 3791                                        5-Title I schoolwide school
## 3796                                                                n/a
## 3797                                                                n/a
## 3798                                                                n/a
## 3799                                                                n/a
## 3800                                                                n/a
## 3801                                             6-Not a Title I school
## 3802                                             6-Not a Title I school
## 3803                                             6-Not a Title I school
## 3804                                             6-Not a Title I school
## 3825                                             6-Not a Title I school
## 3834                                             6-Not a Title I school
## 3835                                             6-Not a Title I school
## 3837                                        5-Title I schoolwide school
## 3841                                                                n/a
## 3898                                                               <NA>
## 3914                                             6-Not a Title I school
## 3915                                        5-Title I schoolwide school
## 3916                                             6-Not a Title I school
## 3917                                             6-Not a Title I school
## 3918                                        5-Title I schoolwide school
## 3919                                        5-Title I schoolwide school
## 3920                                             6-Not a Title I school
## 3921                                             6-Not a Title I school
## 3922                                             6-Not a Title I school
## 3931                                             6-Not a Title I school
## 3934                                             6-Not a Title I school
## 3953                               2-Title I targeted assistance school
## 3986                               2-Title I targeted assistance school
## 3987                               2-Title I targeted assistance school
## 4006                                                               <NA>
## 4034                                                               <NA>
## 4042                                                                n/a
## 4051                                                                n/a
## 4053                                                               <NA>
## 4196                                        5-Title I schoolwide school
## 4204                                                               <NA>
## 4283                                             6-Not a Title I school
## 4308                                                                n/a
## 4309                                                                n/a
## 4332                                             6-Not a Title I school
## 4384                                                               <NA>
## 4472                                             6-Not a Title I school
## 4497                                        5-Title I schoolwide school
## 4513                                             6-Not a Title I school
## 4514                                             6-Not a Title I school
## 4534                                             6-Not a Title I school
## 4547                                                                n/a
## 4557                                                               <NA>
## 4576                                                                n/a
## 4592                                        5-Title I schoolwide school
## 4622                                                                n/a
## 4623                                                                n/a
## 4626                                        5-Title I schoolwide school
## 4635                                        5-Title I schoolwide school
## 4644                                        5-Title I schoolwide school
## 4690                                                                n/a
## 4695                                             6-Not a Title I school
## 4727                                                                n/a
## 4728                                             6-Not a Title I school
## 4800                                                                n/a
## 4807                                             6-Not a Title I school
## 4948                                        5-Title I schoolwide school
## 4949                               2-Title I targeted assistance school
## 4950                               2-Title I targeted assistance school
## 4952                                                                n/a
## 5054                                                                n/a
## 5128                                                                n/a
## 5137                                        5-Title I schoolwide school
## 5164                                                               <NA>
## 5174                                             6-Not a Title I school
## 5189                                             6-Not a Title I school
## 5305                                             6-Not a Title I school
## 5306                                             6-Not a Title I school
## 5307                                             6-Not a Title I school
## 5308                                             6-Not a Title I school
## 5310                                             6-Not a Title I school
## 5311                                             6-Not a Title I school
## 5312                                             6-Not a Title I school
## 5313                                             6-Not a Title I school
## 5314                                             6-Not a Title I school
## 5315                                             6-Not a Title I school
## 5316                                             6-Not a Title I school
## 5317                                             6-Not a Title I school
## 5318                                             6-Not a Title I school
## 5319                                             6-Not a Title I school
## 5320                                                                n/a
## 5321                                             6-Not a Title I school
## 5322                                             6-Not a Title I school
## 5323                                             6-Not a Title I school
## 5324                                             6-Not a Title I school
## 5325                                             6-Not a Title I school
## 5326                                             6-Not a Title I school
## 5327                                             6-Not a Title I school
## 5328                                             6-Not a Title I school
## 5329                                             6-Not a Title I school
## 5347                                             6-Not a Title I school
## 5348                                             6-Not a Title I school
## 5375                                             6-Not a Title I school
## 5457                                             6-Not a Title I school
## 5532                                             6-Not a Title I school
## 5533           1-Title I targeted assistance eligible school-No program
## 5534                                             6-Not a Title I school
## 5588                                                               <NA>
## 5623                                             6-Not a Title I school
## 5670                                             6-Not a Title I school
## 5672                    4-Title I schoolwide eligible school-No program
## 5735                               2-Title I targeted assistance school
## 5737                                             6-Not a Title I school
## 5738                                             6-Not a Title I school
## 5803                                                                n/a
## 5809                               2-Title I targeted assistance school
## 5825                                             6-Not a Title I school
## 5829                                                                n/a
## 5834                                             6-Not a Title I school
## 5873                                                                n/a
## 5885                                                                n/a
## 5908                                                                n/a
## 5937                    4-Title I schoolwide eligible school-No program
## 5967                                             6-Not a Title I school
## 5968                               2-Title I targeted assistance school
## 5989                                                               <NA>
## 6059                                        5-Title I schoolwide school
## 6075                                             6-Not a Title I school
## 6114                                             6-Not a Title I school
## 6122                                             6-Not a Title I school
## 6131                                             6-Not a Title I school
## 6152                                                                n/a
## 6156                                                               <NA>
## 6184                               2-Title I targeted assistance school
## 6263                                                               <NA>
## 6397                                             6-Not a Title I school
## 6416                                                                n/a
## 6426                    4-Title I schoolwide eligible school-No program
## 6428           1-Title I targeted assistance eligible school-No program
## 6441                                        5-Title I schoolwide school
## 6456                                                               <NA>
## 6463                                             6-Not a Title I school
## 6506                                                               <NA>
## 6508                                             6-Not a Title I school
## 6509                                             6-Not a Title I school
## 6510                                             6-Not a Title I school
## 6531                                             6-Not a Title I school
## 6541                                                               <NA>
## 6574                                             6-Not a Title I school
## 6575                                             6-Not a Title I school
## 6616                                             6-Not a Title I school
## 6617                                             6-Not a Title I school
## 6684                                             6-Not a Title I school
## 6685                                             6-Not a Title I school
## 6687                                             6-Not a Title I school
## 6710  3-Title I schoolwide eligible-Title I targeted assistance program
## 6723                                                               <NA>
## 6729                                                               <NA>
## 6753                                                                n/a
## 6872                                                                n/a
## 6933                                                                n/a
## 6965                                        5-Title I schoolwide school
## 7127                                             6-Not a Title I school
## 7128                                             6-Not a Title I school
## 7129                                             6-Not a Title I school
## 7130                                             6-Not a Title I school
## 7135                                             6-Not a Title I school
## 7146                                                                n/a
## 7166                               2-Title I targeted assistance school
## 7200                                                               <NA>
## 7211                                        5-Title I schoolwide school
## 7213                                        5-Title I schoolwide school
## 7214           1-Title I targeted assistance eligible school-No program
## 7252                                                               <NA>
## 7263                                             6-Not a Title I school
## 7264                                        5-Title I schoolwide school
## 7280                                                                n/a
## 7296                                             6-Not a Title I school
## 7338                                             6-Not a Title I school
## 7351                                        5-Title I schoolwide school
## 7424                                        5-Title I schoolwide school
## 7430                               2-Title I targeted assistance school
## 7470                                                               <NA>
## 7498                                                               <NA>
## 7522                                             6-Not a Title I school
## 7523                                                                n/a
## 7576                                             6-Not a Title I school
## 7588                                             6-Not a Title I school
## 7659                                                               <NA>
## 7709                                        5-Title I schoolwide school
## 7752                                             6-Not a Title I school
## 7753                                             6-Not a Title I school
## 7769                                                               <NA>
## 7770                                                               <NA>
## 7816                                        5-Title I schoolwide school
## 7825                                             6-Not a Title I school
## 7828                                             6-Not a Title I school
## 7829                                        5-Title I schoolwide school
## 7836                                        5-Title I schoolwide school
## 7839                                                               <NA>
## 7843                                                                n/a
## 7844                                                                n/a
## 7900                                             6-Not a Title I school
## 7922                                                                n/a
## 7931                                                                n/a
## 7963                                                                n/a
## 7976                                             6-Not a Title I school
## 7995                                             6-Not a Title I school
## 7996                                        5-Title I schoolwide school
## 8003                                             6-Not a Title I school
## 8030                                                                n/a
## 8046                                                                n/a
## 8068                                        5-Title I schoolwide school
## 8084                                                                n/a
## 8108                                                               <NA>
## 8136                                             6-Not a Title I school
## 8173                                                               <NA>
## 8252                                             6-Not a Title I school
## 8255                                             6-Not a Title I school
## 8257                                             6-Not a Title I school
## 8260                                        5-Title I schoolwide school
## 8261                                             6-Not a Title I school
## 8262                                        5-Title I schoolwide school
## 8284                               2-Title I targeted assistance school
## 8313                                                                n/a
## 8319                                                                n/a
## 8352                                                                n/a
## 8358                                                                n/a
## 8441                                                                n/a
## 8470                                             6-Not a Title I school
## 8480                                             6-Not a Title I school
## 8481                                        5-Title I schoolwide school
## 8485                                             6-Not a Title I school
## 8486                                             6-Not a Title I school
## 8487                                             6-Not a Title I school
## 8604                                             6-Not a Title I school
## 8606                                             6-Not a Title I school
## 8663                                                                n/a
## 8677                                             6-Not a Title I school
## 8679                                             6-Not a Title I school
## 8728                                             6-Not a Title I school
## 8729                                             6-Not a Title I school
## 8730                                             6-Not a Title I school
## 8735                                             6-Not a Title I school
## 8748                                                               <NA>
## 8768                                                                n/a
## 8808                                        5-Title I schoolwide school
## 8859                                                                n/a
## 8902                                             6-Not a Title I school
## 8905                                             6-Not a Title I school
## 8910                                             6-Not a Title I school
## 8928                                                                n/a
## 8942                                        5-Title I schoolwide school
## 9056                                                                n/a
## 9063                                                                n/a
## 9065                                                                n/a
## 9066                                                                n/a
## 9073                    4-Title I schoolwide eligible school-No program
## 9107                                                               <NA>
## 9201                    4-Title I schoolwide eligible school-No program
## 9218                                        5-Title I schoolwide school
## 9227                                                                n/a
## 9228                                                               <NA>
## 9239                                             6-Not a Title I school
## 9271                                                                n/a
## 9272                                                                n/a
## 9305                                             6-Not a Title I school
## 9327                                             6-Not a Title I school
## 9406                                        5-Title I schoolwide school
## 9491                                             6-Not a Title I school
## 9694                                        5-Title I schoolwide school
## 9787                                        5-Title I schoolwide school
## 9814                                             6-Not a Title I school
## 9863                                             6-Not a Title I school
## 9878           1-Title I targeted assistance eligible school-No program
## 9879                                             6-Not a Title I school
## 9880                                             6-Not a Title I school
## 9885                                             6-Not a Title I school
## 9886                                                                n/a
## 9887                                             6-Not a Title I school
## 10043                   4-Title I schoolwide eligible school-No program
## 10044                                       5-Title I schoolwide school
## 10095                                                              <NA>
## 10096                                                              <NA>
## 10145                                       5-Title I schoolwide school
## 10159                                            6-Not a Title I school
## 10160                                       5-Title I schoolwide school
## 10174                                                               n/a
## 10177                                                               n/a
## 10178                                                               n/a
## 10314                                                               n/a
## 10330                                                              <NA>
## 10373                                            6-Not a Title I school
## 10402                                                               n/a
## 10426                                                              <NA>
## 10432                                                               n/a
## 10487                                                               n/a
## 10491                                       5-Title I schoolwide school
## 10525                                            6-Not a Title I school
## 10538                                                               n/a
## 10565                                                               n/a
## 10567                                                              <NA>
## 10569                                            6-Not a Title I school
## 10591                                                               n/a
## 10597                                                               n/a
## 10621                                                               n/a
## 10644                   4-Title I schoolwide eligible school-No program
## 10650                                       5-Title I schoolwide school
## 10655                                       5-Title I schoolwide school
## 10702                                                               n/a
## 10767                                                               n/a
## 10776                                                              <NA>
## 10782                                                               n/a
## 10789                                            6-Not a Title I school
## 10793                                            6-Not a Title I school
## 10805                                                               n/a
## 10816                                                               n/a
## 10817                                            6-Not a Title I school
## 10823                                       5-Title I schoolwide school
## 10928                                                              <NA>
## 10937                                                              <NA>
## 10938                                                               n/a
## 10948                                                              <NA>
## 10957                                                               n/a
## 10962                                            6-Not a Title I school
## 11016                              2-Title I targeted assistance school
## 11017                              2-Title I targeted assistance school
## 11021                                                               n/a
## 11030                                       5-Title I schoolwide school
## 11033                                                               n/a
## 11059                                            6-Not a Title I school
## 11065                                            6-Not a Title I school
## 11125                                                               n/a
## 11156                              2-Title I targeted assistance school
## 11192                                            6-Not a Title I school
## 11230                                                               n/a
## 11231                                                               n/a
## 11255                   4-Title I schoolwide eligible school-No program
## 11256                                                               n/a
## 11257                                                               n/a
## 11258                                            6-Not a Title I school
## 11259                                                               n/a
## 11263                                       5-Title I schoolwide school
## 11272                                                              <NA>
## 11273                                                              <NA>
## 11299                                                              <NA>
## 11300                                                              <NA>
## 11301                                                              <NA>
## 11302                                                              <NA>
## 11303                                                              <NA>
## 11307                                                              <NA>
## 11308                                                              <NA>
## 11309                                                              <NA>
## 11310                                                              <NA>
## 11312                                                              <NA>
## 11313                                                              <NA>
## 11314                                                              <NA>
## 11351                   4-Title I schoolwide eligible school-No program
## 11405                                            6-Not a Title I school
## 11422                                                              <NA>
## 11439                                            6-Not a Title I school
## 11440                                            6-Not a Title I school
## 11483                                                              <NA>
## 11484                                                               n/a
## 11512                                                              <NA>
## 11513                                                              <NA>
## 11514                                                              <NA>
## 11522                                            6-Not a Title I school
## 11534                                       5-Title I schoolwide school
## 11535                                       5-Title I schoolwide school
## 11539                                                               n/a
## 11541                                            6-Not a Title I school
## 11543                                            6-Not a Title I school
## 11544                                            6-Not a Title I school
## 11546                                            6-Not a Title I school
## 11547                                            6-Not a Title I school
## 11551                                            6-Not a Title I school
## 11582                                            6-Not a Title I school
## 11589                                            6-Not a Title I school
## 11591                                                              <NA>
## 11612                                                              <NA>
## 11621                                                               n/a
## 11683                                                               n/a
## 11685                                       5-Title I schoolwide school
## 11728                                            6-Not a Title I school
## 11869                                            6-Not a Title I school
## 11872                                            6-Not a Title I school
## 11876                                                               n/a
## 11877                                                              <NA>
## 11881                              2-Title I targeted assistance school
## 11900                                            6-Not a Title I school
## 11908                              2-Title I targeted assistance school
## 11911                                            6-Not a Title I school
## 11912                                            6-Not a Title I school
## 11913                                       5-Title I schoolwide school
## 11914                                            6-Not a Title I school
## 11925                                            6-Not a Title I school
## 11926                                                               n/a
## 11927                                            6-Not a Title I school
## 11928                                            6-Not a Title I school
## 11929                                            6-Not a Title I school
## 11930 3-Title I schoolwide eligible-Title I targeted assistance program
## 11931                                            6-Not a Title I school
## 11932                                            6-Not a Title I school
## 11935                                                               n/a
## 11936                                            6-Not a Title I school
## 11937                                            6-Not a Title I school
## 11967                                                              <NA>
## 11968                                                              <NA>
## 11975                                                               n/a
## 12070                                            6-Not a Title I school
## 12083                                            6-Not a Title I school
## 12088                                                              <NA>
## 12114                                            6-Not a Title I school
## 12123                                                               n/a
## 12131                                       5-Title I schoolwide school
## 12138                                                               n/a
## 12149                                                               n/a
## 12163                   4-Title I schoolwide eligible school-No program
## 12164                                       5-Title I schoolwide school
## 12165                   4-Title I schoolwide eligible school-No program
## 12166                                       5-Title I schoolwide school
## 12167                                                               n/a
## 12168                                                               n/a
## 12190                                                               n/a
## 12221                                                              <NA>
## 12227                                            6-Not a Title I school
## 12228                                       5-Title I schoolwide school
## 12243                                                              <NA>
## 12249                                            6-Not a Title I school
## 12307                                                               n/a
## 12310                                                              <NA>
## 12316                                                              <NA>
## 12348                                                               n/a
## 12427                                       5-Title I schoolwide school
## 12480                                            6-Not a Title I school
## 12501                                                               n/a
## 12523                                                               n/a
## 12540                                                               n/a
## 12567                                                               n/a
## 12591                                                               n/a
## 12677                                                               n/a
## 12746                                                              <NA>
## 12749                                                              <NA>
## 12756                                       5-Title I schoolwide school
## 12764                                                              <NA>
## 12783                                                               n/a
## 12806                                            6-Not a Title I school
## 12905                                            6-Not a Title I school
## 12912                                       5-Title I schoolwide school
## 12934                                            6-Not a Title I school
## 12965                                                               n/a
## 12974                                       5-Title I schoolwide school
## 12976                                       5-Title I schoolwide school
## 12979          1-Title I targeted assistance eligible school-No program
## 13071                                                               n/a
## 13072                                                               n/a
## 13073                                                               n/a
## 13075                                                               n/a
## 13076                                                               n/a
## 13077                                                               n/a
## 13079                                                               n/a
## 13080                                                               n/a
## 13081                                                               n/a
## 13082                                                               n/a
## 13085                                                               n/a
## 13086                                                               n/a
## 13087                                                               n/a
## 13088                                                               n/a
## 13089                                                               n/a
## 13090                                                               n/a
## 13091                                                               n/a
## 13111                                                               n/a
## 13117                                            6-Not a Title I school
## 13156                                            6-Not a Title I school
## 13176                                       5-Title I schoolwide school
## 13230                                                               n/a
## 13233                                            6-Not a Title I school
## 13240                                       5-Title I schoolwide school
## 13262                                            6-Not a Title I school
## 13269                                            6-Not a Title I school
## 13270                                            6-Not a Title I school
## 13275                                            6-Not a Title I school
## 13290                                            6-Not a Title I school
## 13335                                                              <NA>
## 13338                                       5-Title I schoolwide school
## 13340                                                              <NA>
## 13424                                            6-Not a Title I school
## 13428                                            6-Not a Title I school
## 13442                              2-Title I targeted assistance school
## 13448                                                               n/a
## 13467                                            6-Not a Title I school
## 13468                                            6-Not a Title I school
## 13469                                            6-Not a Title I school
## 13470                                            6-Not a Title I school
## 13471                                            6-Not a Title I school
## 13483                                                               n/a
## 13487                                            6-Not a Title I school
## 13588                                                               n/a
## 13595                                            6-Not a Title I school
## 13602                                            6-Not a Title I school
## 13623                                                               n/a
## 13625                                                               n/a
## 13677                                            6-Not a Title I school
## 13704                                                              <NA>
## 13755                                       5-Title I schoolwide school
## 13816                                       5-Title I schoolwide school
## 13964                                                              <NA>
## 14045                                            6-Not a Title I school
## 14047                                            6-Not a Title I school
## 14061                                                               n/a
## 14062                                                               n/a
## 14068                                                               n/a
## 14102                                            6-Not a Title I school
## 14112                                       5-Title I schoolwide school
## 14118                                                               n/a
## 14124                                                               n/a
## 14129                                                               n/a
## 14136                                                               n/a
## 14142                                                               n/a
## 14161                                                               n/a
## 14205                                       5-Title I schoolwide school
## 14221                                                              <NA>
## 14226                                       5-Title I schoolwide school
## 14229                                            6-Not a Title I school
## 14237                                            6-Not a Title I school
## 14371                                            6-Not a Title I school
## 14373                                            6-Not a Title I school
## 14375                                            6-Not a Title I school
## 14377                                            6-Not a Title I school
## 14379                              2-Title I targeted assistance school
## 14387                                            6-Not a Title I school
## 14436                                                               n/a
## 14458                                       5-Title I schoolwide school
## 14464          1-Title I targeted assistance eligible school-No program
## 14465                                       5-Title I schoolwide school
## 14516                                            6-Not a Title I school
## 14520                                                              <NA>
## 14526                                       5-Title I schoolwide school
## 14531                                                               n/a
## 14618                                            6-Not a Title I school
## 14671                                            6-Not a Title I school
## 14768                              2-Title I targeted assistance school
## 14876                                            6-Not a Title I school
## 14877                                                               n/a
## 14880                                                               n/a
## 14882                                                               n/a
## 14883                                                               n/a
## 14899                                       5-Title I schoolwide school
## 14912                                                              <NA>
## 15111                                                               n/a
## 15116                                                              <NA>
## 15161                                       5-Title I schoolwide school
## 15172                                                              <NA>
## 15173                                       5-Title I schoolwide school
## 15175                                                              <NA>
## 15212                                                               n/a
## 15213                                                               n/a
## 15215                                                               n/a
## 15297                                                               n/a
## 15298                                                               n/a
## 15304                                                               n/a
## 15365                                       5-Title I schoolwide school
## 15370                                       5-Title I schoolwide school
## 15371                                       5-Title I schoolwide school
## 15373                                            6-Not a Title I school
## 15376                                                              <NA>
## 15377                                                              <NA>
## 15395                                                              <NA>
## 15442                                                              <NA>
## 15448                                            6-Not a Title I school
## 15451                                                               n/a
## 15452                                       5-Title I schoolwide school
## 15454                                       5-Title I schoolwide school
## 15458                                                              <NA>
## 15473                                            6-Not a Title I school
## 15508                                                               n/a
## 15587                              2-Title I targeted assistance school
## 15666                                            6-Not a Title I school
## 15778                                                               n/a
## 15789                                            6-Not a Title I school
## 15809          1-Title I targeted assistance eligible school-No program
## 15822                                            6-Not a Title I school
## 15823                                            6-Not a Title I school
## 15824                                            6-Not a Title I school
## 15825                                            6-Not a Title I school
## 15826                                            6-Not a Title I school
## 15828                                            6-Not a Title I school
## 15829                                            6-Not a Title I school
## 15830                                            6-Not a Title I school
## 15831                                            6-Not a Title I school
## 15832                                            6-Not a Title I school
## 15833                                            6-Not a Title I school
## 15834                                            6-Not a Title I school
## 15835                                            6-Not a Title I school
## 15843                                                              <NA>
## 15898                                            6-Not a Title I school
## 15899                                       5-Title I schoolwide school
## 15943                                       5-Title I schoolwide school
## 15950                                       5-Title I schoolwide school
## 15957                                                               n/a
## 15958                                                               n/a
## 15960                              2-Title I targeted assistance school
## 15966                                                               n/a
## 15970                                       5-Title I schoolwide school
## 15981                                       5-Title I schoolwide school
## 16010                                                              <NA>
## 16141                                            6-Not a Title I school
## 16190                                            6-Not a Title I school
## 16218                                            6-Not a Title I school
## 16247                                                              <NA>
## 16271                                                              <NA>
## 16273                                                              <NA>
## 16307                                       5-Title I schoolwide school
## 16308                                                              <NA>
## 16332                                       5-Title I schoolwide school
## 16357                                                               n/a
## 16359                                                               n/a
## 16360                                                               n/a
## 16403                                            6-Not a Title I school
## 16411                                                              <NA>
## 16483                                            6-Not a Title I school
## 16498                                                              <NA>
## 16525                                                               n/a
## 16526                                                               n/a
## 16623                                            6-Not a Title I school
## 16633                                                               n/a
## 16767                                            6-Not a Title I school
## 16805                                                               n/a
## 16811                              2-Title I targeted assistance school
## 16816                                                               n/a
## 16828                                            6-Not a Title I school
## 16913                                                               n/a
## 16918                                                               n/a
## 16926                                                               n/a
## 16948                                                              <NA>
## 16950                                            6-Not a Title I school
## 16952                                            6-Not a Title I school
## 16953                                                               n/a
## 16963                                                               n/a
## 17019                                                               n/a
## 17046                                                              <NA>
## 17116                                       5-Title I schoolwide school
## 17160                                            6-Not a Title I school
## 17231                                                               n/a
## 17232                                                               n/a
## 17282                                                              <NA>
## 17334                                                               n/a
## 17335                                            6-Not a Title I school
## 17344                                            6-Not a Title I school
## 17345                                            6-Not a Title I school
## 17347                                            6-Not a Title I school
## 17447                                                               n/a
## 17510                                                               n/a
## 17538                              2-Title I targeted assistance school
## 17599                                       5-Title I schoolwide school
## 17600                                            6-Not a Title I school
## 17611                                                               n/a
## 17612                                            6-Not a Title I school
## 17613                                            6-Not a Title I school
## 17639                                            6-Not a Title I school
## 17641                                                               n/a
## 17651                                                               n/a
## 17775                                                               n/a
## 17787                                            6-Not a Title I school
## 17793                                                               n/a
## 17800                                                              <NA>
## 17802                                                              <NA>
## 17803                                                              <NA>
## 17805                                                              <NA>
## 17815                                            6-Not a Title I school
## 17823                                                               n/a
## 17845                                                              <NA>
## 17850                                       5-Title I schoolwide school
## 17856                                                              <NA>
## 17895                                                              <NA>
## 17896                                                              <NA>
## 17897                                                              <NA>
## 17901                                            6-Not a Title I school
## 17907                                       5-Title I schoolwide school
## 17925                                                               n/a
## 17936                                            6-Not a Title I school
## 17977                                            6-Not a Title I school
## 17978                                                               n/a
## 18066                                                              <NA>
## 18067                                                              <NA>
## 18074                                                               n/a
## 18168                                                               n/a
## 18169                                                              <NA>
## 18170                                                               n/a
## 18171                                                               n/a
## 18173                                                               n/a
## 18174                                                               n/a
## 18176                                                               n/a
## 18177                                                               n/a
## 18178                                                               n/a
## 18216                                       5-Title I schoolwide school
## 18232                                            6-Not a Title I school
## 18254                                                              <NA>
## 18273                                            6-Not a Title I school
## 18285                                                               n/a
## 18338                                                               n/a
## 18375                                            6-Not a Title I school
## 18378                                            6-Not a Title I school
## 18379                                            6-Not a Title I school
## 18386                                            6-Not a Title I school
## 18387                                            6-Not a Title I school
## 18392                                            6-Not a Title I school
## 18393                                            6-Not a Title I school
## 18408                                       5-Title I schoolwide school
## 18423                                            6-Not a Title I school
## 18424                                            6-Not a Title I school
## 18425                                            6-Not a Title I school
## 18431                                       5-Title I schoolwide school
## 18432                                       5-Title I schoolwide school
## 18468                              2-Title I targeted assistance school
## 18490                                                               n/a
## 18508                                            6-Not a Title I school
## 18553                                            6-Not a Title I school
## 18557                              2-Title I targeted assistance school
## 18567                                            6-Not a Title I school
## 18574                                                               n/a
## 18614                              2-Title I targeted assistance school
## 18642                                                               n/a
## 18677                                                              <NA>
## 18719                                                              <NA>
## 18726                                                               n/a
## 18762                                                              <NA>
## 18787                                            6-Not a Title I school
## 18792                                                               n/a
## 18795                                            6-Not a Title I school
## 18796                              2-Title I targeted assistance school
## 18840                                       5-Title I schoolwide school
## 18861                                            6-Not a Title I school
## 18877                                                              <NA>
## 18878                                                               n/a
## 18879                                                              <NA>
## 18881                                            6-Not a Title I school
## 18890          1-Title I targeted assistance eligible school-No program
## 18891                                            6-Not a Title I school
## 18900                                                               n/a
## 18932                                            6-Not a Title I school
## 18973                                            6-Not a Title I school
## 18994                                                               n/a
## 19047                                                               n/a
## 19102                                                              <NA>
## 19111                                                              <NA>
## 19115                                                               n/a
## 19147                                            6-Not a Title I school
## 19169                                                              <NA>
## 19183                                                              <NA>
## 19190                                                              <NA>
## 19232                                                              <NA>
## 19238                                            6-Not a Title I school
## 19246                                       5-Title I schoolwide school
## 19257                                                               n/a
## 19258                                                               n/a
## 19288                                            6-Not a Title I school
## 19292                                                              <NA>
## 19293                                                              <NA>
## 19294                                                               n/a
## 19295                                                              <NA>
## 19296                                                              <NA>
## 19354                                       5-Title I schoolwide school
## 19388                                       5-Title I schoolwide school
## 19389                                            6-Not a Title I school
## 19451                                            6-Not a Title I school
## 19461                                       5-Title I schoolwide school
## 19474                                                               n/a
## 19486                                                              <NA>
## 19492                                            6-Not a Title I school
## 19568                                            6-Not a Title I school
## 19612                                            6-Not a Title I school
## 19626                                                               n/a
## 19649                              2-Title I targeted assistance school
## 19659                                                               n/a
## 19664                                       5-Title I schoolwide school
## 19690                                                              <NA>
## 19712                                            6-Not a Title I school
## 19719                                            6-Not a Title I school
## 19748                                                              <NA>
## 19756                                                              <NA>
## 19776                                                               n/a
## 19777                                                               n/a
## 19778                                                               n/a
## 19779                                                               n/a
## 19781                                                               n/a
## 19782                                                               n/a
## 19783                                                               n/a
## 19784                                                               n/a
## 19785                                                               n/a
## 19786                                                               n/a
## 19788                                                               n/a
## 19832                                                               n/a
## 19833                                                               n/a
## 19835                                                               n/a
## 19837                                                               n/a
## 19860                                                               n/a
## 19892                                                              <NA>
## 19900                                                               n/a
## 19928                                                              <NA>
## 20031                                                               n/a
## 20032                                                               n/a
## 20033                                                               n/a
## 20034                                                               n/a
## 20035                                                               n/a
## 20036                                                               n/a
## 20061                                                               n/a
## 20099                                            6-Not a Title I school
## 20101                                            6-Not a Title I school
## 20161                                                              <NA>
## 20167                              2-Title I targeted assistance school
## 20175                                            6-Not a Title I school
## 20182                                            6-Not a Title I school
## 20196                                                               n/a
## 20223                              2-Title I targeted assistance school
## 20247                                            6-Not a Title I school
## 20266                                            6-Not a Title I school
## 20268                                                               n/a
## 20272                                            6-Not a Title I school
## 20273                                            6-Not a Title I school
## 20335                                            6-Not a Title I school
## 20413                                                              <NA>
## 20424                                       5-Title I schoolwide school
## 20545                                                              <NA>
## 20590                                       5-Title I schoolwide school
## 20654                              2-Title I targeted assistance school
## 20662                                                               n/a
## 20695                                            6-Not a Title I school
## 20712                                       5-Title I schoolwide school
## 20715                                                               n/a
## 20719                                                               n/a
## 20764                                            6-Not a Title I school
## 20770                                                               n/a
## 20774                                            6-Not a Title I school
## 20775                                            6-Not a Title I school
## 20826                                            6-Not a Title I school
## 20887                                                              <NA>
## 20927                                            6-Not a Title I school
## 21008                                                              <NA>
## 21027                                                              <NA>
## 21040                                            6-Not a Title I school
## 21073                                            6-Not a Title I school
## 21095                                                              <NA>
## 21101                                                               n/a
## 21115                                       5-Title I schoolwide school
## 21117                                                               n/a
## 21137                                                              <NA>
## 21140                                                              <NA>
## 21143                                                               n/a
## 21161                                                              <NA>
## 21251                                            6-Not a Title I school
## 21283                                                              <NA>
## 21287                                                               n/a
## 21309                                            6-Not a Title I school
## 21325                                            6-Not a Title I school
## 21329                                       5-Title I schoolwide school
## 21331                                       5-Title I schoolwide school
## 21374                                                               n/a
## 21440                                            6-Not a Title I school
## 21446                                            6-Not a Title I school
## 21451                                            6-Not a Title I school
## 21479                                                               n/a
## 21480                                                               n/a
## 21490                                                               n/a
## 21549                              2-Title I targeted assistance school
## 21551                              2-Title I targeted assistance school
## 21554                                            6-Not a Title I school
## 21555                                       5-Title I schoolwide school
## 21556                                            6-Not a Title I school
## 21563                                            6-Not a Title I school
## 21569                                       5-Title I schoolwide school
## 21580                                            6-Not a Title I school
## 21585                                            6-Not a Title I school
## 21591                                                              <NA>
## 21596                                            6-Not a Title I school
## 21602                                            6-Not a Title I school
## 21607                                            6-Not a Title I school
## 21608 3-Title I schoolwide eligible-Title I targeted assistance program
## 21610                                                              <NA>
## 21618                                                              <NA>
## 21619                                       5-Title I schoolwide school
## 21633                                                               n/a
## 21638                                                              <NA>
## 21641                                            6-Not a Title I school
## 21646                                                               n/a
## 21647                                                               n/a
## 21656                                                              <NA>
## 21680                                                               n/a
## 21681                                                               n/a
## 21693 3-Title I schoolwide eligible-Title I targeted assistance program
## 21698                                                               n/a
## 21827                                                               n/a
## 21837                                            6-Not a Title I school
## 21849                                            6-Not a Title I school
## 21850                                            6-Not a Title I school
## 21855                                            6-Not a Title I school
## 21859                                       5-Title I schoolwide school
## 21913                                                              <NA>
## 21914                                                               n/a
## 21916                                                              <NA>
## 21917                                                              <NA>
## 21975                                            6-Not a Title I school
## 22012                                                              <NA>
## 22028                                                              <NA>
## 22029                                                              <NA>
## 22033                                                              <NA>
## 22041                                                               n/a
## 22049                                            6-Not a Title I school
## 22088                                            6-Not a Title I school
## 22096                                       5-Title I schoolwide school
## 22097                                            6-Not a Title I school
## 22101                                            6-Not a Title I school
## 22109                                            6-Not a Title I school
## 22113                                                              <NA>
## 22114                                                               n/a
## 22115                                            6-Not a Title I school
## 22117                              2-Title I targeted assistance school
## 22125                                                               n/a
## 22133                                                               n/a
## 22134                                                               n/a
## 22135                                                               n/a
## 22136                                                               n/a
## 22137                                                               n/a
## 22138                                                               n/a
## 22139                                                               n/a
## 22157                                                               n/a
## 22168                                            6-Not a Title I school
## 22172                                            6-Not a Title I school
## 22174                              2-Title I targeted assistance school
## 22175                                       5-Title I schoolwide school
## 22176                                                               n/a
## 22177                                            6-Not a Title I school
## 22178                                                               n/a
## 22179                                                               n/a
## 22180                                            6-Not a Title I school
## 22199                                            6-Not a Title I school
## 22202                                                              <NA>
## 22218                                       5-Title I schoolwide school
## 22386                                                               n/a
## 22450                                            6-Not a Title I school
## 22538                                                               n/a
## 22554                                                               n/a
## 22573                                            6-Not a Title I school
## 22583                                                               n/a
## 22596                                                              <NA>
## 22626                                                              <NA>
## 22627                                            6-Not a Title I school
## 22646                                                               n/a
## 22699                                                              <NA>
## 22736                                       5-Title I schoolwide school
## 22752                                       5-Title I schoolwide school
## 22913                                       5-Title I schoolwide school
## 22991                                            6-Not a Title I school
## 22992                                            6-Not a Title I school
## 23002                                            6-Not a Title I school
## 23004                                                               n/a
## 23059                   4-Title I schoolwide eligible school-No program
## 23060                                                              <NA>
## 23087                                            6-Not a Title I school
## 23115                                       5-Title I schoolwide school
## 23144                                                              <NA>
## 23161                                            6-Not a Title I school
## 23162                              2-Title I targeted assistance school
## 23167                                            6-Not a Title I school
## 23195                                            6-Not a Title I school
## 23204                                                               n/a
## 23228                                                               n/a
## 23337                                                               n/a
## 23364                                                               n/a
## 23444          1-Title I targeted assistance eligible school-No program
## 23446          1-Title I targeted assistance eligible school-No program
## 23447          1-Title I targeted assistance eligible school-No program
## 23448          1-Title I targeted assistance eligible school-No program
## 23449                   4-Title I schoolwide eligible school-No program
## 23450                   4-Title I schoolwide eligible school-No program
## 23452                              2-Title I targeted assistance school
## 23455                                                               n/a
## 23456                                                               n/a
## 23458                                                               n/a
## 23578                                            6-Not a Title I school
## 23579                                            6-Not a Title I school
## 23580                                            6-Not a Title I school
## 23581                                            6-Not a Title I school
## 23582                                            6-Not a Title I school
## 23583                                            6-Not a Title I school
## 23584                                            6-Not a Title I school
## 23656                                            6-Not a Title I school
## 23667                                       5-Title I schoolwide school
## 23668                                       5-Title I schoolwide school
## 23669                                       5-Title I schoolwide school
## 23670                                       5-Title I schoolwide school
## 23673                                                               n/a
## 23737                                            6-Not a Title I school
## 23762                                            6-Not a Title I school
## 23768                                       5-Title I schoolwide school
## 23773                                            6-Not a Title I school
## 23858                   4-Title I schoolwide eligible school-No program
## 23861                                       5-Title I schoolwide school
## 23872                                                               n/a
## 23891                                       5-Title I schoolwide school
## 23895                                            6-Not a Title I school
## 23932                                                              <NA>
## 23935                                            6-Not a Title I school
## 23938                                                               n/a
## 23939                                                               n/a
## 23949                                                               n/a
## 23951                                                               n/a
## 23952                              2-Title I targeted assistance school
## 23953                                       5-Title I schoolwide school
## 23959                                                               n/a
## 23964                                            6-Not a Title I school
## 23965                              2-Title I targeted assistance school
## 23971                                            6-Not a Title I school
## 23972                                            6-Not a Title I school
## 23974                                            6-Not a Title I school
## 23975                                            6-Not a Title I school
## 23979                                       5-Title I schoolwide school
## 23980                              2-Title I targeted assistance school
## 23985                              2-Title I targeted assistance school
## 23988                                       5-Title I schoolwide school
## 23991                                       5-Title I schoolwide school
## 24066                                                              <NA>
## 24073                                                              <NA>
## 24074                                            6-Not a Title I school
## 24088                                                               n/a
## 24093                              2-Title I targeted assistance school
## 24101                                       5-Title I schoolwide school
## 24122                                                               n/a
## 24128                                            6-Not a Title I school
## 24186                                            6-Not a Title I school
## 24379                                            6-Not a Title I school
## 24396                                                              <NA>
## 24412                                       5-Title I schoolwide school
## 24467                                            6-Not a Title I school
## 24500                                            6-Not a Title I school
## 24521                                       5-Title I schoolwide school
## 24546                              2-Title I targeted assistance school
## 24564                                                              <NA>
## 24599                                                               n/a
## 24600                                                               n/a
## 24634                                                               n/a
## 24636                                            6-Not a Title I school
## 24639                              2-Title I targeted assistance school
## 24642                                                               n/a
## 24701                                            6-Not a Title I school
## 24706                                            6-Not a Title I school
## 24756                                            6-Not a Title I school
## 24757                                                               n/a
## 24794                                                              <NA>
## 24819                                                               n/a
## 24852                                            6-Not a Title I school
## 24866                                       5-Title I schoolwide school
## 24871                                            6-Not a Title I school
## 24899                                            6-Not a Title I school
## 24994                                            6-Not a Title I school
## 25047                                                              <NA>
## 25049                                                               n/a
## 25075                                            6-Not a Title I school
## 25090                                       5-Title I schoolwide school
## 25107          1-Title I targeted assistance eligible school-No program
## 25125                                                               n/a
## 25126                                                               n/a
## 25167                                            6-Not a Title I school
## 25168                                            6-Not a Title I school
## 25191                                            6-Not a Title I school
## 25192                                            6-Not a Title I school
## 25335                                                               n/a
## 25364                                       5-Title I schoolwide school
## 25372                                                               n/a
## 25375                              2-Title I targeted assistance school
## 25389                                       5-Title I schoolwide school
## 25390                                       5-Title I schoolwide school
## 25391                                            6-Not a Title I school
## 25392          1-Title I targeted assistance eligible school-No program
## 25440                                                              <NA>
## 25444                                                               n/a
## 25445                                                              <NA>
## 25458                                       5-Title I schoolwide school
## 25459                                       5-Title I schoolwide school
## 25465                                            6-Not a Title I school
## 25475                                            6-Not a Title I school
## 25478                                                               n/a
## 25482                                                               n/a
## 25483                                                               n/a
## 25486                                       5-Title I schoolwide school
## 25487                                            6-Not a Title I school
## 25488                                            6-Not a Title I school
## 25498                                                               n/a
## 25520                                                              <NA>
## 25578                                                              <NA>
## 25653                                                              <NA>
## 25693                                            6-Not a Title I school
## 25748                                                               n/a
## 25797                                                               n/a
## 25808                                                               n/a
## 25842                                                               n/a
## 25858                                       5-Title I schoolwide school
## 25867                                            6-Not a Title I school
## 25868                                            6-Not a Title I school
## 25877                                            6-Not a Title I school
## 25917                                                              <NA>
## 25932                                                               n/a
## 25958                                                              <NA>
## 26038                                                              <NA>
## 26092                                                              <NA>
## 26097                                            6-Not a Title I school
## 26112                                            6-Not a Title I school
## 26114                              2-Title I targeted assistance school
## 26118                                            6-Not a Title I school
## 26166                                                              <NA>
## 26172                                                               n/a
## 26286                                       5-Title I schoolwide school
## 26289                                            6-Not a Title I school
## 26327                                                              <NA>
## 26389                                                               n/a
## 26433                                                              <NA>
## 26530                                            6-Not a Title I school
## 26532                                            6-Not a Title I school
## 26590                                            6-Not a Title I school
## 26602                                            6-Not a Title I school
## 26606                                                               n/a
## 26632                                       5-Title I schoolwide school
## 26677                                                              <NA>
## 26701                                       5-Title I schoolwide school
## 26702                                       5-Title I schoolwide school
## 26703                                                              <NA>
## 26707                                                               n/a
## 26728                   4-Title I schoolwide eligible school-No program
## 26748                              2-Title I targeted assistance school
## 26753                              2-Title I targeted assistance school
## 26761                                            6-Not a Title I school
## 26774                                       5-Title I schoolwide school
## 26776                                       5-Title I schoolwide school
## 26777                                       5-Title I schoolwide school
## 26778                                       5-Title I schoolwide school
## 26780                                       5-Title I schoolwide school
## 26797                                                               n/a
## 26838                                       5-Title I schoolwide school
## 26844                                                              <NA>
## 26851                                            6-Not a Title I school
## 26852                                            6-Not a Title I school
## 26856                                            6-Not a Title I school
## 26860                                                               n/a
## 26875                                            6-Not a Title I school
## 26886                                       5-Title I schoolwide school
## 26888                                                               n/a
## 26889                              2-Title I targeted assistance school
## 26890                              2-Title I targeted assistance school
## 26892                                            6-Not a Title I school
## 26907                                       5-Title I schoolwide school
## 26915                                            6-Not a Title I school
## 26916                                       5-Title I schoolwide school
## 26924                                            6-Not a Title I school
## 26930                                                              <NA>
## 26947                                                               n/a
## 27064                                            6-Not a Title I school
## 27066                                            6-Not a Title I school
## 27069                                       5-Title I schoolwide school
## 27070                                       5-Title I schoolwide school
## 27071                                       5-Title I schoolwide school
## 27073                                                              <NA>
## 27076                                            6-Not a Title I school
## 27078                                                               n/a
## 27082                                            6-Not a Title I school
## 27083                                            6-Not a Title I school
## 27085                                                               n/a
## 27086                                            6-Not a Title I school
## 27087                                                               n/a
## 27089                                                               n/a
## 27098                                                              <NA>
## 27106                                                              <NA>
## 27111          1-Title I targeted assistance eligible school-No program
## 27115                                            6-Not a Title I school
## 27121                                            6-Not a Title I school
## 27151                              2-Title I targeted assistance school
## 27157                                                              <NA>
## 27175                                                              <NA>
## 27176                                                              <NA>
## 27188                                       5-Title I schoolwide school
## 27229                                       5-Title I schoolwide school
## 27238                                                               n/a
## 27266                                       5-Title I schoolwide school
## 27283                                                               n/a
## 27390                                       5-Title I schoolwide school
## 27478                                                              <NA>
## 27487                                            6-Not a Title I school
## 27489                                                               n/a
## 27524                                            6-Not a Title I school
## 27577                                            6-Not a Title I school
## 27606                                                               n/a
## 27607                                                               n/a
## 27608                                                               n/a
## 27609                                                               n/a
## 27610                                                               n/a
## 27611                                                               n/a
## 27612                                                               n/a
## 27613                                                               n/a
## 27614                                                               n/a
## 27615                                                               n/a
## 27616                                                               n/a
## 27617                                                               n/a
## 27618                                                               n/a
## 27619                                                               n/a
## 27620                                                               n/a
## 27621                                                               n/a
## 27622                                                               n/a
## 27623                                                               n/a
## 27625                                                               n/a
## 27627                                                               n/a
## 27628                                                               n/a
## 27629                                                               n/a
## 27630                                                               n/a
## 27631                                                               n/a
## 27632                                                               n/a
## 27633                                                               n/a
## 27634                                                               n/a
## 27635                                                               n/a
## 27636                                                               n/a
## 27637                                                               n/a
## 27638                                                               n/a
## 27639                                                               n/a
## 27640                                                               n/a
## 27641                                                               n/a
## 27642                                                               n/a
## 27643                                                               n/a
## 27644                                                               n/a
## 27645                                                               n/a
## 27646                                                               n/a
## 27647                                                               n/a
## 27648                                                               n/a
## 27650                                                               n/a
## 27651                                                               n/a
## 27652                                                               n/a
## 27653                                                               n/a
## 27654                                                               n/a
## 27656                                                               n/a
## 27657                                                               n/a
## 27658                                                               n/a
## 27671                                            6-Not a Title I school
## 27689                                            6-Not a Title I school
## 27690                                            6-Not a Title I school
## 27691                                       5-Title I schoolwide school
## 27692                                       5-Title I schoolwide school
## 27693                                       5-Title I schoolwide school
## 27697                                       5-Title I schoolwide school
## 27728                              2-Title I targeted assistance school
## 27730                                       5-Title I schoolwide school
## 27737                                       5-Title I schoolwide school
## 27749                                                               n/a
## 27756                                                               n/a
## 27804          1-Title I targeted assistance eligible school-No program
## 27805                                            6-Not a Title I school
## 27851                                                               n/a
## 27896                                                              <NA>
## 27913                                            6-Not a Title I school
## 27935                                                               n/a
## 27937                                                               n/a
## 27942                                                               n/a
## 27946                                                               n/a
## 27977                                            6-Not a Title I school
## 27998                                                               n/a
## 28085                                            6-Not a Title I school
## 28086                                            6-Not a Title I school
## 28087                                            6-Not a Title I school
## 28089                                            6-Not a Title I school
## 28090                                            6-Not a Title I school
## 28091                                            6-Not a Title I school
## 28093                                            6-Not a Title I school
## 28095                                            6-Not a Title I school
## 28101                                            6-Not a Title I school
## 28107                              2-Title I targeted assistance school
## 28120                                                              <NA>
## 28198                              2-Title I targeted assistance school
## 28202                                       5-Title I schoolwide school
## 28204                                            6-Not a Title I school
## 28205                                       5-Title I schoolwide school
## 28209                                            6-Not a Title I school
## 28211                                            6-Not a Title I school
## 28213                                            6-Not a Title I school
## 28230                                                              <NA>
## 28248                                            6-Not a Title I school
## 28304                                                               n/a
## 28335                                                               n/a
## 28336                                            6-Not a Title I school
## 28338                                                               n/a
## 28339                                            6-Not a Title I school
## 28340                                                              <NA>
## 28341                                                               n/a
## 28346                                                               n/a
## 28348                                                              <NA>
## 28354                                                               n/a
## 28400                                                               n/a
## 28432                                                               n/a
## 28445                                            6-Not a Title I school
## 28450                                            6-Not a Title I school
## 28454                                                               n/a
## 28472                                            6-Not a Title I school
## 28475                                                              <NA>
## 28508                                       5-Title I schoolwide school
## 28547                                                               n/a
## 28574          1-Title I targeted assistance eligible school-No program
## 28579                                            6-Not a Title I school
## 28585                                       5-Title I schoolwide school
## 28606                                                              <NA>
## 28628                                                               n/a
## 28659                                            6-Not a Title I school
## 28660                                            6-Not a Title I school
## 28661                                            6-Not a Title I school
## 28730                              2-Title I targeted assistance school
## 28754                                            6-Not a Title I school
## 28781                                                               n/a
## 28791                                            6-Not a Title I school
## 28830                              2-Title I targeted assistance school
## 28842                                            6-Not a Title I school
## 28843                                       5-Title I schoolwide school
## 28921                                            6-Not a Title I school
## 28922                                            6-Not a Title I school
## 28932                                            6-Not a Title I school
## 28933                                            6-Not a Title I school
## 28989                                                               n/a
## 28991                                                               n/a
## 28994                                                              <NA>
## 28995                                                              <NA>
## 28996                                                              <NA>
## 29010                                                               n/a
## 29013                                            6-Not a Title I school
## 29016                              2-Title I targeted assistance school
## 29022                                                               n/a
## 29026                                            6-Not a Title I school
## 29100                                            6-Not a Title I school
## 29101                                            6-Not a Title I school
## 29105                                            6-Not a Title I school
## 29128                                       5-Title I schoolwide school
## 29178                                                               n/a
## 29195                                                               n/a
## 29207                                            6-Not a Title I school
## 29208                                            6-Not a Title I school
## 29216          1-Title I targeted assistance eligible school-No program
## 29218          1-Title I targeted assistance eligible school-No program
## 29230                                                              <NA>
## 29251                                                              <NA>
## 29300                                            6-Not a Title I school
## 29311                                            6-Not a Title I school
## 29318                              2-Title I targeted assistance school
## 29395                                            6-Not a Title I school
## 29398                                                              <NA>
## 29406                                            6-Not a Title I school
## 29407                                            6-Not a Title I school
## 29410                                            6-Not a Title I school
## 29411                                            6-Not a Title I school
## 29422                                            6-Not a Title I school
## 29423                                            6-Not a Title I school
## 29428                                            6-Not a Title I school
## 29527                                                               n/a
## 29546                                                               n/a
## 29569                                                               n/a
## 29587                                                              <NA>
## 29596                                                              <NA>
## 29652                                                              <NA>
## 29669                                                              <NA>
## 29702                                            6-Not a Title I school
## 29757                                            6-Not a Title I school
## 29795                                                              <NA>
## 29818                                                              <NA>
## 29871                                                               n/a
## 29882                                            6-Not a Title I school
## 29937                                       5-Title I schoolwide school
## 29939                                            6-Not a Title I school
## 29953                                                               n/a
## 29977                                                               n/a
## 30024                                            6-Not a Title I school
## 30028                                            6-Not a Title I school
## 30029                                            6-Not a Title I school
## 30031                                            6-Not a Title I school
## 30058                                            6-Not a Title I school
## 30153                                            6-Not a Title I school
## 30256                                                               n/a
## 30260                                       5-Title I schoolwide school
## 30325                                                               n/a
## 30333                                                               n/a
## 30347                              2-Title I targeted assistance school
## 30349                                                               n/a
## 30489                                       5-Title I schoolwide school
## 30490 3-Title I schoolwide eligible-Title I targeted assistance program
## 30502                                       5-Title I schoolwide school
## 30505                                       5-Title I schoolwide school
## 30521                                            6-Not a Title I school
## 30590                                                               n/a
## 30609                                                              <NA>
## 30616                                                               n/a
## 30721                                            6-Not a Title I school
## 30723                                            6-Not a Title I school
## 30781                                       5-Title I schoolwide school
## 30783                                       5-Title I schoolwide school
## 30784                                            6-Not a Title I school
## 30787                                            6-Not a Title I school
## 30788                                            6-Not a Title I school
## 30849                                                              <NA>
## 30870                                            6-Not a Title I school
## 30872                                                              <NA>
## 30875                                                              <NA>
## 30876                                                              <NA>
## 30886                                       5-Title I schoolwide school
## 30900                                                              <NA>
## 30920                                                               n/a
## 30928                                                               n/a
## 30929                                                               n/a
## 30933                                                               n/a
## 30957                                            6-Not a Title I school
## 31043                                            6-Not a Title I school
## 31107          1-Title I targeted assistance eligible school-No program
## 31115                                                               n/a
## 31168                                       5-Title I schoolwide school
## 31197                                                               n/a
## 31223                                       5-Title I schoolwide school
## 31250                                                              <NA>
## 31252                                            6-Not a Title I school
## 31298                                       5-Title I schoolwide school
## 31299                                       5-Title I schoolwide school
## 31314                                                               n/a
## 31327                                                               n/a
## 31328                                            6-Not a Title I school
## 31357                                       5-Title I schoolwide school
## 31388                                                              <NA>
## 31390                                                              <NA>
## 31395                                                              <NA>
## 31463                                            6-Not a Title I school
## 31464                                            6-Not a Title I school
## 31465                                            6-Not a Title I school
## 31467                                            6-Not a Title I school
## 31559                                                              <NA>
## 31645                                                              <NA>
## 31699                                       5-Title I schoolwide school
## 31709                                                               n/a
## 31733                              2-Title I targeted assistance school
## 31740                                                               n/a
## 31751                                            6-Not a Title I school
## 31829                                                               n/a
## 31831                                                               n/a
## 31845                                                              <NA>
## 31850                                       5-Title I schoolwide school
## 31852                                                               n/a
## 31883                              2-Title I targeted assistance school
## 31888          1-Title I targeted assistance eligible school-No program
## 31910                                       5-Title I schoolwide school
## 31941                                                              <NA>
## 31942                                                              <NA>
## 31957                                                              <NA>
## 31968                                            6-Not a Title I school
## 31973                                                               n/a
## 31989 3-Title I schoolwide eligible-Title I targeted assistance program
## 32006                                                               n/a
## 32010                                                               n/a
## 32014                                                               n/a
## 32036                                                               n/a
## 32054                                            6-Not a Title I school
## 32060                                                               n/a
## 32081                                                               n/a
## 32082                                       5-Title I schoolwide school
## 32142                                                               n/a
## 32176                                            6-Not a Title I school
## 32179                                                               n/a
## 32273                                                              <NA>
## 32297                                                              <NA>
## 32298                                            6-Not a Title I school
## 32349                                       5-Title I schoolwide school
## 32366                                       5-Title I schoolwide school
## 32474                                                              <NA>
## 32573                                                               n/a
## 32574                                                               n/a
## 32576                                                               n/a
## 32577                                                               n/a
## 32578                                                               n/a
## 32579                                                               n/a
## 32580                                                               n/a
## 32581                                                               n/a
## 32639                                            6-Not a Title I school
## 32640                                                               n/a
## 32641                                                               n/a
## 32642                                            6-Not a Title I school
## 32651                                                               n/a
## 32710                                                               n/a
## 32733                                       5-Title I schoolwide school
## 32738                                       5-Title I schoolwide school
## 32753                                                              <NA>
## 32768                                                              <NA>
## 32779                                                               n/a
## 32784                                            6-Not a Title I school
## 32785                                            6-Not a Title I school
## 32786                                                               n/a
## 32787                                            6-Not a Title I school
## 32805                                       5-Title I schoolwide school
## 32822                                                               n/a
## 32879                                                              <NA>
## 32984                                       5-Title I schoolwide school
## 33021                                                               n/a
## 33083                                            6-Not a Title I school
## 33104                                                               n/a
## 33122                                                              <NA>
## 33198                                                              <NA>
## 33228                                                               n/a
## 33263                                                              <NA>
## 33281                                                              <NA>
## 33292                                            6-Not a Title I school
## 33293                                                              <NA>
## 33317                                                              <NA>
## 33337                                                              <NA>
## 33343                                                              <NA>
## 33344                                                              <NA>
## 33360                                            6-Not a Title I school
## 33388                                                              <NA>
## 33416                              2-Title I targeted assistance school
## 33473                                            6-Not a Title I school
## 33496                                                               n/a
## 33499                                                               n/a
## 33536                                                              <NA>
## 33562                                       5-Title I schoolwide school
## 33591                                                               n/a
## 33592                                                               n/a
## 33614                                                               n/a
## 33620                                                              <NA>
## 33666                                                              <NA>
## 33701                                                              <NA>
## 33758                                       5-Title I schoolwide school
## 33804                                            6-Not a Title I school
## 33805                                            6-Not a Title I school
## 33829                                                               n/a
## 33945                                       5-Title I schoolwide school
## 33950                                       5-Title I schoolwide school
## 33956                                            6-Not a Title I school
## 33971                                       5-Title I schoolwide school
## 33973                                                               n/a
## 33976                                            6-Not a Title I school
## 33979                                            6-Not a Title I school
## 33994                                                               n/a
## 34050                                            6-Not a Title I school
## 34077                                            6-Not a Title I school
## 34078                                            6-Not a Title I school
## 34079                                            6-Not a Title I school
## 34124                                                               n/a
## 34145                                                               n/a
## 34152                                                              <NA>
## 34183                                                              <NA>
## 34190                                                              <NA>
## 34193                                                              <NA>
## 34197                                                               n/a
## 34227                                            6-Not a Title I school
## 34235                                            6-Not a Title I school
## 34236                                            6-Not a Title I school
## 34237                                            6-Not a Title I school
## 34238                                            6-Not a Title I school
## 34239                                            6-Not a Title I school
## 34240                                            6-Not a Title I school
## 34241                                            6-Not a Title I school
## 34242                                            6-Not a Title I school
## 34243                                            6-Not a Title I school
## 34244                                            6-Not a Title I school
## 34245                                            6-Not a Title I school
## 34246                                            6-Not a Title I school
## 34247                                            6-Not a Title I school
## 34248                                            6-Not a Title I school
## 34249                                            6-Not a Title I school
## 34250                                            6-Not a Title I school
## 34251                                       5-Title I schoolwide school
## 34252                                            6-Not a Title I school
## 34253                                            6-Not a Title I school
## 34254                                            6-Not a Title I school
## 34255                                            6-Not a Title I school
## 34256                                            6-Not a Title I school
## 34302                                                              <NA>
## 34303                                                              <NA>
## 34323                                            6-Not a Title I school
## 34329                                                               n/a
## 34331                                                              <NA>
## 34336                                            6-Not a Title I school
## 34341                                                              <NA>
## 34359                                            6-Not a Title I school
## 34365                                                              <NA>
## 34369                                            6-Not a Title I school
## 34436                                                              <NA>
## 34439                                                              <NA>
## 34445                                            6-Not a Title I school
## 34525                                                               n/a
## 34559                                                               n/a
## 34560                                                               n/a
## 34583                                                               n/a
## 34719                                            6-Not a Title I school
## 34743                              2-Title I targeted assistance school
## 34752                                                              <NA>
## 34754                                                              <NA>
## 34797                                       5-Title I schoolwide school
## 34855                                                              <NA>
## 34870                                                              <NA>
## 34968                                            6-Not a Title I school
## 34969                                            6-Not a Title I school
## 34971                                                              <NA>
## 35001                                            6-Not a Title I school
## 35040                                                              <NA>
## 35065                                       5-Title I schoolwide school
## 35069                                                               n/a
## 35075                                                               n/a
## 35076                                       5-Title I schoolwide school
## 35077                                                              <NA>
## 35096                                                              <NA>
## 35134                                                               n/a
## 35143                                                               n/a
## 35152          1-Title I targeted assistance eligible school-No program
## 35167                                            6-Not a Title I school
## 35168                                            6-Not a Title I school
## 35169                                       5-Title I schoolwide school
## 35252                                            6-Not a Title I school
## 35261                                                               n/a
## 35271                                            6-Not a Title I school
## 35289                                                              <NA>
## 35294                                            6-Not a Title I school
## 35338                                                               n/a
## 35339                                            6-Not a Title I school
## 35428                                            6-Not a Title I school
## 35457                                            6-Not a Title I school
## 35479                                                               n/a
## 35494                                                               n/a
## 35595                                                               n/a
## 35694                                            6-Not a Title I school
## 35695                                            6-Not a Title I school
## 35696                                            6-Not a Title I school
## 35697                                                               n/a
## 35875                                       5-Title I schoolwide school
## 35962                                                              <NA>
## 35972                                            6-Not a Title I school
## 35973                                            6-Not a Title I school
## 36024                                            6-Not a Title I school
## 36025                                                               n/a
## 36026                                            6-Not a Title I school
## 36038                                            6-Not a Title I school
## 36065                                                               n/a
## 36116                              2-Title I targeted assistance school
## 36316                                                               n/a
## 36382                                            6-Not a Title I school
## 36383                                            6-Not a Title I school
## 36384                                            6-Not a Title I school
## 36385                                            6-Not a Title I school
## 36402                                            6-Not a Title I school
## 36449                                            6-Not a Title I school
## 36458                                                               n/a
## 36510                                            6-Not a Title I school
## 36557                                                              <NA>
## 36571                                            6-Not a Title I school
## 36588                                                               n/a
## 36661                                            6-Not a Title I school
## 36680                                                              <NA>
## 36691                                                               n/a
## 36692                                       5-Title I schoolwide school
## 36693                                       5-Title I schoolwide school
## 36694                                       5-Title I schoolwide school
## 36696                                                              <NA>
## 36699                                            6-Not a Title I school
## 36752                                                               n/a
## 36807                                                               n/a
## 36808                                       5-Title I schoolwide school
## 36809                                                               n/a
## 36821                                            6-Not a Title I school
## 36893                              2-Title I targeted assistance school
## 36894                              2-Title I targeted assistance school
## 36966                                            6-Not a Title I school
## 36988                                            6-Not a Title I school
## 37076                                                              <NA>
## 37138                                                               n/a
## 37158                                            6-Not a Title I school
## 37197                                       5-Title I schoolwide school
## 37227                                       5-Title I schoolwide school
## 37243                   4-Title I schoolwide eligible school-No program
## 37265                                       5-Title I schoolwide school
## 37373                                       5-Title I schoolwide school
## 37421                                            6-Not a Title I school
## 37447                                       5-Title I schoolwide school
## 37458                   4-Title I schoolwide eligible school-No program
## 37522                                                               n/a
## 37523                                                               n/a
## 37542                                                               n/a
## 37575                                                               n/a
## 37581                                                              <NA>
## 37638                                            6-Not a Title I school
## 37668                                                              <NA>
## 37731                                       5-Title I schoolwide school
## 37751                                            6-Not a Title I school
## 37754                                            6-Not a Title I school
## 37759                                            6-Not a Title I school
## 37790                                            6-Not a Title I school
## 37795                                            6-Not a Title I school
## 37841                                                              <NA>
## 37866                                                               n/a
## 37869                                       5-Title I schoolwide school
## 37871                                            6-Not a Title I school
## 37872                                       5-Title I schoolwide school
## 37877                                            6-Not a Title I school
## 37892                                                              <NA>
## 37932                                            6-Not a Title I school
## 37933                                                              <NA>
## 37934                                                              <NA>
## 37940                                                               n/a
## 37941                                            6-Not a Title I school
## 37947                                                               n/a
## 37950          1-Title I targeted assistance eligible school-No program
## 37951                                                               n/a
## 37952                                                               n/a
## 37981                                            6-Not a Title I school
## 37982                                            6-Not a Title I school
## 38055                                                               n/a
## 38057                                                               n/a
## 38127                                                              <NA>
## 38149                                            6-Not a Title I school
## 38151                                            6-Not a Title I school
## 38153                                            6-Not a Title I school
## 38154                                            6-Not a Title I school
## 38160                                            6-Not a Title I school
## 38169                                            6-Not a Title I school
## 38212                                            6-Not a Title I school
## 38214                                                               n/a
## 38238                   4-Title I schoolwide eligible school-No program
## 38251                                            6-Not a Title I school
## 38340 3-Title I schoolwide eligible-Title I targeted assistance program
## 38349                                                              <NA>
## 38427 3-Title I schoolwide eligible-Title I targeted assistance program
## 38433                                            6-Not a Title I school
## 38453                                       5-Title I schoolwide school
## 38522                                            6-Not a Title I school
## 38526                                            6-Not a Title I school
## 38541                                            6-Not a Title I school
## 38560                                                              <NA>
## 38561                   4-Title I schoolwide eligible school-No program
## 38562                                            6-Not a Title I school
## 38596                                                               n/a
## 38607                                            6-Not a Title I school
## 38608                                                               n/a
## 38609                                            6-Not a Title I school
## 38622                              2-Title I targeted assistance school
## 38626                                            6-Not a Title I school
## 38627                                            6-Not a Title I school
## 38628                                            6-Not a Title I school
## 38629                                            6-Not a Title I school
## 38631                   4-Title I schoolwide eligible school-No program
## 38632                                            6-Not a Title I school
## 38688                                            6-Not a Title I school
## 38690                                            6-Not a Title I school
## 38711                                            6-Not a Title I school
## 38736                                                               n/a
## 38787                                            6-Not a Title I school
## 38799                                            6-Not a Title I school
## 38809                                            6-Not a Title I school
## 38810                                       5-Title I schoolwide school
## 38815                                       5-Title I schoolwide school
## 38895                                            6-Not a Title I school
## 38916                                       5-Title I schoolwide school
## 38933                                                               n/a
## 38962                                            6-Not a Title I school
## 38970                                            6-Not a Title I school
## 39085                                       5-Title I schoolwide school
## 39089                                            6-Not a Title I school
## 39124                                            6-Not a Title I school
## 39138                              2-Title I targeted assistance school
## 39173                                       5-Title I schoolwide school
## 39213                                            6-Not a Title I school
## 39289                                                               n/a
## 39457                                                               n/a
## 39458                                            6-Not a Title I school
## 39459                                                               n/a
## 39466                                            6-Not a Title I school
## 39480                                       5-Title I schoolwide school
## 39511                                            6-Not a Title I school
## 39525                                       5-Title I schoolwide school
## 39526                                            6-Not a Title I school
## 39534                                            6-Not a Title I school
## 39535                                                               n/a
## 39536                                            6-Not a Title I school
## 39585                                                              <NA>
## 39592                                                              <NA>
## 39600                                                              <NA>
## 39636                                                               n/a
## 39638                                                              <NA>
## 39672                                            6-Not a Title I school
## 39677                                            6-Not a Title I school
## 39739                                                               n/a
## 39743                   4-Title I schoolwide eligible school-No program
## 39772                                                               n/a
## 39775                                            6-Not a Title I school
## 39777                                            6-Not a Title I school
## 39778                                                              <NA>
## 39780                                                               n/a
## 39781                                       5-Title I schoolwide school
## 39795                                                               n/a
## 39874                                                               n/a
## 39915                                       5-Title I schoolwide school
## 39933                                                              <NA>
## 39959                                                               n/a
## 39961                                            6-Not a Title I school
## 39962                                            6-Not a Title I school
## 39976                                            6-Not a Title I school
## 39978                                            6-Not a Title I school
## 39979                              2-Title I targeted assistance school
## 39980                                            6-Not a Title I school
## 40009                                            6-Not a Title I school
## 40025                                       5-Title I schoolwide school
## 40044                                                              <NA>
## 40065                                            6-Not a Title I school
## 40068                                            6-Not a Title I school
## 40070                                            6-Not a Title I school
## 40071                                                               n/a
## 40073                                                               n/a
## 40074                                            6-Not a Title I school
## 40075                                            6-Not a Title I school
## 40077                                                               n/a
## 40078                                            6-Not a Title I school
## 40079                                            6-Not a Title I school
## 40081                                            6-Not a Title I school
## 40138                                                               n/a
## 40145                                                               n/a
## 40146                                                               n/a
## 40243                              2-Title I targeted assistance school
## 40253                                            6-Not a Title I school
## 40255                                                              <NA>
## 40354                                                              <NA>
## 40383                                                               n/a
## 40402                                                               n/a
## 40421                                                               n/a
## 40449                                                              <NA>
## 40520                                            6-Not a Title I school
## 40521                                                               n/a
## 40522                                            6-Not a Title I school
## 40534                                                               n/a
## 40537                                                               n/a
## 40561                                                              <NA>
## 40592                                            6-Not a Title I school
## 40595                                            6-Not a Title I school
## 40598                                            6-Not a Title I school
## 40657                              2-Title I targeted assistance school
## 40730                                            6-Not a Title I school
## 40732                                            6-Not a Title I school
## 40733                                            6-Not a Title I school
## 40735                                       5-Title I schoolwide school
## 40762                              2-Title I targeted assistance school
## 40763                              2-Title I targeted assistance school
## 40789                                                               n/a
## 40808                                                              <NA>
## 40832                   4-Title I schoolwide eligible school-No program
## 40851                                            6-Not a Title I school
## 40918                                                               n/a
## 41002                                            6-Not a Title I school
## 41005                                       5-Title I schoolwide school
## 41020                                       5-Title I schoolwide school
## 41021                                       5-Title I schoolwide school
## 41034                                                              <NA>
## 41035                                                              <NA>
## 41036                                                              <NA>
## 41038                                                              <NA>
## 41053                                            6-Not a Title I school
## 41054                                            6-Not a Title I school
## 41097                                       5-Title I schoolwide school
## 41098                                       5-Title I schoolwide school
## 41099                                       5-Title I schoolwide school
## 41100                                       5-Title I schoolwide school
## 41101                                       5-Title I schoolwide school
## 41109                                       5-Title I schoolwide school
## 41110                                       5-Title I schoolwide school
## 41111                                       5-Title I schoolwide school
## 41112                                       5-Title I schoolwide school
## 41113                                       5-Title I schoolwide school
## 41114                                       5-Title I schoolwide school
## 41115                                       5-Title I schoolwide school
## 41123                                            6-Not a Title I school
## 41124                                       5-Title I schoolwide school
## 41125                              2-Title I targeted assistance school
## 41126                              2-Title I targeted assistance school
## 41139                                       5-Title I schoolwide school
## 41140                              2-Title I targeted assistance school
## 41141                                       5-Title I schoolwide school
## 41142                                       5-Title I schoolwide school
## 41143                                       5-Title I schoolwide school
## 41146                                       5-Title I schoolwide school
## 41186                                                               n/a
## 41198                                            6-Not a Title I school
## 41241                                            6-Not a Title I school
## 41257                                                               n/a
## 41277                                                               n/a
## 41301                                                              <NA>
## 41307                                                              <NA>
## 41310                                                              <NA>
## 41316                                                              <NA>
## 41331                                                               n/a
## 41342                                            6-Not a Title I school
## 41344                                            6-Not a Title I school
## 41395                                            6-Not a Title I school
## 41402                                                              <NA>
## 41486                                                               n/a
## 41488                                                               n/a
## 41542                                                              <NA>
## 41545                                                               n/a
## 41574                                            6-Not a Title I school
## 41577                                                               n/a
## 41599                                       5-Title I schoolwide school
## 41600                                       5-Title I schoolwide school
## 41607                                                              <NA>
## 41608                                                              <NA>
## 41609                                                              <NA>
## 41611                                                              <NA>
## 41612                                                              <NA>
## 41616                                       5-Title I schoolwide school
## 41626          1-Title I targeted assistance eligible school-No program
## 41629                              2-Title I targeted assistance school
## 41633                                       5-Title I schoolwide school
## 41637                                            6-Not a Title I school
## 41640                                       5-Title I schoolwide school
## 41641                                       5-Title I schoolwide school
## 41642                                       5-Title I schoolwide school
## 41643                                       5-Title I schoolwide school
## 41644                                            6-Not a Title I school
## 41652                                                               n/a
## 41685                                            6-Not a Title I school
## 41686                                            6-Not a Title I school
## 41704                                            6-Not a Title I school
## 41716                                                              <NA>
## 41719                   4-Title I schoolwide eligible school-No program
## 41720                   4-Title I schoolwide eligible school-No program
## 41725          1-Title I targeted assistance eligible school-No program
## 41735                                       5-Title I schoolwide school
## 41753                                                               n/a
## 41792                                                              <NA>
## 41847                                            6-Not a Title I school
## 41854                                            6-Not a Title I school
## 41907                                                              <NA>
## 42016                              2-Title I targeted assistance school
## 42029                                                              <NA>
## 42040                              2-Title I targeted assistance school
## 42054          1-Title I targeted assistance eligible school-No program
## 42062                                                               n/a
## 42121                                                              <NA>
## 42142                              2-Title I targeted assistance school
## 42154                              2-Title I targeted assistance school
## 42157                              2-Title I targeted assistance school
## 42173          1-Title I targeted assistance eligible school-No program
## 42180                                                              <NA>
## 42183                                                               n/a
## 42252                                            6-Not a Title I school
## 42338                                                              <NA>
## 42388                                            6-Not a Title I school
## 42409                                                              <NA>
## 42424                                                               n/a
## 42429                                       5-Title I schoolwide school
## 42448                                                              <NA>
## 42485                                            6-Not a Title I school
## 42490                                       5-Title I schoolwide school
## 42495                                       5-Title I schoolwide school
## 42523                                            6-Not a Title I school
## 42525                                            6-Not a Title I school
## 42526                                                               n/a
## 42636                                                               n/a
## 42637                                                               n/a
## 42644                                            6-Not a Title I school
## 42652                                                               n/a
## 42653                                                               n/a
## 42654                                            6-Not a Title I school
## 42661                                            6-Not a Title I school
## 42704                                                               n/a
## 42705                                                               n/a
## 42706                                                               n/a
## 42707                                            6-Not a Title I school
## 42708                                            6-Not a Title I school
## 42803                                       5-Title I schoolwide school
## 42845                                                               n/a
## 42911                                            6-Not a Title I school
## 42913                                       5-Title I schoolwide school
## 42961                                                               n/a
## 42992                                                               n/a
## 43046                                                              <NA>
## 43053                                                              <NA>
## 43163                                                               n/a
## 43164                                                               n/a
## 43165                                                               n/a
## 43181                                            6-Not a Title I school
## 43220                              2-Title I targeted assistance school
## 43239                                            6-Not a Title I school
## 43244                                            6-Not a Title I school
## 43245                                            6-Not a Title I school
## 43248                                                               n/a
## 43249                                                               n/a
## 43250                                                               n/a
## 43251                                                               n/a
## 43253                                                               n/a
## 43302                                                              <NA>
## 43366                                                              <NA>
## 43500                                                              <NA>
## 43509                                            6-Not a Title I school
## 43531                                                               n/a
## 43532                                                               n/a
## 43533                                            6-Not a Title I school
## 43564                                       5-Title I schoolwide school
## 43637                                            6-Not a Title I school
## 43638                                            6-Not a Title I school
## 43667                                                              <NA>
## 43668                                                              <NA>
## 43673                                                              <NA>
## 43674                                                              <NA>
## 43786                                       5-Title I schoolwide school
## 43794                                                              <NA>
## 43800                                            6-Not a Title I school
## 43833                                            6-Not a Title I school
## 43839                                            6-Not a Title I school
## 43840                                            6-Not a Title I school
## 43841                                            6-Not a Title I school
## 43843                                            6-Not a Title I school
## 43858                                            6-Not a Title I school
## 43909                                            6-Not a Title I school
## 43914                                                              <NA>
## 43941                                                              <NA>
## 43942                                                              <NA>
## 43943                                                              <NA>
## 43945                                                              <NA>
## 44002                                                               n/a
## 44016                                            6-Not a Title I school
## 44041                                                               n/a
## 44043                                            6-Not a Title I school
## 44151                                            6-Not a Title I school
## 44166                                                               n/a
## 44189                                                              <NA>
## 44227                                            6-Not a Title I school
## 44236                                       5-Title I schoolwide school
## 44246                                                               n/a
## 44271                                                               n/a
## 44319                                                               n/a
## 44347                                                              <NA>
## 44393                                            6-Not a Title I school
## 44425                                                              <NA>
## 44435                                                               n/a
## 44557                                            6-Not a Title I school
## 44649                                       5-Title I schoolwide school
## 44763                                                               n/a
## 44764                                                               n/a
## 44766                                                              <NA>
## 44768                              2-Title I targeted assistance school
## 44778                                            6-Not a Title I school
## 44781                                            6-Not a Title I school
## 44786                                            6-Not a Title I school
## 44791                                            6-Not a Title I school
## 44829                                                               n/a
## 44955                                            6-Not a Title I school
## 44961                                                              <NA>
## 44993                                            6-Not a Title I school
## 44994                                            6-Not a Title I school
## 44995                                                              <NA>
## 45101                                                              <NA>
## 45145                                                              <NA>
## 45174                                                              <NA>
## 45183                                                               n/a
## 45188                                                               n/a
## 45207                                                               n/a
## 45226                                                               n/a
## 45241                                                              <NA>
## 45243                                            6-Not a Title I school
## 45244                                            6-Not a Title I school
## 45245                                            6-Not a Title I school
## 45247                                            6-Not a Title I school
## 45249                                            6-Not a Title I school
## 45252                                                               n/a
## 45255                                                              <NA>
## 45256                                                               n/a
## 45259                                                               n/a
## 45260                                            6-Not a Title I school
## 45266                                                              <NA>
## 45314                                                               n/a
## 45316                                                              <NA>
## 45322                                            6-Not a Title I school
## 45323                                       5-Title I schoolwide school
## 45324                                            6-Not a Title I school
## 45325                                       5-Title I schoolwide school
## 45326                                       5-Title I schoolwide school
## 45327                                            6-Not a Title I school
## 45328                                       5-Title I schoolwide school
## 45351                              2-Title I targeted assistance school
## 45383                                            6-Not a Title I school
## 45384                                            6-Not a Title I school
## 45385                                       5-Title I schoolwide school
## 45389                                       5-Title I schoolwide school
## 45393                                            6-Not a Title I school
## 45401                                            6-Not a Title I school
## 45449                                            6-Not a Title I school
## 45467                                                              <NA>
## 45549                                            6-Not a Title I school
## 45550                                                              <NA>
## 45558                                            6-Not a Title I school
## 45562                                            6-Not a Title I school
## 45563                                            6-Not a Title I school
## 45566                                                               n/a
## 45568                                            6-Not a Title I school
## 45591                                            6-Not a Title I school
## 45592                                       5-Title I schoolwide school
## 45646                                       5-Title I schoolwide school
## 45706                                            6-Not a Title I school
## 45803                                            6-Not a Title I school
## 45907                                            6-Not a Title I school
## 45918                                                               n/a
## 45946                                            6-Not a Title I school
## 46044                                                              <NA>
## 46105                                                               n/a
## 46107                                                               n/a
## 46166                                                              <NA>
## 46187          1-Title I targeted assistance eligible school-No program
## 46203                   4-Title I schoolwide eligible school-No program
## 46226                                            6-Not a Title I school
## 46233                                            6-Not a Title I school
## 46234                                            6-Not a Title I school
## 46289                                            6-Not a Title I school
## 46375                                                              <NA>
## 46430                                       5-Title I schoolwide school
## 46455          1-Title I targeted assistance eligible school-No program
## 46456                              2-Title I targeted assistance school
## 46457          1-Title I targeted assistance eligible school-No program
## 46458                              2-Title I targeted assistance school
## 46468                                                               n/a
## 46471                                                               n/a
## 46472                                                               n/a
## 46473                                                              <NA>
## 46475                                                               n/a
## 46476                                                              <NA>
## 46492                                            6-Not a Title I school
## 46500                                                              <NA>
## 46501                                                              <NA>
## 46641                                            6-Not a Title I school
## 46672                                            6-Not a Title I school
## 46673                                            6-Not a Title I school
## 46752                                            6-Not a Title I school
## 46925                                       5-Title I schoolwide school
## 46926                                            6-Not a Title I school
## 46956                                                              <NA>
## 46970                                                              <NA>
## 46978                                       5-Title I schoolwide school
## 47007                                            6-Not a Title I school
## 47096                                                               n/a
## 47101                                            6-Not a Title I school
## 47254                                            6-Not a Title I school
## 47256                                                              <NA>
## 47270                                            6-Not a Title I school
## 47303                                            6-Not a Title I school
## 47324                                                              <NA>
## 47326                                                              <NA>
## 47344                                                               n/a
## 47427                                       5-Title I schoolwide school
## 47433                                       5-Title I schoolwide school
## 47434                                       5-Title I schoolwide school
## 47435                                       5-Title I schoolwide school
## 47459                                                               n/a
## 47466                                       5-Title I schoolwide school
## 47477 3-Title I schoolwide eligible-Title I targeted assistance program
## 47478                                                               n/a
## 47498                                                              <NA>
## 47515                                                               n/a
## 47568                                                              <NA>
## 47580                                                               n/a
## 47581                                                               n/a
## 47583                                            6-Not a Title I school
## 47603                                            6-Not a Title I school
## 47659                                            6-Not a Title I school
## 47660                                                               n/a
## 47661                                            6-Not a Title I school
## 47662                                                               n/a
## 47682                                                              <NA>
## 47693                                                              <NA>
## 47730                                                              <NA>
## 47732                                                              <NA>
## 47761                                                               n/a
## 47770                                            6-Not a Title I school
## 47775                                                               n/a
## 47820                                                              <NA>
## 47924                                       5-Title I schoolwide school
## 47937                                            6-Not a Title I school
## 47938                                       5-Title I schoolwide school
## 47959                                            6-Not a Title I school
## 48017                                       5-Title I schoolwide school
## 48020                                                               n/a
## 48021                                            6-Not a Title I school
## 48022                                                               n/a
## 48034                                                               n/a
## 48096                                            6-Not a Title I school
## 48136                                                               n/a
## 48187                                            6-Not a Title I school
## 48189                                            6-Not a Title I school
## 48192                                                              <NA>
## 48195                              2-Title I targeted assistance school
## 48200                                            6-Not a Title I school
## 48275                                       5-Title I schoolwide school
## 48277                                            6-Not a Title I school
## 48279                                       5-Title I schoolwide school
## 48315                                                              <NA>
## 48389                                                               n/a
## 48400          1-Title I targeted assistance eligible school-No program
## 48509                                                               n/a
## 48515                                                               n/a
## 48534                                            6-Not a Title I school
## 48594                                                               n/a
## 48634                                                              <NA>
## 48661                                                               n/a
## 48677                                       5-Title I schoolwide school
## 48737                                            6-Not a Title I school
## 48748                                                               n/a
## 48779                                       5-Title I schoolwide school
## 48786                                            6-Not a Title I school
## 48802                                                               n/a
## 48813                                                               n/a
## 48835                                       5-Title I schoolwide school
## 48863                                                               n/a
## 48945                                                              <NA>
## 48956                              2-Title I targeted assistance school
## 48987                                            6-Not a Title I school
## 49000                                       5-Title I schoolwide school
## 49040                                                               n/a
## 49052                                                               n/a
## 49123                                            6-Not a Title I school
## 49124                                       5-Title I schoolwide school
## 49126                                                               n/a
## 49177                                            6-Not a Title I school
## 49179                              2-Title I targeted assistance school
## 49180                              2-Title I targeted assistance school
## 49192 3-Title I schoolwide eligible-Title I targeted assistance program
## 49193                              2-Title I targeted assistance school
## 49194 3-Title I schoolwide eligible-Title I targeted assistance program
## 49195 3-Title I schoolwide eligible-Title I targeted assistance program
## 49196 3-Title I schoolwide eligible-Title I targeted assistance program
## 49197                              2-Title I targeted assistance school
## 49232                                                              <NA>
## 49240                                                              <NA>
## 49247                                            6-Not a Title I school
## 49255                                                              <NA>
## 49256 3-Title I schoolwide eligible-Title I targeted assistance program
## 49257 3-Title I schoolwide eligible-Title I targeted assistance program
## 49258                              2-Title I targeted assistance school
## 49259 3-Title I schoolwide eligible-Title I targeted assistance program
## 49262          1-Title I targeted assistance eligible school-No program
## 49263                                                              <NA>
## 49269                                                               n/a
## 49353                                                               n/a
## 49355                                                               n/a
## 49429                                                               n/a
## 49430                                                               n/a
## 49480                                                               n/a
## 49511                                            6-Not a Title I school
## 49519                                            6-Not a Title I school
## 49523                                            6-Not a Title I school
## 49524                                       5-Title I schoolwide school
## 49526                              2-Title I targeted assistance school
## 49527                                       5-Title I schoolwide school
## 49529                                       5-Title I schoolwide school
## 49530                                       5-Title I schoolwide school
## 49531                              2-Title I targeted assistance school
## 49533                                       5-Title I schoolwide school
## 49534                              2-Title I targeted assistance school
## 49535                                       5-Title I schoolwide school
## 49536                              2-Title I targeted assistance school
## 49537                              2-Title I targeted assistance school
## 49538                              2-Title I targeted assistance school
## 49539                              2-Title I targeted assistance school
## 49540                                       5-Title I schoolwide school
## 49557                                            6-Not a Title I school
## 49558                                            6-Not a Title I school
## 49559                                            6-Not a Title I school
## 49591                                            6-Not a Title I school
## 49618                                            6-Not a Title I school
## 49620                                            6-Not a Title I school
## 49621                                            6-Not a Title I school
## 49623                                            6-Not a Title I school
## 49645                                                              <NA>
## 49646                                                              <NA>
## 49682                                                              <NA>
## 49726                                            6-Not a Title I school
## 49742                                                               n/a
## 49743                                                               n/a
## 49890                   4-Title I schoolwide eligible school-No program
## 49892                                                               n/a
## 49893                                                               n/a
## 49894                                            6-Not a Title I school
## 49895                                            6-Not a Title I school
## 49982                                                               n/a
## 50014                                       5-Title I schoolwide school
## 50039                                                              <NA>
## 50092                                       5-Title I schoolwide school
## 50097                                                               n/a
## 50099                                       5-Title I schoolwide school
## 50223                                            6-Not a Title I school
## 50289                              2-Title I targeted assistance school
## 50290                                       5-Title I schoolwide school
## 50295                                       5-Title I schoolwide school
## 50296                                       5-Title I schoolwide school
## 50303                                                               n/a
## 50304                                            6-Not a Title I school
## 50305                                            6-Not a Title I school
## 50315                                                              <NA>
## 50355                                       5-Title I schoolwide school
## 50366                                                              <NA>
## 50368                                       5-Title I schoolwide school
## 50370                                            6-Not a Title I school
## 50400                                       5-Title I schoolwide school
## 50403                                            6-Not a Title I school
## 50465                                                               n/a
## 50478          1-Title I targeted assistance eligible school-No program
## 50479          1-Title I targeted assistance eligible school-No program
## 50493                              2-Title I targeted assistance school
## 50495                                                               n/a
## 50522                                                               n/a
## 50561                                                              <NA>
## 50830                                                              <NA>
## 50899                                       5-Title I schoolwide school
## 50901                                       5-Title I schoolwide school
## 50911                                       5-Title I schoolwide school
## 50916                                       5-Title I schoolwide school
## 50951                                                               n/a
## 50952                                                              <NA>
## 50965                                       5-Title I schoolwide school
## 50966                                       5-Title I schoolwide school
## 51003                                                               n/a
## 51022                              2-Title I targeted assistance school
## 51083                                            6-Not a Title I school
## 51093                                                              <NA>
## 51196                                                               n/a
## 51203                                                              <NA>
## 51222                              2-Title I targeted assistance school
## 51237                                                               n/a
## 51243                                                              <NA>
## 51284                                                              <NA>
## 51321                                                              <NA>
## 51326                                            6-Not a Title I school
## 51358                                                              <NA>
## 51374                                                              <NA>
## 51419                                                               n/a
## 51459                                            6-Not a Title I school
## 51461                                       5-Title I schoolwide school
## 51476                                       5-Title I schoolwide school
## 51502                                            6-Not a Title I school
## 51573                                            6-Not a Title I school
## 51590                                            6-Not a Title I school
## 51594                                                              <NA>
## 51613                                                               n/a
## 51637                                            6-Not a Title I school
## 51686                                            6-Not a Title I school
## 51712                                                              <NA>
## 51720                                            6-Not a Title I school
## 51722                                            6-Not a Title I school
## 51728                                       5-Title I schoolwide school
## 51735                                            6-Not a Title I school
## 51736                                            6-Not a Title I school
## 51737                                            6-Not a Title I school
## 51738                                            6-Not a Title I school
## 51739                                            6-Not a Title I school
## 51740                                            6-Not a Title I school
## 51741                                       5-Title I schoolwide school
## 51765                                                               n/a
## 51809                                                               n/a
## 51811                                                              <NA>
## 51910                                            6-Not a Title I school
## 51936                                                               n/a
## 51963                                                               n/a
## 52033                                                               n/a
## 52055                                                               n/a
## 52063                                                               n/a
## 52069                                                               n/a
## 52092                                            6-Not a Title I school
## 52129                                                               n/a
## 52139                                            6-Not a Title I school
## 52154                                                               n/a
## 52155                                                               n/a
## 52204                                                               n/a
## 52210                                                              <NA>
## 52219                                                              <NA>
## 52222                                                              <NA>
## 52285                                       5-Title I schoolwide school
## 52375                                                               n/a
## 52420                                                              <NA>
## 52433                                            6-Not a Title I school
## 52434                                            6-Not a Title I school
## 52462                                                               n/a
## 52512                                                               n/a
## 52544                                                              <NA>
## 52568                                            6-Not a Title I school
## 52677                                                              <NA>
## 52705                                                              <NA>
## 52711                                                               n/a
## 52713                                                               n/a
## 52714                                                               n/a
## 52752                                                              <NA>
## 52763                                                              <NA>
## 52785                                                               n/a
## 52794                                                              <NA>
## 52828                                                              <NA>
## 52837                                                               n/a
## 52847                                       5-Title I schoolwide school
## 52875                                                              <NA>
## 52988                                                               n/a
## 52998                                       5-Title I schoolwide school
## 53039                                            6-Not a Title I school
## 53054                                                               n/a
## 53072                                                               n/a
## 53073                                                               n/a
## 53075                                                               n/a
## 53176                                       5-Title I schoolwide school
## 53239                                            6-Not a Title I school
## 53242                                                               n/a
## 53243                                            6-Not a Title I school
## 53244                                            6-Not a Title I school
## 53297                                            6-Not a Title I school
## 53314                                                               n/a
## 53319                                            6-Not a Title I school
## 53341                                                              <NA>
## 53392                                                              <NA>
## 53407                              2-Title I targeted assistance school
## 53461                                                              <NA>
## 53472                                            6-Not a Title I school
## 53473                                       5-Title I schoolwide school
## 53474                                            6-Not a Title I school
## 53589                              2-Title I targeted assistance school
## 53620                                            6-Not a Title I school
## 53705                                                               n/a
## 53730                                            6-Not a Title I school
## 53733                                            6-Not a Title I school
## 53734                                            6-Not a Title I school
## 53846                                                              <NA>
## 53862                                            6-Not a Title I school
## 53863                                       5-Title I schoolwide school
## 53922                                                              <NA>
## 53978                                            6-Not a Title I school
## 53985                                            6-Not a Title I school
## 54026                                            6-Not a Title I school
## 54028                                            6-Not a Title I school
## 54138                              2-Title I targeted assistance school
## 54154                                                              <NA>
## 54186                                       5-Title I schoolwide school
## 54231                              2-Title I targeted assistance school
## 54252                                            6-Not a Title I school
## 54264                                            6-Not a Title I school
## 54265                                            6-Not a Title I school
## 54288                                       5-Title I schoolwide school
## 54296                                                               n/a
## 54301                                                               n/a
## 54336                                            6-Not a Title I school
## 54347                                                               n/a
## 54357                                                               n/a
## 54405                                            6-Not a Title I school
## 54414                                                               n/a
## 54416                                            6-Not a Title I school
## 54426                                       5-Title I schoolwide school
## 54637                                                               n/a
## 54646                              2-Title I targeted assistance school
## 54683                                                               n/a
## 54691                              2-Title I targeted assistance school
## 54721                                                               n/a
## 54743                                            6-Not a Title I school
## 54765                                       5-Title I schoolwide school
## 54791                                            6-Not a Title I school
## 54907                                                               n/a
## 54946                                                               n/a
## 54972                                                              <NA>
## 54976                                                               n/a
## 55018                                                              <NA>
## 55110                                       5-Title I schoolwide school
## 55121                                                              <NA>
## 55164                                                               n/a
## 55166                                       5-Title I schoolwide school
## 55187                                                               n/a
## 55203                                       5-Title I schoolwide school
## 55238                                                               n/a
## 55239                                                               n/a
## 55291                   4-Title I schoolwide eligible school-No program
## 55298                                       5-Title I schoolwide school
## 55299                                       5-Title I schoolwide school
## 55300                                       5-Title I schoolwide school
## 55306                                       5-Title I schoolwide school
## 55307                   4-Title I schoolwide eligible school-No program
## 55309                                       5-Title I schoolwide school
## 55312          1-Title I targeted assistance eligible school-No program
## 55314                                       5-Title I schoolwide school
## 55317                   4-Title I schoolwide eligible school-No program
## 55323                                       5-Title I schoolwide school
## 55331                                                              <NA>
## 55369                                       5-Title I schoolwide school
## 55412                                                              <NA>
## 55413                                                              <NA>
## 55414                                                              <NA>
## 55530          1-Title I targeted assistance eligible school-No program
## 55677                                                               n/a
## 55748                                                              <NA>
## 55754                                                              <NA>
## 55901                                            6-Not a Title I school
## 55902                                            6-Not a Title I school
## 55903                                            6-Not a Title I school
## 56099                                       5-Title I schoolwide school
## 56102                                       5-Title I schoolwide school
## 56123                                                              <NA>
## 56133                                                               n/a
## 56183                                            6-Not a Title I school
## 56184                                            6-Not a Title I school
## 56213                                                               n/a
## 56232                              2-Title I targeted assistance school
## 56233                                            6-Not a Title I school
## 56243                                            6-Not a Title I school
## 56295                                            6-Not a Title I school
## 56337                                            6-Not a Title I school
## 56358                                       5-Title I schoolwide school
## 56361                                                               n/a
## 56384                                       5-Title I schoolwide school
## 56419                                       5-Title I schoolwide school
## 56428                                                              <NA>
## 56619                              2-Title I targeted assistance school
## 56678                                       5-Title I schoolwide school
## 56739                              2-Title I targeted assistance school
## 56817                                                               n/a
## 56838                                                               n/a
## 56863                                                               n/a
## 56873                                            6-Not a Title I school
## 56880                                                               n/a
## 56904                                                               n/a
## 56918                                                               n/a
## 56931                                                              <NA>
## 56932                                                              <NA>
## 56933                                                              <NA>
## 56982                              2-Title I targeted assistance school
## 57060                                       5-Title I schoolwide school
## 57140                                                              <NA>
## 57141                                                              <NA>
## 57144                                                              <NA>
## 57152                                            6-Not a Title I school
## 57160                                       5-Title I schoolwide school
## 57161                                                               n/a
## 57167                                            6-Not a Title I school
## 57171                                            6-Not a Title I school
## 57198                                            6-Not a Title I school
## 57199                                            6-Not a Title I school
## 57226          1-Title I targeted assistance eligible school-No program
## 57228                                                               n/a
## 57230                                       5-Title I schoolwide school
## 57231                                       5-Title I schoolwide school
## 57234          1-Title I targeted assistance eligible school-No program
## 57238                                                               n/a
## 57252                                                               n/a
## 57264                                                               n/a
## 57270                                                               n/a
## 57276                                                               n/a
## 57278                                                               n/a
## 57287                                            6-Not a Title I school
## 57288                                            6-Not a Title I school
## 57289                                                               n/a
## 57297                   4-Title I schoolwide eligible school-No program
## 57298                                       5-Title I schoolwide school
## 57354                                                               n/a
## 57379                                            6-Not a Title I school
## 57385                                            6-Not a Title I school
## 57420                                                               n/a
## 57472                                            6-Not a Title I school
## 57478                                                              <NA>
## 57533                                                               n/a
## 57571                                            6-Not a Title I school
## 57595                                            6-Not a Title I school
## 57596                                       5-Title I schoolwide school
## 57603                                            6-Not a Title I school
## 57604                                       5-Title I schoolwide school
## 57609                                            6-Not a Title I school
## 57656                                            6-Not a Title I school
## 57665                                            6-Not a Title I school
## 57685                                                              <NA>
## 57688                                                               n/a
## 57689                                                               n/a
## 57690                                                               n/a
## 57691                                                               n/a
## 57692                                                               n/a
## 57694                                                               n/a
## 57695                                                               n/a
## 57696                                                               n/a
## 57778                                            6-Not a Title I school
## 57780                                       5-Title I schoolwide school
## 57788                                                               n/a
## 57791                                            6-Not a Title I school
## 57800                                       5-Title I schoolwide school
## 57848                                            6-Not a Title I school
## 57882                                            6-Not a Title I school
## 57904                                                              <NA>
## 57907                                                              <NA>
## 57912                                            6-Not a Title I school
## 57913                                            6-Not a Title I school
## 57925                                                              <NA>
## 57927                                                              <NA>
## 57966                                                               n/a
## 57984                                                               n/a
## 57993                                                               n/a
## 58065                                       5-Title I schoolwide school
## 58141                                            6-Not a Title I school
## 58185                                                               n/a
## 58204                                            6-Not a Title I school
## 58205                                       5-Title I schoolwide school
## 58219                                                               n/a
## 58222                                       5-Title I schoolwide school
## 58355                              2-Title I targeted assistance school
## 58359          1-Title I targeted assistance eligible school-No program
## 58363                                                              <NA>
## 58371                                       5-Title I schoolwide school
## 58373                                            6-Not a Title I school
## 58383                                            6-Not a Title I school
## 58393                                                               n/a
## 58400                                                               n/a
## 58405                                                              <NA>
## 58420                                                               n/a
## 58432                                                               n/a
## 58489          1-Title I targeted assistance eligible school-No program
## 58492                                                               n/a
## 58502                                            6-Not a Title I school
## 58505                                            6-Not a Title I school
## 58506                                            6-Not a Title I school
## 58520                              2-Title I targeted assistance school
## 58530                                            6-Not a Title I school
## 58536                                            6-Not a Title I school
## 58537                                            6-Not a Title I school
## 58554                                                              <NA>
## 58555                                                               n/a
## 58571                                            6-Not a Title I school
## 58572                                            6-Not a Title I school
## 58573                                            6-Not a Title I school
## 58600                                                              <NA>
## 58635                                       5-Title I schoolwide school
## 58658                                                              <NA>
## 58701                                                              <NA>
## 58702                                                              <NA>
## 58707                                                               n/a
## 58741                                                               n/a
## 58747                                                               n/a
## 58800                                                               n/a
## 58813                                       5-Title I schoolwide school
## 58814                                       5-Title I schoolwide school
## 58817                                                               n/a
## 58821                                                               n/a
## 58822                                                               n/a
## 58823                                                               n/a
## 58824                                                               n/a
## 58843                                            6-Not a Title I school
## 58848                                                              <NA>
## 58930                                            6-Not a Title I school
## 58953                                                               n/a
## 58954                                                              <NA>
## 58981                              2-Title I targeted assistance school
## 58985                                            6-Not a Title I school
## 58987                                            6-Not a Title I school
## 58988                                            6-Not a Title I school
## 58989                                            6-Not a Title I school
## 58991                                            6-Not a Title I school
## 58992                                            6-Not a Title I school
## 58995                                            6-Not a Title I school
## 59000                                       5-Title I schoolwide school
## 59006                                            6-Not a Title I school
## 59007                                            6-Not a Title I school
## 59016                                       5-Title I schoolwide school
## 59031                                                               n/a
## 59035                                                               n/a
## 59038                                            6-Not a Title I school
## 59076                                                               n/a
## 59081                                            6-Not a Title I school
## 59091                                       5-Title I schoolwide school
## 59108                                       5-Title I schoolwide school
## 59129                                            6-Not a Title I school
## 59158                                       5-Title I schoolwide school
## 59205                                                               n/a
## 59331                                                               n/a
## 59335                                                               n/a
## 59346                                            6-Not a Title I school
## 59351                                            6-Not a Title I school
## 59355                                            6-Not a Title I school
## 59359                                            6-Not a Title I school
## 59360                              2-Title I targeted assistance school
## 59416                                            6-Not a Title I school
## 59421                                       5-Title I schoolwide school
## 59447                                                              <NA>
## 59472                                                              <NA>
## 59477                                            6-Not a Title I school
## 59478                                                              <NA>
## 59482                                            6-Not a Title I school
## 59489                                                              <NA>
## 59491                                                              <NA>
## 59534                                            6-Not a Title I school
## 59564                                                               n/a
## 59677                                       5-Title I schoolwide school
## 59716                                       5-Title I schoolwide school
## 59758                                            6-Not a Title I school
## 59759                                            6-Not a Title I school
## 59770                                            6-Not a Title I school
## 59848                                                               n/a
## 59861                                            6-Not a Title I school
## 59864                                                               n/a
## 59865                                                              <NA>
## 59868                                                               n/a
## 59870                                            6-Not a Title I school
## 59875                                            6-Not a Title I school
## 59877                                            6-Not a Title I school
## 59881                                                              <NA>
## 59886                                                              <NA>
## 59901 3-Title I schoolwide eligible-Title I targeted assistance program
## 59917                                            6-Not a Title I school
## 59922                                            6-Not a Title I school
## 59924                                            6-Not a Title I school
## 59928                                            6-Not a Title I school
## 59933                                            6-Not a Title I school
## 59967                                                              <NA>
## 60008                                            6-Not a Title I school
## 60040                                            6-Not a Title I school
## 60041                                       5-Title I schoolwide school
## 60043                                       5-Title I schoolwide school
## 60058                                            6-Not a Title I school
## 60068                              2-Title I targeted assistance school
## 60081                                            6-Not a Title I school
## 60084                                                              <NA>
## 60089                                            6-Not a Title I school
## 60098                                       5-Title I schoolwide school
## 60099                                       5-Title I schoolwide school
## 60113                                            6-Not a Title I school
## 60118                                                               n/a
## 60162                                            6-Not a Title I school
## 60254                                                              <NA>
## 60255                                                               n/a
## 60276                                            6-Not a Title I school
## 60285                                            6-Not a Title I school
## 60289                                            6-Not a Title I school
## 60300                                       5-Title I schoolwide school
## 60329                                                               n/a
## 60346                                            6-Not a Title I school
## 60368                                            6-Not a Title I school
## 60375                                                              <NA>
## 60464                                       5-Title I schoolwide school
## 60517                                                               n/a
## 60528                                            6-Not a Title I school
## 60558                                                               n/a
## 60606                                                               n/a
## 60658                              2-Title I targeted assistance school
## 60662                                                              <NA>
## 60679                                                              <NA>
## 60682                                                               n/a
## 60683                                       5-Title I schoolwide school
## 60689                                                               n/a
## 60721                                       5-Title I schoolwide school
## 60755                              2-Title I targeted assistance school
## 60764                                                               n/a
## 60765                                                               n/a
## 60768                                                               n/a
## 60787                                       5-Title I schoolwide school
## 60859                                                               n/a
## 60860                                                               n/a
## 60862                                            6-Not a Title I school
## 60863                                                               n/a
## 60864                                            6-Not a Title I school
## 60865                                            6-Not a Title I school
## 60932                                                               n/a
## 60938                                                              <NA>
## 60940                                                               n/a
## 60941                                                               n/a
## 60942                                                               n/a
## 60943                                                               n/a
## 60944                                                               n/a
## 60945                                                               n/a
## 60946                                                               n/a
## 60947                                                               n/a
## 60948                                                               n/a
## 60956                                                              <NA>
## 60994                                       5-Title I schoolwide school
## 61018                              2-Title I targeted assistance school
## 61021                                                               n/a
## 61022                                                               n/a
## 61023                                                               n/a
## 61024                                                               n/a
## 61025                                                               n/a
## 61027                                                               n/a
## 61028                                                               n/a
## 61029                                                               n/a
## 61030                                                               n/a
## 61031                                                               n/a
## 61032                                                               n/a
## 61051                                                               n/a
## 61054                                            6-Not a Title I school
## 61055                                            6-Not a Title I school
## 61065                                                              <NA>
## 61070                                                               n/a
## 61073                                            6-Not a Title I school
## 61077                                            6-Not a Title I school
## 61140                                            6-Not a Title I school
## 61161                   4-Title I schoolwide eligible school-No program
## 61222                                            6-Not a Title I school
## 61225                              2-Title I targeted assistance school
## 61229                                                              <NA>
## 61270                                                              <NA>
## 61284                                                               n/a
## 61296                                            6-Not a Title I school
## 61298                                            6-Not a Title I school
## 61356                                            6-Not a Title I school
## 61357                                                              <NA>
## 61359                                                              <NA>
## 61360                                                              <NA>
## 61369                                            6-Not a Title I school
## 61376                                                               n/a
## 61378                                            6-Not a Title I school
## 61379          1-Title I targeted assistance eligible school-No program
## 61380          1-Title I targeted assistance eligible school-No program
## 61384                                                               n/a
## 61386                                       5-Title I schoolwide school
## 61438                                            6-Not a Title I school
## 61450                                                               n/a
## 61453                                            6-Not a Title I school
## 61455                                                               n/a
## 61456                                                               n/a
## 61457                                                               n/a
## 61459                                            6-Not a Title I school
## 61463                                       5-Title I schoolwide school
## 61464                                                               n/a
## 61563                                                               n/a
## 61586                                                               n/a
## 61588                              2-Title I targeted assistance school
## 61591                                       5-Title I schoolwide school
## 61600                                                               n/a
## 61611                                                              <NA>
## 61612                                                               n/a
## 61637                                            6-Not a Title I school
## 61697                                                              <NA>
## 61699                                                              <NA>
## 61754                                                               n/a
## 61766                                            6-Not a Title I school
## 61767                                            6-Not a Title I school
## 61781                                                               n/a
## 61802                                                              <NA>
## 61803                                                              <NA>
## 61843                                                              <NA>
## 61845                                       5-Title I schoolwide school
## 61866                                                               n/a
## 61868                                                               n/a
## 61876                                            6-Not a Title I school
## 62013                                       5-Title I schoolwide school
## 62051                                                               n/a
## 62125                                       5-Title I schoolwide school
## 62139                                            6-Not a Title I school
## 62140                                       5-Title I schoolwide school
## 62141                                                              <NA>
## 62144                                                              <NA>
## 62147                                                               n/a
## 62185                                            6-Not a Title I school
## 62192                                       5-Title I schoolwide school
## 62266                                                              <NA>
## 62267                                            6-Not a Title I school
## 62269                                            6-Not a Title I school
## 62305                                       5-Title I schoolwide school
## 62309                                            6-Not a Title I school
## 62310                                            6-Not a Title I school
## 62312                              2-Title I targeted assistance school
## 62315                              2-Title I targeted assistance school
## 62316 3-Title I schoolwide eligible-Title I targeted assistance program
## 62317 3-Title I schoolwide eligible-Title I targeted assistance program
## 62339                                            6-Not a Title I school
## 62340                                            6-Not a Title I school
## 62341                                            6-Not a Title I school
## 62342                                            6-Not a Title I school
## 62343                                            6-Not a Title I school
## 62344                                            6-Not a Title I school
## 62345                                            6-Not a Title I school
## 62346                                            6-Not a Title I school
## 62347                                            6-Not a Title I school
## 62348                                            6-Not a Title I school
## 62349                                            6-Not a Title I school
## 62350                                            6-Not a Title I school
## 62351                                            6-Not a Title I school
## 62352                                            6-Not a Title I school
## 62353                                            6-Not a Title I school
## 62354                                            6-Not a Title I school
## 62355                                            6-Not a Title I school
## 62373                                                               n/a
## 62408                                            6-Not a Title I school
## 62409                                            6-Not a Title I school
## 62410                                                               n/a
## 62414                                                               n/a
## 62415          1-Title I targeted assistance eligible school-No program
## 62445                                                               n/a
## 62446                                                               n/a
## 62450                                                               n/a
## 62453                                                               n/a
## 62456                                                               n/a
## 62523                                                              <NA>
## 62531                                                              <NA>
## 62557                                                               n/a
## 62574                                                               n/a
## 62644                                            6-Not a Title I school
## 62678                                                              <NA>
## 62679                                                               n/a
## 62687                                                              <NA>
## 62693                   4-Title I schoolwide eligible school-No program
## 62731                                                               n/a
## 62755                                       5-Title I schoolwide school
## 62756                              2-Title I targeted assistance school
## 62788                                            6-Not a Title I school
## 62803                                                              <NA>
## 62866                                                               n/a
## 62978                                                              <NA>
## 63014                                                               n/a
## 63041                                            6-Not a Title I school
## 63042                                            6-Not a Title I school
## 63044                                            6-Not a Title I school
## 63058                                                              <NA>
## 63094                                                               n/a
## 63111                                       5-Title I schoolwide school
## 63144                                            6-Not a Title I school
## 63145                                            6-Not a Title I school
## 63151                                                               n/a
## 63152                                                               n/a
## 63169                   4-Title I schoolwide eligible school-No program
## 63173                                       5-Title I schoolwide school
## 63174                                            6-Not a Title I school
## 63175                                       5-Title I schoolwide school
## 63206                                            6-Not a Title I school
## 63211                                            6-Not a Title I school
## 63239                                            6-Not a Title I school
## 63240                                            6-Not a Title I school
## 63279                                            6-Not a Title I school
## 63280                                            6-Not a Title I school
## 63291                                            6-Not a Title I school
## 63292                                            6-Not a Title I school
## 63344                              2-Title I targeted assistance school
## 63363                                            6-Not a Title I school
## 63365                                       5-Title I schoolwide school
## 63379                                            6-Not a Title I school
## 63380                                            6-Not a Title I school
## 63381                                            6-Not a Title I school
## 63382                              2-Title I targeted assistance school
## 63397                                                               n/a
## 63509                                            6-Not a Title I school
## 63511                                                               n/a
## 63519                                                               n/a
## 63615                                            6-Not a Title I school
## 63616                                                               n/a
## 63622                                                              <NA>
## 63623                                       5-Title I schoolwide school
## 63672                                            6-Not a Title I school
## 63674                                            6-Not a Title I school
## 63685                                                               n/a
## 63686                                                               n/a
## 63687                                                               n/a
## 63698                                                               n/a
## 63703                                                               n/a
## 63711                                                               n/a
## 63741                                       5-Title I schoolwide school
## 63749                                            6-Not a Title I school
## 63756                                            6-Not a Title I school
## 63780                                            6-Not a Title I school
## 63802                                            6-Not a Title I school
## 63818                                            6-Not a Title I school
## 63821                                       5-Title I schoolwide school
## 63822                                                              <NA>
## 63834                                       5-Title I schoolwide school
## 63903                                                              <NA>
## 64038                                       5-Title I schoolwide school
## 64095                                                               n/a
## 64146                                                              <NA>
## 64246                                            6-Not a Title I school
## 64284                                                              <NA>
## 64285                                                               n/a
## 64321                                            6-Not a Title I school
## 64322                                            6-Not a Title I school
## 64323                                            6-Not a Title I school
## 64327                                                              <NA>
## 64334                                                               n/a
## 64368                                                               n/a
## 64381                                                               n/a
## 64460                                            6-Not a Title I school
## 64502                                                              <NA>
## 64599                                            6-Not a Title I school
## 64601                                            6-Not a Title I school
## 64612                                                               n/a
## 64629                                                              <NA>
## 64646                                                               n/a
## 64679                                            6-Not a Title I school
## 64684                                            6-Not a Title I school
## 64733                                            6-Not a Title I school
## 64739                                                              <NA>
## 64753                                                              <NA>
## 64766                                            6-Not a Title I school
## 64783                                            6-Not a Title I school
## 64796                                       5-Title I schoolwide school
## 64797                                       5-Title I schoolwide school
## 64911                                            6-Not a Title I school
## 64913          1-Title I targeted assistance eligible school-No program
## 64984                                            6-Not a Title I school
## 65028                              2-Title I targeted assistance school
## 65030                                                              <NA>
## 65046                                                              <NA>
## 65056                                                              <NA>
## 65063                                                              <NA>
## 65064                                                              <NA>
## 65072          1-Title I targeted assistance eligible school-No program
## 65075                                                               n/a
## 65076                                                               n/a
## 65129                                       5-Title I schoolwide school
## 65134                                                               n/a
## 65136                                                               n/a
## 65172                              2-Title I targeted assistance school
## 65175                                            6-Not a Title I school
## 65186                                            6-Not a Title I school
## 65193                                            6-Not a Title I school
## 65194                                       5-Title I schoolwide school
## 65211                                            6-Not a Title I school
## 65214                                            6-Not a Title I school
## 65219                                       5-Title I schoolwide school
## 65220                                            6-Not a Title I school
## 65281          1-Title I targeted assistance eligible school-No program
## 65282                                            6-Not a Title I school
## 65285                                                               n/a
## 65286                                                               n/a
## 65287                                            6-Not a Title I school
## 65288                                            6-Not a Title I school
## 65309                                            6-Not a Title I school
## 65310                                                               n/a
## 65311                                            6-Not a Title I school
## 65323                                       5-Title I schoolwide school
## 65324                                       5-Title I schoolwide school
## 65325                                       5-Title I schoolwide school
## 65329                                       5-Title I schoolwide school
## 65330                                       5-Title I schoolwide school
## 65333                                            6-Not a Title I school
## 65334                                            6-Not a Title I school
## 65335                                            6-Not a Title I school
## 65336                                            6-Not a Title I school
## 65389                                                               n/a
## 65404                                            6-Not a Title I school
## 65405                                            6-Not a Title I school
## 65429                                       5-Title I schoolwide school
## 65430                                                              <NA>
## 65485                                                              <NA>
## 65559                                                              <NA>
## 65575                                                              <NA>
## 65602                                                               n/a
## 65622                                            6-Not a Title I school
## 65623                                            6-Not a Title I school
## 65636                                            6-Not a Title I school
## 65637                                            6-Not a Title I school
## 65638                                            6-Not a Title I school
## 65639                                            6-Not a Title I school
## 65640                                            6-Not a Title I school
## 65641                                            6-Not a Title I school
## 65642                                            6-Not a Title I school
## 65643                                       5-Title I schoolwide school
## 65644          1-Title I targeted assistance eligible school-No program
## 65687                                                              <NA>
## 65711                              2-Title I targeted assistance school
## 65712                                            6-Not a Title I school
## 65755                                                               n/a
## 65761                              2-Title I targeted assistance school
## 65768                                            6-Not a Title I school
## 65793                                                              <NA>
## 65794                                                              <NA>
## 65795                                                              <NA>
## 65796                                                              <NA>
## 65797                                                              <NA>
## 65799                                                               n/a
## 65800                                                               n/a
## 65821                                                              <NA>
## 65822                                                              <NA>
## 65823                                                              <NA>
## 65824                                                              <NA>
## 65825                                                              <NA>
## 65833                                            6-Not a Title I school
## 65834                                       5-Title I schoolwide school
## 65835                                       5-Title I schoolwide school
## 65837                                                               n/a
## 65859                                                              <NA>
## 65861                                            6-Not a Title I school
## 65899                                                               n/a
## 65905                                                              <NA>
## 65919                                                              <NA>
## 65956                                            6-Not a Title I school
## 65980                                            6-Not a Title I school
## 65981                                            6-Not a Title I school
## 66018                                                               n/a
## 66035                                            6-Not a Title I school
## 66036                              2-Title I targeted assistance school
## 66037                                            6-Not a Title I school
## 66044                                                              <NA>
## 66049                                                              <NA>
## 66059                                            6-Not a Title I school
## 66083                                                              <NA>
## 66089                              2-Title I targeted assistance school
## 66186                                            6-Not a Title I school
## 66187                                       5-Title I schoolwide school
## 66188                                                               n/a
## 66220                                            6-Not a Title I school
## 66221                                                               n/a
## 66222                                            6-Not a Title I school
## 66228                                            6-Not a Title I school
## 66242                                       5-Title I schoolwide school
## 66267                                            6-Not a Title I school
## 66370                                                               n/a
## 66397                                            6-Not a Title I school
## 66455                                                              <NA>
## 66470                                                              <NA>
## 66471                                                              <NA>
## 66496                                       5-Title I schoolwide school
## 66509                                                               n/a
## 66543                                                              <NA>
## 66544                                                              <NA>
## 66558                                                               n/a
## 66560                                                               n/a
## 66569                                                               n/a
## 66592                                            6-Not a Title I school
## 66593                                            6-Not a Title I school
## 66594                                            6-Not a Title I school
## 66595                                            6-Not a Title I school
## 66601                                            6-Not a Title I school
## 66602                                            6-Not a Title I school
## 66620                                                               n/a
## 66631                                            6-Not a Title I school
## 66632                                                               n/a
## 66640          1-Title I targeted assistance eligible school-No program
## 66641                                            6-Not a Title I school
## 66643                                                               n/a
## 66648                                            6-Not a Title I school
## 66651                                            6-Not a Title I school
## 66653                                            6-Not a Title I school
## 66660 3-Title I schoolwide eligible-Title I targeted assistance program
## 66669                                                               n/a
## 66681                                                              <NA>
## 66687                                                              <NA>
## 66691                              2-Title I targeted assistance school
## 66698                                                               n/a
## 66705                                                              <NA>
## 66706                                                              <NA>
## 66747                                                               n/a
## 66758                                       5-Title I schoolwide school
## 66775                                       5-Title I schoolwide school
## 66794                                            6-Not a Title I school
## 66822                                                               n/a
## 66844                              2-Title I targeted assistance school
## 66852                                                               n/a
## 66855                                                               n/a
## 66859                                                               n/a
## 66871                                                               n/a
## 66876                                                              <NA>
## 66902                                                               n/a
## 66908                                                               n/a
## 66966                                            6-Not a Title I school
## 66967                                       5-Title I schoolwide school
## 67008                                            6-Not a Title I school
## 67038                                       5-Title I schoolwide school
## 67043                                            6-Not a Title I school
## 67056                                            6-Not a Title I school
## 67057                                            6-Not a Title I school
## 67058                                       5-Title I schoolwide school
## 67063                                                              <NA>
## 67078                                            6-Not a Title I school
## 67110                                                               n/a
## 67116                                            6-Not a Title I school
## 67117                                                              <NA>
## 67119                                                              <NA>
## 67121                                            6-Not a Title I school
## 67132                                            6-Not a Title I school
## 67138                                                               n/a
## 67151                                            6-Not a Title I school
## 67155                                            6-Not a Title I school
## 67158                                                              <NA>
## 67230                                            6-Not a Title I school
## 67295                                            6-Not a Title I school
## 67326                                       5-Title I schoolwide school
## 67339                                            6-Not a Title I school
## 67340                                            6-Not a Title I school
## 67360 3-Title I schoolwide eligible-Title I targeted assistance program
## 67361                                            6-Not a Title I school
## 67366                                                               n/a
## 67487                              2-Title I targeted assistance school
## 67488                                            6-Not a Title I school
## 67558                                       5-Title I schoolwide school
## 67620                                            6-Not a Title I school
## 67621                              2-Title I targeted assistance school
## 67642                                            6-Not a Title I school
## 67643                                       5-Title I schoolwide school
## 67681                                                              <NA>
## 67693                                                              <NA>
## 67703                                                               n/a
## 67709                                                               n/a
## 67715                                                              <NA>
## 67733                                            6-Not a Title I school
## 67743                                                              <NA>
## 67756                                            6-Not a Title I school
## 67773                                            6-Not a Title I school
## 67774          1-Title I targeted assistance eligible school-No program
## 67802                                                              <NA>
## 67803                                                              <NA>
## 67806                                                              <NA>
## 67812                                            6-Not a Title I school
## 67818                                            6-Not a Title I school
## 67822                                       5-Title I schoolwide school
## 67831                                            6-Not a Title I school
## 67861                                                              <NA>
## 68022                                       5-Title I schoolwide school
## 68038                                       5-Title I schoolwide school
## 68039          1-Title I targeted assistance eligible school-No program
## 68053                                                              <NA>
## 68057                                                              <NA>
## 68079                                            6-Not a Title I school
## 68080                                                               n/a
## 68113                                            6-Not a Title I school
## 68115                                            6-Not a Title I school
## 68118                                                               n/a
## 68119                                                               n/a
## 68120                                                               n/a
## 68121                                                               n/a
## 68122                                                               n/a
## 68123                                                               n/a
## 68124                                                               n/a
## 68125                                                               n/a
## 68126                                                               n/a
## 68127                                                               n/a
## 68128                                                               n/a
## 68130                                                               n/a
## 68131                                                               n/a
## 68132                                                               n/a
## 68133                                                               n/a
## 68134                                                               n/a
## 68135                                                               n/a
## 68136                                                               n/a
## 68137                                                               n/a
## 68138                                                               n/a
## 68139                                                               n/a
## 68140                                                               n/a
## 68141                                                               n/a
## 68142                                                               n/a
## 68143                                                               n/a
## 68144                                                               n/a
## 68145                                                               n/a
## 68146                                                               n/a
## 68147                                                               n/a
## 68148                                                               n/a
## 68149                                                               n/a
## 68150                                                               n/a
## 68151                                                               n/a
## 68152                                                               n/a
## 68153                                                               n/a
## 68154                                                               n/a
## 68155                                                               n/a
## 68156                                                               n/a
## 68157                                                               n/a
## 68158                                                               n/a
## 68209                                                              <NA>
## 68303                                                              <NA>
## 68304                                                              <NA>
## 68307                                                              <NA>
## 68338                                            6-Not a Title I school
## 68449                                                               n/a
## 68464                                                              <NA>
## 68468                                                               n/a
## 68474                                                               n/a
## 68501                                                               n/a
## 68568                                            6-Not a Title I school
## 68579                                       5-Title I schoolwide school
## 68580          1-Title I targeted assistance eligible school-No program
## 68597                                            6-Not a Title I school
## 68598                                            6-Not a Title I school
## 68698                                                               n/a
## 68774                                                               n/a
## 68782                                                              <NA>
## 68801                                            6-Not a Title I school
## 68802                                            6-Not a Title I school
## 68803                                            6-Not a Title I school
## 68804                                            6-Not a Title I school
## 68811                                            6-Not a Title I school
## 68839                                                               n/a
## 68870                                                               n/a
## 68940                                                               n/a
## 69031                                       5-Title I schoolwide school
## 69060                                       5-Title I schoolwide school
## 69064                                                               n/a
## 69066                                                              <NA>
## 69068          1-Title I targeted assistance eligible school-No program
## 69070                                       5-Title I schoolwide school
## 69071                                            6-Not a Title I school
## 69072                                            6-Not a Title I school
## 69073                                            6-Not a Title I school
## 69096                              2-Title I targeted assistance school
## 69099                                                               n/a
## 69100                                       5-Title I schoolwide school
## 69117                                                               n/a
## 69153                                            6-Not a Title I school
## 69157                                            6-Not a Title I school
## 69161                                                               n/a
## 69170                                                               n/a
## 69184                                                               n/a
## 69186                                                               n/a
## 69232                              2-Title I targeted assistance school
## 69244                                                               n/a
## 69289                                            6-Not a Title I school
## 69290                                            6-Not a Title I school
## 69314                                                               n/a
## 69324                                                               n/a
## 69330                                       5-Title I schoolwide school
## 69331                                            6-Not a Title I school
## 69332                                            6-Not a Title I school
## 69333                                            6-Not a Title I school
## 69334                                       5-Title I schoolwide school
## 69394                              2-Title I targeted assistance school
## 69420                                                              <NA>
## 69518                                            6-Not a Title I school
## 69519                                            6-Not a Title I school
## 69533                   4-Title I schoolwide eligible school-No program
## 69551                   4-Title I schoolwide eligible school-No program
## 69552                   4-Title I schoolwide eligible school-No program
## 69576                                                              <NA>
## 69581                                            6-Not a Title I school
## 69583                                            6-Not a Title I school
## 69594                                            6-Not a Title I school
## 69595                                                               n/a
## 69596                                                               n/a
## 69688                                       5-Title I schoolwide school
## 69689                                            6-Not a Title I school
## 69690                                            6-Not a Title I school
## 69695                                            6-Not a Title I school
## 69696                                            6-Not a Title I school
## 69698                                            6-Not a Title I school
## 69699                                            6-Not a Title I school
## 69701                                            6-Not a Title I school
## 69766                                                               n/a
## 69774                                            6-Not a Title I school
## 69792                                                              <NA>
## 69794                                            6-Not a Title I school
## 69802                                       5-Title I schoolwide school
## 69803                                            6-Not a Title I school
## 69957                                                               n/a
## 69958                                            6-Not a Title I school
## 69963                                                              <NA>
## 69964                                                              <NA>
## 69965                                                              <NA>
## 69970                                            6-Not a Title I school
## 69971                                                               n/a
## 69973                              2-Title I targeted assistance school
## 69986                                            6-Not a Title I school
## 70053                                                               n/a
## 70059                                            6-Not a Title I school
## 70115                                                               n/a
## 70143                                            6-Not a Title I school
## 70148                                            6-Not a Title I school
## 70157                                            6-Not a Title I school
## 70173                                            6-Not a Title I school
## 70177                                            6-Not a Title I school
## 70240                                                               n/a
## 70286                                                               n/a
## 70351                                                               n/a
## 70365                                                              <NA>
## 70366                                                              <NA>
## 70367                                                               n/a
## 70397                                       5-Title I schoolwide school
## 70469                                                               n/a
## 70504                                                               n/a
## 70505                                            6-Not a Title I school
## 70524          1-Title I targeted assistance eligible school-No program
## 70528          1-Title I targeted assistance eligible school-No program
## 70529                                            6-Not a Title I school
## 70535                                                               n/a
## 70536                                            6-Not a Title I school
## 70586                                            6-Not a Title I school
## 70658                                            6-Not a Title I school
## 70674                                                              <NA>
## 70755                                            6-Not a Title I school
## 70769                                            6-Not a Title I school
## 70808                                                               n/a
## 70809                                            6-Not a Title I school
## 70851                                                              <NA>
## 70883                                            6-Not a Title I school
## 70889                                            6-Not a Title I school
## 70895                                            6-Not a Title I school
## 71038                                                               n/a
## 71047                                            6-Not a Title I school
## 71048                                            6-Not a Title I school
## 71049                                            6-Not a Title I school
## 71050                                            6-Not a Title I school
## 71051                                            6-Not a Title I school
## 71053                                            6-Not a Title I school
## 71064                                       5-Title I schoolwide school
## 71161                                                              <NA>
## 71180                                                               n/a
## 71182                                                              <NA>
## 71226                                       5-Title I schoolwide school
## 71238                                                              <NA>
## 71260                                                               n/a
## 71263                                                               n/a
## 71264                                            6-Not a Title I school
## 71267                                            6-Not a Title I school
## 71271                                            6-Not a Title I school
## 71272                                            6-Not a Title I school
## 71273                                            6-Not a Title I school
## 71278                                       5-Title I schoolwide school
## 71279                                            6-Not a Title I school
## 71280                                            6-Not a Title I school
## 71281                                       5-Title I schoolwide school
## 71285                                       5-Title I schoolwide school
## 71337                                                               n/a
## 71338                                                               n/a
## 71339                                            6-Not a Title I school
## 71344                                                               n/a
## 71345                                                               n/a
## 71368                                       5-Title I schoolwide school
## 71380                                                               n/a
## 71384                                       5-Title I schoolwide school
## 71389                                                               n/a
## 71390                                                               n/a
## 71468                                                              <NA>
## 71473                                            6-Not a Title I school
## 71482                                                               n/a
## 71491                                                               n/a
## 71499                                                               n/a
## 71500                              2-Title I targeted assistance school
## 71507                              2-Title I targeted assistance school
## 71527                              2-Title I targeted assistance school
## 71577                                            6-Not a Title I school
## 71586                                                               n/a
## 71588                                                               n/a
## 71595                                            6-Not a Title I school
## 71598                                                               n/a
## 71599                                            6-Not a Title I school
## 71600                                            6-Not a Title I school
## 71602                                                               n/a
## 71603                                                               n/a
## 71608                                            6-Not a Title I school
## 71609                                       5-Title I schoolwide school
## 71611                                            6-Not a Title I school
## 71613                                                               n/a
## 71614                                                              <NA>
## 71615                                                              <NA>
## 71616                                                              <NA>
## 71617                                                              <NA>
## 71618                                                              <NA>
## 71619                                                              <NA>
## 71627                              2-Title I targeted assistance school
## 71669                                                               n/a
## 71696                              2-Title I targeted assistance school
## 71700                                            6-Not a Title I school
## 71715                                                               n/a
## 71716                                            6-Not a Title I school
## 71717                                            6-Not a Title I school
## 71718                                       5-Title I schoolwide school
## 71719                                       5-Title I schoolwide school
## 72527                                                               n/a
## 72555                                                               n/a
## 72606                                                               n/a
## 72618                                                               n/a
## 72637                                            6-Not a Title I school
## 72638                                                               n/a
## 72639                                            6-Not a Title I school
## 72651                                                               n/a
## 72671                                            6-Not a Title I school
## 72684                              2-Title I targeted assistance school
## 72695                                                               n/a
## 72756                              2-Title I targeted assistance school
## 72762                                                               n/a
## 72814                                                               n/a
## 72922                                                              <NA>
## 72923                                                              <NA>
## 72959                                            6-Not a Title I school
## 72980                                            6-Not a Title I school
## 72981                                                               n/a
## 72983                                            6-Not a Title I school
## 72986                                            6-Not a Title I school
## 72991                                                               n/a
## 73021                                                               n/a
## 73095                                                               n/a
## 73146                                                               n/a
## 73180                                                              <NA>
## 73185                                            6-Not a Title I school
## 73220                                                               n/a
## 73300                                                               n/a
## 73303                                                               n/a
## 73304                                                               n/a
## 73355                                                               n/a
## 73356                                                               n/a
## 73395                                                               n/a
## 73437                                                              <NA>
## 73473                                                              <NA>
## 73489                                                              <NA>
## 73527                                            6-Not a Title I school
## 73528                                       5-Title I schoolwide school
## 73537                                                              <NA>
## 73551                                                               n/a
## 73554                                            6-Not a Title I school
## 73573                                            6-Not a Title I school
## 73582                              2-Title I targeted assistance school
## 73601                                                              <NA>
## 73603                                            6-Not a Title I school
## 73604                                                               n/a
## 73643                                                               n/a
## 73656                                       5-Title I schoolwide school
## 73676                                            6-Not a Title I school
## 73688                                       5-Title I schoolwide school
## 73712                                       5-Title I schoolwide school
## 73781                                                              <NA>
## 73782                                                              <NA>
## 73790                                                               n/a
## 73792                                                               n/a
## 73816                              2-Title I targeted assistance school
## 73846                                       5-Title I schoolwide school
## 73862                                            6-Not a Title I school
## 73901                                                               n/a
## 73908                                       5-Title I schoolwide school
## 73927                                                               n/a
## 73928                                                               n/a
## 73931                                            6-Not a Title I school
## 73933                                            6-Not a Title I school
## 73954                                                               n/a
## 73955                                                               n/a
## 73956                                            6-Not a Title I school
## 73957                                            6-Not a Title I school
## 73958                                                               n/a
## 73959                                                               n/a
## 73965                                            6-Not a Title I school
## 73968                                                               n/a
## 73971                                                               n/a
## 73988                                            6-Not a Title I school
## 73989                                            6-Not a Title I school
## 74028                                            6-Not a Title I school
## 74032                                            6-Not a Title I school
## 74068                                                               n/a
## 74094                                                               n/a
## 74122                                                               n/a
## 74159          1-Title I targeted assistance eligible school-No program
## 74161                                       5-Title I schoolwide school
## 74198                                       5-Title I schoolwide school
## 74199                                                               n/a
## 74294                                            6-Not a Title I school
## 74298                                            6-Not a Title I school
## 74300                                            6-Not a Title I school
## 74369                                       5-Title I schoolwide school
## 74414                                       5-Title I schoolwide school
## 74432                   4-Title I schoolwide eligible school-No program
## 74444                                            6-Not a Title I school
## 74447                                            6-Not a Title I school
## 74462                                            6-Not a Title I school
## 74476                                            6-Not a Title I school
## 74511                                                               n/a
## 74515                                       5-Title I schoolwide school
## 74516                                       5-Title I schoolwide school
## 74522                                                               n/a
## 74529                                                              <NA>
## 74531                                                              <NA>
## 74538                                                              <NA>
## 74552                                                               n/a
## 74554                                                               n/a
## 74558                                       5-Title I schoolwide school
## 74562                                                               n/a
## 74563                                                              <NA>
## 74634                   4-Title I schoolwide eligible school-No program
## 74659                                            6-Not a Title I school
## 74676                                            6-Not a Title I school
## 74677                                            6-Not a Title I school
## 74680                                            6-Not a Title I school
## 74681                                                              <NA>
## 74751                                                               n/a
## 74784                                                              <NA>
## 74800                                       5-Title I schoolwide school
## 74805                   4-Title I schoolwide eligible school-No program
## 74809                                                               n/a
## 74912                                            6-Not a Title I school
## 74940                                                               n/a
## 74993                                                              <NA>
## 75052                   4-Title I schoolwide eligible school-No program
## 75053                   4-Title I schoolwide eligible school-No program
## 75078                                            6-Not a Title I school
## 75084                                                              <NA>
## 75087                                                              <NA>
## 75109                                                               n/a
## 75122                                            6-Not a Title I school
## 75141                                                              <NA>
## 75194                                       5-Title I schoolwide school
## 75213                                                              <NA>
## 75237                                                              <NA>
## 75241                                            6-Not a Title I school
## 75244                                                              <NA>
## 75268                                            6-Not a Title I school
## 75272                                       5-Title I schoolwide school
## 75283                                                              <NA>
## 75295                                                               n/a
## 75400                                            6-Not a Title I school
## 75407                                       5-Title I schoolwide school
## 75408                                            6-Not a Title I school
## 75421                                                               n/a
## 75422                                                               n/a
## 75429                                            6-Not a Title I school
## 75439                                            6-Not a Title I school
## 75483                                            6-Not a Title I school
## 75499                                            6-Not a Title I school
## 75500                                            6-Not a Title I school
## 75530                              2-Title I targeted assistance school
## 75536                                       5-Title I schoolwide school
## 75545                                                               n/a
## 75554                                                               n/a
## 75555                                                               n/a
## 75563                                                               n/a
## 75581                                       5-Title I schoolwide school
## 75637                                                              <NA>
## 75694                                            6-Not a Title I school
## 75725                                                               n/a
## 75745                                                               n/a
## 75922                                                               n/a
## 75976                                            6-Not a Title I school
## 76028                                            6-Not a Title I school
## 76076                                       5-Title I schoolwide school
## 76137                                                              <NA>
## 76138                                                              <NA>
## 76139                                                              <NA>
## 76174                                            6-Not a Title I school
## 76226                                            6-Not a Title I school
## 76227                                            6-Not a Title I school
## 76235                                            6-Not a Title I school
## 76239                                                              <NA>
## 76257                              2-Title I targeted assistance school
## 76286                                                               n/a
## 76287                                                               n/a
## 76288                                            6-Not a Title I school
## 76291                                            6-Not a Title I school
## 76405                                                               n/a
## 76435                                       5-Title I schoolwide school
## 76488                                                               n/a
## 76530                                                              <NA>
## 76670                                            6-Not a Title I school
## 76683                                                               n/a
## 76703                                       5-Title I schoolwide school
## 76704                                       5-Title I schoolwide school
## 76721                              2-Title I targeted assistance school
## 76728                                                               n/a
## 76771                                            6-Not a Title I school
## 76793                                            6-Not a Title I school
## 76795                                                              <NA>
## 76820                                       5-Title I schoolwide school
## 76824                                            6-Not a Title I school
## 76849                                            6-Not a Title I school
## 76996                                                              <NA>
## 77018                                                               n/a
## 77091                                                               n/a
## 77094                                       5-Title I schoolwide school
## 77111                                                               n/a
## 77151                                            6-Not a Title I school
## 77156                                            6-Not a Title I school
## 77167                                       5-Title I schoolwide school
## 77194                                                               n/a
## 77218                                            6-Not a Title I school
## 77242                                       5-Title I schoolwide school
## 77264                                                               n/a
## 77417                                                               n/a
## 77448                                                               n/a
## 77612                                                              <NA>
## 77625                                                               n/a
## 77651                                            6-Not a Title I school
## 77656                                            6-Not a Title I school
## 77683                                                               n/a
## 77686                                                              <NA>
## 77696                                                              <NA>
## 77698                                                               n/a
## 77731                                            6-Not a Title I school
## 77733                                                              <NA>
## 77738                                            6-Not a Title I school
## 77745                                            6-Not a Title I school
## 77831                                       5-Title I schoolwide school
## 77833                                            6-Not a Title I school
## 77892                                            6-Not a Title I school
## 77894                                            6-Not a Title I school
## 77903                                            6-Not a Title I school
## 77928                                       5-Title I schoolwide school
## 77972                                       5-Title I schoolwide school
## 78005                              2-Title I targeted assistance school
## 78006                              2-Title I targeted assistance school
## 78008                                            6-Not a Title I school
## 78009                              2-Title I targeted assistance school
## 78010                                       5-Title I schoolwide school
## 78011                                       5-Title I schoolwide school
## 78066                                                               n/a
## 78095          1-Title I targeted assistance eligible school-No program
## 78160                                                               n/a
## 78168                                                              <NA>
## 78176                                                               n/a
## 78179                                                              <NA>
## 78183                                                               n/a
## 78193                                                               n/a
## 78198                                                              <NA>
## 78202                                                              <NA>
## 78203                                                              <NA>
## 78217                                                               n/a
## 78228                                                               n/a
## 78243                                                              <NA>
## 78245                                                               n/a
## 78255                                       5-Title I schoolwide school
## 78263                              2-Title I targeted assistance school
## 78265                                                               n/a
## 78272                                       5-Title I schoolwide school
## 78279                                                               n/a
## 78296                                       5-Title I schoolwide school
## 78306                                                               n/a
## 78311                                                               n/a
## 78312                                                               n/a
## 78313                                                               n/a
## 78332                                                              <NA>
## 78340                                            6-Not a Title I school
## 78346                                                               n/a
## 78348                                            6-Not a Title I school
## 78351                                                              <NA>
## 78399                                            6-Not a Title I school
## 78400                                                               n/a
## 78405                                            6-Not a Title I school
## 78408                                                              <NA>
## 78436                                       5-Title I schoolwide school
## 78482                                       5-Title I schoolwide school
## 78492                                                              <NA>
## 78494                                                              <NA>
## 78522                                       5-Title I schoolwide school
## 78570                                       5-Title I schoolwide school
## 78584                                                              <NA>
## 78585                                                              <NA>
## 78586                                                               n/a
## 78587                                                               n/a
## 78588                                                              <NA>
## 78591                                                               n/a
## 78595                                                               n/a
## 78597                                                              <NA>
## 78601                                            6-Not a Title I school
## 78603                                                              <NA>
## 78606                                                              <NA>
## 78609                                                               n/a
## 78652                                            6-Not a Title I school
## 78663                                                               n/a
## 78670                                                               n/a
## 78671                                                              <NA>
## 78685                                            6-Not a Title I school
## 78686                                                               n/a
## 78689                                            6-Not a Title I school
## 78690                                                               n/a
## 78699                                                              <NA>
## 78702                                                               n/a
## 78708                                            6-Not a Title I school
## 78744                                                               n/a
## 78787                                                               n/a
## 78788                                            6-Not a Title I school
## 78797                                            6-Not a Title I school
## 78841                                                              <NA>
## 78842                                            6-Not a Title I school
## 78908                                       5-Title I schoolwide school
## 78926                                                              <NA>
## 78955                                            6-Not a Title I school
## 78956                                            6-Not a Title I school
## 78963                                                              <NA>
## 79001                                            6-Not a Title I school
## 79055                              2-Title I targeted assistance school
## 79162          1-Title I targeted assistance eligible school-No program
## 79249                                       5-Title I schoolwide school
## 79257                                                              <NA>
## 79413                                                               n/a
## 79443                                            6-Not a Title I school
## 79478                                            6-Not a Title I school
## 79484                                            6-Not a Title I school
## 79485                                            6-Not a Title I school
## 79544                   4-Title I schoolwide eligible school-No program
## 79545                              2-Title I targeted assistance school
## 79573                                                               n/a
## 79582          1-Title I targeted assistance eligible school-No program
## 79583          1-Title I targeted assistance eligible school-No program
## 79610                                                              <NA>
## 79634                                                               n/a
## 79638                                                               n/a
## 79644                                       5-Title I schoolwide school
## 79645                                       5-Title I schoolwide school
## 79646                                       5-Title I schoolwide school
## 79647                                       5-Title I schoolwide school
## 79672                                       5-Title I schoolwide school
## 79673                                                               n/a
## 79681                                       5-Title I schoolwide school
## 79689                                            6-Not a Title I school
## 79698                                                              <NA>
## 79700                                            6-Not a Title I school
## 79722                                                               n/a
## 79723                                       5-Title I schoolwide school
## 79724                                            6-Not a Title I school
## 79770                                            6-Not a Title I school
## 79789                                                               n/a
## 79795                                                               n/a
## 79817                                                              <NA>
## 79825                                                              <NA>
## 79834                                                              <NA>
## 79850                                       5-Title I schoolwide school
## 79864                              2-Title I targeted assistance school
## 79875                                       5-Title I schoolwide school
## 79887                                       5-Title I schoolwide school
## 79889                                       5-Title I schoolwide school
## 79891                                                              <NA>
## 79892                                       5-Title I schoolwide school
## 79894                                            6-Not a Title I school
## 79942                                            6-Not a Title I school
## 79945                                                               n/a
## 79946                                                               n/a
## 79959                                            6-Not a Title I school
## 79974                              2-Title I targeted assistance school
## 80014                                                               n/a
## 80015                                                               n/a
## 80073                                                              <NA>
## 80104                                            6-Not a Title I school
## 80225                                            6-Not a Title I school
## 80241                                       5-Title I schoolwide school
## 80273                                                              <NA>
## 80286                                                               n/a
## 80443                                            6-Not a Title I school
## 80474                                                              <NA>
## 80477                                                               n/a
## 80479                                                               n/a
## 80480                                                               n/a
## 80569                                            6-Not a Title I school
## 80570                                                               n/a
## 80603                                                              <NA>
## 80604                                                              <NA>
## 80605                                                              <NA>
## 80615                                       5-Title I schoolwide school
## 80653                                                              <NA>
## 80752                                            6-Not a Title I school
## 80789                                                               n/a
## 80834                                                              <NA>
## 80835                   4-Title I schoolwide eligible school-No program
## 80885                                                              <NA>
## 80889                                            6-Not a Title I school
## 80891                                                               n/a
## 80892                                                               n/a
## 80893                                                               n/a
## 80900                                                              <NA>
## 80920                              2-Title I targeted assistance school
## 80928                                                              <NA>
## 80929                   4-Title I schoolwide eligible school-No program
## 80944                                                               n/a
## 80969                                                              <NA>
## 80990          1-Title I targeted assistance eligible school-No program
## 80991                                                               n/a
## 81005                                                               n/a
## 81039                                            6-Not a Title I school
## 81041                                                              <NA>
## 81048                                       5-Title I schoolwide school
## 81067                                            6-Not a Title I school
## 81093                                            6-Not a Title I school
## 81094                                            6-Not a Title I school
## 81149                                                               n/a
## 81217                                                               n/a
## 81306                                            6-Not a Title I school
## 81307                                                              <NA>
## 81314                                            6-Not a Title I school
## 81328                                       5-Title I schoolwide school
## 81346                                            6-Not a Title I school
## 81359                                       5-Title I schoolwide school
## 81364                                            6-Not a Title I school
## 81376                                            6-Not a Title I school
## 81384                              2-Title I targeted assistance school
## 81401                                            6-Not a Title I school
## 81411                                                               n/a
## 81434                                                              <NA>
## 81621                                                               n/a
## 81653                                            6-Not a Title I school
## 81654                                            6-Not a Title I school
## 81665                                            6-Not a Title I school
## 81669                                            6-Not a Title I school
## 81670                                            6-Not a Title I school
## 81681                                            6-Not a Title I school
## 81702                                            6-Not a Title I school
## 81709                   4-Title I schoolwide eligible school-No program
## 81761                              2-Title I targeted assistance school
## 81771                                                               n/a
## 81772                                                               n/a
## 81778                              2-Title I targeted assistance school
## 81817          1-Title I targeted assistance eligible school-No program
## 81818          1-Title I targeted assistance eligible school-No program
## 81848                                       5-Title I schoolwide school
## 81854                                       5-Title I schoolwide school
## 81855                                       5-Title I schoolwide school
## 81857                   4-Title I schoolwide eligible school-No program
## 81882                                       5-Title I schoolwide school
## 81894          1-Title I targeted assistance eligible school-No program
## 81917                                                              <NA>
## 81918                                                              <NA>
## 81919                                                               n/a
## 81920                                                              <NA>
## 81938                                            6-Not a Title I school
## 81941                                            6-Not a Title I school
## 81942                                            6-Not a Title I school
## 81943                                            6-Not a Title I school
## 81944                                            6-Not a Title I school
## 81945                                            6-Not a Title I school
## 81978                                                              <NA>
## 82019                                                               n/a
## 82029                                                               n/a
## 82053                                                               n/a
## 82064                                                              <NA>
## 82078                                            6-Not a Title I school
## 82096                                                               n/a
## 82123                                       5-Title I schoolwide school
## 82125                                                               n/a
## 82138                                                               n/a
## 82159                                            6-Not a Title I school
## 82186                                                               n/a
## 82297                   4-Title I schoolwide eligible school-No program
## 82353                                            6-Not a Title I school
## 82355                                                              <NA>
## 82372                                                               n/a
## 82376                                            6-Not a Title I school
## 82377                                            6-Not a Title I school
## 82381                                       5-Title I schoolwide school
## 82472                                       5-Title I schoolwide school
## 82487                                            6-Not a Title I school
## 82497                                            6-Not a Title I school
## 82525                                       5-Title I schoolwide school
## 82548                                       5-Title I schoolwide school
## 82549                                       5-Title I schoolwide school
## 82575                                            6-Not a Title I school
## 82576                                       5-Title I schoolwide school
## 82581                                       5-Title I schoolwide school
## 82606                                            6-Not a Title I school
## 82618                                            6-Not a Title I school
## 82619                                            6-Not a Title I school
## 82677                                            6-Not a Title I school
## 82678                                            6-Not a Title I school
## 82679                                                               n/a
## 82680                              2-Title I targeted assistance school
## 82683                                                              <NA>
## 82694                                                               n/a
## 82717                                       5-Title I schoolwide school
## 82718                                            6-Not a Title I school
## 82742                                            6-Not a Title I school
## 82752                                                              <NA>
## 82787                                                               n/a
## 82788                                       5-Title I schoolwide school
## 82793                                                               n/a
## 82848                                                              <NA>
## 82877                                                               n/a
## 82880                                            6-Not a Title I school
## 82888                                                               n/a
## 82928                                       5-Title I schoolwide school
## 82949                                                               n/a
## 82958                                                              <NA>
## 82967                                                              <NA>
## 82975                                            6-Not a Title I school
## 82996                                            6-Not a Title I school
## 83016                                                               n/a
## 83040                                            6-Not a Title I school
## 83041                                                              <NA>
## 83045 3-Title I schoolwide eligible-Title I targeted assistance program
## 83058                                                              <NA>
## 83096                                                               n/a
## 83107                                                              <NA>
## 83111                                                               n/a
## 83142                                            6-Not a Title I school
## 83179                                                               n/a
## 83189                                            6-Not a Title I school
## 83192                                            6-Not a Title I school
## 83199                                                               n/a
## 83223                                                              <NA>
## 83233                                                               n/a
## 83254                                                               n/a
## 83255                                                               n/a
## 83288                                            6-Not a Title I school
## 83297                                                               n/a
## 83305                                            6-Not a Title I school
## 83306                                            6-Not a Title I school
## 83313                                            6-Not a Title I school
## 83315                                                               n/a
## 83322                                                              <NA>
## 83337                                            6-Not a Title I school
## 83387                                                               n/a
## 83389                                            6-Not a Title I school
## 83393                              2-Title I targeted assistance school
## 83395                                       5-Title I schoolwide school
## 83398                                       5-Title I schoolwide school
## 83408                                                               n/a
## 83409                                                               n/a
## 83410                                                               n/a
## 83411                                                               n/a
## 83412                                                               n/a
## 83416                                                               n/a
## 83417                                                               n/a
## 83419                                            6-Not a Title I school
## 83425                              2-Title I targeted assistance school
## 83430                                            6-Not a Title I school
## 83436                              2-Title I targeted assistance school
## 83437                                            6-Not a Title I school
## 83446                                       5-Title I schoolwide school
## 83485                                                              <NA>
## 83527                                                               n/a
## 83549                                       5-Title I schoolwide school
## 83550                                            6-Not a Title I school
## 83555                                       5-Title I schoolwide school
## 83562                                                               n/a
## 83589                                       5-Title I schoolwide school
## 83615                                            6-Not a Title I school
## 83617                                       5-Title I schoolwide school
## 83621                                                               n/a
## 83644                                                              <NA>
## 83675                                                               n/a
## 83693                                            6-Not a Title I school
## 83694                                                               n/a
## 83695                                            6-Not a Title I school
## 83774                                       5-Title I schoolwide school
## 83775                                                               n/a
## 83781                                                              <NA>
## 83783                                                               n/a
## 83805                                                              <NA>
## 83816                                                              <NA>
## 83835                                                              <NA>
## 83841                                            6-Not a Title I school
## 83867                                            6-Not a Title I school
## 83886                                            6-Not a Title I school
## 83888                                            6-Not a Title I school
## 83912                                            6-Not a Title I school
## 83927                                                              <NA>
## 83947                                                               n/a
## 83957                                       5-Title I schoolwide school
## 83958                                            6-Not a Title I school
## 83995                                            6-Not a Title I school
## 84024                                                               n/a
## 84061          1-Title I targeted assistance eligible school-No program
## 84094                              2-Title I targeted assistance school
## 84100                                                              <NA>
## 84121                                            6-Not a Title I school
## 84122                                            6-Not a Title I school
## 84128                                            6-Not a Title I school
## 84129                                            6-Not a Title I school
## 84130          1-Title I targeted assistance eligible school-No program
## 84132                                            6-Not a Title I school
## 84135                              2-Title I targeted assistance school
## 84138                                            6-Not a Title I school
## 84141                                            6-Not a Title I school
## 84289                                            6-Not a Title I school
## 84314                                            6-Not a Title I school
## 84315                                            6-Not a Title I school
## 84316                                       5-Title I schoolwide school
## 84364                                       5-Title I schoolwide school
## 84381                                                               n/a
## 84414                   4-Title I schoolwide eligible school-No program
## 84442                                       5-Title I schoolwide school
## 84521                                                               n/a
## 84524                                                               n/a
## 84525                                                               n/a
## 84526                                                               n/a
## 84527                                                               n/a
## 84528                                                               n/a
## 84529                                                               n/a
## 84530                                                               n/a
## 84535 3-Title I schoolwide eligible-Title I targeted assistance program
## 84591                                                               n/a
## 84599                                                               n/a
## 84624                                       5-Title I schoolwide school
## 84679                                            6-Not a Title I school
## 84684                                                               n/a
## 84717                                       5-Title I schoolwide school
## 84791                                                              <NA>
## 84822                                            6-Not a Title I school
## 84857                              2-Title I targeted assistance school
## 84910                                                               n/a
## 84912                                                              <NA>
## 84913                                                              <NA>
## 84940                                                              <NA>
## 85144                                                               n/a
## 85152                                                               n/a
## 85280                   4-Title I schoolwide eligible school-No program
## 85282                                            6-Not a Title I school
## 85283                                            6-Not a Title I school
## 85289                                            6-Not a Title I school
## 85292                                            6-Not a Title I school
## 85295                                            6-Not a Title I school
## 85296                                            6-Not a Title I school
## 85301                                            6-Not a Title I school
## 85305                                            6-Not a Title I school
## 85353                                            6-Not a Title I school
## 85356                                            6-Not a Title I school
## 85357                                            6-Not a Title I school
## 85362                                                               n/a
## 85365                                            6-Not a Title I school
## 85398                                            6-Not a Title I school
## 85399                                            6-Not a Title I school
## 85400                                            6-Not a Title I school
## 85402                                            6-Not a Title I school
## 85403                                            6-Not a Title I school
## 85404                                            6-Not a Title I school
## 85412                                            6-Not a Title I school
## 85413                              2-Title I targeted assistance school
## 85435                                                              <NA>
## 85534                                                               n/a
## 85589                              2-Title I targeted assistance school
## 85590                              2-Title I targeted assistance school
## 85591                              2-Title I targeted assistance school
## 85606                              2-Title I targeted assistance school
## 85630                                                               n/a
## 85642                                            6-Not a Title I school
## 85660                                                               n/a
## 85688                                       5-Title I schoolwide school
## 85689                                                               n/a
## 85692                                            6-Not a Title I school
## 85697                                            6-Not a Title I school
## 85733                                                               n/a
## 85738                                            6-Not a Title I school
## 85741                                            6-Not a Title I school
## 85757                                       5-Title I schoolwide school
## 85768                                       5-Title I schoolwide school
## 85785                                                               n/a
## 85790                                                               n/a
## 85791                                                               n/a
## 85795                                       5-Title I schoolwide school
## 85831                                                               n/a
## 85969                                                              <NA>
## 85970                                            6-Not a Title I school
## 85971                                            6-Not a Title I school
## 85973                                            6-Not a Title I school
## 85974                                            6-Not a Title I school
## 86024                                            6-Not a Title I school
## 86049                                            6-Not a Title I school
## 86051                                       5-Title I schoolwide school
## 86052                                       5-Title I schoolwide school
## 86065                                       5-Title I schoolwide school
## 86067                                            6-Not a Title I school
## 86081                                       5-Title I schoolwide school
## 86096                                                               n/a
## 86101                                                               n/a
## 86180                                                               n/a
## 86205                                                              <NA>
## 86233                                            6-Not a Title I school
## 86234                                            6-Not a Title I school
## 86235                   4-Title I schoolwide eligible school-No program
## 86254                                            6-Not a Title I school
## 86342                                                              <NA>
## 86438                                                              <NA>
## 86494                                            6-Not a Title I school
## 86498                              2-Title I targeted assistance school
## 86499                              2-Title I targeted assistance school
## 86503                                            6-Not a Title I school
## 86504                                            6-Not a Title I school
## 86506                                            6-Not a Title I school
## 86511                                       5-Title I schoolwide school
## 86522                                                              <NA>
## 86533                                       5-Title I schoolwide school
## 86570                                            6-Not a Title I school
## 86584                                            6-Not a Title I school
## 86585                                            6-Not a Title I school
## 86593                                                               n/a
## 86616                                                              <NA>
## 86640                                                              <NA>
## 86691                                                               n/a
## 86693                                                               n/a
## 86781                                            6-Not a Title I school
## 86782                                                               n/a
## 86788                                            6-Not a Title I school
## 86827                                            6-Not a Title I school
## 86828                                            6-Not a Title I school
## 86829                                            6-Not a Title I school
## 86831                                            6-Not a Title I school
## 86832                                            6-Not a Title I school
## 86834                                            6-Not a Title I school
## 86835                                            6-Not a Title I school
## 86839                                            6-Not a Title I school
## 86892                                                              <NA>
## 86893                                                              <NA>
## 86898                                            6-Not a Title I school
## 86906                                            6-Not a Title I school
## 86917                                                               n/a
## 86966                                       5-Title I schoolwide school
## 86967                                            6-Not a Title I school
## 86970                                                               n/a
## 86971                                                               n/a
## 86984                                            6-Not a Title I school
## 86985                                       5-Title I schoolwide school
## 86991                                                               n/a
## 87055                                                               n/a
## 87058                                                               n/a
## 87061                                                               n/a
## 87097                                            6-Not a Title I school
## 87099                                            6-Not a Title I school
## 87101                                            6-Not a Title I school
## 87107                                                               n/a
## 87125                                            6-Not a Title I school
## 87126                                            6-Not a Title I school
## 87127                              2-Title I targeted assistance school
## 87148                                                              <NA>
## 87151                                                              <NA>
## 87152                                                              <NA>
## 87158                                            6-Not a Title I school
## 87243                              2-Title I targeted assistance school
## 87251                                            6-Not a Title I school
## 87284                                       5-Title I schoolwide school
## 87331                                            6-Not a Title I school
## 87332                                       5-Title I schoolwide school
## 87341                                            6-Not a Title I school
## 87342                                            6-Not a Title I school
## 87343                                            6-Not a Title I school
## 87346                                       5-Title I schoolwide school
## 87347                                       5-Title I schoolwide school
## 87401                   4-Title I schoolwide eligible school-No program
## 87407                                                               n/a
## 87430                                       5-Title I schoolwide school
## 87447                              2-Title I targeted assistance school
## 87456                                       5-Title I schoolwide school
## 87457                                                              <NA>
## 87465                                                               n/a
## 87487                                            6-Not a Title I school
## 87501                                                               n/a
## 87505                                            6-Not a Title I school
## 87511                                            6-Not a Title I school
## 87519                                                               n/a
## 87521                                                               n/a
## 87523                                                               n/a
## 87525                                       5-Title I schoolwide school
## 87532                                                               n/a
## 87535                                                              <NA>
## 87542                                                              <NA>
## 87555                                                               n/a
## 87570          1-Title I targeted assistance eligible school-No program
## 87590                   4-Title I schoolwide eligible school-No program
## 87603                                            6-Not a Title I school
## 87604                                            6-Not a Title I school
## 87605                                            6-Not a Title I school
## 87608                   4-Title I schoolwide eligible school-No program
## 87611                                       5-Title I schoolwide school
## 87617                                       5-Title I schoolwide school
## 87618                                                              <NA>
## 87623                   4-Title I schoolwide eligible school-No program
## 87636          1-Title I targeted assistance eligible school-No program
## 87639                                                               n/a
## 87640                                                               n/a
## 87648                                            6-Not a Title I school
## 87662                                       5-Title I schoolwide school
## 87663                                            6-Not a Title I school
## 87664                                                              <NA>
## 87676                                                               n/a
## 87749                                                               n/a
## 87752                                            6-Not a Title I school
## 87775                                                               n/a
## 87828                                                              <NA>
## 87832                                            6-Not a Title I school
## 87833                                            6-Not a Title I school
## 87880                                                              <NA>
## 87915                                            6-Not a Title I school
## 87931                                                              <NA>
## 87963                                       5-Title I schoolwide school
## 87997                                            6-Not a Title I school
## 88027                                                               n/a
## 88044                                                              <NA>
## 88153                                            6-Not a Title I school
## 88164                                            6-Not a Title I school
## 88171                                                              <NA>
## 88172                                            6-Not a Title I school
## 88173                                       5-Title I schoolwide school
## 88191                                                              <NA>
## 88212                                            6-Not a Title I school
## 88265                                       5-Title I schoolwide school
## 88266                                       5-Title I schoolwide school
## 88281                                                               n/a
## 88283                                                               n/a
## 88314                                       5-Title I schoolwide school
## 88394                                            6-Not a Title I school
## 88418                                            6-Not a Title I school
## 88419                                            6-Not a Title I school
## 88420                                            6-Not a Title I school
## 88421                                       5-Title I schoolwide school
## 88423                                            6-Not a Title I school
## 88445                                            6-Not a Title I school
## 88446                                            6-Not a Title I school
## 88449                                                               n/a
## 88500                                            6-Not a Title I school
## 88509                                                               n/a
## 88586                                                               n/a
## 88590                                            6-Not a Title I school
## 88595                                       5-Title I schoolwide school
## 88640                                            6-Not a Title I school
## 88672                                            6-Not a Title I school
## 88706                                                               n/a
## 88707                                            6-Not a Title I school
## 88708                                            6-Not a Title I school
## 88709                                                               n/a
## 88753                                                               n/a
## 88760                                                              <NA>
## 88893                                            6-Not a Title I school
## 88894                                            6-Not a Title I school
## 88918                              2-Title I targeted assistance school
## 88926                                            6-Not a Title I school
## 88928                                                               n/a
## 88931                              2-Title I targeted assistance school
## 88932                              2-Title I targeted assistance school
## 88957                                            6-Not a Title I school
## 88966                                            6-Not a Title I school
## 88969                                            6-Not a Title I school
## 89013                                            6-Not a Title I school
## 89016          1-Title I targeted assistance eligible school-No program
## 89023                                                              <NA>
## 89025                              2-Title I targeted assistance school
## 89065                                                               n/a
## 89069                                                              <NA>
## 89105                                                               n/a
## 89106                                            6-Not a Title I school
## 89107                                                              <NA>
## 89108                                                              <NA>
## 89109                                                              <NA>
## 89130                                                               n/a
## 89153                                                               n/a
## 89210                                                               n/a
## 89211                                                               n/a
## 89212                                                               n/a
## 89247                                                               n/a
## 89274                                            6-Not a Title I school
## 89353                                                               n/a
## 89406                                       5-Title I schoolwide school
## 89414                                       5-Title I schoolwide school
## 89417                              2-Title I targeted assistance school
## 89433                                                               n/a
## 89447          1-Title I targeted assistance eligible school-No program
## 89448                                            6-Not a Title I school
## 89449                                            6-Not a Title I school
## 89450                                       5-Title I schoolwide school
## 89451                                       5-Title I schoolwide school
## 89453                                            6-Not a Title I school
## 89454                                                               n/a
## 89480                                                               n/a
## 89481                                                               n/a
## 89531                                                               n/a
## 89533                                                               n/a
## 89554                                                               n/a
## 89569                                            6-Not a Title I school
## 89601                                            6-Not a Title I school
## 89604                                                               n/a
## 89609                                                               n/a
## 89636                                                               n/a
## 89638                                                               n/a
## 89744                                            6-Not a Title I school
## 89769                                       5-Title I schoolwide school
## 89778                                            6-Not a Title I school
## 89783                                                               n/a
## 89788                                                               n/a
## 89826                                            6-Not a Title I school
## 89890                                                              <NA>
## 89900                                            6-Not a Title I school
## 89902                                                               n/a
## 89919                                            6-Not a Title I school
## 89920                                            6-Not a Title I school
## 89921                                            6-Not a Title I school
## 89922                              2-Title I targeted assistance school
## 89923                                            6-Not a Title I school
## 89924                                            6-Not a Title I school
## 89925                                            6-Not a Title I school
## 89950                                                               n/a
## 89973                                                              <NA>
## 90028                                                               n/a
## 90050                                                               n/a
## 90102                                            6-Not a Title I school
## 90115                                                              <NA>
## 90117                                                              <NA>
## 90134                                            6-Not a Title I school
## 90154                                                              <NA>
## 90167                                                              <NA>
## 90175                                                               n/a
## 90176                                                               n/a
## 90177                                                               n/a
## 90204                                            6-Not a Title I school
## 90207                                       5-Title I schoolwide school
## 90221                                                               n/a
## 90249                                                              <NA>
## 90255                                            6-Not a Title I school
## 90256                                            6-Not a Title I school
## 90257                                            6-Not a Title I school
## 90258                                            6-Not a Title I school
## 90281                                                               n/a
## 90325                                            6-Not a Title I school
## 90347                                                              <NA>
## 90348                                                              <NA>
## 90383                                            6-Not a Title I school
## 90385                                                              <NA>
## 90386                                                              <NA>
## 90387                                                              <NA>
## 90405                                       5-Title I schoolwide school
## 90414 3-Title I schoolwide eligible-Title I targeted assistance program
## 90520                                                              <NA>
## 90531                                       5-Title I schoolwide school
## 90532                                       5-Title I schoolwide school
## 90533                                       5-Title I schoolwide school
## 90541                                                               n/a
## 90569                                            6-Not a Title I school
## 90570                                       5-Title I schoolwide school
## 90571                                            6-Not a Title I school
## 90572                                       5-Title I schoolwide school
## 90573                              2-Title I targeted assistance school
## 90574                              2-Title I targeted assistance school
## 90575                                            6-Not a Title I school
## 90576                                            6-Not a Title I school
## 90578                                       5-Title I schoolwide school
## 90615                                                               n/a
## 90619                                                               n/a
## 90620                                                               n/a
## 90621                                                               n/a
## 90622                                                               n/a
## 90623                                                               n/a
## 90627                                       5-Title I schoolwide school
## 90689                                            6-Not a Title I school
## 90690                                            6-Not a Title I school
## 90694                                                              <NA>
## 90720                              2-Title I targeted assistance school
## 90726                                                               n/a
## 90748                                            6-Not a Title I school
## 90787                                            6-Not a Title I school
## 90802                                            6-Not a Title I school
## 90807                                            6-Not a Title I school
## 90810                                                              <NA>
## 90825                                                              <NA>
## 90831                                                               n/a
## 90835                                                               n/a
## 90846                                       5-Title I schoolwide school
## 90855                                                               n/a
## 90856                                            6-Not a Title I school
## 90858                                       5-Title I schoolwide school
## 90879                                                              <NA>
## 90951                                       5-Title I schoolwide school
## 90952                                            6-Not a Title I school
## 90953                                            6-Not a Title I school
## 90981          1-Title I targeted assistance eligible school-No program
## 91064                                            6-Not a Title I school
## 91146                                       5-Title I schoolwide school
## 91180                                       5-Title I schoolwide school
## 91223                                       5-Title I schoolwide school
## 91266                                                              <NA>
## 91274                                                              <NA>
## 91277                              2-Title I targeted assistance school
## 91293                                                              <NA>
## 91298                                            6-Not a Title I school
## 91322                                            6-Not a Title I school
## 91345                                            6-Not a Title I school
## 91367                                                              <NA>
## 91377                                            6-Not a Title I school
## 91425                                                              <NA>
## 91468                                                               n/a
## 91481                                                               n/a
## 91528                                            6-Not a Title I school
## 91537                                            6-Not a Title I school
## 91543                                       5-Title I schoolwide school
## 91544                                       5-Title I schoolwide school
## 91586                                            6-Not a Title I school
## 91587                                            6-Not a Title I school
## 91607                                            6-Not a Title I school
## 91622                                                              <NA>
## 91682                                                              <NA>
## 91709                                                              <NA>
## 91724                                       5-Title I schoolwide school
## 91761                                                               n/a
## 91781                                                               n/a
## 91813                                                               n/a
## 91827                                                               n/a
## 91841                                            6-Not a Title I school
## 91868                              2-Title I targeted assistance school
## 91872 3-Title I schoolwide eligible-Title I targeted assistance program
## 91873                                       5-Title I schoolwide school
## 91898                                       5-Title I schoolwide school
## 91899                                            6-Not a Title I school
## 91923                                                              <NA>
## 91928                                            6-Not a Title I school
## 91950                                                               n/a
## 91975                                            6-Not a Title I school
## 91979          1-Title I targeted assistance eligible school-No program
## 91988                                                              <NA>
## 91998                              2-Title I targeted assistance school
## 92024                                                               n/a
## 92100                                                              <NA>
## 92120                                                              <NA>
## 92183                                                               n/a
## 92189                                                               n/a
## 92217                              2-Title I targeted assistance school
## 92258                                                              <NA>
## 92275                                            6-Not a Title I school
## 92365                                            6-Not a Title I school
## 92369                                                               n/a
## 92385                                       5-Title I schoolwide school
## 92422                                                               n/a
## 92423                                                               n/a
## 92489                                            6-Not a Title I school
## 92490                                            6-Not a Title I school
## 92493                                            6-Not a Title I school
## 92494                                            6-Not a Title I school
## 92495                                            6-Not a Title I school
## 92519                                            6-Not a Title I school
## 92526                                       5-Title I schoolwide school
## 92547                                            6-Not a Title I school
## 92555                                       5-Title I schoolwide school
## 92632                                            6-Not a Title I school
## 92693                                       5-Title I schoolwide school
## 92700                                                               n/a
## 92754                                            6-Not a Title I school
## 92763                                       5-Title I schoolwide school
## 92771                                            6-Not a Title I school
## 92791                                                              <NA>
## 92792                                                              <NA>
## 92870                                            6-Not a Title I school
## 92972                                                               n/a
## 92974                                                              <NA>
## 93049                                                              <NA>
## 93051                                            6-Not a Title I school
## 93052                                            6-Not a Title I school
## 93053                                            6-Not a Title I school
## 93054                              2-Title I targeted assistance school
## 93055                                       5-Title I schoolwide school
## 93056                                            6-Not a Title I school
## 93057                                            6-Not a Title I school
## 93058                                            6-Not a Title I school
## 93059                              2-Title I targeted assistance school
## 93068                              2-Title I targeted assistance school
## 93116                                                               n/a
## 93117                                                               n/a
## 93120                                                               n/a
## 93154                                                              <NA>
## 93349                                                              <NA>
## 93394                                                              <NA>
## 93416                                            6-Not a Title I school
## 93433                                       5-Title I schoolwide school
## 93434                                       5-Title I schoolwide school
## 93438                                       5-Title I schoolwide school
## 93457                                       5-Title I schoolwide school
## 93459                                                               n/a
## 93466                                            6-Not a Title I school
## 93490                                            6-Not a Title I school
## 93519                                            6-Not a Title I school
## 93520                                       5-Title I schoolwide school
## 93521                                            6-Not a Title I school
## 93680                                       5-Title I schoolwide school
## 93685                                                               n/a
## 93696                                                              <NA>
## 93722                                            6-Not a Title I school
## 93746                                                               n/a
## 93747                                                               n/a
## 93748                                                               n/a
## 93749                                                               n/a
## 93750                                                               n/a
## 93752                                                               n/a
## 93757                                       5-Title I schoolwide school
## 93816                                       5-Title I schoolwide school
## 93861                                            6-Not a Title I school
## 93873                                            6-Not a Title I school
## 93967                                                               n/a
## 93976                                            6-Not a Title I school
## 94003                                            6-Not a Title I school
## 94004                                            6-Not a Title I school
## 94006                                            6-Not a Title I school
## 94007                                            6-Not a Title I school
## 94113                                            6-Not a Title I school
## 94114                                                               n/a
## 94142                                            6-Not a Title I school
## 94191                                                               n/a
## 94200                                       5-Title I schoolwide school
## 94227                                            6-Not a Title I school
## 94241                              2-Title I targeted assistance school
## 94249                                       5-Title I schoolwide school
## 94257                                            6-Not a Title I school
## 94289                                       5-Title I schoolwide school
## 94324                                                               n/a
## 94349                                                               n/a
## 94362                                                               n/a
## 94369                                            6-Not a Title I school
## 94396                                                               n/a
## 94403                                            6-Not a Title I school
## 94460                                       5-Title I schoolwide school
## 94467                   4-Title I schoolwide eligible school-No program
## 94468                                            6-Not a Title I school
## 94501                                            6-Not a Title I school
## 94534                                            6-Not a Title I school
## 94535                                            6-Not a Title I school
## 94696                                            6-Not a Title I school
## 94701                                            6-Not a Title I school
## 94719                                            6-Not a Title I school
## 94738                                            6-Not a Title I school
## 94742                                                              <NA>
## 94782                                            6-Not a Title I school
## 94783                                            6-Not a Title I school
## 94784                                       5-Title I schoolwide school
## 94790                                       5-Title I schoolwide school
## 94798                                       5-Title I schoolwide school
## 94800                                                               n/a
## 94948                                            6-Not a Title I school
## 94976                                       5-Title I schoolwide school
## 94997                                            6-Not a Title I school
## 95001                                            6-Not a Title I school
## 95007                                                               n/a
## 95064                                            6-Not a Title I school
## 95100                                                               n/a
## 95109                              2-Title I targeted assistance school
## 95116                              2-Title I targeted assistance school
## 95141                                                               n/a
## 95151                                            6-Not a Title I school
## 95176                                            6-Not a Title I school
## 95198                                                               n/a
## 95199                                                               n/a
## 95200                                                               n/a
## 95206                                            6-Not a Title I school
## 95232                                                               n/a
## 95233                                                               n/a
## 95234                                                               n/a
## 95235                                                               n/a
## 95236                                                               n/a
## 95237                                                               n/a
## 95238                                                               n/a
## 95240                                                               n/a
## 95241                                                               n/a
## 95242                                                               n/a
## 95243                                                               n/a
## 95244                                                               n/a
## 95245                                                               n/a
## 95246                                                               n/a
## 95247                                                               n/a
## 95248                                                               n/a
## 95249                                                               n/a
## 95250                                                               n/a
## 95251                                                               n/a
## 95252                                                               n/a
## 95254                                                               n/a
## 95255                                                               n/a
## 95256                                                               n/a
## 95257                                                               n/a
## 95258                                                               n/a
## 95259                                                               n/a
## 95261                                                               n/a
## 95262                                                               n/a
## 95263                                                               n/a
## 95264                                                               n/a
## 95265                                                               n/a
## 95266                                                               n/a
## 95267                                                               n/a
## 95268                                                               n/a
## 95269                                                               n/a
## 95270                                                               n/a
## 95271                                                               n/a
## 95272                                                               n/a
## 95273                                                               n/a
## 95275                                                               n/a
## 95276                                                               n/a
## 95277                                                               n/a
## 95278                                                               n/a
## 95279                                                               n/a
## 95303                                            6-Not a Title I school
## 95335                                                              <NA>
## 95343                                                              <NA>
## 95401                                       5-Title I schoolwide school
## 95413                                                               n/a
## 95417                                                               n/a
## 95429                                                               n/a
## 95430                                                               n/a
## 95442                                            6-Not a Title I school
## 95444                                                              <NA>
## 95446                                                               n/a
## 95486                                            6-Not a Title I school
## 95534                                            6-Not a Title I school
## 95549                                            6-Not a Title I school
## 95550                                       5-Title I schoolwide school
## 95551                                       5-Title I schoolwide school
## 95593                                       5-Title I schoolwide school
## 95670                                            6-Not a Title I school
## 95748                                       5-Title I schoolwide school
## 95752                                       5-Title I schoolwide school
## 95806                                                              <NA>
## 95886                                            6-Not a Title I school
## 95930                                                               n/a
## 96039                                                               n/a
## 96120                                       5-Title I schoolwide school
## 96180                                                               n/a
## 96209                                       5-Title I schoolwide school
## 96241                                       5-Title I schoolwide school
## 96369                                                              <NA>
## 96399                                                               n/a
## 96408                              2-Title I targeted assistance school
## 96409                                            6-Not a Title I school
## 96426                                            6-Not a Title I school
## 96450                                            6-Not a Title I school
## 96498                                                               n/a
## 96502                                                              <NA>
## 96541                                                              <NA>
## 96544          1-Title I targeted assistance eligible school-No program
## 96572                                            6-Not a Title I school
## 96689                                            6-Not a Title I school
## 96726                                                              <NA>
## 96834                                                               n/a
## 96927                                            6-Not a Title I school
## 96945                                                               n/a
## 97010                                                               n/a
## 97070                                                              <NA>
## 97071                                                              <NA>
## 97072                                                              <NA>
## 97073                                            6-Not a Title I school
## 97074                                            6-Not a Title I school
## 97075                                                               n/a
## 97078                                            6-Not a Title I school
## 97080                                            6-Not a Title I school
## 97084                                            6-Not a Title I school
## 97085                                            6-Not a Title I school
## 97087          1-Title I targeted assistance eligible school-No program
## 97091                                            6-Not a Title I school
## 97159                                       5-Title I schoolwide school
## 97166                                       5-Title I schoolwide school
## 97181                                            6-Not a Title I school
## 97187                                            6-Not a Title I school
## 97220                                                              <NA>
## 97244                                            6-Not a Title I school
## 97255                                            6-Not a Title I school
## 97258                                                               n/a
## 97267                                            6-Not a Title I school
## 97335                                            6-Not a Title I school
## 97338                                            6-Not a Title I school
## 97339                                            6-Not a Title I school
## 97452                                       5-Title I schoolwide school
## 97453                                       5-Title I schoolwide school
## 97541          1-Title I targeted assistance eligible school-No program
## 97546                                                               n/a
## 97564                                            6-Not a Title I school
## 97614                                       5-Title I schoolwide school
## 97769                                                               n/a
## 97803                                                               n/a
## 97824                                            6-Not a Title I school
## 97879                                                               n/a
## 97908                                                               n/a
## 97909                                                               n/a
## 97960                   4-Title I schoolwide eligible school-No program
## 98030                                            6-Not a Title I school
## 98031                                                               n/a
## 98032                                                               n/a
## 98034                                                               n/a
## 98051                                                               n/a
## 98063                                                              <NA>
## 98197                                                              <NA>
## 98206                                                              <NA>
## 98261                                                              <NA>
## 98267                                                              <NA>
## 98288                                                              <NA>
## 98299                                                              <NA>
## 98309                                                              <NA>
## 98310                                                              <NA>
## 98359                                       5-Title I schoolwide school
## 98435                                                               n/a
## 98437                                       5-Title I schoolwide school
## 98450                                       5-Title I schoolwide school
## 98454                                            6-Not a Title I school
## 98455                                            6-Not a Title I school
## 98471                                                               n/a
## 98485                                            6-Not a Title I school
## 98506                                                              <NA>
## 98511                                                              <NA>
## 98512                                            6-Not a Title I school
## 98617                                                              <NA>
## 98619                                                              <NA>
## 98627                                       5-Title I schoolwide school
## 98628                                       5-Title I schoolwide school
## 98644                                                              <NA>
## 98645                                                              <NA>
## 98693                                            6-Not a Title I school
## 98711                                                               n/a
## 98787                                                               n/a
## 98807                                                               n/a
## 98885                                            6-Not a Title I school
## 98886                                            6-Not a Title I school
## 98887                                            6-Not a Title I school
## 98888                                            6-Not a Title I school
## 98889                                            6-Not a Title I school
## 98890                                            6-Not a Title I school
## 98891                                            6-Not a Title I school
## 98892                                            6-Not a Title I school
## 98893                                            6-Not a Title I school
## 98894                                            6-Not a Title I school
## 98895                                            6-Not a Title I school
## 98897                                            6-Not a Title I school
## 98898                                            6-Not a Title I school
## 98899                                            6-Not a Title I school
## 98901                                                               n/a
## 98902                                            6-Not a Title I school
## 98903                                            6-Not a Title I school
## 98904                                            6-Not a Title I school
## 98905                                            6-Not a Title I school
## 98965                                                               n/a
## 99046                                                               n/a
## 99047                                                              <NA>
## 99056                                            6-Not a Title I school
## 99070                                            6-Not a Title I school
## 99073                                       5-Title I schoolwide school
## 99074                   4-Title I schoolwide eligible school-No program
## 99085 3-Title I schoolwide eligible-Title I targeted assistance program
## 99086                                       5-Title I schoolwide school
## 99129                                            6-Not a Title I school
## 99148                                       5-Title I schoolwide school
## 99149                                                               n/a
## 99170                                                              <NA>
## 99174                                                               n/a
## 99175                                                              <NA>
## 99176                                                              <NA>
## 99181                                                               n/a
## 99203                                                              <NA>
## 99265                                                               n/a
## 99294                                                               n/a
## 99333                                            6-Not a Title I school
##                  Updated.Status
## 3                        1-Open
## 4                        1-Open
## 108                      1-Open
## 129                      1-Open
## 133                      1-Open
## 163                      1-Open
## 177                      1-Open
## 209                      1-Open
## 210                      1-Open
## 212                      1-Open
## 263                      1-Open
## 283                      1-Open
## 397                      1-Open
## 398                      1-Open
## 399                      1-Open
## 400                      1-Open
## 404                      1-Open
## 406                      1-Open
## 407                      1-Open
## 413                      1-Open
## 421                      1-Open
## 422                      1-Open
## 427                      1-Open
## 432                       3-New
## 446                      1-Open
## 455                      1-Open
## 457                      1-Open
## 458                      1-Open
## 496                      1-Open
## 497                      1-Open
## 499                      1-Open
## 506                      1-Open
## 508                      1-Open
## 516                      1-Open
## 517                      1-Open
## 518                      1-Open
## 535                      1-Open
## 536                      1-Open
## 537                      1-Open
## 544                      1-Open
## 545                      1-Open
## 546                      1-Open
## 552                      1-Open
## 574                      1-Open
## 575                      1-Open
## 579                      1-Open
## 584                      1-Open
## 591                      1-Open
## 637                      1-Open
## 661                      1-Open
## 680                      1-Open
## 681                      1-Open
## 688                      1-Open
## 717                      1-Open
## 803                      1-Open
## 805                      1-Open
## 807                      1-Open
## 849                      1-Open
## 875                      1-Open
## 898                      1-Open
## 899                      1-Open
## 915                      1-Open
## 919                      1-Open
## 924                      1-Open
## 925                      1-Open
## 929                      1-Open
## 930                      1-Open
## 932                      1-Open
## 933                      1-Open
## 936                      1-Open
## 937                      1-Open
## 938                      1-Open
## 942                      1-Open
## 943                      1-Open
## 950                      1-Open
## 951                      1-Open
## 952                       3-New
## 959                      1-Open
## 969                      1-Open
## 1028                     1-Open
## 1072                     1-Open
## 1105                     1-Open
## 1106                     1-Open
## 1139                     1-Open
## 1140                     1-Open
## 1141                     1-Open
## 1144                     1-Open
## 1145                     1-Open
## 1150                     1-Open
## 1151                     1-Open
## 1160                     1-Open
## 1163                     1-Open
## 1247                     1-Open
## 1252                     1-Open
## 1290                     1-Open
## 1318                     1-Open
## 1335                     1-Open
## 1336                     1-Open
## 1337                     1-Open
## 1338                     1-Open
## 1345                     1-Open
## 1347                     1-Open
## 1358                     1-Open
## 1431                     1-Open
## 1470                     1-Open
## 1506                     1-Open
## 1557                     1-Open
## 1633                     1-Open
## 1656                     1-Open
## 1660                     1-Open
## 1661                     1-Open
## 1692                     1-Open
## 1693                     1-Open
## 1738                     1-Open
## 1766                     1-Open
## 1837                     1-Open
## 1844                     1-Open
## 1853                     1-Open
## 1857                     1-Open
## 1877                     1-Open
## 1902                     1-Open
## 1906                     1-Open
## 1907                     1-Open
## 1921                     1-Open
## 1922                     1-Open
## 1932                     1-Open
## 1940                     1-Open
## 1952                     1-Open
## 1971                     1-Open
## 1972                      3-New
## 1974                     1-Open
## 1987                     1-Open
## 1989                     1-Open
## 1992                     1-Open
## 2008                     1-Open
## 2014                     1-Open
## 2016                     1-Open
## 2017                     1-Open
## 2020                     1-Open
## 2027                     1-Open
## 2034                     1-Open
## 2036                     1-Open
## 2038                     1-Open
## 2054                     1-Open
## 2057                     1-Open
## 2060                     1-Open
## 2061                     1-Open
## 2067                     1-Open
## 2160                     1-Open
## 2162                     1-Open
## 2163                     1-Open
## 2194                      3-New
## 2195                     1-Open
## 2210                     1-Open
## 2212                     1-Open
## 2213                     1-Open
## 2219                     1-Open
## 2230                     1-Open
## 2236                     1-Open
## 2242                     1-Open
## 2251                     1-Open
## 2252                     1-Open
## 2253                     1-Open
## 2254                     1-Open
## 2266                     1-Open
## 2268                     1-Open
## 2269                     1-Open
## 2270                      3-New
## 2271                      3-New
## 2272                     1-Open
## 2273                     1-Open
## 2274                     1-Open
## 2275                      3-New
## 2279                     1-Open
## 2280                     1-Open
## 2281                     1-Open
## 2282                     1-Open
## 2283                     1-Open
## 2284                     1-Open
## 2288                     1-Open
## 2297                     1-Open
## 2298                     1-Open
## 2299                     1-Open
## 2300                     1-Open
## 2310                     1-Open
## 2334                     1-Open
## 2335                     1-Open
## 2342                     1-Open
## 2343                     1-Open
## 2348                     1-Open
## 2350                     1-Open
## 2351                     1-Open
## 2352                     1-Open
## 2355                     1-Open
## 2440                     1-Open
## 2442                     1-Open
## 2552                     1-Open
## 2669                     1-Open
## 2682                     1-Open
## 2704                     1-Open
## 2720                     1-Open
## 2724                     1-Open
## 2743                     1-Open
## 2786                     1-Open
## 2832                     1-Open
## 2842                     1-Open
## 2846                     1-Open
## 2847                     1-Open
## 2857                     1-Open
## 2886                     1-Open
## 2887                     1-Open
## 2888                     1-Open
## 2926                     1-Open
## 2927                     1-Open
## 2928                     1-Open
## 2929                     1-Open
## 2930                     1-Open
## 2931                     1-Open
## 2932                     1-Open
## 2941                     1-Open
## 2943                     1-Open
## 3000                      3-New
## 3009                     1-Open
## 3049                     1-Open
## 3129                     1-Open
## 3130                     1-Open
## 3155                     1-Open
## 3274                     1-Open
## 3275                      3-New
## 3276                     1-Open
## 3277                     1-Open
## 3278                     1-Open
## 3279                     1-Open
## 3280                     1-Open
## 3281                     1-Open
## 3282                     1-Open
## 3284                     1-Open
## 3287                     1-Open
## 3288                     1-Open
## 3289                     1-Open
## 3290                     1-Open
## 3291                     1-Open
## 3295                     1-Open
## 3296                     1-Open
## 3297                     1-Open
## 3299                     1-Open
## 3300                     1-Open
## 3301                     1-Open
## 3330                      3-New
## 3512                     1-Open
## 3544                     1-Open
## 3613                     1-Open
## 3646                     1-Open
## 3666                     1-Open
## 3667                     1-Open
## 3668                     1-Open
## 3673                     1-Open
## 3674                     1-Open
## 3675                     1-Open
## 3763                     1-Open
## 3770                     1-Open
## 3771                     1-Open
## 3772                     1-Open
## 3780                     1-Open
## 3781                     1-Open
## 3782                     1-Open
## 3791                     1-Open
## 3796                     1-Open
## 3797                     1-Open
## 3798                     1-Open
## 3799                     1-Open
## 3800                     1-Open
## 3801                     1-Open
## 3802                     1-Open
## 3803                     1-Open
## 3804                     1-Open
## 3825                     1-Open
## 3834                     1-Open
## 3835                     1-Open
## 3837                     1-Open
## 3841                     1-Open
## 3898                     1-Open
## 3914                     1-Open
## 3915                     1-Open
## 3916                      3-New
## 3917                      3-New
## 3918                     1-Open
## 3919                     1-Open
## 3920                     1-Open
## 3921                     1-Open
## 3922                     1-Open
## 3931                     1-Open
## 3934                     1-Open
## 3953                     1-Open
## 3986                     1-Open
## 3987                     1-Open
## 4006                     1-Open
## 4034                     1-Open
## 4042                     1-Open
## 4051                     1-Open
## 4053                     1-Open
## 4196                     1-Open
## 4204                     1-Open
## 4283                     1-Open
## 4308                     1-Open
## 4309                     1-Open
## 4332                     1-Open
## 4384                     1-Open
## 4472                     1-Open
## 4497                     1-Open
## 4513                     1-Open
## 4514                     1-Open
## 4534                      3-New
## 4547                     1-Open
## 4557                     1-Open
## 4576                     1-Open
## 4592                     1-Open
## 4622                     1-Open
## 4623                     1-Open
## 4626                     1-Open
## 4635                     1-Open
## 4644                     1-Open
## 4690                     1-Open
## 4695                     1-Open
## 4727                 8-Reopened
## 4728                     1-Open
## 4800                     1-Open
## 4807                     1-Open
## 4948                     1-Open
## 4949                     1-Open
## 4950                     1-Open
## 4952                     1-Open
## 5054                     1-Open
## 5128                     1-Open
## 5137                     1-Open
## 5164                     1-Open
## 5174                     1-Open
## 5189                     1-Open
## 5305                     1-Open
## 5306                     1-Open
## 5307                     1-Open
## 5308                     1-Open
## 5310                     1-Open
## 5311                     1-Open
## 5312                     1-Open
## 5313                     1-Open
## 5314                     1-Open
## 5315                     1-Open
## 5316                     1-Open
## 5317                      3-New
## 5318                     1-Open
## 5319                     1-Open
## 5320                      3-New
## 5321                      3-New
## 5322                     1-Open
## 5323                      3-New
## 5324                     1-Open
## 5325                     1-Open
## 5326                     1-Open
## 5327                     1-Open
## 5328                     1-Open
## 5329                     1-Open
## 5347                      3-New
## 5348                     1-Open
## 5375                     1-Open
## 5457                     1-Open
## 5532                     1-Open
## 5533                     1-Open
## 5534                     1-Open
## 5588                     1-Open
## 5623                     1-Open
## 5670                     1-Open
## 5672                     1-Open
## 5735                     1-Open
## 5737                     1-Open
## 5738                     1-Open
## 5803                     1-Open
## 5809                     1-Open
## 5825                     1-Open
## 5829                    4-Added
## 5834                     1-Open
## 5873                     1-Open
## 5885                     1-Open
## 5908                     1-Open
## 5937                     1-Open
## 5967                     1-Open
## 5968                     1-Open
## 5989                     1-Open
## 6059                     1-Open
## 6075                     1-Open
## 6114                     1-Open
## 6122                     1-Open
## 6131                     1-Open
## 6152                     1-Open
## 6156                     1-Open
## 6184                     1-Open
## 6263                     1-Open
## 6397                     1-Open
## 6416                     1-Open
## 6426                     1-Open
## 6428                     1-Open
## 6441                     1-Open
## 6456                     1-Open
## 6463                     1-Open
## 6506                     1-Open
## 6508                     1-Open
## 6509                     1-Open
## 6510                     1-Open
## 6531                     1-Open
## 6541                     1-Open
## 6574                     1-Open
## 6575                     1-Open
## 6616                     1-Open
## 6617                     1-Open
## 6684                     1-Open
## 6685                     1-Open
## 6687                     1-Open
## 6710                     1-Open
## 6723                     1-Open
## 6729                     1-Open
## 6753                     1-Open
## 6872                     1-Open
## 6933                     1-Open
## 6965                     1-Open
## 7127                     1-Open
## 7128                     1-Open
## 7129                     1-Open
## 7130                     1-Open
## 7135                     1-Open
## 7146                     1-Open
## 7166                     1-Open
## 7200                     1-Open
## 7211                     1-Open
## 7213                      3-New
## 7214                     1-Open
## 7252                     1-Open
## 7263                     1-Open
## 7264                     1-Open
## 7280                     1-Open
## 7296                     1-Open
## 7338                     1-Open
## 7351                     1-Open
## 7424                     1-Open
## 7430                     1-Open
## 7470                     1-Open
## 7498                     1-Open
## 7522                     1-Open
## 7523                     1-Open
## 7576                     1-Open
## 7588                     1-Open
## 7659                     1-Open
## 7709                     1-Open
## 7752                     1-Open
## 7753                      3-New
## 7769                     1-Open
## 7770                     1-Open
## 7816                     1-Open
## 7825                     1-Open
## 7828                     1-Open
## 7829                     1-Open
## 7836                     1-Open
## 7839                     1-Open
## 7843                     1-Open
## 7844                     1-Open
## 7900                     1-Open
## 7922                     1-Open
## 7931                     1-Open
## 7963                     1-Open
## 7976                     1-Open
## 7995                     1-Open
## 7996                     1-Open
## 8003                     1-Open
## 8030                     1-Open
## 8046                     1-Open
## 8068                     1-Open
## 8084                     1-Open
## 8108                     1-Open
## 8136                     1-Open
## 8173                     1-Open
## 8252                      3-New
## 8255                     1-Open
## 8257                     1-Open
## 8260                     1-Open
## 8261                     1-Open
## 8262                     1-Open
## 8284                     1-Open
## 8313                     1-Open
## 8319                     1-Open
## 8352                     1-Open
## 8358                     1-Open
## 8441                     1-Open
## 8470                     1-Open
## 8480                     1-Open
## 8481                     1-Open
## 8485                     1-Open
## 8486                     1-Open
## 8487                     1-Open
## 8604                     1-Open
## 8606                     1-Open
## 8663                     1-Open
## 8677                     1-Open
## 8679                     1-Open
## 8728                     1-Open
## 8729                 8-Reopened
## 8730                     1-Open
## 8735                     1-Open
## 8748                     1-Open
## 8768                     1-Open
## 8808                     1-Open
## 8859                     1-Open
## 8902                     1-Open
## 8905                     1-Open
## 8910                     1-Open
## 8928                     1-Open
## 8942                     1-Open
## 9056                     1-Open
## 9063                     1-Open
## 9065                     1-Open
## 9066                     1-Open
## 9073                     1-Open
## 9107                     1-Open
## 9201                      3-New
## 9218                     1-Open
## 9227                     1-Open
## 9228                     1-Open
## 9239                     1-Open
## 9271                     1-Open
## 9272                     1-Open
## 9305                     1-Open
## 9327                     1-Open
## 9406                     1-Open
## 9491                     1-Open
## 9694                     1-Open
## 9787                     1-Open
## 9814                     1-Open
## 9863                     1-Open
## 9878                     1-Open
## 9879                     1-Open
## 9880                     1-Open
## 9885                     1-Open
## 9886                     1-Open
## 9887                     1-Open
## 10043                    1-Open
## 10044                    1-Open
## 10095                    1-Open
## 10096                    1-Open
## 10145                    1-Open
## 10159                    1-Open
## 10160                    1-Open
## 10174                    1-Open
## 10177                    1-Open
## 10178                    1-Open
## 10314                    1-Open
## 10330                    1-Open
## 10373                    1-Open
## 10402                    1-Open
## 10426                    1-Open
## 10432                    1-Open
## 10487                    1-Open
## 10491                    1-Open
## 10525                    1-Open
## 10538                    1-Open
## 10565                    1-Open
## 10567                    1-Open
## 10569                    1-Open
## 10591                    1-Open
## 10597                    1-Open
## 10621                    1-Open
## 10644                    1-Open
## 10650                    1-Open
## 10655                    1-Open
## 10702                    1-Open
## 10767                    1-Open
## 10776                    1-Open
## 10782                    1-Open
## 10789                    1-Open
## 10793                    1-Open
## 10805                    1-Open
## 10816                    1-Open
## 10817                    1-Open
## 10823                    1-Open
## 10928                    1-Open
## 10937                    1-Open
## 10938                    1-Open
## 10948                    1-Open
## 10957                    1-Open
## 10962                    1-Open
## 11016                    1-Open
## 11017                    1-Open
## 11021                    1-Open
## 11030                    1-Open
## 11033                    1-Open
## 11059                    1-Open
## 11065                    1-Open
## 11125                    1-Open
## 11156                    1-Open
## 11192                     3-New
## 11230                    1-Open
## 11231                    1-Open
## 11255                    1-Open
## 11256                    1-Open
## 11257                    1-Open
## 11258                    1-Open
## 11259                    1-Open
## 11263                    1-Open
## 11272                     3-New
## 11273                     3-New
## 11299                    1-Open
## 11300                    1-Open
## 11301                    1-Open
## 11302                    1-Open
## 11303                    1-Open
## 11307                    1-Open
## 11308                    1-Open
## 11309                    1-Open
## 11310                     3-New
## 11312                    1-Open
## 11313                    1-Open
## 11314                     3-New
## 11351                    1-Open
## 11405                    1-Open
## 11422                    1-Open
## 11439                    1-Open
## 11440                    1-Open
## 11483                    1-Open
## 11484                    1-Open
## 11512                    1-Open
## 11513                    1-Open
## 11514                    1-Open
## 11522                    1-Open
## 11534                    1-Open
## 11535                    1-Open
## 11539                    1-Open
## 11541                    1-Open
## 11543                    1-Open
## 11544                    1-Open
## 11546                    1-Open
## 11547                    1-Open
## 11551                    1-Open
## 11582                    1-Open
## 11589                    1-Open
## 11591                    1-Open
## 11612                    1-Open
## 11621                    1-Open
## 11683                     3-New
## 11685                    1-Open
## 11728                    1-Open
## 11869                    1-Open
## 11872                    1-Open
## 11876                    1-Open
## 11877                    1-Open
## 11881                    1-Open
## 11900                    1-Open
## 11908                    1-Open
## 11911                    1-Open
## 11912                     3-New
## 11913                    1-Open
## 11914                    1-Open
## 11925                    1-Open
## 11926                     3-New
## 11927                    1-Open
## 11928                    1-Open
## 11929                    1-Open
## 11930                    1-Open
## 11931                    1-Open
## 11932                    1-Open
## 11935                    1-Open
## 11936                    1-Open
## 11937                     3-New
## 11967                    1-Open
## 11968                    1-Open
## 11975                    1-Open
## 12070                    1-Open
## 12083                    1-Open
## 12088                    1-Open
## 12114                    1-Open
## 12123                    1-Open
## 12131                    1-Open
## 12138                    1-Open
## 12149                    1-Open
## 12163                    1-Open
## 12164                    1-Open
## 12165                    1-Open
## 12166                    1-Open
## 12167                    1-Open
## 12168                    1-Open
## 12190                    1-Open
## 12221                    1-Open
## 12227                    1-Open
## 12228                    1-Open
## 12243                    1-Open
## 12249                    1-Open
## 12307                    1-Open
## 12310                    1-Open
## 12316                    1-Open
## 12348                    1-Open
## 12427                    1-Open
## 12480                    1-Open
## 12501                    1-Open
## 12523                    1-Open
## 12540                    1-Open
## 12567                    1-Open
## 12591                     3-New
## 12677                    1-Open
## 12746                    1-Open
## 12749                    1-Open
## 12756                    1-Open
## 12764                    1-Open
## 12783                    1-Open
## 12806                    1-Open
## 12905                    1-Open
## 12912                    1-Open
## 12934                    1-Open
## 12965                    1-Open
## 12974                    1-Open
## 12976                    1-Open
## 12979                    1-Open
## 13071                    1-Open
## 13072                    1-Open
## 13073                     3-New
## 13075                    1-Open
## 13076                    1-Open
## 13077                    1-Open
## 13079                    1-Open
## 13080                    1-Open
## 13081                    1-Open
## 13082                    1-Open
## 13085                    1-Open
## 13086                    1-Open
## 13087                    1-Open
## 13088                    1-Open
## 13089                    1-Open
## 13090                    1-Open
## 13091                    1-Open
## 13111                    1-Open
## 13117                    1-Open
## 13156                    1-Open
## 13176                    1-Open
## 13230                    1-Open
## 13233                    1-Open
## 13240                    1-Open
## 13262                    1-Open
## 13269                     3-New
## 13270                    1-Open
## 13275                    1-Open
## 13290                    1-Open
## 13335 5-Changed Boundary/Agency
## 13338                    1-Open
## 13340 5-Changed Boundary/Agency
## 13424                    1-Open
## 13428                    1-Open
## 13442                    1-Open
## 13448                    1-Open
## 13467                    1-Open
## 13468                    1-Open
## 13469                    1-Open
## 13470                    1-Open
## 13471                    1-Open
## 13483                    1-Open
## 13487                    1-Open
## 13588                    1-Open
## 13595                    1-Open
## 13602                    1-Open
## 13623                    1-Open
## 13625                    1-Open
## 13677                    1-Open
## 13704                    1-Open
## 13755                    1-Open
## 13816                    1-Open
## 13964                    1-Open
## 14045                    1-Open
## 14047                    1-Open
## 14061                    1-Open
## 14062                    1-Open
## 14068                    1-Open
## 14102                    1-Open
## 14112                    1-Open
## 14118                    1-Open
## 14124                    1-Open
## 14129                    1-Open
## 14136                    1-Open
## 14142                    1-Open
## 14161                    1-Open
## 14205                    1-Open
## 14221                     3-New
## 14226                    1-Open
## 14229                    1-Open
## 14237                    1-Open
## 14371                    1-Open
## 14373                    1-Open
## 14375                    1-Open
## 14377                    1-Open
## 14379                    1-Open
## 14387                    1-Open
## 14436                    1-Open
## 14458                    1-Open
## 14464                     3-New
## 14465                    1-Open
## 14516                    1-Open
## 14520                    1-Open
## 14526                    1-Open
## 14531                    1-Open
## 14618                    1-Open
## 14671                    1-Open
## 14768                    1-Open
## 14876                    1-Open
## 14877                    1-Open
## 14880                    1-Open
## 14882                    1-Open
## 14883                    1-Open
## 14899                    1-Open
## 14912                    1-Open
## 15111                    1-Open
## 15116                    1-Open
## 15161                    1-Open
## 15172                    1-Open
## 15173                    1-Open
## 15175                    1-Open
## 15212                    1-Open
## 15213                    1-Open
## 15215                    1-Open
## 15297                    1-Open
## 15298                    1-Open
## 15304                    1-Open
## 15365                    1-Open
## 15370                    1-Open
## 15371                    1-Open
## 15373                    1-Open
## 15376                    1-Open
## 15377                    1-Open
## 15395                    1-Open
## 15442                    1-Open
## 15448                    1-Open
## 15451                    1-Open
## 15452                    1-Open
## 15454                    1-Open
## 15458                    1-Open
## 15473                    1-Open
## 15508                    1-Open
## 15587                    1-Open
## 15666                    1-Open
## 15778                    1-Open
## 15789                    1-Open
## 15809                    1-Open
## 15822                    1-Open
## 15823                    1-Open
## 15824                    1-Open
## 15825                    1-Open
## 15826                    1-Open
## 15828                    1-Open
## 15829                    1-Open
## 15830                    1-Open
## 15831                    1-Open
## 15832                    1-Open
## 15833                    1-Open
## 15834                    1-Open
## 15835                    1-Open
## 15843                    1-Open
## 15898                    1-Open
## 15899                    1-Open
## 15943                    1-Open
## 15950                    1-Open
## 15957                    1-Open
## 15958                8-Reopened
## 15960                    1-Open
## 15966                    1-Open
## 15970                    1-Open
## 15981                    1-Open
## 16010                    1-Open
## 16141                    1-Open
## 16190                    1-Open
## 16218                    1-Open
## 16247                     3-New
## 16271                    1-Open
## 16273                    1-Open
## 16307                    1-Open
## 16308                    1-Open
## 16332                    1-Open
## 16357                    1-Open
## 16359                    1-Open
## 16360                    1-Open
## 16403                    1-Open
## 16411                    1-Open
## 16483                    1-Open
## 16498                    1-Open
## 16525                    1-Open
## 16526                    1-Open
## 16623                    1-Open
## 16633                    1-Open
## 16767                    1-Open
## 16805                    1-Open
## 16811                    1-Open
## 16816                    1-Open
## 16828                    1-Open
## 16913                    1-Open
## 16918                    1-Open
## 16926                    1-Open
## 16948                     3-New
## 16950                    1-Open
## 16952                    1-Open
## 16953                8-Reopened
## 16963                    1-Open
## 17019                     3-New
## 17046                    1-Open
## 17116                    1-Open
## 17160                    1-Open
## 17231                    1-Open
## 17232                    1-Open
## 17282                    1-Open
## 17334                    1-Open
## 17335                    1-Open
## 17344                    1-Open
## 17345                    1-Open
## 17347                    1-Open
## 17447                    1-Open
## 17510                    1-Open
## 17538                    1-Open
## 17599                    1-Open
## 17600                    1-Open
## 17611                    1-Open
## 17612                    1-Open
## 17613                    1-Open
## 17639                    1-Open
## 17641                    1-Open
## 17651                    1-Open
## 17775                    1-Open
## 17787                    1-Open
## 17793                    1-Open
## 17800                    1-Open
## 17802                     3-New
## 17803                     3-New
## 17805                    1-Open
## 17815                    1-Open
## 17823                    1-Open
## 17845                    1-Open
## 17850                   4-Added
## 17856                    1-Open
## 17895                    1-Open
## 17896                    1-Open
## 17897                    1-Open
## 17901                    1-Open
## 17907                    1-Open
## 17925                    1-Open
## 17936                    1-Open
## 17977                    1-Open
## 17978                    1-Open
## 18066                    1-Open
## 18067                     3-New
## 18074                    1-Open
## 18168                    1-Open
## 18169                    1-Open
## 18170                    1-Open
## 18171                    1-Open
## 18173                    1-Open
## 18174                    1-Open
## 18176                    1-Open
## 18177                    1-Open
## 18178                    1-Open
## 18216                    1-Open
## 18232                    1-Open
## 18254                    1-Open
## 18273                    1-Open
## 18285                    1-Open
## 18338                    1-Open
## 18375                    1-Open
## 18378                    1-Open
## 18379                    1-Open
## 18386                    1-Open
## 18387                    1-Open
## 18392                    1-Open
## 18393                    1-Open
## 18408                    1-Open
## 18423                    1-Open
## 18424                    1-Open
## 18425                     3-New
## 18431                    1-Open
## 18432                    1-Open
## 18468                    1-Open
## 18490                    1-Open
## 18508                    1-Open
## 18553                    1-Open
## 18557                    1-Open
## 18567                    1-Open
## 18574                    1-Open
## 18614                    1-Open
## 18642                     3-New
## 18677                    1-Open
## 18719                    1-Open
## 18726                     3-New
## 18762                    1-Open
## 18787                    1-Open
## 18792                     3-New
## 18795                    1-Open
## 18796                    1-Open
## 18840                    1-Open
## 18861                    1-Open
## 18877                    1-Open
## 18878                    1-Open
## 18879                    1-Open
## 18881                    1-Open
## 18890                    1-Open
## 18891                    1-Open
## 18900                    1-Open
## 18932                    1-Open
## 18973                    1-Open
## 18994                    1-Open
## 19047                    1-Open
## 19102                    1-Open
## 19111                    1-Open
## 19115                    1-Open
## 19147                    1-Open
## 19169                    1-Open
## 19183                    1-Open
## 19190                    1-Open
## 19232                    1-Open
## 19238                    1-Open
## 19246                    1-Open
## 19257                    1-Open
## 19258                    1-Open
## 19288                    1-Open
## 19292                    1-Open
## 19293                     3-New
## 19294                    1-Open
## 19295                     3-New
## 19296                    1-Open
## 19354                    1-Open
## 19388                    1-Open
## 19389                    1-Open
## 19451                    1-Open
## 19461                    1-Open
## 19474                    1-Open
## 19486                    1-Open
## 19492                    1-Open
## 19568                    1-Open
## 19612                    1-Open
## 19626                    1-Open
## 19649                    1-Open
## 19659                    1-Open
## 19664                   4-Added
## 19690                    1-Open
## 19712                    1-Open
## 19719                    1-Open
## 19748                    1-Open
## 19756                    1-Open
## 19776                    1-Open
## 19777                    1-Open
## 19778                    1-Open
## 19779                    1-Open
## 19781                    1-Open
## 19782                    1-Open
## 19783                    1-Open
## 19784                    1-Open
## 19785                    1-Open
## 19786                    1-Open
## 19788                    1-Open
## 19832                    1-Open
## 19833                    1-Open
## 19835                    1-Open
## 19837                    1-Open
## 19860                    1-Open
## 19892                    1-Open
## 19900                   4-Added
## 19928                    1-Open
## 20031                    1-Open
## 20032                    1-Open
## 20033                    1-Open
## 20034                     3-New
## 20035                    1-Open
## 20036                    1-Open
## 20061                     3-New
## 20099                    1-Open
## 20101                    1-Open
## 20161                    1-Open
## 20167                    1-Open
## 20175                    1-Open
## 20182                    1-Open
## 20196                    1-Open
## 20223                    1-Open
## 20247                    1-Open
## 20266                    1-Open
## 20268                    1-Open
## 20272                    1-Open
## 20273                    1-Open
## 20335                    1-Open
## 20413                    1-Open
## 20424                     3-New
## 20545                    1-Open
## 20590                    1-Open
## 20654                    1-Open
## 20662                    1-Open
## 20695                    1-Open
## 20712                    1-Open
## 20715                    1-Open
## 20719                    1-Open
## 20764                    1-Open
## 20770                    1-Open
## 20774                    1-Open
## 20775                    1-Open
## 20826                    1-Open
## 20887                    1-Open
## 20927                    1-Open
## 21008                    1-Open
## 21027                    1-Open
## 21040                    1-Open
## 21073                    1-Open
## 21095                    1-Open
## 21101                    1-Open
## 21115                    1-Open
## 21117                    1-Open
## 21137                    1-Open
## 21140                    1-Open
## 21143                    1-Open
## 21161                    1-Open
## 21251                    1-Open
## 21283                    1-Open
## 21287                    1-Open
## 21309                    1-Open
## 21325                    1-Open
## 21329                    1-Open
## 21331                    1-Open
## 21374                    1-Open
## 21440                    1-Open
## 21446                    1-Open
## 21451                    1-Open
## 21479                    1-Open
## 21480                    1-Open
## 21490                    1-Open
## 21549                    1-Open
## 21551                    1-Open
## 21554                    1-Open
## 21555                    1-Open
## 21556                    1-Open
## 21563                    1-Open
## 21569                    1-Open
## 21580                    1-Open
## 21585                    1-Open
## 21591                    1-Open
## 21596                    1-Open
## 21602                    1-Open
## 21607                    1-Open
## 21608                    1-Open
## 21610                    1-Open
## 21618                    1-Open
## 21619                    1-Open
## 21633                8-Reopened
## 21638                    1-Open
## 21641                    1-Open
## 21646                    1-Open
## 21647                    1-Open
## 21656                    1-Open
## 21680                    1-Open
## 21681                    1-Open
## 21693                    1-Open
## 21698                    1-Open
## 21827                    1-Open
## 21837                    1-Open
## 21849                    1-Open
## 21850                    1-Open
## 21855                    1-Open
## 21859                    1-Open
## 21913                     3-New
## 21914                    1-Open
## 21916                    1-Open
## 21917                    1-Open
## 21975                    1-Open
## 22012                    1-Open
## 22028                    1-Open
## 22029                    1-Open
## 22033                    1-Open
## 22041                    1-Open
## 22049                    1-Open
## 22088                    1-Open
## 22096                    1-Open
## 22097                    1-Open
## 22101                    1-Open
## 22109                    1-Open
## 22113                    1-Open
## 22114                    1-Open
## 22115                    1-Open
## 22117                    1-Open
## 22125                    1-Open
## 22133                    1-Open
## 22134                    1-Open
## 22135                    1-Open
## 22136                    1-Open
## 22137                    1-Open
## 22138                    1-Open
## 22139                    1-Open
## 22157                    1-Open
## 22168                    1-Open
## 22172                    1-Open
## 22174                    1-Open
## 22175                    1-Open
## 22176                     3-New
## 22177                    1-Open
## 22178                   4-Added
## 22179                    1-Open
## 22180                    1-Open
## 22199                    1-Open
## 22202                    1-Open
## 22218                    1-Open
## 22386                    1-Open
## 22450                     3-New
## 22538                    1-Open
## 22554                    1-Open
## 22573                    1-Open
## 22583                    1-Open
## 22596                    1-Open
## 22626                    1-Open
## 22627                    1-Open
## 22646                    1-Open
## 22699                    1-Open
## 22736                    1-Open
## 22752                    1-Open
## 22913                     3-New
## 22991                    1-Open
## 22992                    1-Open
## 23002                    1-Open
## 23004                    1-Open
## 23059                    1-Open
## 23060                    1-Open
## 23087                    1-Open
## 23115                    1-Open
## 23144                    1-Open
## 23161                    1-Open
## 23162                    1-Open
## 23167                    1-Open
## 23195                    1-Open
## 23204                8-Reopened
## 23228                    1-Open
## 23337                    1-Open
## 23364                    1-Open
## 23444                    1-Open
## 23446                     3-New
## 23447                    1-Open
## 23448                    1-Open
## 23449                    1-Open
## 23450                    1-Open
## 23452                    1-Open
## 23455                    1-Open
## 23456                    1-Open
## 23458                    1-Open
## 23578                    1-Open
## 23579                    1-Open
## 23580                    1-Open
## 23581                    1-Open
## 23582                    1-Open
## 23583                    1-Open
## 23584                    1-Open
## 23656                    1-Open
## 23667                    1-Open
## 23668                    1-Open
## 23669                    1-Open
## 23670                    1-Open
## 23673                    1-Open
## 23737                    1-Open
## 23762                    1-Open
## 23768                    1-Open
## 23773                    1-Open
## 23858                    1-Open
## 23861                    1-Open
## 23872                    1-Open
## 23891                     3-New
## 23895                    1-Open
## 23932                    1-Open
## 23935                    1-Open
## 23938                    1-Open
## 23939                     3-New
## 23949                     3-New
## 23951                    1-Open
## 23952                   4-Added
## 23953                    1-Open
## 23959                    1-Open
## 23964                    1-Open
## 23965                    1-Open
## 23971                    1-Open
## 23972                    1-Open
## 23974                    1-Open
## 23975                    1-Open
## 23979                    1-Open
## 23980                    1-Open
## 23985                    1-Open
## 23988                    1-Open
## 23991                    1-Open
## 24066                    1-Open
## 24073                    1-Open
## 24074                    1-Open
## 24088                    1-Open
## 24093                    1-Open
## 24101                    1-Open
## 24122                    1-Open
## 24128                    1-Open
## 24186                    1-Open
## 24379                    1-Open
## 24396                    1-Open
## 24412                    1-Open
## 24467                    1-Open
## 24500                    1-Open
## 24521                    1-Open
## 24546                    1-Open
## 24564                     3-New
## 24599                    1-Open
## 24600                    1-Open
## 24634                    1-Open
## 24636                    1-Open
## 24639                    1-Open
## 24642                    1-Open
## 24701                    1-Open
## 24706                    1-Open
## 24756                    1-Open
## 24757                    1-Open
## 24794                    1-Open
## 24819                    1-Open
## 24852                    1-Open
## 24866                    1-Open
## 24871                    1-Open
## 24899                    1-Open
## 24994                    1-Open
## 25047                    1-Open
## 25049                    1-Open
## 25075                    1-Open
## 25090                    1-Open
## 25107                    1-Open
## 25125                    1-Open
## 25126                    1-Open
## 25167                    1-Open
## 25168                    1-Open
## 25191                    1-Open
## 25192                    1-Open
## 25335                    1-Open
## 25364                    1-Open
## 25372                    1-Open
## 25375                    1-Open
## 25389                    1-Open
## 25390                    1-Open
## 25391                    1-Open
## 25392                    1-Open
## 25440                    1-Open
## 25444                    1-Open
## 25445                    1-Open
## 25458                    1-Open
## 25459                    1-Open
## 25465                    1-Open
## 25475                    1-Open
## 25478                     3-New
## 25482                    1-Open
## 25483                    1-Open
## 25486                    1-Open
## 25487                    1-Open
## 25488                    1-Open
## 25498                    1-Open
## 25520                    1-Open
## 25578                    1-Open
## 25653                    1-Open
## 25693                    1-Open
## 25748                    1-Open
## 25797                     3-New
## 25808                    1-Open
## 25842                    1-Open
## 25858                    1-Open
## 25867                    1-Open
## 25868                    1-Open
## 25877                    1-Open
## 25917                    1-Open
## 25932                    1-Open
## 25958                    1-Open
## 26038                    1-Open
## 26092                    1-Open
## 26097                    1-Open
## 26112                    1-Open
## 26114                    1-Open
## 26118                    1-Open
## 26166                    1-Open
## 26172                    1-Open
## 26286                    1-Open
## 26289                    1-Open
## 26327                    1-Open
## 26389                    1-Open
## 26433                    1-Open
## 26530                    1-Open
## 26532                    1-Open
## 26590                    1-Open
## 26602                    1-Open
## 26606                    1-Open
## 26632                    1-Open
## 26677                    1-Open
## 26701                    1-Open
## 26702                    1-Open
## 26703                    1-Open
## 26707                    1-Open
## 26728                    1-Open
## 26748                    1-Open
## 26753                    1-Open
## 26761                    1-Open
## 26774                    1-Open
## 26776                    1-Open
## 26777                    1-Open
## 26778                    1-Open
## 26780                    1-Open
## 26797                    1-Open
## 26838                    1-Open
## 26844                    1-Open
## 26851                   4-Added
## 26852                    1-Open
## 26856                    1-Open
## 26860                    1-Open
## 26875                    1-Open
## 26886                    1-Open
## 26888                    1-Open
## 26889                    1-Open
## 26890                    1-Open
## 26892                    1-Open
## 26907                    1-Open
## 26915                    1-Open
## 26916                    1-Open
## 26924                     3-New
## 26930                    1-Open
## 26947                    1-Open
## 27064                    1-Open
## 27066                    1-Open
## 27069                    1-Open
## 27070                    1-Open
## 27071                    1-Open
## 27073                    1-Open
## 27076                    1-Open
## 27078                    1-Open
## 27082                    1-Open
## 27083                    1-Open
## 27085                    1-Open
## 27086                    1-Open
## 27087                    1-Open
## 27089                    1-Open
## 27098                    1-Open
## 27106                    1-Open
## 27111                    1-Open
## 27115                    1-Open
## 27121                    1-Open
## 27151                    1-Open
## 27157                    1-Open
## 27175                    1-Open
## 27176                    1-Open
## 27188                    1-Open
## 27229                    1-Open
## 27238                    1-Open
## 27266                    1-Open
## 27283                    1-Open
## 27390                    1-Open
## 27478                    1-Open
## 27487                    1-Open
## 27489                    1-Open
## 27524                    1-Open
## 27577                    1-Open
## 27606                    1-Open
## 27607                    1-Open
## 27608                    1-Open
## 27609                    1-Open
## 27610                    1-Open
## 27611                    1-Open
## 27612                    1-Open
## 27613                    1-Open
## 27614                    1-Open
## 27615                    1-Open
## 27616                    1-Open
## 27617                    1-Open
## 27618                    1-Open
## 27619                    1-Open
## 27620                    1-Open
## 27621                    1-Open
## 27622                    1-Open
## 27623                    1-Open
## 27625                   4-Added
## 27627                    1-Open
## 27628                    1-Open
## 27629                    1-Open
## 27630                    1-Open
## 27631                    1-Open
## 27632                    1-Open
## 27633                    1-Open
## 27634                    1-Open
## 27635                    1-Open
## 27636                    1-Open
## 27637                    1-Open
## 27638                    1-Open
## 27639                    1-Open
## 27640                    1-Open
## 27641                    1-Open
## 27642                    1-Open
## 27643                    1-Open
## 27644                    1-Open
## 27645                    1-Open
## 27646                    1-Open
## 27647                    1-Open
## 27648                    1-Open
## 27650                    1-Open
## 27651                    1-Open
## 27652                    1-Open
## 27653                    1-Open
## 27654                    1-Open
## 27656                    1-Open
## 27657                    1-Open
## 27658                    1-Open
## 27671                    1-Open
## 27689                    1-Open
## 27690                    1-Open
## 27691                    1-Open
## 27692                    1-Open
## 27693                    1-Open
## 27697                    1-Open
## 27728                    1-Open
## 27730                    1-Open
## 27737                    1-Open
## 27749                    1-Open
## 27756                8-Reopened
## 27804                    1-Open
## 27805                    1-Open
## 27851                    1-Open
## 27896                     3-New
## 27913                    1-Open
## 27935                    1-Open
## 27937                    1-Open
## 27942                    1-Open
## 27946                    1-Open
## 27977                    1-Open
## 27998                    1-Open
## 28085                    1-Open
## 28086                    1-Open
## 28087                    1-Open
## 28089                    1-Open
## 28090                    1-Open
## 28091                    1-Open
## 28093                    1-Open
## 28095                    1-Open
## 28101                    1-Open
## 28107                    1-Open
## 28120                    1-Open
## 28198                    1-Open
## 28202                    1-Open
## 28204                    1-Open
## 28205                   4-Added
## 28209                    1-Open
## 28211                    1-Open
## 28213                    1-Open
## 28230                     3-New
## 28248                    1-Open
## 28304                    1-Open
## 28335                    1-Open
## 28336                    1-Open
## 28338                    1-Open
## 28339                    1-Open
## 28340                    1-Open
## 28341                    1-Open
## 28346                    1-Open
## 28348                    1-Open
## 28354                    1-Open
## 28400                    1-Open
## 28432                    1-Open
## 28445                    1-Open
## 28450                    1-Open
## 28454                    1-Open
## 28472                    1-Open
## 28475                    1-Open
## 28508                    1-Open
## 28547                    1-Open
## 28574                    1-Open
## 28579                    1-Open
## 28585                   4-Added
## 28606                    1-Open
## 28628                    1-Open
## 28659                    1-Open
## 28660                    1-Open
## 28661                    1-Open
## 28730                    1-Open
## 28754                    1-Open
## 28781                    1-Open
## 28791                    1-Open
## 28830                     3-New
## 28842                    1-Open
## 28843                    1-Open
## 28921                   4-Added
## 28922                   4-Added
## 28932                    1-Open
## 28933                    1-Open
## 28989                    1-Open
## 28991                    1-Open
## 28994                    1-Open
## 28995                    1-Open
## 28996                    1-Open
## 29010                    1-Open
## 29013                    1-Open
## 29016                    1-Open
## 29022                    1-Open
## 29026                    1-Open
## 29100                    1-Open
## 29101                    1-Open
## 29105                    1-Open
## 29128                    1-Open
## 29178                    1-Open
## 29195                    1-Open
## 29207                    1-Open
## 29208                    1-Open
## 29216                    1-Open
## 29218                    1-Open
## 29230                    1-Open
## 29251                    1-Open
## 29300                    1-Open
## 29311                    1-Open
## 29318                    1-Open
## 29395                    1-Open
## 29398                    1-Open
## 29406                    1-Open
## 29407                    1-Open
## 29410                    1-Open
## 29411                    1-Open
## 29422                    1-Open
## 29423                    1-Open
## 29428                    1-Open
## 29527                    1-Open
## 29546                    1-Open
## 29569                    1-Open
## 29587                    1-Open
## 29596                    1-Open
## 29652                    1-Open
## 29669                    1-Open
## 29702                    1-Open
## 29757                    1-Open
## 29795                    1-Open
## 29818                    1-Open
## 29871                    1-Open
## 29882                    1-Open
## 29937                    1-Open
## 29939                    1-Open
## 29953                    1-Open
## 29977                    1-Open
## 30024                    1-Open
## 30028                    1-Open
## 30029                    1-Open
## 30031                    1-Open
## 30058                    1-Open
## 30153                    1-Open
## 30256                    1-Open
## 30260                    1-Open
## 30325                    1-Open
## 30333                    1-Open
## 30347                    1-Open
## 30349                    1-Open
## 30489                    1-Open
## 30490                    1-Open
## 30502                    1-Open
## 30505                    1-Open
## 30521                    1-Open
## 30590                    1-Open
## 30609                    1-Open
## 30616                    1-Open
## 30721                    1-Open
## 30723                    1-Open
## 30781                    1-Open
## 30783                    1-Open
## 30784                    1-Open
## 30787                    1-Open
## 30788                    1-Open
## 30849                    1-Open
## 30870                    1-Open
## 30872                    1-Open
## 30875                    1-Open
## 30876                    1-Open
## 30886                    1-Open
## 30900                    1-Open
## 30920                    1-Open
## 30928                    1-Open
## 30929                    1-Open
## 30933                    1-Open
## 30957                    1-Open
## 31043                    1-Open
## 31107                    1-Open
## 31115                    1-Open
## 31168                    1-Open
## 31197                    1-Open
## 31223                    1-Open
## 31250                    1-Open
## 31252                    1-Open
## 31298                    1-Open
## 31299                    1-Open
## 31314                    1-Open
## 31327                    1-Open
## 31328                    1-Open
## 31357                    1-Open
## 31388                    1-Open
## 31390                    1-Open
## 31395                    1-Open
## 31463                    1-Open
## 31464                    1-Open
## 31465                    1-Open
## 31467                    1-Open
## 31559                    1-Open
## 31645                    1-Open
## 31699                    1-Open
## 31709                    1-Open
## 31733                    1-Open
## 31740                    1-Open
## 31751                    1-Open
## 31829                     3-New
## 31831                    1-Open
## 31845                    1-Open
## 31850                    1-Open
## 31852                    1-Open
## 31883                    1-Open
## 31888                    1-Open
## 31910                    1-Open
## 31941                    1-Open
## 31942                    1-Open
## 31957                    1-Open
## 31968                    1-Open
## 31973                    1-Open
## 31989                    1-Open
## 32006                    1-Open
## 32010                    1-Open
## 32014                    1-Open
## 32036                    1-Open
## 32054                    1-Open
## 32060                    1-Open
## 32081                    1-Open
## 32082                    1-Open
## 32142                     3-New
## 32176                    1-Open
## 32179                    1-Open
## 32273                    1-Open
## 32297                    1-Open
## 32298                    1-Open
## 32349                    1-Open
## 32366                    1-Open
## 32474                    1-Open
## 32573                    1-Open
## 32574                    1-Open
## 32576                    1-Open
## 32577                    1-Open
## 32578                    1-Open
## 32579                    1-Open
## 32580                    1-Open
## 32581                    1-Open
## 32639                    1-Open
## 32640                     3-New
## 32641                    1-Open
## 32642                    1-Open
## 32651                    1-Open
## 32710                     3-New
## 32733                    1-Open
## 32738                    1-Open
## 32753                    1-Open
## 32768                    1-Open
## 32779                    1-Open
## 32784                    1-Open
## 32785                    1-Open
## 32786                     3-New
## 32787                    1-Open
## 32805                   4-Added
## 32822                    1-Open
## 32879                    1-Open
## 32984                    1-Open
## 33021                    1-Open
## 33083                    1-Open
## 33104                    1-Open
## 33122                    1-Open
## 33198                    1-Open
## 33228                    1-Open
## 33263                    1-Open
## 33281                    1-Open
## 33292                     3-New
## 33293                    1-Open
## 33317                    1-Open
## 33337                    1-Open
## 33343                    1-Open
## 33344                    1-Open
## 33360                    1-Open
## 33388                    1-Open
## 33416                    1-Open
## 33473                    1-Open
## 33496                    1-Open
## 33499                     3-New
## 33536                    1-Open
## 33562                    1-Open
## 33591                    1-Open
## 33592                    1-Open
## 33614                    1-Open
## 33620                    1-Open
## 33666                    1-Open
## 33701                    1-Open
## 33758                    1-Open
## 33804                    1-Open
## 33805                    1-Open
## 33829                    1-Open
## 33945                    1-Open
## 33950                    1-Open
## 33956                    1-Open
## 33971                    1-Open
## 33973                    1-Open
## 33976                    1-Open
## 33979                    1-Open
## 33994                    1-Open
## 34050                    1-Open
## 34077                    1-Open
## 34078                    1-Open
## 34079                    1-Open
## 34124                    1-Open
## 34145                    1-Open
## 34152                    1-Open
## 34183                    1-Open
## 34190                    1-Open
## 34193                    1-Open
## 34197                    1-Open
## 34227                    1-Open
## 34235                    1-Open
## 34236                    1-Open
## 34237                    1-Open
## 34238                    1-Open
## 34239                    1-Open
## 34240                    1-Open
## 34241                    1-Open
## 34242                    1-Open
## 34243                    1-Open
## 34244                    1-Open
## 34245                    1-Open
## 34246                    1-Open
## 34247                    1-Open
## 34248                    1-Open
## 34249                    1-Open
## 34250                    1-Open
## 34251                    1-Open
## 34252                    1-Open
## 34253                    1-Open
## 34254                    1-Open
## 34255                    1-Open
## 34256                    1-Open
## 34302                    1-Open
## 34303                    1-Open
## 34323                    1-Open
## 34329                    1-Open
## 34331                    1-Open
## 34336                    1-Open
## 34341                    1-Open
## 34359                    1-Open
## 34365                    1-Open
## 34369                     3-New
## 34436                    1-Open
## 34439                    1-Open
## 34445                    1-Open
## 34525                    1-Open
## 34559                    1-Open
## 34560                    1-Open
## 34583                    1-Open
## 34719                    1-Open
## 34743                    1-Open
## 34752                    1-Open
## 34754                    1-Open
## 34797                    1-Open
## 34855                    1-Open
## 34870                    1-Open
## 34968                    1-Open
## 34969                    1-Open
## 34971                    1-Open
## 35001                    1-Open
## 35040                     3-New
## 35065                    1-Open
## 35069                    1-Open
## 35075                     3-New
## 35076                    1-Open
## 35077                    1-Open
## 35096                    1-Open
## 35134                    1-Open
## 35143                    1-Open
## 35152                    1-Open
## 35167                    1-Open
## 35168                    1-Open
## 35169                    1-Open
## 35252                    1-Open
## 35261                    1-Open
## 35271                    1-Open
## 35289                    1-Open
## 35294                    1-Open
## 35338                    1-Open
## 35339                    1-Open
## 35428                    1-Open
## 35457                    1-Open
## 35479                    1-Open
## 35494                    1-Open
## 35595                    1-Open
## 35694                    1-Open
## 35695                    1-Open
## 35696                    1-Open
## 35697                    1-Open
## 35875                    1-Open
## 35962                    1-Open
## 35972                    1-Open
## 35973                    1-Open
## 36024                    1-Open
## 36025                8-Reopened
## 36026                    1-Open
## 36038                    1-Open
## 36065                    1-Open
## 36116                    1-Open
## 36316                     3-New
## 36382                    1-Open
## 36383                    1-Open
## 36384                    1-Open
## 36385                    1-Open
## 36402                    1-Open
## 36449                    1-Open
## 36458                    1-Open
## 36510                     3-New
## 36557                    1-Open
## 36571                    1-Open
## 36588                    1-Open
## 36661                    1-Open
## 36680                    1-Open
## 36691                    1-Open
## 36692                    1-Open
## 36693                    1-Open
## 36694                    1-Open
## 36696                    1-Open
## 36699                    1-Open
## 36752                    1-Open
## 36807                    1-Open
## 36808                    1-Open
## 36809                    1-Open
## 36821                    1-Open
## 36893                    1-Open
## 36894                    1-Open
## 36966                    1-Open
## 36988                    1-Open
## 37076                    1-Open
## 37138                    1-Open
## 37158                    1-Open
## 37197                    1-Open
## 37227                    1-Open
## 37243                    1-Open
## 37265                    1-Open
## 37373                    1-Open
## 37421                    1-Open
## 37447                    1-Open
## 37458                     3-New
## 37522                    1-Open
## 37523                     3-New
## 37542                    1-Open
## 37575                    1-Open
## 37581                    1-Open
## 37638                    1-Open
## 37668                    1-Open
## 37731                    1-Open
## 37751                    1-Open
## 37754                    1-Open
## 37759                    1-Open
## 37790                    1-Open
## 37795                    1-Open
## 37841                    1-Open
## 37866                    1-Open
## 37869                    1-Open
## 37871                    1-Open
## 37872                    1-Open
## 37877                    1-Open
## 37892                    1-Open
## 37932                    1-Open
## 37933                    1-Open
## 37934                    1-Open
## 37940                    1-Open
## 37941                    1-Open
## 37947                    1-Open
## 37950                    1-Open
## 37951                    1-Open
## 37952                    1-Open
## 37981                    1-Open
## 37982                    1-Open
## 38055                    1-Open
## 38057                    1-Open
## 38127                    1-Open
## 38149                    1-Open
## 38151                    1-Open
## 38153                    1-Open
## 38154                    1-Open
## 38160                    1-Open
## 38169                    1-Open
## 38212                    1-Open
## 38214                    1-Open
## 38238                    1-Open
## 38251                    1-Open
## 38340                    1-Open
## 38349                    1-Open
## 38427                    1-Open
## 38433                    1-Open
## 38453                    1-Open
## 38522                    1-Open
## 38526                     3-New
## 38541                    1-Open
## 38560                    1-Open
## 38561                    1-Open
## 38562                    1-Open
## 38596                    1-Open
## 38607                    1-Open
## 38608                    1-Open
## 38609                     3-New
## 38622                    1-Open
## 38626                    1-Open
## 38627                    1-Open
## 38628                    1-Open
## 38629                    1-Open
## 38631                    1-Open
## 38632                    1-Open
## 38688                    1-Open
## 38690                    1-Open
## 38711                    1-Open
## 38736                    1-Open
## 38787                    1-Open
## 38799                    1-Open
## 38809                    1-Open
## 38810                    1-Open
## 38815                    1-Open
## 38895                    1-Open
## 38916                    1-Open
## 38933                    1-Open
## 38962                    1-Open
## 38970                    1-Open
## 39085                    1-Open
## 39089                    1-Open
## 39124                    1-Open
## 39138                    1-Open
## 39173                    1-Open
## 39213                    1-Open
## 39289                    1-Open
## 39457                    1-Open
## 39458                    1-Open
## 39459                    1-Open
## 39466                    1-Open
## 39480                    1-Open
## 39511                    1-Open
## 39525                    1-Open
## 39526                    1-Open
## 39534                    1-Open
## 39535                    1-Open
## 39536                    1-Open
## 39585                    1-Open
## 39592                    1-Open
## 39600                    1-Open
## 39636                    1-Open
## 39638                    1-Open
## 39672                    1-Open
## 39677                     3-New
## 39739                    1-Open
## 39743                    1-Open
## 39772                    1-Open
## 39775                    1-Open
## 39777                    1-Open
## 39778                    1-Open
## 39780                     3-New
## 39781                    1-Open
## 39795                    1-Open
## 39874                    1-Open
## 39915                    1-Open
## 39933                    1-Open
## 39959                    1-Open
## 39961                    1-Open
## 39962                    1-Open
## 39976                    1-Open
## 39978                    1-Open
## 39979                    1-Open
## 39980                    1-Open
## 40009                    1-Open
## 40025                    1-Open
## 40044                    1-Open
## 40065                    1-Open
## 40068                    1-Open
## 40070                    1-Open
## 40071                    1-Open
## 40073                    1-Open
## 40074                    1-Open
## 40075                    1-Open
## 40077                    1-Open
## 40078                    1-Open
## 40079                    1-Open
## 40081                    1-Open
## 40138                     3-New
## 40145                    1-Open
## 40146                    1-Open
## 40243                    1-Open
## 40253                    1-Open
## 40255                    1-Open
## 40354                    1-Open
## 40383                    1-Open
## 40402                    1-Open
## 40421                    1-Open
## 40449                    1-Open
## 40520                    1-Open
## 40521                    1-Open
## 40522                    1-Open
## 40534                    1-Open
## 40537                    1-Open
## 40561                    1-Open
## 40592                    1-Open
## 40595                    1-Open
## 40598                    1-Open
## 40657                    1-Open
## 40730                    1-Open
## 40732                    1-Open
## 40733                    1-Open
## 40735                    1-Open
## 40762                    1-Open
## 40763                    1-Open
## 40789                    1-Open
## 40808                    1-Open
## 40832                    1-Open
## 40851                    1-Open
## 40918                    1-Open
## 41002                    1-Open
## 41005                    1-Open
## 41020                    1-Open
## 41021                    1-Open
## 41034                    1-Open
## 41035                    1-Open
## 41036                     3-New
## 41038                    1-Open
## 41053                    1-Open
## 41054                     3-New
## 41097                    1-Open
## 41098                    1-Open
## 41099                    1-Open
## 41100                    1-Open
## 41101                    1-Open
## 41109                    1-Open
## 41110                    1-Open
## 41111                    1-Open
## 41112                    1-Open
## 41113                    1-Open
## 41114                    1-Open
## 41115                    1-Open
## 41123                    1-Open
## 41124                    1-Open
## 41125                    1-Open
## 41126                    1-Open
## 41139                    1-Open
## 41140                    1-Open
## 41141                    1-Open
## 41142                    1-Open
## 41143                    1-Open
## 41146                    1-Open
## 41186                    1-Open
## 41198                    1-Open
## 41241                    1-Open
## 41257 5-Changed Boundary/Agency
## 41277                    1-Open
## 41301                    1-Open
## 41307                    1-Open
## 41310                    1-Open
## 41316                    1-Open
## 41331                    1-Open
## 41342                    1-Open
## 41344                    1-Open
## 41395                    1-Open
## 41402                    1-Open
## 41486                    1-Open
## 41488                    1-Open
## 41542                    1-Open
## 41545                    1-Open
## 41574                    1-Open
## 41577                    1-Open
## 41599                    1-Open
## 41600                    1-Open
## 41607                    1-Open
## 41608                    1-Open
## 41609                    1-Open
## 41611                    1-Open
## 41612                    1-Open
## 41616                    1-Open
## 41626                    1-Open
## 41629                    1-Open
## 41633                    1-Open
## 41637                    1-Open
## 41640                    1-Open
## 41641                    1-Open
## 41642                    1-Open
## 41643                    1-Open
## 41644                     3-New
## 41652                    1-Open
## 41685                    1-Open
## 41686                    1-Open
## 41704                    1-Open
## 41716                    1-Open
## 41719                    1-Open
## 41720                    1-Open
## 41725                    1-Open
## 41735                    1-Open
## 41753                    1-Open
## 41792                    1-Open
## 41847                    1-Open
## 41854                    1-Open
## 41907                    1-Open
## 42016                    1-Open
## 42029                    1-Open
## 42040                     3-New
## 42054                    1-Open
## 42062                    1-Open
## 42121                     3-New
## 42142                    1-Open
## 42154                    1-Open
## 42157                    1-Open
## 42173                    1-Open
## 42180                    1-Open
## 42183                    1-Open
## 42252                    1-Open
## 42338                    1-Open
## 42388                    1-Open
## 42409                    1-Open
## 42424                    1-Open
## 42429                    1-Open
## 42448                    1-Open
## 42485                    1-Open
## 42490                    1-Open
## 42495                    1-Open
## 42523                    1-Open
## 42525                    1-Open
## 42526                    1-Open
## 42636                    1-Open
## 42637                    1-Open
## 42644                    1-Open
## 42652                    1-Open
## 42653                    1-Open
## 42654                    1-Open
## 42661                    1-Open
## 42704                    1-Open
## 42705                    1-Open
## 42706                    1-Open
## 42707                    1-Open
## 42708                    1-Open
## 42803                    1-Open
## 42845                    1-Open
## 42911                    1-Open
## 42913                    1-Open
## 42961                    1-Open
## 42992                    1-Open
## 43046                    1-Open
## 43053                    1-Open
## 43163                    1-Open
## 43164                    1-Open
## 43165                    1-Open
## 43181                    1-Open
## 43220                    1-Open
## 43239                    1-Open
## 43244                    1-Open
## 43245                    1-Open
## 43248                    1-Open
## 43249                    1-Open
## 43250                    1-Open
## 43251                    1-Open
## 43253                    1-Open
## 43302                    1-Open
## 43366                    1-Open
## 43500                    1-Open
## 43509                    1-Open
## 43531                    1-Open
## 43532                    1-Open
## 43533                    1-Open
## 43564                     3-New
## 43637                    1-Open
## 43638                    1-Open
## 43667                    1-Open
## 43668                    1-Open
## 43673                    1-Open
## 43674                    1-Open
## 43786                    1-Open
## 43794                    1-Open
## 43800                    1-Open
## 43833                    1-Open
## 43839                    1-Open
## 43840                    1-Open
## 43841                    1-Open
## 43843                    1-Open
## 43858                    1-Open
## 43909                    1-Open
## 43914                    1-Open
## 43941                    1-Open
## 43942                     3-New
## 43943                     3-New
## 43945                     3-New
## 44002                    1-Open
## 44016                    1-Open
## 44041                    1-Open
## 44043                    1-Open
## 44151                    1-Open
## 44166                    1-Open
## 44189                    1-Open
## 44227                    1-Open
## 44236                    1-Open
## 44246                    1-Open
## 44271                    1-Open
## 44319                    1-Open
## 44347                    1-Open
## 44393                    1-Open
## 44425                    1-Open
## 44435                     3-New
## 44557                    1-Open
## 44649                    1-Open
## 44763                    1-Open
## 44764                    1-Open
## 44766                    1-Open
## 44768                    1-Open
## 44778                    1-Open
## 44781                    1-Open
## 44786                    1-Open
## 44791                    1-Open
## 44829                    1-Open
## 44955                    1-Open
## 44961                    1-Open
## 44993                    1-Open
## 44994                    1-Open
## 44995                     3-New
## 45101                    1-Open
## 45145                    1-Open
## 45174                    1-Open
## 45183                    1-Open
## 45188                    1-Open
## 45207                    1-Open
## 45226                    1-Open
## 45241                    1-Open
## 45243                    1-Open
## 45244                    1-Open
## 45245                    1-Open
## 45247                    1-Open
## 45249                    1-Open
## 45252                    1-Open
## 45255                    1-Open
## 45256                    1-Open
## 45259                     3-New
## 45260                    1-Open
## 45266                    1-Open
## 45314                    1-Open
## 45316                    1-Open
## 45322                    1-Open
## 45323                    1-Open
## 45324                    1-Open
## 45325                    1-Open
## 45326                    1-Open
## 45327                    1-Open
## 45328                    1-Open
## 45351                     3-New
## 45383                    1-Open
## 45384                    1-Open
## 45385                    1-Open
## 45389                    1-Open
## 45393                    1-Open
## 45401                    1-Open
## 45449                    1-Open
## 45467                    1-Open
## 45549                    1-Open
## 45550                    1-Open
## 45558                    1-Open
## 45562                    1-Open
## 45563                    1-Open
## 45566                    1-Open
## 45568                    1-Open
## 45591                    1-Open
## 45592                    1-Open
## 45646                    1-Open
## 45706                     3-New
## 45803                    1-Open
## 45907                    1-Open
## 45918                    1-Open
## 45946                     3-New
## 46044                    1-Open
## 46105                    1-Open
## 46107                    1-Open
## 46166                    1-Open
## 46187                    1-Open
## 46203                    1-Open
## 46226                    1-Open
## 46233                    1-Open
## 46234                    1-Open
## 46289                    1-Open
## 46375                    1-Open
## 46430                    1-Open
## 46455                    1-Open
## 46456                    1-Open
## 46457                    1-Open
## 46458                    1-Open
## 46468                    1-Open
## 46471                    1-Open
## 46472                    1-Open
## 46473                    1-Open
## 46475                    1-Open
## 46476                    1-Open
## 46492                    1-Open
## 46500                    1-Open
## 46501                     3-New
## 46641                    1-Open
## 46672                    1-Open
## 46673                    1-Open
## 46752                    1-Open
## 46925                    1-Open
## 46926                    1-Open
## 46956                    1-Open
## 46970                    1-Open
## 46978                    1-Open
## 47007                    1-Open
## 47096                    1-Open
## 47101                    1-Open
## 47254                    1-Open
## 47256                    1-Open
## 47270                    1-Open
## 47303                    1-Open
## 47324                    1-Open
## 47326                    1-Open
## 47344                    1-Open
## 47427                    1-Open
## 47433                    1-Open
## 47434                    1-Open
## 47435                    1-Open
## 47459                    1-Open
## 47466                    1-Open
## 47477                    1-Open
## 47478                    1-Open
## 47498                    1-Open
## 47515                    1-Open
## 47568                    1-Open
## 47580                    1-Open
## 47581                    1-Open
## 47583                    1-Open
## 47603                    1-Open
## 47659                    1-Open
## 47660                    1-Open
## 47661                    1-Open
## 47662                    1-Open
## 47682                    1-Open
## 47693                    1-Open
## 47730                    1-Open
## 47732                    1-Open
## 47761                    1-Open
## 47770                    1-Open
## 47775                    1-Open
## 47820                    1-Open
## 47924                    1-Open
## 47937                    1-Open
## 47938                    1-Open
## 47959                    1-Open
## 48017                    1-Open
## 48020                    1-Open
## 48021                    1-Open
## 48022                    1-Open
## 48034                    1-Open
## 48096                    1-Open
## 48136                     3-New
## 48187                    1-Open
## 48189                    1-Open
## 48192                    1-Open
## 48195                    1-Open
## 48200                    1-Open
## 48275                    1-Open
## 48277                    1-Open
## 48279                    1-Open
## 48315                    1-Open
## 48389                    1-Open
## 48400                    1-Open
## 48509                    1-Open
## 48515                    1-Open
## 48534                    1-Open
## 48594                    1-Open
## 48634                    1-Open
## 48661                    1-Open
## 48677                    1-Open
## 48737                    1-Open
## 48748                    1-Open
## 48779                    1-Open
## 48786                    1-Open
## 48802                    1-Open
## 48813                    1-Open
## 48835                    1-Open
## 48863                    1-Open
## 48945                    1-Open
## 48956                    1-Open
## 48987                    1-Open
## 49000                    1-Open
## 49040                    1-Open
## 49052                    1-Open
## 49123                    1-Open
## 49124                    1-Open
## 49126                    1-Open
## 49177                     3-New
## 49179                    1-Open
## 49180                     3-New
## 49192                    1-Open
## 49193                    1-Open
## 49194                    1-Open
## 49195                    1-Open
## 49196                    1-Open
## 49197                    1-Open
## 49232                    1-Open
## 49240                    1-Open
## 49247                    1-Open
## 49255                    1-Open
## 49256                    1-Open
## 49257                    1-Open
## 49258                    1-Open
## 49259                    1-Open
## 49262                    1-Open
## 49263                     3-New
## 49269                    1-Open
## 49353                    1-Open
## 49355                    1-Open
## 49429                    1-Open
## 49430                    1-Open
## 49480                    1-Open
## 49511                    1-Open
## 49519                    1-Open
## 49523                    1-Open
## 49524                    1-Open
## 49526                    1-Open
## 49527                    1-Open
## 49529                    1-Open
## 49530                    1-Open
## 49531                    1-Open
## 49533                    1-Open
## 49534                    1-Open
## 49535                    1-Open
## 49536                    1-Open
## 49537                    1-Open
## 49538                    1-Open
## 49539                    1-Open
## 49540                    1-Open
## 49557                    1-Open
## 49558                    1-Open
## 49559                    1-Open
## 49591                    1-Open
## 49618                    1-Open
## 49620                     3-New
## 49621                     3-New
## 49623                     3-New
## 49645                    1-Open
## 49646                     3-New
## 49682                    1-Open
## 49726                    1-Open
## 49742                    1-Open
## 49743                    1-Open
## 49890                    1-Open
## 49892                    1-Open
## 49893                   4-Added
## 49894                    1-Open
## 49895                    1-Open
## 49982                    1-Open
## 50014                    1-Open
## 50039                    1-Open
## 50092                     3-New
## 50097                    1-Open
## 50099                    1-Open
## 50223                    1-Open
## 50289                    1-Open
## 50290                    1-Open
## 50295                    1-Open
## 50296                    1-Open
## 50303                    1-Open
## 50304                    1-Open
## 50305                    1-Open
## 50315                    1-Open
## 50355                    1-Open
## 50366                    1-Open
## 50368                    1-Open
## 50370                    1-Open
## 50400                    1-Open
## 50403                    1-Open
## 50465                    1-Open
## 50478                    1-Open
## 50479                    1-Open
## 50493                    1-Open
## 50495                    1-Open
## 50522                    1-Open
## 50561                    1-Open
## 50830                    1-Open
## 50899                    1-Open
## 50901                    1-Open
## 50911                    1-Open
## 50916                    1-Open
## 50951                     3-New
## 50952                    1-Open
## 50965                    1-Open
## 50966                    1-Open
## 51003                     3-New
## 51022                    1-Open
## 51083                    1-Open
## 51093                    1-Open
## 51196                    1-Open
## 51203                    1-Open
## 51222                    1-Open
## 51237                    1-Open
## 51243                    1-Open
## 51284                    1-Open
## 51321                    1-Open
## 51326                    1-Open
## 51358                    1-Open
## 51374                     3-New
## 51419                    1-Open
## 51459                    1-Open
## 51461                    1-Open
## 51476                    1-Open
## 51502                    1-Open
## 51573                     3-New
## 51590                    1-Open
## 51594                    1-Open
## 51613                    1-Open
## 51637                    1-Open
## 51686                    1-Open
## 51712                    1-Open
## 51720                    1-Open
## 51722                    1-Open
## 51728                    1-Open
## 51735                    1-Open
## 51736                    1-Open
## 51737                    1-Open
## 51738                    1-Open
## 51739                    1-Open
## 51740                    1-Open
## 51741                    1-Open
## 51765                    1-Open
## 51809                    1-Open
## 51811                     3-New
## 51910                    1-Open
## 51936                    1-Open
## 51963                    1-Open
## 52033                    1-Open
## 52055                    1-Open
## 52063                    1-Open
## 52069                    1-Open
## 52092                    1-Open
## 52129                    1-Open
## 52139                    1-Open
## 52154                    1-Open
## 52155                    1-Open
## 52204                    1-Open
## 52210                    1-Open
## 52219                    1-Open
## 52222                    1-Open
## 52285                    1-Open
## 52375                     3-New
## 52420                    1-Open
## 52433                    1-Open
## 52434                    1-Open
## 52462                    1-Open
## 52512                    1-Open
## 52544                    1-Open
## 52568                    1-Open
## 52677                    1-Open
## 52705                    1-Open
## 52711                    1-Open
## 52713                    1-Open
## 52714                    1-Open
## 52752                    1-Open
## 52763                    1-Open
## 52785                    1-Open
## 52794                    1-Open
## 52828                    1-Open
## 52837                    1-Open
## 52847                    1-Open
## 52875                    1-Open
## 52988                    1-Open
## 52998                    1-Open
## 53039                    1-Open
## 53054                    1-Open
## 53072                    1-Open
## 53073                    1-Open
## 53075                    1-Open
## 53176                    1-Open
## 53239                    1-Open
## 53242                    1-Open
## 53243                    1-Open
## 53244                    1-Open
## 53297                    1-Open
## 53314                    1-Open
## 53319                    1-Open
## 53341                    1-Open
## 53392                    1-Open
## 53407                    1-Open
## 53461                    1-Open
## 53472                     3-New
## 53473                    1-Open
## 53474                    1-Open
## 53589                    1-Open
## 53620                    1-Open
## 53705                    1-Open
## 53730                    1-Open
## 53733                    1-Open
## 53734                    1-Open
## 53846                    1-Open
## 53862                    1-Open
## 53863                    1-Open
## 53922                    1-Open
## 53978                    1-Open
## 53985                    1-Open
## 54026                    1-Open
## 54028                    1-Open
## 54138                     3-New
## 54154                    1-Open
## 54186                    1-Open
## 54231                    1-Open
## 54252                    1-Open
## 54264                    1-Open
## 54265                    1-Open
## 54288                    1-Open
## 54296                    1-Open
## 54301                    1-Open
## 54336                     3-New
## 54347                    1-Open
## 54357                    1-Open
## 54405                    1-Open
## 54414                    1-Open
## 54416                    1-Open
## 54426                    1-Open
## 54637                    1-Open
## 54646                   4-Added
## 54683                    1-Open
## 54691                    1-Open
## 54721                    1-Open
## 54743                    1-Open
## 54765                    1-Open
## 54791                    1-Open
## 54907                    1-Open
## 54946                    1-Open
## 54972                    1-Open
## 54976                     3-New
## 55018                    1-Open
## 55110                    1-Open
## 55121                    1-Open
## 55164                    1-Open
## 55166                    1-Open
## 55187                    1-Open
## 55203                    1-Open
## 55238                    1-Open
## 55239                    1-Open
## 55291                    1-Open
## 55298                    1-Open
## 55299                    1-Open
## 55300                    1-Open
## 55306                    1-Open
## 55307                    1-Open
## 55309                    1-Open
## 55312                    1-Open
## 55314                    1-Open
## 55317                    1-Open
## 55323                    1-Open
## 55331                    1-Open
## 55369                     3-New
## 55412                    1-Open
## 55413                    1-Open
## 55414                    1-Open
## 55530                    1-Open
## 55677                    1-Open
## 55748                    1-Open
## 55754                    1-Open
## 55901                    1-Open
## 55902                    1-Open
## 55903                    1-Open
## 56099                    1-Open
## 56102                    1-Open
## 56123                    1-Open
## 56133                    1-Open
## 56183                    1-Open
## 56184                    1-Open
## 56213                    1-Open
## 56232                    1-Open
## 56233                    1-Open
## 56243                    1-Open
## 56295                    1-Open
## 56337                    1-Open
## 56358                    1-Open
## 56361                    1-Open
## 56384                    1-Open
## 56419                    1-Open
## 56428                    1-Open
## 56619                    1-Open
## 56678                    1-Open
## 56739                    1-Open
## 56817                    1-Open
## 56838                    1-Open
## 56863                    1-Open
## 56873                    1-Open
## 56880                    1-Open
## 56904                    1-Open
## 56918                    1-Open
## 56931                    1-Open
## 56932                    1-Open
## 56933                    1-Open
## 56982                    1-Open
## 57060                    1-Open
## 57140                    1-Open
## 57141                    1-Open
## 57144                    1-Open
## 57152                    1-Open
## 57160                    1-Open
## 57161                    1-Open
## 57167                    1-Open
## 57171                    1-Open
## 57198                    1-Open
## 57199                    1-Open
## 57226                    1-Open
## 57228                    1-Open
## 57230                    1-Open
## 57231                    1-Open
## 57234                    1-Open
## 57238                    1-Open
## 57252                    1-Open
## 57264                    1-Open
## 57270                    1-Open
## 57276                    1-Open
## 57278                    1-Open
## 57287                    1-Open
## 57288                    1-Open
## 57289                    1-Open
## 57297                    1-Open
## 57298                    1-Open
## 57354                    1-Open
## 57379                    1-Open
## 57385                    1-Open
## 57420                    1-Open
## 57472                    1-Open
## 57478                    1-Open
## 57533                    1-Open
## 57571                    1-Open
## 57595                    1-Open
## 57596                    1-Open
## 57603                    1-Open
## 57604                    1-Open
## 57609                    1-Open
## 57656                    1-Open
## 57665                    1-Open
## 57685                    1-Open
## 57688                    1-Open
## 57689                    1-Open
## 57690                    1-Open
## 57691                    1-Open
## 57692                    1-Open
## 57694                    1-Open
## 57695                    1-Open
## 57696                     3-New
## 57778                    1-Open
## 57780                    1-Open
## 57788                    1-Open
## 57791                    1-Open
## 57800                    1-Open
## 57848                    1-Open
## 57882                    1-Open
## 57904                    1-Open
## 57907                    1-Open
## 57912                    1-Open
## 57913                    1-Open
## 57925                    1-Open
## 57927                    1-Open
## 57966                    1-Open
## 57984                    1-Open
## 57993                    1-Open
## 58065                    1-Open
## 58141                    1-Open
## 58185                    1-Open
## 58204                    1-Open
## 58205                    1-Open
## 58219                    1-Open
## 58222                    1-Open
## 58355                    1-Open
## 58359                    1-Open
## 58363                    1-Open
## 58371                    1-Open
## 58373                     3-New
## 58383                    1-Open
## 58393                    1-Open
## 58400                    1-Open
## 58405                    1-Open
## 58420                    1-Open
## 58432                     3-New
## 58489                    1-Open
## 58492                    1-Open
## 58502                    1-Open
## 58505                    1-Open
## 58506                    1-Open
## 58520                    1-Open
## 58530                    1-Open
## 58536                    1-Open
## 58537                    1-Open
## 58554                    1-Open
## 58555                    1-Open
## 58571                    1-Open
## 58572                    1-Open
## 58573                    1-Open
## 58600                    1-Open
## 58635                    1-Open
## 58658                    1-Open
## 58701                    1-Open
## 58702                    1-Open
## 58707                    1-Open
## 58741                    1-Open
## 58747                    1-Open
## 58800                    1-Open
## 58813                    1-Open
## 58814                    1-Open
## 58817                    1-Open
## 58821                    1-Open
## 58822                    1-Open
## 58823                    1-Open
## 58824                    1-Open
## 58843                    1-Open
## 58848                    1-Open
## 58930                    1-Open
## 58953                    1-Open
## 58954                    1-Open
## 58981                    1-Open
## 58985                    1-Open
## 58987                    1-Open
## 58988                    1-Open
## 58989                    1-Open
## 58991                    1-Open
## 58992                    1-Open
## 58995                    1-Open
## 59000                    1-Open
## 59006                    1-Open
## 59007                    1-Open
## 59016                    1-Open
## 59031                    1-Open
## 59035                    1-Open
## 59038                    1-Open
## 59076                    1-Open
## 59081                    1-Open
## 59091                    1-Open
## 59108                    1-Open
## 59129                    1-Open
## 59158                    1-Open
## 59205                    1-Open
## 59331                    1-Open
## 59335                    1-Open
## 59346                    1-Open
## 59351                    1-Open
## 59355                    1-Open
## 59359                    1-Open
## 59360                    1-Open
## 59416                    1-Open
## 59421                    1-Open
## 59447                    1-Open
## 59472                    1-Open
## 59477                    1-Open
## 59478                    1-Open
## 59482                    1-Open
## 59489                    1-Open
## 59491                    1-Open
## 59534                    1-Open
## 59564                    1-Open
## 59677                    1-Open
## 59716                    1-Open
## 59758                    1-Open
## 59759                    1-Open
## 59770                    1-Open
## 59848                    1-Open
## 59861                    1-Open
## 59864                    1-Open
## 59865                    1-Open
## 59868                    1-Open
## 59870                    1-Open
## 59875                    1-Open
## 59877                    1-Open
## 59881                    1-Open
## 59886                    1-Open
## 59901                    1-Open
## 59917                    1-Open
## 59922                    1-Open
## 59924                    1-Open
## 59928                    1-Open
## 59933                    1-Open
## 59967                    1-Open
## 60008                    1-Open
## 60040                    1-Open
## 60041                    1-Open
## 60043                    1-Open
## 60058                    1-Open
## 60068                    1-Open
## 60081                    1-Open
## 60084                    1-Open
## 60089                    1-Open
## 60098                    1-Open
## 60099                    1-Open
## 60113                    1-Open
## 60118                     3-New
## 60162                   4-Added
## 60254                    1-Open
## 60255                    1-Open
## 60276                    1-Open
## 60285                    1-Open
## 60289                    1-Open
## 60300                    1-Open
## 60329                    1-Open
## 60346                    1-Open
## 60368                    1-Open
## 60375                    1-Open
## 60464                    1-Open
## 60517                    1-Open
## 60528                    1-Open
## 60558                    1-Open
## 60606                    1-Open
## 60658                    1-Open
## 60662                    1-Open
## 60679                    1-Open
## 60682                    1-Open
## 60683                    1-Open
## 60689                    1-Open
## 60721                    1-Open
## 60755                     3-New
## 60764                    1-Open
## 60765                    1-Open
## 60768                    1-Open
## 60787                    1-Open
## 60859                    1-Open
## 60860                    1-Open
## 60862                    1-Open
## 60863                    1-Open
## 60864                    1-Open
## 60865                    1-Open
## 60932                     3-New
## 60938                     3-New
## 60940                    1-Open
## 60941                    1-Open
## 60942                    1-Open
## 60943                    1-Open
## 60944                    1-Open
## 60945                    1-Open
## 60946                    1-Open
## 60947                    1-Open
## 60948                    1-Open
## 60956                    1-Open
## 60994                    1-Open
## 61018                    1-Open
## 61021                    1-Open
## 61022                    1-Open
## 61023                    1-Open
## 61024                    1-Open
## 61025                    1-Open
## 61027                    1-Open
## 61028                    1-Open
## 61029                    1-Open
## 61030                    1-Open
## 61031                    1-Open
## 61032                    1-Open
## 61051                    1-Open
## 61054                    1-Open
## 61055                    1-Open
## 61065                    1-Open
## 61070                    1-Open
## 61073                    1-Open
## 61077                    1-Open
## 61140                    1-Open
## 61161                    1-Open
## 61222                    1-Open
## 61225                    1-Open
## 61229                    1-Open
## 61270                    1-Open
## 61284                    1-Open
## 61296                     3-New
## 61298                     3-New
## 61356                    1-Open
## 61357                    1-Open
## 61359                    1-Open
## 61360                    1-Open
## 61369                    1-Open
## 61376                    1-Open
## 61378                    1-Open
## 61379                    1-Open
## 61380                    1-Open
## 61384                    1-Open
## 61386                    1-Open
## 61438                    1-Open
## 61450                    1-Open
## 61453                     3-New
## 61455                    1-Open
## 61456                    1-Open
## 61457                    1-Open
## 61459                    1-Open
## 61463                    1-Open
## 61464                    1-Open
## 61563                    1-Open
## 61586                    1-Open
## 61588                    1-Open
## 61591                    1-Open
## 61600                    1-Open
## 61611                    1-Open
## 61612                8-Reopened
## 61637                    1-Open
## 61697                    1-Open
## 61699                    1-Open
## 61754                    1-Open
## 61766                    1-Open
## 61767                    1-Open
## 61781                    1-Open
## 61802                    1-Open
## 61803                    1-Open
## 61843                    1-Open
## 61845                    1-Open
## 61866                    1-Open
## 61868                    1-Open
## 61876                    1-Open
## 62013                    1-Open
## 62051                    1-Open
## 62125                    1-Open
## 62139                    1-Open
## 62140                    1-Open
## 62141                    1-Open
## 62144                    1-Open
## 62147                    1-Open
## 62185                    1-Open
## 62192                    1-Open
## 62266                    1-Open
## 62267                    1-Open
## 62269                    1-Open
## 62305                    1-Open
## 62309                    1-Open
## 62310                    1-Open
## 62312                    1-Open
## 62315                    1-Open
## 62316                    1-Open
## 62317                    1-Open
## 62339                    1-Open
## 62340                    1-Open
## 62341                    1-Open
## 62342                    1-Open
## 62343                    1-Open
## 62344                    1-Open
## 62345                    1-Open
## 62346                    1-Open
## 62347                    1-Open
## 62348                    1-Open
## 62349                    1-Open
## 62350                    1-Open
## 62351                    1-Open
## 62352                    1-Open
## 62353                    1-Open
## 62354                    1-Open
## 62355                    1-Open
## 62373                    1-Open
## 62408                    1-Open
## 62409                    1-Open
## 62410                    1-Open
## 62414                    1-Open
## 62415                    1-Open
## 62445                    1-Open
## 62446                    1-Open
## 62450                    1-Open
## 62453                    1-Open
## 62456                    1-Open
## 62523                    1-Open
## 62531                    1-Open
## 62557                    1-Open
## 62574                    1-Open
## 62644                    1-Open
## 62678                    1-Open
## 62679                    1-Open
## 62687                    1-Open
## 62693                    1-Open
## 62731                    1-Open
## 62755                    1-Open
## 62756                    1-Open
## 62788                    1-Open
## 62803                    1-Open
## 62866                    1-Open
## 62978                    1-Open
## 63014                    1-Open
## 63041                    1-Open
## 63042                    1-Open
## 63044                    1-Open
## 63058                    1-Open
## 63094                    1-Open
## 63111                    1-Open
## 63144                    1-Open
## 63145                    1-Open
## 63151                    1-Open
## 63152                    1-Open
## 63169                    1-Open
## 63173                    1-Open
## 63174                    1-Open
## 63175                    1-Open
## 63206                    1-Open
## 63211                    1-Open
## 63239                    1-Open
## 63240                    1-Open
## 63279                    1-Open
## 63280                    1-Open
## 63291                    1-Open
## 63292                    1-Open
## 63344                    1-Open
## 63363                    1-Open
## 63365                    1-Open
## 63379                    1-Open
## 63380                    1-Open
## 63381                    1-Open
## 63382                    1-Open
## 63397                    1-Open
## 63509                     3-New
## 63511                     3-New
## 63519                    1-Open
## 63615                    1-Open
## 63616                    1-Open
## 63622                    1-Open
## 63623                    1-Open
## 63672                    1-Open
## 63674                   4-Added
## 63685                    1-Open
## 63686                    1-Open
## 63687                    1-Open
## 63698                    1-Open
## 63703                    1-Open
## 63711                     3-New
## 63741                    1-Open
## 63749                    1-Open
## 63756                    1-Open
## 63780                    1-Open
## 63802                    1-Open
## 63818                    1-Open
## 63821                   4-Added
## 63822 5-Changed Boundary/Agency
## 63834                    1-Open
## 63903                    1-Open
## 64038                    1-Open
## 64095                    1-Open
## 64146                    1-Open
## 64246                    1-Open
## 64284                    1-Open
## 64285                    1-Open
## 64321                    1-Open
## 64322                    1-Open
## 64323                    1-Open
## 64327                    1-Open
## 64334                    1-Open
## 64368                    1-Open
## 64381                    1-Open
## 64460                    1-Open
## 64502                    1-Open
## 64599                    1-Open
## 64601                    1-Open
## 64612                    1-Open
## 64629                    1-Open
## 64646                    1-Open
## 64679                    1-Open
## 64684                    1-Open
## 64733                    1-Open
## 64739                    1-Open
## 64753                    1-Open
## 64766                    1-Open
## 64783                    1-Open
## 64796                    1-Open
## 64797                    1-Open
## 64911                    1-Open
## 64913                    1-Open
## 64984                    1-Open
## 65028                     3-New
## 65030                    1-Open
## 65046                    1-Open
## 65056                    1-Open
## 65063                    1-Open
## 65064                    1-Open
## 65072                    1-Open
## 65075                   4-Added
## 65076                    1-Open
## 65129                    1-Open
## 65134                    1-Open
## 65136                    1-Open
## 65172                    1-Open
## 65175                    1-Open
## 65186                    1-Open
## 65193                    1-Open
## 65194                    1-Open
## 65211                    1-Open
## 65214                    1-Open
## 65219                    1-Open
## 65220                    1-Open
## 65281                    1-Open
## 65282                    1-Open
## 65285                    1-Open
## 65286                    1-Open
## 65287                    1-Open
## 65288                    1-Open
## 65309                    1-Open
## 65310                    1-Open
## 65311                     3-New
## 65323                    1-Open
## 65324                    1-Open
## 65325                    1-Open
## 65329                    1-Open
## 65330                    1-Open
## 65333                    1-Open
## 65334                    1-Open
## 65335                    1-Open
## 65336                    1-Open
## 65389                     3-New
## 65404                    1-Open
## 65405                     3-New
## 65429                     3-New
## 65430                    1-Open
## 65485                    1-Open
## 65559                    1-Open
## 65575                    1-Open
## 65602                    1-Open
## 65622                    1-Open
## 65623                    1-Open
## 65636                    1-Open
## 65637                    1-Open
## 65638                    1-Open
## 65639                    1-Open
## 65640                    1-Open
## 65641                    1-Open
## 65642                    1-Open
## 65643                    1-Open
## 65644                    1-Open
## 65687                    1-Open
## 65711                    1-Open
## 65712                    1-Open
## 65755                    1-Open
## 65761                    1-Open
## 65768                    1-Open
## 65793                    1-Open
## 65794                    1-Open
## 65795                    1-Open
## 65796                    1-Open
## 65797                    1-Open
## 65799                    1-Open
## 65800                    1-Open
## 65821                    1-Open
## 65822                     3-New
## 65823                    1-Open
## 65824                    1-Open
## 65825                    1-Open
## 65833                    1-Open
## 65834                    1-Open
## 65835                    1-Open
## 65837                    1-Open
## 65859                    1-Open
## 65861                    1-Open
## 65899                    1-Open
## 65905                    1-Open
## 65919                    1-Open
## 65956                    1-Open
## 65980                    1-Open
## 65981                    1-Open
## 66018                    1-Open
## 66035                    1-Open
## 66036                    1-Open
## 66037                    1-Open
## 66044                    1-Open
## 66049                    1-Open
## 66059                    1-Open
## 66083                    1-Open
## 66089                    1-Open
## 66186                    1-Open
## 66187                    1-Open
## 66188                    1-Open
## 66220                    1-Open
## 66221                    1-Open
## 66222                    1-Open
## 66228                    1-Open
## 66242                    1-Open
## 66267                    1-Open
## 66370                    1-Open
## 66397                    1-Open
## 66455                    1-Open
## 66470                    1-Open
## 66471                    1-Open
## 66496                    1-Open
## 66509                    1-Open
## 66543                    1-Open
## 66544                    1-Open
## 66558                    1-Open
## 66560                    1-Open
## 66569                    1-Open
## 66592                    1-Open
## 66593                    1-Open
## 66594                    1-Open
## 66595                    1-Open
## 66601                    1-Open
## 66602                    1-Open
## 66620                    1-Open
## 66631                    1-Open
## 66632                    1-Open
## 66640                    1-Open
## 66641                    1-Open
## 66643                     3-New
## 66648                    1-Open
## 66651                    1-Open
## 66653                    1-Open
## 66660                    1-Open
## 66669                    1-Open
## 66681                    1-Open
## 66687                    1-Open
## 66691                    1-Open
## 66698                    1-Open
## 66705                    1-Open
## 66706                    1-Open
## 66747                    1-Open
## 66758                    1-Open
## 66775                    1-Open
## 66794                    1-Open
## 66822                    1-Open
## 66844                    1-Open
## 66852                    1-Open
## 66855                    1-Open
## 66859                    1-Open
## 66871                    1-Open
## 66876                    1-Open
## 66902                    1-Open
## 66908                    1-Open
## 66966                    1-Open
## 66967                    1-Open
## 67008                    1-Open
## 67038                    1-Open
## 67043                    1-Open
## 67056                    1-Open
## 67057                    1-Open
## 67058                    1-Open
## 67063                    1-Open
## 67078                    1-Open
## 67110                    1-Open
## 67116                    1-Open
## 67117                    1-Open
## 67119                    1-Open
## 67121                    1-Open
## 67132                    1-Open
## 67138                     3-New
## 67151                    1-Open
## 67155                    1-Open
## 67158                    1-Open
## 67230                    1-Open
## 67295                    1-Open
## 67326                    1-Open
## 67339                    1-Open
## 67340                    1-Open
## 67360                    1-Open
## 67361                    1-Open
## 67366                    1-Open
## 67487                    1-Open
## 67488                    1-Open
## 67558                    1-Open
## 67620                    1-Open
## 67621                    1-Open
## 67642                    1-Open
## 67643                    1-Open
## 67681                    1-Open
## 67693                    1-Open
## 67703                    1-Open
## 67709                    1-Open
## 67715                    1-Open
## 67733                    1-Open
## 67743                    1-Open
## 67756                    1-Open
## 67773                    1-Open
## 67774                    1-Open
## 67802                    1-Open
## 67803                    1-Open
## 67806                    1-Open
## 67812                    1-Open
## 67818                    1-Open
## 67822                    1-Open
## 67831                    1-Open
## 67861                    1-Open
## 68022                    1-Open
## 68038                    1-Open
## 68039                    1-Open
## 68053                    1-Open
## 68057                    1-Open
## 68079                    1-Open
## 68080                     3-New
## 68113                    1-Open
## 68115                    1-Open
## 68118                    1-Open
## 68119                    1-Open
## 68120                    1-Open
## 68121                    1-Open
## 68122                    1-Open
## 68123                    1-Open
## 68124                    1-Open
## 68125                    1-Open
## 68126                    1-Open
## 68127                    1-Open
## 68128                    1-Open
## 68130                    1-Open
## 68131                    1-Open
## 68132                    1-Open
## 68133                    1-Open
## 68134                    1-Open
## 68135                    1-Open
## 68136                    1-Open
## 68137                    1-Open
## 68138                    1-Open
## 68139                    1-Open
## 68140                    1-Open
## 68141                    1-Open
## 68142                    1-Open
## 68143                    1-Open
## 68144                    1-Open
## 68145                    1-Open
## 68146                    1-Open
## 68147                    1-Open
## 68148                    1-Open
## 68149                    1-Open
## 68150                    1-Open
## 68151                    1-Open
## 68152                    1-Open
## 68153                    1-Open
## 68154                    1-Open
## 68155                    1-Open
## 68156                    1-Open
## 68157                     3-New
## 68158                     3-New
## 68209                    1-Open
## 68303                    1-Open
## 68304                    1-Open
## 68307                    1-Open
## 68338                    1-Open
## 68449                    1-Open
## 68464                    1-Open
## 68468                    1-Open
## 68474                    1-Open
## 68501                    1-Open
## 68568                    1-Open
## 68579                    1-Open
## 68580                    1-Open
## 68597                    1-Open
## 68598                    1-Open
## 68698                    1-Open
## 68774                    1-Open
## 68782                    1-Open
## 68801                    1-Open
## 68802                    1-Open
## 68803                    1-Open
## 68804                    1-Open
## 68811                    1-Open
## 68839                    1-Open
## 68870                    1-Open
## 68940                    1-Open
## 69031                    1-Open
## 69060                    1-Open
## 69064                     3-New
## 69066                     3-New
## 69068                    1-Open
## 69070                    1-Open
## 69071                    1-Open
## 69072                    1-Open
## 69073                    1-Open
## 69096                    1-Open
## 69099                    1-Open
## 69100                    1-Open
## 69117                    1-Open
## 69153                    1-Open
## 69157                     3-New
## 69161                    1-Open
## 69170                    1-Open
## 69184                    1-Open
## 69186                    1-Open
## 69232                    1-Open
## 69244                    1-Open
## 69289                    1-Open
## 69290                    1-Open
## 69314                     3-New
## 69324                    1-Open
## 69330                    1-Open
## 69331                    1-Open
## 69332                    1-Open
## 69333                    1-Open
## 69334                    1-Open
## 69394                    1-Open
## 69420                    1-Open
## 69518                    1-Open
## 69519                    1-Open
## 69533                    1-Open
## 69551                    1-Open
## 69552                    1-Open
## 69576                    1-Open
## 69581                    1-Open
## 69583                    1-Open
## 69594                     3-New
## 69595                    1-Open
## 69596                    1-Open
## 69688                    1-Open
## 69689                    1-Open
## 69690                    1-Open
## 69695                    1-Open
## 69696                    1-Open
## 69698                     3-New
## 69699                    1-Open
## 69701                    1-Open
## 69766                    1-Open
## 69774                    1-Open
## 69792                    1-Open
## 69794                    1-Open
## 69802                    1-Open
## 69803                    1-Open
## 69957                    1-Open
## 69958                    1-Open
## 69963                    1-Open
## 69964                    1-Open
## 69965                    1-Open
## 69970                    1-Open
## 69971                    1-Open
## 69973                    1-Open
## 69986                    1-Open
## 70053                    1-Open
## 70059                    1-Open
## 70115                    1-Open
## 70143                    1-Open
## 70148                    1-Open
## 70157                    1-Open
## 70173                    1-Open
## 70177                    1-Open
## 70240                    1-Open
## 70286                    1-Open
## 70351                    1-Open
## 70365                    1-Open
## 70366                    1-Open
## 70367                    1-Open
## 70397                    1-Open
## 70469                    1-Open
## 70504                    1-Open
## 70505                    1-Open
## 70524                    1-Open
## 70528                    1-Open
## 70529                    1-Open
## 70535                    1-Open
## 70536                    1-Open
## 70586                    1-Open
## 70658                    1-Open
## 70674                    1-Open
## 70755                    1-Open
## 70769                    1-Open
## 70808                    1-Open
## 70809                    1-Open
## 70851                    1-Open
## 70883                    1-Open
## 70889                    1-Open
## 70895                    1-Open
## 71038                    1-Open
## 71047                    1-Open
## 71048                    1-Open
## 71049                    1-Open
## 71050                    1-Open
## 71051                    1-Open
## 71053                    1-Open
## 71064                   4-Added
## 71161                    1-Open
## 71180                    1-Open
## 71182                    1-Open
## 71226                    1-Open
## 71238                    1-Open
## 71260                    1-Open
## 71263                    1-Open
## 71264                     3-New
## 71267                    1-Open
## 71271                    1-Open
## 71272                    1-Open
## 71273                    1-Open
## 71278                    1-Open
## 71279                    1-Open
## 71280                    1-Open
## 71281                    1-Open
## 71285                    1-Open
## 71337                    1-Open
## 71338                    1-Open
## 71339                    1-Open
## 71344                    1-Open
## 71345                    1-Open
## 71368                    1-Open
## 71380                    1-Open
## 71384                    1-Open
## 71389                    1-Open
## 71390                    1-Open
## 71468                    1-Open
## 71473                    1-Open
## 71482                    1-Open
## 71491                    1-Open
## 71499                    1-Open
## 71500                    1-Open
## 71507                    1-Open
## 71527                    1-Open
## 71577                8-Reopened
## 71586                    1-Open
## 71588                    1-Open
## 71595                    1-Open
## 71598                    1-Open
## 71599                    1-Open
## 71600                    1-Open
## 71602                    1-Open
## 71603                    1-Open
## 71608                    1-Open
## 71609                    1-Open
## 71611                    1-Open
## 71613                    1-Open
## 71614                    1-Open
## 71615                    1-Open
## 71616                    1-Open
## 71617                    1-Open
## 71618                    1-Open
## 71619                    1-Open
## 71627                    1-Open
## 71669                    1-Open
## 71696                    1-Open
## 71700                    1-Open
## 71715                    1-Open
## 71716                    1-Open
## 71717                    1-Open
## 71718                    1-Open
## 71719                    1-Open
## 72527                    1-Open
## 72555                    1-Open
## 72606                    1-Open
## 72618                    1-Open
## 72637                    1-Open
## 72638                    1-Open
## 72639                    1-Open
## 72651                    1-Open
## 72671                    1-Open
## 72684                    1-Open
## 72695                    1-Open
## 72756                    1-Open
## 72762                    1-Open
## 72814                    1-Open
## 72922                    1-Open
## 72923                    1-Open
## 72959                    1-Open
## 72980                    1-Open
## 72981                    1-Open
## 72983                    1-Open
## 72986                    1-Open
## 72991                    1-Open
## 73021                    1-Open
## 73095                    1-Open
## 73146                    1-Open
## 73180                    1-Open
## 73185                    1-Open
## 73220                    1-Open
## 73300                    1-Open
## 73303                    1-Open
## 73304                    1-Open
## 73355                    1-Open
## 73356                   4-Added
## 73395                     3-New
## 73437                    1-Open
## 73473                    1-Open
## 73489                    1-Open
## 73527                     3-New
## 73528                    1-Open
## 73537                    1-Open
## 73551                    1-Open
## 73554                    1-Open
## 73573                    1-Open
## 73582                    1-Open
## 73601                    1-Open
## 73603                     3-New
## 73604                    1-Open
## 73643                    1-Open
## 73656                    1-Open
## 73676                    1-Open
## 73688                    1-Open
## 73712                    1-Open
## 73781                    1-Open
## 73782                    1-Open
## 73790                    1-Open
## 73792                    1-Open
## 73816                    1-Open
## 73846                    1-Open
## 73862                    1-Open
## 73901                    1-Open
## 73908                    1-Open
## 73927                    1-Open
## 73928                    1-Open
## 73931                    1-Open
## 73933                    1-Open
## 73954                    1-Open
## 73955                    1-Open
## 73956                    1-Open
## 73957                    1-Open
## 73958                    1-Open
## 73959                    1-Open
## 73965                    1-Open
## 73968                    1-Open
## 73971                     3-New
## 73988                    1-Open
## 73989                    1-Open
## 74028                    1-Open
## 74032                    1-Open
## 74068                    1-Open
## 74094                    1-Open
## 74122                    1-Open
## 74159                    1-Open
## 74161                     3-New
## 74198                    1-Open
## 74199                    1-Open
## 74294                    1-Open
## 74298                    1-Open
## 74300                    1-Open
## 74369                    1-Open
## 74414                    1-Open
## 74432                    1-Open
## 74444                    1-Open
## 74447                    1-Open
## 74462                    1-Open
## 74476                    1-Open
## 74511                    1-Open
## 74515                    1-Open
## 74516                    1-Open
## 74522                    1-Open
## 74529                    1-Open
## 74531                    1-Open
## 74538                    1-Open
## 74552                    1-Open
## 74554                    1-Open
## 74558                    1-Open
## 74562                    1-Open
## 74563                    1-Open
## 74634                    1-Open
## 74659                    1-Open
## 74676                    1-Open
## 74677                    1-Open
## 74680                    1-Open
## 74681                    1-Open
## 74751                    1-Open
## 74784                    1-Open
## 74800                    1-Open
## 74805                    1-Open
## 74809                    1-Open
## 74912                    1-Open
## 74940                    1-Open
## 74993                    1-Open
## 75052                    1-Open
## 75053                    1-Open
## 75078                    1-Open
## 75084                    1-Open
## 75087                    1-Open
## 75109                    1-Open
## 75122                    1-Open
## 75141                    1-Open
## 75194                    1-Open
## 75213                    1-Open
## 75237                    1-Open
## 75241                    1-Open
## 75244                    1-Open
## 75268                    1-Open
## 75272                    1-Open
## 75283                    1-Open
## 75295                    1-Open
## 75400                    1-Open
## 75407                    1-Open
## 75408                    1-Open
## 75421                6-Inactive
## 75422                6-Inactive
## 75429                    1-Open
## 75439                    1-Open
## 75483                    1-Open
## 75499                    1-Open
## 75500                    1-Open
## 75530                    1-Open
## 75536                    1-Open
## 75545                    1-Open
## 75554                    1-Open
## 75555                    1-Open
## 75563                    1-Open
## 75581                    1-Open
## 75637                    1-Open
## 75694                    1-Open
## 75725                    1-Open
## 75745                    1-Open
## 75922                    1-Open
## 75976                    1-Open
## 76028                    1-Open
## 76076                    1-Open
## 76137                    1-Open
## 76138                    1-Open
## 76139                    1-Open
## 76174                    1-Open
## 76226                    1-Open
## 76227                    1-Open
## 76235                    1-Open
## 76239                    1-Open
## 76257                    1-Open
## 76286                    1-Open
## 76287                    1-Open
## 76288                    1-Open
## 76291                    1-Open
## 76405                    1-Open
## 76435                    1-Open
## 76488                    1-Open
## 76530                    1-Open
## 76670                    1-Open
## 76683                    1-Open
## 76703                    1-Open
## 76704                    1-Open
## 76721                    1-Open
## 76728                    1-Open
## 76771                    1-Open
## 76793                    1-Open
## 76795                    1-Open
## 76820                    1-Open
## 76824                    1-Open
## 76849                    1-Open
## 76996                     3-New
## 77018                    1-Open
## 77091                    1-Open
## 77094                    1-Open
## 77111                    1-Open
## 77151                    1-Open
## 77156                    1-Open
## 77167                    1-Open
## 77194                    1-Open
## 77218                    1-Open
## 77242                    1-Open
## 77264                    1-Open
## 77417                    1-Open
## 77448                     3-New
## 77612                    1-Open
## 77625                    1-Open
## 77651                    1-Open
## 77656                    1-Open
## 77683                    1-Open
## 77686                    1-Open
## 77696                    1-Open
## 77698                    1-Open
## 77731                    1-Open
## 77733                    1-Open
## 77738                    1-Open
## 77745                    1-Open
## 77831                    1-Open
## 77833                    1-Open
## 77892                    1-Open
## 77894                    1-Open
## 77903                    1-Open
## 77928                    1-Open
## 77972                    1-Open
## 78005                    1-Open
## 78006                    1-Open
## 78008                    1-Open
## 78009                    1-Open
## 78010                    1-Open
## 78011                    1-Open
## 78066                    1-Open
## 78095                    1-Open
## 78160                    1-Open
## 78168                     3-New
## 78176                    1-Open
## 78179                    1-Open
## 78183                    1-Open
## 78193                    1-Open
## 78198                    1-Open
## 78202                    1-Open
## 78203                    1-Open
## 78217                    1-Open
## 78228                    1-Open
## 78243                    1-Open
## 78245                    1-Open
## 78255                    1-Open
## 78263                    1-Open
## 78265                    1-Open
## 78272                    1-Open
## 78279                     3-New
## 78296                    1-Open
## 78306                    1-Open
## 78311                    1-Open
## 78312                    1-Open
## 78313                    1-Open
## 78332                    1-Open
## 78340                    1-Open
## 78346                     3-New
## 78348                    1-Open
## 78351                    1-Open
## 78399                    1-Open
## 78400                    1-Open
## 78405                    1-Open
## 78408                    1-Open
## 78436                    1-Open
## 78482                    1-Open
## 78492                    1-Open
## 78494                    1-Open
## 78522                    1-Open
## 78570                    1-Open
## 78584                    1-Open
## 78585                    1-Open
## 78586                    1-Open
## 78587                    1-Open
## 78588                    1-Open
## 78591                     3-New
## 78595                    1-Open
## 78597                    1-Open
## 78601                    1-Open
## 78603                    1-Open
## 78606                     3-New
## 78609                    1-Open
## 78652                    1-Open
## 78663                     3-New
## 78670                     3-New
## 78671                    1-Open
## 78685                    1-Open
## 78686                    1-Open
## 78689                    1-Open
## 78690                    1-Open
## 78699                    1-Open
## 78702                    1-Open
## 78708                    1-Open
## 78744                     3-New
## 78787                    1-Open
## 78788                    1-Open
## 78797                    1-Open
## 78841                    1-Open
## 78842                    1-Open
## 78908                    1-Open
## 78926                    1-Open
## 78955                    1-Open
## 78956                    1-Open
## 78963                    1-Open
## 79001                    1-Open
## 79055                    1-Open
## 79162                    1-Open
## 79249                    1-Open
## 79257                     3-New
## 79413                    1-Open
## 79443                    1-Open
## 79478                    1-Open
## 79484                    1-Open
## 79485                    1-Open
## 79544                    1-Open
## 79545                    1-Open
## 79573                     3-New
## 79582                     3-New
## 79583                    1-Open
## 79610                    1-Open
## 79634                    1-Open
## 79638                    1-Open
## 79644                    1-Open
## 79645                    1-Open
## 79646                    1-Open
## 79647                    1-Open
## 79672                    1-Open
## 79673                    1-Open
## 79681                    1-Open
## 79689                    1-Open
## 79698                    1-Open
## 79700                    1-Open
## 79722                    1-Open
## 79723                    1-Open
## 79724                    1-Open
## 79770                    1-Open
## 79789                    1-Open
## 79795                    1-Open
## 79817                    1-Open
## 79825                    1-Open
## 79834                    1-Open
## 79850                    1-Open
## 79864                    1-Open
## 79875                    1-Open
## 79887                    1-Open
## 79889                    1-Open
## 79891                    1-Open
## 79892                    1-Open
## 79894                    1-Open
## 79942                    1-Open
## 79945                    1-Open
## 79946                     3-New
## 79959                    1-Open
## 79974                    1-Open
## 80014                    1-Open
## 80015                    1-Open
## 80073                    1-Open
## 80104                    1-Open
## 80225                     3-New
## 80241                    1-Open
## 80273                    1-Open
## 80286                    1-Open
## 80443                    1-Open
## 80474                    1-Open
## 80477                    1-Open
## 80479                    1-Open
## 80480                    1-Open
## 80569                    1-Open
## 80570                    1-Open
## 80603                    1-Open
## 80604                    1-Open
## 80605                     3-New
## 80615                    1-Open
## 80653                    1-Open
## 80752                    1-Open
## 80789                    1-Open
## 80834                    1-Open
## 80835                    1-Open
## 80885                    1-Open
## 80889                    1-Open
## 80891                    1-Open
## 80892                    1-Open
## 80893                     3-New
## 80900                    1-Open
## 80920                    1-Open
## 80928                    1-Open
## 80929                    1-Open
## 80944                    1-Open
## 80969                    1-Open
## 80990                    1-Open
## 80991                    1-Open
## 81005                    1-Open
## 81039                    1-Open
## 81041                    1-Open
## 81048                    1-Open
## 81067                    1-Open
## 81093                     3-New
## 81094                     3-New
## 81149                     3-New
## 81217                    1-Open
## 81306                    1-Open
## 81307                    1-Open
## 81314                    1-Open
## 81328                    1-Open
## 81346                    1-Open
## 81359                    1-Open
## 81364                    1-Open
## 81376                    1-Open
## 81384                    1-Open
## 81401                8-Reopened
## 81411                    1-Open
## 81434                    1-Open
## 81621                    1-Open
## 81653                    1-Open
## 81654                    1-Open
## 81665                    1-Open
## 81669                    1-Open
## 81670                    1-Open
## 81681                    1-Open
## 81702                    1-Open
## 81709                    1-Open
## 81761                    1-Open
## 81771                    1-Open
## 81772                    1-Open
## 81778                    1-Open
## 81817                    1-Open
## 81818                    1-Open
## 81848                    1-Open
## 81854                    1-Open
## 81855                    1-Open
## 81857                    1-Open
## 81882                    1-Open
## 81894                    1-Open
## 81917                    1-Open
## 81918                    1-Open
## 81919                    1-Open
## 81920                    1-Open
## 81938                    1-Open
## 81941                    1-Open
## 81942                    1-Open
## 81943                    1-Open
## 81944                    1-Open
## 81945                    1-Open
## 81978                    1-Open
## 82019                    1-Open
## 82029                    1-Open
## 82053                    1-Open
## 82064                    1-Open
## 82078                    1-Open
## 82096                    1-Open
## 82123                    1-Open
## 82125                    1-Open
## 82138                    1-Open
## 82159                    1-Open
## 82186                    1-Open
## 82297                    1-Open
## 82353                    1-Open
## 82355                    1-Open
## 82372                  2-Closed
## 82376                    1-Open
## 82377                    1-Open
## 82381                    1-Open
## 82472                    1-Open
## 82487                    1-Open
## 82497                    1-Open
## 82525                    1-Open
## 82548                    1-Open
## 82549                    1-Open
## 82575                    1-Open
## 82576                    1-Open
## 82581                    1-Open
## 82606                    1-Open
## 82618                    1-Open
## 82619                    1-Open
## 82677                    1-Open
## 82678                    1-Open
## 82679                    1-Open
## 82680                    1-Open
## 82683                    1-Open
## 82694                    1-Open
## 82717                    1-Open
## 82718                    1-Open
## 82742                    1-Open
## 82752                    1-Open
## 82787                    1-Open
## 82788                    1-Open
## 82793                    1-Open
## 82848                    1-Open
## 82877                    1-Open
## 82880                    1-Open
## 82888                    1-Open
## 82928                    1-Open
## 82949                    1-Open
## 82958                    1-Open
## 82967                    1-Open
## 82975                    1-Open
## 82996                    1-Open
## 83016                    1-Open
## 83040                    1-Open
## 83041                    1-Open
## 83045                    1-Open
## 83058                    1-Open
## 83096                    1-Open
## 83107                    1-Open
## 83111                    1-Open
## 83142                    1-Open
## 83179                    1-Open
## 83189                    1-Open
## 83192                    1-Open
## 83199                    1-Open
## 83223                    1-Open
## 83233                    1-Open
## 83254                    1-Open
## 83255                    1-Open
## 83288                    1-Open
## 83297                    1-Open
## 83305                    1-Open
## 83306                    1-Open
## 83313                    1-Open
## 83315                    1-Open
## 83322                    1-Open
## 83337                    1-Open
## 83387                    1-Open
## 83389                    1-Open
## 83393                    1-Open
## 83395                    1-Open
## 83398                    1-Open
## 83408                     3-New
## 83409                     3-New
## 83410                    1-Open
## 83411                    1-Open
## 83412                    1-Open
## 83416                    1-Open
## 83417                    1-Open
## 83419                    1-Open
## 83425                    1-Open
## 83430                    1-Open
## 83436                    1-Open
## 83437                    1-Open
## 83446                    1-Open
## 83485                    1-Open
## 83527                    1-Open
## 83549                    1-Open
## 83550                     3-New
## 83555                    1-Open
## 83562                    1-Open
## 83589                    1-Open
## 83615                    1-Open
## 83617                    1-Open
## 83621                    1-Open
## 83644                    1-Open
## 83675                    1-Open
## 83693                    1-Open
## 83694                    1-Open
## 83695                    1-Open
## 83774                    1-Open
## 83775                    1-Open
## 83781                    1-Open
## 83783                    1-Open
## 83805                    1-Open
## 83816                    1-Open
## 83835                    1-Open
## 83841                     3-New
## 83867                    1-Open
## 83886                    1-Open
## 83888                    1-Open
## 83912                    1-Open
## 83927                    1-Open
## 83947                    1-Open
## 83957                    1-Open
## 83958                    1-Open
## 83995                    1-Open
## 84024                    1-Open
## 84061                    1-Open
## 84094                     3-New
## 84100                     3-New
## 84121                    1-Open
## 84122                    1-Open
## 84128                    1-Open
## 84129                    1-Open
## 84130                    1-Open
## 84132                    1-Open
## 84135                    1-Open
## 84138                    1-Open
## 84141                    1-Open
## 84289                    1-Open
## 84314                    1-Open
## 84315                    1-Open
## 84316                    1-Open
## 84364                    1-Open
## 84381                    1-Open
## 84414                    1-Open
## 84442                    1-Open
## 84521                    1-Open
## 84524                    1-Open
## 84525                     3-New
## 84526                    1-Open
## 84527                    1-Open
## 84528                    1-Open
## 84529                    1-Open
## 84530                    1-Open
## 84535                    1-Open
## 84591                    1-Open
## 84599                    1-Open
## 84624                    1-Open
## 84679                    1-Open
## 84684                    1-Open
## 84717                    1-Open
## 84791                    1-Open
## 84822                    1-Open
## 84857                    1-Open
## 84910                    1-Open
## 84912                    1-Open
## 84913                    1-Open
## 84940                    1-Open
## 85144                    1-Open
## 85152                    1-Open
## 85280                    1-Open
## 85282                    1-Open
## 85283                    1-Open
## 85289                    1-Open
## 85292                    1-Open
## 85295                    1-Open
## 85296                    1-Open
## 85301                    1-Open
## 85305                    1-Open
## 85353                    1-Open
## 85356                    1-Open
## 85357                    1-Open
## 85362                    1-Open
## 85365                     3-New
## 85398                    1-Open
## 85399                    1-Open
## 85400                    1-Open
## 85402                    1-Open
## 85403                    1-Open
## 85404                    1-Open
## 85412                    1-Open
## 85413                    1-Open
## 85435                    1-Open
## 85534                     3-New
## 85589                    1-Open
## 85590                    1-Open
## 85591                    1-Open
## 85606                    1-Open
## 85630                    1-Open
## 85642                    1-Open
## 85660                    1-Open
## 85688                    1-Open
## 85689                    1-Open
## 85692                    1-Open
## 85697                    1-Open
## 85733                    1-Open
## 85738                    1-Open
## 85741                    1-Open
## 85757                    1-Open
## 85768                    1-Open
## 85785                    1-Open
## 85790                    1-Open
## 85791                    1-Open
## 85795                    1-Open
## 85831                    1-Open
## 85969                    1-Open
## 85970                    1-Open
## 85971                    1-Open
## 85973                    1-Open
## 85974                    1-Open
## 86024                    1-Open
## 86049                    1-Open
## 86051                    1-Open
## 86052                    1-Open
## 86065                    1-Open
## 86067                    1-Open
## 86081                    1-Open
## 86096                    1-Open
## 86101                    1-Open
## 86180                    1-Open
## 86205                    1-Open
## 86233                    1-Open
## 86234                    1-Open
## 86235                    1-Open
## 86254                    1-Open
## 86342                    1-Open
## 86438                    1-Open
## 86494                     3-New
## 86498                    1-Open
## 86499                    1-Open
## 86503                    1-Open
## 86504                    1-Open
## 86506                    1-Open
## 86511                    1-Open
## 86522                    1-Open
## 86533                    1-Open
## 86570                    1-Open
## 86584                    1-Open
## 86585                    1-Open
## 86593                    1-Open
## 86616                    1-Open
## 86640                    1-Open
## 86691                    1-Open
## 86693                    1-Open
## 86781                    1-Open
## 86782                    1-Open
## 86788                    1-Open
## 86827                    1-Open
## 86828                    1-Open
## 86829                    1-Open
## 86831                    1-Open
## 86832                    1-Open
## 86834                    1-Open
## 86835                    1-Open
## 86839                    1-Open
## 86892                    1-Open
## 86893                    1-Open
## 86898                    1-Open
## 86906                    1-Open
## 86917                    1-Open
## 86966                    1-Open
## 86967                    1-Open
## 86970                    1-Open
## 86971                    1-Open
## 86984                    1-Open
## 86985                    1-Open
## 86991                    1-Open
## 87055                    1-Open
## 87058                    1-Open
## 87061                    1-Open
## 87097                    1-Open
## 87099                    1-Open
## 87101                    1-Open
## 87107                    1-Open
## 87125                    1-Open
## 87126                    1-Open
## 87127                     3-New
## 87148                     3-New
## 87151                    1-Open
## 87152                    1-Open
## 87158                    1-Open
## 87243                    1-Open
## 87251                    1-Open
## 87284                     3-New
## 87331                    1-Open
## 87332                    1-Open
## 87341                    1-Open
## 87342                    1-Open
## 87343                    1-Open
## 87346                    1-Open
## 87347                    1-Open
## 87401                    1-Open
## 87407                    1-Open
## 87430                    1-Open
## 87447                     3-New
## 87456                    1-Open
## 87457                    1-Open
## 87465                     3-New
## 87487                    1-Open
## 87501                    1-Open
## 87505                    1-Open
## 87511                    1-Open
## 87519                    1-Open
## 87521                    1-Open
## 87523                    1-Open
## 87525                    1-Open
## 87532                    1-Open
## 87535                    1-Open
## 87542                    1-Open
## 87555                    1-Open
## 87570                    1-Open
## 87590                    1-Open
## 87603                    1-Open
## 87604                    1-Open
## 87605                    1-Open
## 87608                    1-Open
## 87611                    1-Open
## 87617                    1-Open
## 87618                    1-Open
## 87623                    1-Open
## 87636                    1-Open
## 87639                    1-Open
## 87640                    1-Open
## 87648                    1-Open
## 87662                    1-Open
## 87663                    1-Open
## 87664                    1-Open
## 87676                    1-Open
## 87749                    1-Open
## 87752                    1-Open
## 87775                    1-Open
## 87828                    1-Open
## 87832                    1-Open
## 87833                    1-Open
## 87880                    1-Open
## 87915                    1-Open
## 87931                    1-Open
## 87963                    1-Open
## 87997                    1-Open
## 88027                    1-Open
## 88044                    1-Open
## 88153                    1-Open
## 88164                    1-Open
## 88171                    1-Open
## 88172                    1-Open
## 88173                    1-Open
## 88191                    1-Open
## 88212                    1-Open
## 88265                    1-Open
## 88266                    1-Open
## 88281                    1-Open
## 88283                    1-Open
## 88314                    1-Open
## 88394                    1-Open
## 88418                    1-Open
## 88419                    1-Open
## 88420                     3-New
## 88421                    1-Open
## 88423                    1-Open
## 88445                    1-Open
## 88446                    1-Open
## 88449                    1-Open
## 88500                    1-Open
## 88509                    1-Open
## 88586                    1-Open
## 88590                    1-Open
## 88595                    1-Open
## 88640                    1-Open
## 88672                    1-Open
## 88706                    1-Open
## 88707                    1-Open
## 88708                    1-Open
## 88709                    1-Open
## 88753                    1-Open
## 88760                    1-Open
## 88893                    1-Open
## 88894                    1-Open
## 88918                    1-Open
## 88926                    1-Open
## 88928                    1-Open
## 88931                    1-Open
## 88932                    1-Open
## 88957                    1-Open
## 88966                    1-Open
## 88969                    1-Open
## 89013                    1-Open
## 89016                    1-Open
## 89023                8-Reopened
## 89025                     3-New
## 89065                    1-Open
## 89069                    1-Open
## 89105                    1-Open
## 89106                    1-Open
## 89107                    1-Open
## 89108                    1-Open
## 89109                    1-Open
## 89130                    1-Open
## 89153                    1-Open
## 89210                    1-Open
## 89211                    1-Open
## 89212                    1-Open
## 89247                    1-Open
## 89274                    1-Open
## 89353                    1-Open
## 89406                    1-Open
## 89414                    1-Open
## 89417                    1-Open
## 89433                    1-Open
## 89447                    1-Open
## 89448                    1-Open
## 89449                    1-Open
## 89450                    1-Open
## 89451                    1-Open
## 89453                    1-Open
## 89454                    1-Open
## 89480                    1-Open
## 89481                    1-Open
## 89531                    1-Open
## 89533                    1-Open
## 89554                    1-Open
## 89569                    1-Open
## 89601                    1-Open
## 89604                    1-Open
## 89609                    1-Open
## 89636                    1-Open
## 89638                    1-Open
## 89744                     3-New
## 89769                    1-Open
## 89778                    1-Open
## 89783                    1-Open
## 89788                    1-Open
## 89826                    1-Open
## 89890                    1-Open
## 89900                    1-Open
## 89902                    1-Open
## 89919                    1-Open
## 89920                    1-Open
## 89921                    1-Open
## 89922                    1-Open
## 89923                    1-Open
## 89924                    1-Open
## 89925                    1-Open
## 89950                    1-Open
## 89973                    1-Open
## 90028                    1-Open
## 90050                    1-Open
## 90102                    1-Open
## 90115                    1-Open
## 90117                    1-Open
## 90134                    1-Open
## 90154                    1-Open
## 90167                    1-Open
## 90175                    1-Open
## 90176                   4-Added
## 90177                    1-Open
## 90204                    1-Open
## 90207                    1-Open
## 90221                    1-Open
## 90249                     3-New
## 90255                    1-Open
## 90256                    1-Open
## 90257                    1-Open
## 90258                    1-Open
## 90281                    1-Open
## 90325                    1-Open
## 90347                    1-Open
## 90348                    1-Open
## 90383                    1-Open
## 90385                     3-New
## 90386                     3-New
## 90387                     3-New
## 90405                    1-Open
## 90414                    1-Open
## 90520                    1-Open
## 90531                    1-Open
## 90532                    1-Open
## 90533                    1-Open
## 90541                     3-New
## 90569                    1-Open
## 90570                    1-Open
## 90571                    1-Open
## 90572                    1-Open
## 90573                    1-Open
## 90574                     3-New
## 90575                    1-Open
## 90576                    1-Open
## 90578                    1-Open
## 90615                    1-Open
## 90619                    1-Open
## 90620                    1-Open
## 90621                    1-Open
## 90622                    1-Open
## 90623                    1-Open
## 90627                    1-Open
## 90689                    1-Open
## 90690                    1-Open
## 90694                     3-New
## 90720                    1-Open
## 90726                    1-Open
## 90748                    1-Open
## 90787                    1-Open
## 90802                    1-Open
## 90807                    1-Open
## 90810                    1-Open
## 90825                    1-Open
## 90831                    1-Open
## 90835                    1-Open
## 90846                    1-Open
## 90855                    1-Open
## 90856                    1-Open
## 90858                    1-Open
## 90879                    1-Open
## 90951                    1-Open
## 90952                    1-Open
## 90953                    1-Open
## 90981                    1-Open
## 91064                     3-New
## 91146                    1-Open
## 91180                    1-Open
## 91223                    1-Open
## 91266                    1-Open
## 91274                    1-Open
## 91277                    1-Open
## 91293                    1-Open
## 91298                    1-Open
## 91322                    1-Open
## 91345                    1-Open
## 91367                    1-Open
## 91377                    1-Open
## 91425                    1-Open
## 91468                    1-Open
## 91481                    1-Open
## 91528                     3-New
## 91537                    1-Open
## 91543                    1-Open
## 91544                    1-Open
## 91586                    1-Open
## 91587                    1-Open
## 91607                    1-Open
## 91622                    1-Open
## 91682                    1-Open
## 91709                    1-Open
## 91724                    1-Open
## 91761                    1-Open
## 91781                    1-Open
## 91813                    1-Open
## 91827                    1-Open
## 91841                    1-Open
## 91868                    1-Open
## 91872                     3-New
## 91873                    1-Open
## 91898                    1-Open
## 91899                    1-Open
## 91923                    1-Open
## 91928                    1-Open
## 91950                    1-Open
## 91975                    1-Open
## 91979                    1-Open
## 91988                    1-Open
## 91998                    1-Open
## 92024                    1-Open
## 92100                    1-Open
## 92120                    1-Open
## 92183                    1-Open
## 92189                    1-Open
## 92217                    1-Open
## 92258                    1-Open
## 92275                    1-Open
## 92365                    1-Open
## 92369                    1-Open
## 92385                    1-Open
## 92422                    1-Open
## 92423                    1-Open
## 92489                    1-Open
## 92490                    1-Open
## 92493                    1-Open
## 92494                    1-Open
## 92495                    1-Open
## 92519                    1-Open
## 92526                    1-Open
## 92547                    1-Open
## 92555                    1-Open
## 92632                    1-Open
## 92693                    1-Open
## 92700                    1-Open
## 92754                    1-Open
## 92763                    1-Open
## 92771                    1-Open
## 92791                    1-Open
## 92792                    1-Open
## 92870                    1-Open
## 92972                    1-Open
## 92974                    1-Open
## 93049                    1-Open
## 93051                    1-Open
## 93052                    1-Open
## 93053                    1-Open
## 93054                    1-Open
## 93055                    1-Open
## 93056                    1-Open
## 93057                    1-Open
## 93058                    1-Open
## 93059                    1-Open
## 93068                    1-Open
## 93116                    1-Open
## 93117                    1-Open
## 93120                    1-Open
## 93154                    1-Open
## 93349                    1-Open
## 93394                    1-Open
## 93416                    1-Open
## 93433                    1-Open
## 93434                    1-Open
## 93438                    1-Open
## 93457                    1-Open
## 93459                    1-Open
## 93466                    1-Open
## 93490                    1-Open
## 93519                    1-Open
## 93520                    1-Open
## 93521                    1-Open
## 93680                    1-Open
## 93685                    1-Open
## 93696                    1-Open
## 93722                    1-Open
## 93746                    1-Open
## 93747                    1-Open
## 93748                    1-Open
## 93749                    1-Open
## 93750                    1-Open
## 93752                    1-Open
## 93757                    1-Open
## 93816                    1-Open
## 93861                    1-Open
## 93873                    1-Open
## 93967                    1-Open
## 93976                    1-Open
## 94003                    1-Open
## 94004                    1-Open
## 94006                    1-Open
## 94007                    1-Open
## 94113                    1-Open
## 94114                    1-Open
## 94142                    1-Open
## 94191                    1-Open
## 94200                    1-Open
## 94227                    1-Open
## 94241                    1-Open
## 94249                    1-Open
## 94257                    1-Open
## 94289                    1-Open
## 94324                    1-Open
## 94349                    1-Open
## 94362                    1-Open
## 94369                    1-Open
## 94396                    1-Open
## 94403                    1-Open
## 94460                    1-Open
## 94467                    1-Open
## 94468                    1-Open
## 94501                    1-Open
## 94534                    1-Open
## 94535                    1-Open
## 94696                    1-Open
## 94701                    1-Open
## 94719                    1-Open
## 94738                    1-Open
## 94742                    1-Open
## 94782                    1-Open
## 94783                    1-Open
## 94784                    1-Open
## 94790                    1-Open
## 94798                    1-Open
## 94800                    1-Open
## 94948                    1-Open
## 94976                    1-Open
## 94997                    1-Open
## 95001                    1-Open
## 95007                    1-Open
## 95064                    1-Open
## 95100                8-Reopened
## 95109                    1-Open
## 95116                    1-Open
## 95141                    1-Open
## 95151                   4-Added
## 95176                    1-Open
## 95198                    1-Open
## 95199                    1-Open
## 95200                    1-Open
## 95206                    1-Open
## 95232                    1-Open
## 95233                    1-Open
## 95234                    1-Open
## 95235                    1-Open
## 95236                    1-Open
## 95237                    1-Open
## 95238                    1-Open
## 95240                    1-Open
## 95241                    1-Open
## 95242                    1-Open
## 95243                    1-Open
## 95244                    1-Open
## 95245                    1-Open
## 95246                    1-Open
## 95247                    1-Open
## 95248                    1-Open
## 95249                    1-Open
## 95250                    1-Open
## 95251                    1-Open
## 95252                    1-Open
## 95254                    1-Open
## 95255                    1-Open
## 95256                    1-Open
## 95257                    1-Open
## 95258                    1-Open
## 95259                    1-Open
## 95261                    1-Open
## 95262                    1-Open
## 95263                    1-Open
## 95264                    1-Open
## 95265                    1-Open
## 95266                    1-Open
## 95267                    1-Open
## 95268                    1-Open
## 95269                    1-Open
## 95270                    1-Open
## 95271                    1-Open
## 95272                    1-Open
## 95273                    1-Open
## 95275                    1-Open
## 95276                    1-Open
## 95277                    1-Open
## 95278                    1-Open
## 95279                    1-Open
## 95303                    1-Open
## 95335                    1-Open
## 95343                    1-Open
## 95401                    1-Open
## 95413                    1-Open
## 95417                    1-Open
## 95429                    1-Open
## 95430                    1-Open
## 95442                    1-Open
## 95444                    1-Open
## 95446                    1-Open
## 95486                    1-Open
## 95534                    1-Open
## 95549                    1-Open
## 95550                    1-Open
## 95551                    1-Open
## 95593                    1-Open
## 95670                    1-Open
## 95748                    1-Open
## 95752                    1-Open
## 95806                    1-Open
## 95886                    1-Open
## 95930                    1-Open
## 96039                    1-Open
## 96120                    1-Open
## 96180                    1-Open
## 96209                    1-Open
## 96241                    1-Open
## 96369                    1-Open
## 96399                    1-Open
## 96408                    1-Open
## 96409                    1-Open
## 96426                    1-Open
## 96450                    1-Open
## 96498                    1-Open
## 96502                    1-Open
## 96541                    1-Open
## 96544                8-Reopened
## 96572                    1-Open
## 96689                    1-Open
## 96726                    1-Open
## 96834                    1-Open
## 96927                    1-Open
## 96945                    1-Open
## 97010                    1-Open
## 97070                    1-Open
## 97071                    1-Open
## 97072                    1-Open
## 97073                    1-Open
## 97074                    1-Open
## 97075                    1-Open
## 97078                    1-Open
## 97080                    1-Open
## 97084                    1-Open
## 97085                    1-Open
## 97087                    1-Open
## 97091                    1-Open
## 97159                    1-Open
## 97166                    1-Open
## 97181                    1-Open
## 97187                    1-Open
## 97220                    1-Open
## 97244                    1-Open
## 97255                    1-Open
## 97258                  2-Closed
## 97267                    1-Open
## 97335                    1-Open
## 97338                    1-Open
## 97339                    1-Open
## 97452                    1-Open
## 97453                    1-Open
## 97541                    1-Open
## 97546                    1-Open
## 97564                    1-Open
## 97614                    1-Open
## 97769                    1-Open
## 97803                    1-Open
## 97824                    1-Open
## 97879                    1-Open
## 97908                    1-Open
## 97909                    1-Open
## 97960                     3-New
## 98030                    1-Open
## 98031                    1-Open
## 98032                    1-Open
## 98034                    1-Open
## 98051                    1-Open
## 98063                    1-Open
## 98197                    1-Open
## 98206                    1-Open
## 98261                    1-Open
## 98267                    1-Open
## 98288                    1-Open
## 98299                    1-Open
## 98309                    1-Open
## 98310                    1-Open
## 98359                    1-Open
## 98435                    1-Open
## 98437                    1-Open
## 98450                    1-Open
## 98454                    1-Open
## 98455                    1-Open
## 98471                    1-Open
## 98485                    1-Open
## 98506                    1-Open
## 98511                    1-Open
## 98512                    1-Open
## 98617                    1-Open
## 98619                    1-Open
## 98627                    1-Open
## 98628                    1-Open
## 98644                    1-Open
## 98645                    1-Open
## 98693                    1-Open
## 98711                    1-Open
## 98787                    1-Open
## 98807                    1-Open
## 98885                    1-Open
## 98886                    1-Open
## 98887                    1-Open
## 98888                    1-Open
## 98889                    1-Open
## 98890                    1-Open
## 98891                    1-Open
## 98892                    1-Open
## 98893                    1-Open
## 98894                    1-Open
## 98895                    1-Open
## 98897                    1-Open
## 98898                    1-Open
## 98899                    1-Open
## 98901                     3-New
## 98902                    1-Open
## 98903                    1-Open
## 98904                    1-Open
## 98905                    1-Open
## 98965                    1-Open
## 99046                    1-Open
## 99047                    1-Open
## 99056                    1-Open
## 99070                    1-Open
## 99073                    1-Open
## 99074                    1-Open
## 99085                    1-Open
## 99086                    1-Open
## 99129                    1-Open
## 99148                    1-Open
## 99149                    1-Open
## 99170                    1-Open
## 99174                     3-New
## 99175                    1-Open
## 99176                    1-Open
## 99181                    1-Open
## 99203                    1-Open
## 99265                    1-Open
## 99294                    1-Open
## 99333                    1-Open
##                                                                          Agency.Type
## 3     1-Regular local school district that is NOT a component of a supervisory union
## 4     1-Regular local school district that is NOT a component of a supervisory union
## 108   1-Regular local school district that is NOT a component of a supervisory union
## 129   1-Regular local school district that is NOT a component of a supervisory union
## 133   1-Regular local school district that is NOT a component of a supervisory union
## 163                                                       8-Other education agencies
## 177                                       4-Regional Education Service Agency (RESA)
## 209                                                   7-Independent Charter District
## 210                                                   7-Independent Charter District
## 212           5-State agency providing elementary and/or secondary level instruction
## 263   1-Regular local school district that is NOT a component of a supervisory union
## 283   1-Regular local school district that is NOT a component of a supervisory union
## 397   1-Regular local school district that is NOT a component of a supervisory union
## 398   1-Regular local school district that is NOT a component of a supervisory union
## 399   1-Regular local school district that is NOT a component of a supervisory union
## 400   1-Regular local school district that is NOT a component of a supervisory union
## 404   1-Regular local school district that is NOT a component of a supervisory union
## 406                                                   7-Independent Charter District
## 407                                                   7-Independent Charter District
## 413   1-Regular local school district that is NOT a component of a supervisory union
## 421                                                   7-Independent Charter District
## 422                                                   7-Independent Charter District
## 427   1-Regular local school district that is NOT a component of a supervisory union
## 432                                             9-Specialized public school district
## 446                                             9-Specialized public school district
## 455                                             9-Specialized public school district
## 457                                                   7-Independent Charter District
## 458                                             9-Specialized public school district
## 496                                                   7-Independent Charter District
## 497   1-Regular local school district that is NOT a component of a supervisory union
## 499   1-Regular local school district that is NOT a component of a supervisory union
## 506   1-Regular local school district that is NOT a component of a supervisory union
## 508                                                   7-Independent Charter District
## 516                                                   7-Independent Charter District
## 517                                                   7-Independent Charter District
## 518                                                   7-Independent Charter District
## 535                                                   7-Independent Charter District
## 536                                                   7-Independent Charter District
## 537                                                   7-Independent Charter District
## 544   1-Regular local school district that is NOT a component of a supervisory union
## 545   1-Regular local school district that is NOT a component of a supervisory union
## 546           5-State agency providing elementary and/or secondary level instruction
## 552                                                   7-Independent Charter District
## 574                                                   7-Independent Charter District
## 575                                                   7-Independent Charter District
## 579                                                   7-Independent Charter District
## 584   1-Regular local school district that is NOT a component of a supervisory union
## 591                                                   7-Independent Charter District
## 637   1-Regular local school district that is NOT a component of a supervisory union
## 661   1-Regular local school district that is NOT a component of a supervisory union
## 680                                                   7-Independent Charter District
## 681                                                   7-Independent Charter District
## 688   1-Regular local school district that is NOT a component of a supervisory union
## 717   1-Regular local school district that is NOT a component of a supervisory union
## 803   1-Regular local school district that is NOT a component of a supervisory union
## 805   1-Regular local school district that is NOT a component of a supervisory union
## 807                                                   7-Independent Charter District
## 849   1-Regular local school district that is NOT a component of a supervisory union
## 875   1-Regular local school district that is NOT a component of a supervisory union
## 898                                                       8-Other education agencies
## 899   1-Regular local school district that is NOT a component of a supervisory union
## 915   1-Regular local school district that is NOT a component of a supervisory union
## 919           5-State agency providing elementary and/or secondary level instruction
## 924   1-Regular local school district that is NOT a component of a supervisory union
## 925   1-Regular local school district that is NOT a component of a supervisory union
## 929   1-Regular local school district that is NOT a component of a supervisory union
## 930   1-Regular local school district that is NOT a component of a supervisory union
## 932   1-Regular local school district that is NOT a component of a supervisory union
## 933   1-Regular local school district that is NOT a component of a supervisory union
## 936   1-Regular local school district that is NOT a component of a supervisory union
## 937   1-Regular local school district that is NOT a component of a supervisory union
## 938   1-Regular local school district that is NOT a component of a supervisory union
## 942   1-Regular local school district that is NOT a component of a supervisory union
## 943   1-Regular local school district that is NOT a component of a supervisory union
## 950   1-Regular local school district that is NOT a component of a supervisory union
## 951   1-Regular local school district that is NOT a component of a supervisory union
## 952   1-Regular local school district that is NOT a component of a supervisory union
## 959   1-Regular local school district that is NOT a component of a supervisory union
## 969                                                   7-Independent Charter District
## 1028  1-Regular local school district that is NOT a component of a supervisory union
## 1072                                                  7-Independent Charter District
## 1105                                                  7-Independent Charter District
## 1106                                                  7-Independent Charter District
## 1139                                                  7-Independent Charter District
## 1140                                                  7-Independent Charter District
## 1141                                                  7-Independent Charter District
## 1144  1-Regular local school district that is NOT a component of a supervisory union
## 1145  1-Regular local school district that is NOT a component of a supervisory union
## 1150  1-Regular local school district that is NOT a component of a supervisory union
## 1151  1-Regular local school district that is NOT a component of a supervisory union
## 1160  1-Regular local school district that is NOT a component of a supervisory union
## 1163  1-Regular local school district that is NOT a component of a supervisory union
## 1247  1-Regular local school district that is NOT a component of a supervisory union
## 1252          5-State agency providing elementary and/or secondary level instruction
## 1290  1-Regular local school district that is NOT a component of a supervisory union
## 1318  1-Regular local school district that is NOT a component of a supervisory union
## 1335  1-Regular local school district that is NOT a component of a supervisory union
## 1336  1-Regular local school district that is NOT a component of a supervisory union
## 1337  1-Regular local school district that is NOT a component of a supervisory union
## 1338  1-Regular local school district that is NOT a component of a supervisory union
## 1345  1-Regular local school district that is NOT a component of a supervisory union
## 1347  1-Regular local school district that is NOT a component of a supervisory union
## 1358  1-Regular local school district that is NOT a component of a supervisory union
## 1431  1-Regular local school district that is NOT a component of a supervisory union
## 1470  1-Regular local school district that is NOT a component of a supervisory union
## 1506  1-Regular local school district that is NOT a component of a supervisory union
## 1557          5-State agency providing elementary and/or secondary level instruction
## 1633  1-Regular local school district that is NOT a component of a supervisory union
## 1656                                                  7-Independent Charter District
## 1660  1-Regular local school district that is NOT a component of a supervisory union
## 1661  1-Regular local school district that is NOT a component of a supervisory union
## 1692  1-Regular local school district that is NOT a component of a supervisory union
## 1693  1-Regular local school district that is NOT a component of a supervisory union
## 1738  1-Regular local school district that is NOT a component of a supervisory union
## 1766  1-Regular local school district that is NOT a component of a supervisory union
## 1837  1-Regular local school district that is NOT a component of a supervisory union
## 1844  1-Regular local school district that is NOT a component of a supervisory union
## 1853  1-Regular local school district that is NOT a component of a supervisory union
## 1857  1-Regular local school district that is NOT a component of a supervisory union
## 1877                                      4-Regional Education Service Agency (RESA)
## 1902  1-Regular local school district that is NOT a component of a supervisory union
## 1906  1-Regular local school district that is NOT a component of a supervisory union
## 1907  1-Regular local school district that is NOT a component of a supervisory union
## 1921  1-Regular local school district that is NOT a component of a supervisory union
## 1922  1-Regular local school district that is NOT a component of a supervisory union
## 1932  1-Regular local school district that is NOT a component of a supervisory union
## 1940  1-Regular local school district that is NOT a component of a supervisory union
## 1952  1-Regular local school district that is NOT a component of a supervisory union
## 1971                                                  7-Independent Charter District
## 1972  1-Regular local school district that is NOT a component of a supervisory union
## 1974  1-Regular local school district that is NOT a component of a supervisory union
## 1987  1-Regular local school district that is NOT a component of a supervisory union
## 1989  1-Regular local school district that is NOT a component of a supervisory union
## 1992  1-Regular local school district that is NOT a component of a supervisory union
## 2008                                      4-Regional Education Service Agency (RESA)
## 2014                                                  7-Independent Charter District
## 2016  1-Regular local school district that is NOT a component of a supervisory union
## 2017  1-Regular local school district that is NOT a component of a supervisory union
## 2020  1-Regular local school district that is NOT a component of a supervisory union
## 2027  1-Regular local school district that is NOT a component of a supervisory union
## 2034  1-Regular local school district that is NOT a component of a supervisory union
## 2036  1-Regular local school district that is NOT a component of a supervisory union
## 2038  1-Regular local school district that is NOT a component of a supervisory union
## 2054  1-Regular local school district that is NOT a component of a supervisory union
## 2057  1-Regular local school district that is NOT a component of a supervisory union
## 2060  1-Regular local school district that is NOT a component of a supervisory union
## 2061  1-Regular local school district that is NOT a component of a supervisory union
## 2067  1-Regular local school district that is NOT a component of a supervisory union
## 2160  1-Regular local school district that is NOT a component of a supervisory union
## 2162                                      4-Regional Education Service Agency (RESA)
## 2163  1-Regular local school district that is NOT a component of a supervisory union
## 2194  1-Regular local school district that is NOT a component of a supervisory union
## 2195  1-Regular local school district that is NOT a component of a supervisory union
## 2210  1-Regular local school district that is NOT a component of a supervisory union
## 2212  1-Regular local school district that is NOT a component of a supervisory union
## 2213  1-Regular local school district that is NOT a component of a supervisory union
## 2219                                                  7-Independent Charter District
## 2230  1-Regular local school district that is NOT a component of a supervisory union
## 2236                                      4-Regional Education Service Agency (RESA)
## 2242                                                  7-Independent Charter District
## 2251  1-Regular local school district that is NOT a component of a supervisory union
## 2252  1-Regular local school district that is NOT a component of a supervisory union
## 2253                                                  7-Independent Charter District
## 2254                                                  7-Independent Charter District
## 2266                                                  7-Independent Charter District
## 2268                                                  7-Independent Charter District
## 2269                                                  7-Independent Charter District
## 2270                                                  7-Independent Charter District
## 2271                                                  7-Independent Charter District
## 2272                                                  7-Independent Charter District
## 2273                                                  7-Independent Charter District
## 2274                                                  7-Independent Charter District
## 2275                                                  7-Independent Charter District
## 2279                                                  7-Independent Charter District
## 2280                                                  7-Independent Charter District
## 2281                                                  7-Independent Charter District
## 2282                                                  7-Independent Charter District
## 2283                                                  7-Independent Charter District
## 2284                                                  7-Independent Charter District
## 2288  1-Regular local school district that is NOT a component of a supervisory union
## 2297                                                  7-Independent Charter District
## 2298                                                  7-Independent Charter District
## 2299                                                  7-Independent Charter District
## 2300                                                  7-Independent Charter District
## 2310  1-Regular local school district that is NOT a component of a supervisory union
## 2334  1-Regular local school district that is NOT a component of a supervisory union
## 2335  1-Regular local school district that is NOT a component of a supervisory union
## 2342  1-Regular local school district that is NOT a component of a supervisory union
## 2343  1-Regular local school district that is NOT a component of a supervisory union
## 2348  1-Regular local school district that is NOT a component of a supervisory union
## 2350  1-Regular local school district that is NOT a component of a supervisory union
## 2351  1-Regular local school district that is NOT a component of a supervisory union
## 2352  1-Regular local school district that is NOT a component of a supervisory union
## 2355  1-Regular local school district that is NOT a component of a supervisory union
## 2440  1-Regular local school district that is NOT a component of a supervisory union
## 2442          5-State agency providing elementary and/or secondary level instruction
## 2552  1-Regular local school district that is NOT a component of a supervisory union
## 2669          5-State agency providing elementary and/or secondary level instruction
## 2682  1-Regular local school district that is NOT a component of a supervisory union
## 2704  1-Regular local school district that is NOT a component of a supervisory union
## 2720  1-Regular local school district that is NOT a component of a supervisory union
## 2724  1-Regular local school district that is NOT a component of a supervisory union
## 2743  1-Regular local school district that is NOT a component of a supervisory union
## 2786  1-Regular local school district that is NOT a component of a supervisory union
## 2832  1-Regular local school district that is NOT a component of a supervisory union
## 2842  1-Regular local school district that is NOT a component of a supervisory union
## 2846  1-Regular local school district that is NOT a component of a supervisory union
## 2847                                      4-Regional Education Service Agency (RESA)
## 2857          5-State agency providing elementary and/or secondary level instruction
## 2886  1-Regular local school district that is NOT a component of a supervisory union
## 2887  1-Regular local school district that is NOT a component of a supervisory union
## 2888  1-Regular local school district that is NOT a component of a supervisory union
## 2926          5-State agency providing elementary and/or secondary level instruction
## 2927          5-State agency providing elementary and/or secondary level instruction
## 2928          5-State agency providing elementary and/or secondary level instruction
## 2929          5-State agency providing elementary and/or secondary level instruction
## 2930          5-State agency providing elementary and/or secondary level instruction
## 2931          5-State agency providing elementary and/or secondary level instruction
## 2932                                                      8-Other education agencies
## 2941  1-Regular local school district that is NOT a component of a supervisory union
## 2943                                                  7-Independent Charter District
## 3000  1-Regular local school district that is NOT a component of a supervisory union
## 3009  1-Regular local school district that is NOT a component of a supervisory union
## 3049                                      4-Regional Education Service Agency (RESA)
## 3129  1-Regular local school district that is NOT a component of a supervisory union
## 3130  1-Regular local school district that is NOT a component of a supervisory union
## 3155  1-Regular local school district that is NOT a component of a supervisory union
## 3274                                                  7-Independent Charter District
## 3275                                                  7-Independent Charter District
## 3276                                                  7-Independent Charter District
## 3277                                                  7-Independent Charter District
## 3278                                                  7-Independent Charter District
## 3279                                                  7-Independent Charter District
## 3280                                                  7-Independent Charter District
## 3281                                                  7-Independent Charter District
## 3282                                                  7-Independent Charter District
## 3284                                                  7-Independent Charter District
## 3287                                                  7-Independent Charter District
## 3288                                                  7-Independent Charter District
## 3289                                                  7-Independent Charter District
## 3290                                                  7-Independent Charter District
## 3291                                                  7-Independent Charter District
## 3295                                                  7-Independent Charter District
## 3296  1-Regular local school district that is NOT a component of a supervisory union
## 3297                                                  7-Independent Charter District
## 3299                                                  7-Independent Charter District
## 3300                                                  7-Independent Charter District
## 3301                                                  7-Independent Charter District
## 3330  1-Regular local school district that is NOT a component of a supervisory union
## 3512  1-Regular local school district that is NOT a component of a supervisory union
## 3544  1-Regular local school district that is NOT a component of a supervisory union
## 3613                                                  7-Independent Charter District
## 3646  1-Regular local school district that is NOT a component of a supervisory union
## 3666                                                  7-Independent Charter District
## 3667                                                  7-Independent Charter District
## 3668                                                  7-Independent Charter District
## 3673          5-State agency providing elementary and/or secondary level instruction
## 3674          5-State agency providing elementary and/or secondary level instruction
## 3675          5-State agency providing elementary and/or secondary level instruction
## 3763  1-Regular local school district that is NOT a component of a supervisory union
## 3770  1-Regular local school district that is NOT a component of a supervisory union
## 3771  1-Regular local school district that is NOT a component of a supervisory union
## 3772  1-Regular local school district that is NOT a component of a supervisory union
## 3780  1-Regular local school district that is NOT a component of a supervisory union
## 3781  1-Regular local school district that is NOT a component of a supervisory union
## 3782  1-Regular local school district that is NOT a component of a supervisory union
## 3791  1-Regular local school district that is NOT a component of a supervisory union
## 3796                                                      8-Other education agencies
## 3797                                                      8-Other education agencies
## 3798                                                      8-Other education agencies
## 3799                                                      8-Other education agencies
## 3800                                                      8-Other education agencies
## 3801                                                      8-Other education agencies
## 3802                                                      8-Other education agencies
## 3803                                                      8-Other education agencies
## 3804                                                      8-Other education agencies
## 3825  1-Regular local school district that is NOT a component of a supervisory union
## 3834  1-Regular local school district that is NOT a component of a supervisory union
## 3835  1-Regular local school district that is NOT a component of a supervisory union
## 3837  1-Regular local school district that is NOT a component of a supervisory union
## 3841  1-Regular local school district that is NOT a component of a supervisory union
## 3898  1-Regular local school district that is NOT a component of a supervisory union
## 3914                                                  7-Independent Charter District
## 3915                                                  7-Independent Charter District
## 3916                                                  7-Independent Charter District
## 3917                                                  7-Independent Charter District
## 3918                                                  7-Independent Charter District
## 3919                                                  7-Independent Charter District
## 3920                                                  7-Independent Charter District
## 3921                                                  7-Independent Charter District
## 3922                                                  7-Independent Charter District
## 3931  1-Regular local school district that is NOT a component of a supervisory union
## 3934  1-Regular local school district that is NOT a component of a supervisory union
## 3953                                                  7-Independent Charter District
## 3986                                                  7-Independent Charter District
## 3987                                                  7-Independent Charter District
## 4006  1-Regular local school district that is NOT a component of a supervisory union
## 4034          5-State agency providing elementary and/or secondary level instruction
## 4042  1-Regular local school district that is NOT a component of a supervisory union
## 4051          5-State agency providing elementary and/or secondary level instruction
## 4053          5-State agency providing elementary and/or secondary level instruction
## 4196          5-State agency providing elementary and/or secondary level instruction
## 4204  1-Regular local school district that is NOT a component of a supervisory union
## 4283  1-Regular local school district that is NOT a component of a supervisory union
## 4308  1-Regular local school district that is NOT a component of a supervisory union
## 4309  1-Regular local school district that is NOT a component of a supervisory union
## 4332                                                  7-Independent Charter District
## 4384  1-Regular local school district that is NOT a component of a supervisory union
## 4472  1-Regular local school district that is NOT a component of a supervisory union
## 4497                                                  7-Independent Charter District
## 4513                                                  7-Independent Charter District
## 4514          5-State agency providing elementary and/or secondary level instruction
## 4534  1-Regular local school district that is NOT a component of a supervisory union
## 4547          5-State agency providing elementary and/or secondary level instruction
## 4557  1-Regular local school district that is NOT a component of a supervisory union
## 4576  1-Regular local school district that is NOT a component of a supervisory union
## 4592  1-Regular local school district that is NOT a component of a supervisory union
## 4622  1-Regular local school district that is NOT a component of a supervisory union
## 4623  1-Regular local school district that is NOT a component of a supervisory union
## 4626  1-Regular local school district that is NOT a component of a supervisory union
## 4635  1-Regular local school district that is NOT a component of a supervisory union
## 4644  1-Regular local school district that is NOT a component of a supervisory union
## 4690  1-Regular local school district that is NOT a component of a supervisory union
## 4695  1-Regular local school district that is NOT a component of a supervisory union
## 4727  1-Regular local school district that is NOT a component of a supervisory union
## 4728  1-Regular local school district that is NOT a component of a supervisory union
## 4800                                      4-Regional Education Service Agency (RESA)
## 4807                                                  7-Independent Charter District
## 4948  1-Regular local school district that is NOT a component of a supervisory union
## 4949  1-Regular local school district that is NOT a component of a supervisory union
## 4950  1-Regular local school district that is NOT a component of a supervisory union
## 4952  1-Regular local school district that is NOT a component of a supervisory union
## 5054          5-State agency providing elementary and/or secondary level instruction
## 5128  1-Regular local school district that is NOT a component of a supervisory union
## 5137  1-Regular local school district that is NOT a component of a supervisory union
## 5164  1-Regular local school district that is NOT a component of a supervisory union
## 5174  1-Regular local school district that is NOT a component of a supervisory union
## 5189  1-Regular local school district that is NOT a component of a supervisory union
## 5305                                                  7-Independent Charter District
## 5306                                                  7-Independent Charter District
## 5307                                                  7-Independent Charter District
## 5308                                                  7-Independent Charter District
## 5310                                                  7-Independent Charter District
## 5311                                                  7-Independent Charter District
## 5312                                                  7-Independent Charter District
## 5313                                                  7-Independent Charter District
## 5314                                                  7-Independent Charter District
## 5315                                                  7-Independent Charter District
## 5316                                                  7-Independent Charter District
## 5317                                                  7-Independent Charter District
## 5318                                                  7-Independent Charter District
## 5319                                                  7-Independent Charter District
## 5320                                                  7-Independent Charter District
## 5321                                                  7-Independent Charter District
## 5322                                                  7-Independent Charter District
## 5323                                                  7-Independent Charter District
## 5324                                                  7-Independent Charter District
## 5325                                                  7-Independent Charter District
## 5326                                                  7-Independent Charter District
## 5327                                                  7-Independent Charter District
## 5328                                                  7-Independent Charter District
## 5329                                                  7-Independent Charter District
## 5347  1-Regular local school district that is NOT a component of a supervisory union
## 5348  1-Regular local school district that is NOT a component of a supervisory union
## 5375  1-Regular local school district that is NOT a component of a supervisory union
## 5457  1-Regular local school district that is NOT a component of a supervisory union
## 5532  1-Regular local school district that is NOT a component of a supervisory union
## 5533  1-Regular local school district that is NOT a component of a supervisory union
## 5534  1-Regular local school district that is NOT a component of a supervisory union
## 5588  1-Regular local school district that is NOT a component of a supervisory union
## 5623  1-Regular local school district that is NOT a component of a supervisory union
## 5670  1-Regular local school district that is NOT a component of a supervisory union
## 5672  1-Regular local school district that is NOT a component of a supervisory union
## 5735                                                  7-Independent Charter District
## 5737  1-Regular local school district that is NOT a component of a supervisory union
## 5738  1-Regular local school district that is NOT a component of a supervisory union
## 5803  1-Regular local school district that is NOT a component of a supervisory union
## 5809  1-Regular local school district that is NOT a component of a supervisory union
## 5825  1-Regular local school district that is NOT a component of a supervisory union
## 5829  1-Regular local school district that is NOT a component of a supervisory union
## 5834  1-Regular local school district that is NOT a component of a supervisory union
## 5873          5-State agency providing elementary and/or secondary level instruction
## 5885  1-Regular local school district that is NOT a component of a supervisory union
## 5908  1-Regular local school district that is NOT a component of a supervisory union
## 5937  1-Regular local school district that is NOT a component of a supervisory union
## 5967  1-Regular local school district that is NOT a component of a supervisory union
## 5968                                                  7-Independent Charter District
## 5989  1-Regular local school district that is NOT a component of a supervisory union
## 6059  1-Regular local school district that is NOT a component of a supervisory union
## 6075  1-Regular local school district that is NOT a component of a supervisory union
## 6114  1-Regular local school district that is NOT a component of a supervisory union
## 6122                                                  7-Independent Charter District
## 6131  1-Regular local school district that is NOT a component of a supervisory union
## 6152  1-Regular local school district that is NOT a component of a supervisory union
## 6156  1-Regular local school district that is NOT a component of a supervisory union
## 6184  1-Regular local school district that is NOT a component of a supervisory union
## 6263  1-Regular local school district that is NOT a component of a supervisory union
## 6397                                      4-Regional Education Service Agency (RESA)
## 6416  1-Regular local school district that is NOT a component of a supervisory union
## 6426  1-Regular local school district that is NOT a component of a supervisory union
## 6428  1-Regular local school district that is NOT a component of a supervisory union
## 6441  1-Regular local school district that is NOT a component of a supervisory union
## 6456  1-Regular local school district that is NOT a component of a supervisory union
## 6463                                                  7-Independent Charter District
## 6506  1-Regular local school district that is NOT a component of a supervisory union
## 6508                                                  7-Independent Charter District
## 6509                                                  7-Independent Charter District
## 6510                                                  7-Independent Charter District
## 6531                                                  7-Independent Charter District
## 6541  1-Regular local school district that is NOT a component of a supervisory union
## 6574                                                  7-Independent Charter District
## 6575                                                  7-Independent Charter District
## 6616  1-Regular local school district that is NOT a component of a supervisory union
## 6617  1-Regular local school district that is NOT a component of a supervisory union
## 6684                                      4-Regional Education Service Agency (RESA)
## 6685                                      4-Regional Education Service Agency (RESA)
## 6687                                      4-Regional Education Service Agency (RESA)
## 6710                                                  7-Independent Charter District
## 6723          5-State agency providing elementary and/or secondary level instruction
## 6729          5-State agency providing elementary and/or secondary level instruction
## 6753  1-Regular local school district that is NOT a component of a supervisory union
## 6872  1-Regular local school district that is NOT a component of a supervisory union
## 6933  1-Regular local school district that is NOT a component of a supervisory union
## 6965  1-Regular local school district that is NOT a component of a supervisory union
## 7127  1-Regular local school district that is NOT a component of a supervisory union
## 7128  1-Regular local school district that is NOT a component of a supervisory union
## 7129  1-Regular local school district that is NOT a component of a supervisory union
## 7130  1-Regular local school district that is NOT a component of a supervisory union
## 7135  1-Regular local school district that is NOT a component of a supervisory union
## 7146  1-Regular local school district that is NOT a component of a supervisory union
## 7166  1-Regular local school district that is NOT a component of a supervisory union
## 7200  1-Regular local school district that is NOT a component of a supervisory union
## 7211  1-Regular local school district that is NOT a component of a supervisory union
## 7213                                                  7-Independent Charter District
## 7214  1-Regular local school district that is NOT a component of a supervisory union
## 7252  1-Regular local school district that is NOT a component of a supervisory union
## 7263  1-Regular local school district that is NOT a component of a supervisory union
## 7264  1-Regular local school district that is NOT a component of a supervisory union
## 7280  1-Regular local school district that is NOT a component of a supervisory union
## 7296  1-Regular local school district that is NOT a component of a supervisory union
## 7338  1-Regular local school district that is NOT a component of a supervisory union
## 7351  1-Regular local school district that is NOT a component of a supervisory union
## 7424  1-Regular local school district that is NOT a component of a supervisory union
## 7430  1-Regular local school district that is NOT a component of a supervisory union
## 7470  1-Regular local school district that is NOT a component of a supervisory union
## 7498  1-Regular local school district that is NOT a component of a supervisory union
## 7522  1-Regular local school district that is NOT a component of a supervisory union
## 7523          5-State agency providing elementary and/or secondary level instruction
## 7576  1-Regular local school district that is NOT a component of a supervisory union
## 7588  1-Regular local school district that is NOT a component of a supervisory union
## 7659  1-Regular local school district that is NOT a component of a supervisory union
## 7709  1-Regular local school district that is NOT a component of a supervisory union
## 7752          5-State agency providing elementary and/or secondary level instruction
## 7753          5-State agency providing elementary and/or secondary level instruction
## 7769  1-Regular local school district that is NOT a component of a supervisory union
## 7770  1-Regular local school district that is NOT a component of a supervisory union
## 7816  1-Regular local school district that is NOT a component of a supervisory union
## 7825  1-Regular local school district that is NOT a component of a supervisory union
## 7828  1-Regular local school district that is NOT a component of a supervisory union
## 7829  1-Regular local school district that is NOT a component of a supervisory union
## 7836  1-Regular local school district that is NOT a component of a supervisory union
## 7839  1-Regular local school district that is NOT a component of a supervisory union
## 7843  1-Regular local school district that is NOT a component of a supervisory union
## 7844  1-Regular local school district that is NOT a component of a supervisory union
## 7900  1-Regular local school district that is NOT a component of a supervisory union
## 7922                                      4-Regional Education Service Agency (RESA)
## 7931          5-State agency providing elementary and/or secondary level instruction
## 7963  1-Regular local school district that is NOT a component of a supervisory union
## 7976                                                  7-Independent Charter District
## 7995  1-Regular local school district that is NOT a component of a supervisory union
## 7996  1-Regular local school district that is NOT a component of a supervisory union
## 8003  1-Regular local school district that is NOT a component of a supervisory union
## 8030  1-Regular local school district that is NOT a component of a supervisory union
## 8046          5-State agency providing elementary and/or secondary level instruction
## 8068          5-State agency providing elementary and/or secondary level instruction
## 8084  1-Regular local school district that is NOT a component of a supervisory union
## 8108  1-Regular local school district that is NOT a component of a supervisory union
## 8136  1-Regular local school district that is NOT a component of a supervisory union
## 8173  1-Regular local school district that is NOT a component of a supervisory union
## 8252                                                  7-Independent Charter District
## 8255  1-Regular local school district that is NOT a component of a supervisory union
## 8257  1-Regular local school district that is NOT a component of a supervisory union
## 8260  1-Regular local school district that is NOT a component of a supervisory union
## 8261  1-Regular local school district that is NOT a component of a supervisory union
## 8262  1-Regular local school district that is NOT a component of a supervisory union
## 8284  1-Regular local school district that is NOT a component of a supervisory union
## 8313  1-Regular local school district that is NOT a component of a supervisory union
## 8319                                      4-Regional Education Service Agency (RESA)
## 8352          5-State agency providing elementary and/or secondary level instruction
## 8358          5-State agency providing elementary and/or secondary level instruction
## 8441  1-Regular local school district that is NOT a component of a supervisory union
## 8470  1-Regular local school district that is NOT a component of a supervisory union
## 8480  1-Regular local school district that is NOT a component of a supervisory union
## 8481  1-Regular local school district that is NOT a component of a supervisory union
## 8485  1-Regular local school district that is NOT a component of a supervisory union
## 8486  1-Regular local school district that is NOT a component of a supervisory union
## 8487  1-Regular local school district that is NOT a component of a supervisory union
## 8604  1-Regular local school district that is NOT a component of a supervisory union
## 8606  1-Regular local school district that is NOT a component of a supervisory union
## 8663  1-Regular local school district that is NOT a component of a supervisory union
## 8677  1-Regular local school district that is NOT a component of a supervisory union
## 8679  1-Regular local school district that is NOT a component of a supervisory union
## 8728  1-Regular local school district that is NOT a component of a supervisory union
## 8729  1-Regular local school district that is NOT a component of a supervisory union
## 8730  1-Regular local school district that is NOT a component of a supervisory union
## 8735                                                  7-Independent Charter District
## 8748  1-Regular local school district that is NOT a component of a supervisory union
## 8768  1-Regular local school district that is NOT a component of a supervisory union
## 8808  1-Regular local school district that is NOT a component of a supervisory union
## 8859  1-Regular local school district that is NOT a component of a supervisory union
## 8902  1-Regular local school district that is NOT a component of a supervisory union
## 8905  1-Regular local school district that is NOT a component of a supervisory union
## 8910  1-Regular local school district that is NOT a component of a supervisory union
## 8928                                      4-Regional Education Service Agency (RESA)
## 8942  1-Regular local school district that is NOT a component of a supervisory union
## 9056  1-Regular local school district that is NOT a component of a supervisory union
## 9063  1-Regular local school district that is NOT a component of a supervisory union
## 9065  1-Regular local school district that is NOT a component of a supervisory union
## 9066  1-Regular local school district that is NOT a component of a supervisory union
## 9073  1-Regular local school district that is NOT a component of a supervisory union
## 9107  1-Regular local school district that is NOT a component of a supervisory union
## 9201  1-Regular local school district that is NOT a component of a supervisory union
## 9218  1-Regular local school district that is NOT a component of a supervisory union
## 9227  1-Regular local school district that is NOT a component of a supervisory union
## 9228  1-Regular local school district that is NOT a component of a supervisory union
## 9239  1-Regular local school district that is NOT a component of a supervisory union
## 9271                                      4-Regional Education Service Agency (RESA)
## 9272                                      4-Regional Education Service Agency (RESA)
## 9305                                                  7-Independent Charter District
## 9327  1-Regular local school district that is NOT a component of a supervisory union
## 9406  1-Regular local school district that is NOT a component of a supervisory union
## 9491  1-Regular local school district that is NOT a component of a supervisory union
## 9694  1-Regular local school district that is NOT a component of a supervisory union
## 9787  1-Regular local school district that is NOT a component of a supervisory union
## 9814  1-Regular local school district that is NOT a component of a supervisory union
## 9863  1-Regular local school district that is NOT a component of a supervisory union
## 9878  1-Regular local school district that is NOT a component of a supervisory union
## 9879  1-Regular local school district that is NOT a component of a supervisory union
## 9880  1-Regular local school district that is NOT a component of a supervisory union
## 9885  1-Regular local school district that is NOT a component of a supervisory union
## 9886  1-Regular local school district that is NOT a component of a supervisory union
## 9887  1-Regular local school district that is NOT a component of a supervisory union
## 10043 1-Regular local school district that is NOT a component of a supervisory union
## 10044 1-Regular local school district that is NOT a component of a supervisory union
## 10095 1-Regular local school district that is NOT a component of a supervisory union
## 10096 1-Regular local school district that is NOT a component of a supervisory union
## 10145 1-Regular local school district that is NOT a component of a supervisory union
## 10159 1-Regular local school district that is NOT a component of a supervisory union
## 10160 1-Regular local school district that is NOT a component of a supervisory union
## 10174 1-Regular local school district that is NOT a component of a supervisory union
## 10177 1-Regular local school district that is NOT a component of a supervisory union
## 10178 1-Regular local school district that is NOT a component of a supervisory union
## 10314 1-Regular local school district that is NOT a component of a supervisory union
## 10330 1-Regular local school district that is NOT a component of a supervisory union
## 10373 1-Regular local school district that is NOT a component of a supervisory union
## 10402 1-Regular local school district that is NOT a component of a supervisory union
## 10426 1-Regular local school district that is NOT a component of a supervisory union
## 10432 1-Regular local school district that is NOT a component of a supervisory union
## 10487 1-Regular local school district that is NOT a component of a supervisory union
## 10491 1-Regular local school district that is NOT a component of a supervisory union
## 10525                                                 7-Independent Charter District
## 10538 1-Regular local school district that is NOT a component of a supervisory union
## 10565         5-State agency providing elementary and/or secondary level instruction
## 10567         5-State agency providing elementary and/or secondary level instruction
## 10569 1-Regular local school district that is NOT a component of a supervisory union
## 10591         5-State agency providing elementary and/or secondary level instruction
## 10597         5-State agency providing elementary and/or secondary level instruction
## 10621 1-Regular local school district that is NOT a component of a supervisory union
## 10644 1-Regular local school district that is NOT a component of a supervisory union
## 10650 1-Regular local school district that is NOT a component of a supervisory union
## 10655 1-Regular local school district that is NOT a component of a supervisory union
## 10702 1-Regular local school district that is NOT a component of a supervisory union
## 10767 1-Regular local school district that is NOT a component of a supervisory union
## 10776 1-Regular local school district that is NOT a component of a supervisory union
## 10782                                     4-Regional Education Service Agency (RESA)
## 10789 1-Regular local school district that is NOT a component of a supervisory union
## 10793 1-Regular local school district that is NOT a component of a supervisory union
## 10805                                     4-Regional Education Service Agency (RESA)
## 10816 1-Regular local school district that is NOT a component of a supervisory union
## 10817 1-Regular local school district that is NOT a component of a supervisory union
## 10823 1-Regular local school district that is NOT a component of a supervisory union
## 10928 1-Regular local school district that is NOT a component of a supervisory union
## 10937 1-Regular local school district that is NOT a component of a supervisory union
## 10938 1-Regular local school district that is NOT a component of a supervisory union
## 10948 1-Regular local school district that is NOT a component of a supervisory union
## 10957 1-Regular local school district that is NOT a component of a supervisory union
## 10962 1-Regular local school district that is NOT a component of a supervisory union
## 11016 1-Regular local school district that is NOT a component of a supervisory union
## 11017                                                 7-Independent Charter District
## 11021                                     4-Regional Education Service Agency (RESA)
## 11030 1-Regular local school district that is NOT a component of a supervisory union
## 11033 1-Regular local school district that is NOT a component of a supervisory union
## 11059 1-Regular local school district that is NOT a component of a supervisory union
## 11065 1-Regular local school district that is NOT a component of a supervisory union
## 11125 1-Regular local school district that is NOT a component of a supervisory union
## 11156 1-Regular local school district that is NOT a component of a supervisory union
## 11192 1-Regular local school district that is NOT a component of a supervisory union
## 11230 1-Regular local school district that is NOT a component of a supervisory union
## 11231 1-Regular local school district that is NOT a component of a supervisory union
## 11255 1-Regular local school district that is NOT a component of a supervisory union
## 11256 1-Regular local school district that is NOT a component of a supervisory union
## 11257 1-Regular local school district that is NOT a component of a supervisory union
## 11258 1-Regular local school district that is NOT a component of a supervisory union
## 11259 1-Regular local school district that is NOT a component of a supervisory union
## 11263                                                 7-Independent Charter District
## 11272 1-Regular local school district that is NOT a component of a supervisory union
## 11273 1-Regular local school district that is NOT a component of a supervisory union
## 11299 1-Regular local school district that is NOT a component of a supervisory union
## 11300 1-Regular local school district that is NOT a component of a supervisory union
## 11301 1-Regular local school district that is NOT a component of a supervisory union
## 11302 1-Regular local school district that is NOT a component of a supervisory union
## 11303 1-Regular local school district that is NOT a component of a supervisory union
## 11307         5-State agency providing elementary and/or secondary level instruction
## 11308         5-State agency providing elementary and/or secondary level instruction
## 11309         5-State agency providing elementary and/or secondary level instruction
## 11310 1-Regular local school district that is NOT a component of a supervisory union
## 11312 1-Regular local school district that is NOT a component of a supervisory union
## 11313 1-Regular local school district that is NOT a component of a supervisory union
## 11314 1-Regular local school district that is NOT a component of a supervisory union
## 11351 1-Regular local school district that is NOT a component of a supervisory union
## 11405 1-Regular local school district that is NOT a component of a supervisory union
## 11422 1-Regular local school district that is NOT a component of a supervisory union
## 11439                                                 7-Independent Charter District
## 11440                                                 7-Independent Charter District
## 11483         5-State agency providing elementary and/or secondary level instruction
## 11484 1-Regular local school district that is NOT a component of a supervisory union
## 11512         5-State agency providing elementary and/or secondary level instruction
## 11513         5-State agency providing elementary and/or secondary level instruction
## 11514         5-State agency providing elementary and/or secondary level instruction
## 11522                                                 7-Independent Charter District
## 11534 1-Regular local school district that is NOT a component of a supervisory union
## 11535 1-Regular local school district that is NOT a component of a supervisory union
## 11539 1-Regular local school district that is NOT a component of a supervisory union
## 11541 1-Regular local school district that is NOT a component of a supervisory union
## 11543 1-Regular local school district that is NOT a component of a supervisory union
## 11544 1-Regular local school district that is NOT a component of a supervisory union
## 11546 1-Regular local school district that is NOT a component of a supervisory union
## 11547 1-Regular local school district that is NOT a component of a supervisory union
## 11551 1-Regular local school district that is NOT a component of a supervisory union
## 11582                                                 7-Independent Charter District
## 11589         5-State agency providing elementary and/or secondary level instruction
## 11591 1-Regular local school district that is NOT a component of a supervisory union
## 11612 1-Regular local school district that is NOT a component of a supervisory union
## 11621 1-Regular local school district that is NOT a component of a supervisory union
## 11683 1-Regular local school district that is NOT a component of a supervisory union
## 11685 1-Regular local school district that is NOT a component of a supervisory union
## 11728                                                 7-Independent Charter District
## 11869 1-Regular local school district that is NOT a component of a supervisory union
## 11872 1-Regular local school district that is NOT a component of a supervisory union
## 11876 1-Regular local school district that is NOT a component of a supervisory union
## 11877 1-Regular local school district that is NOT a component of a supervisory union
## 11881                                                 7-Independent Charter District
## 11900                                                 7-Independent Charter District
## 11908                                                 7-Independent Charter District
## 11911                                                 7-Independent Charter District
## 11912                                                 7-Independent Charter District
## 11913 1-Regular local school district that is NOT a component of a supervisory union
## 11914 1-Regular local school district that is NOT a component of a supervisory union
## 11925 1-Regular local school district that is NOT a component of a supervisory union
## 11926 1-Regular local school district that is NOT a component of a supervisory union
## 11927 1-Regular local school district that is NOT a component of a supervisory union
## 11928 1-Regular local school district that is NOT a component of a supervisory union
## 11929 1-Regular local school district that is NOT a component of a supervisory union
## 11930                                                 7-Independent Charter District
## 11931 1-Regular local school district that is NOT a component of a supervisory union
## 11932 1-Regular local school district that is NOT a component of a supervisory union
## 11935 1-Regular local school district that is NOT a component of a supervisory union
## 11936 1-Regular local school district that is NOT a component of a supervisory union
## 11937 1-Regular local school district that is NOT a component of a supervisory union
## 11967         5-State agency providing elementary and/or secondary level instruction
## 11968         5-State agency providing elementary and/or secondary level instruction
## 11975 1-Regular local school district that is NOT a component of a supervisory union
## 12070 1-Regular local school district that is NOT a component of a supervisory union
## 12083                                                 7-Independent Charter District
## 12088 1-Regular local school district that is NOT a component of a supervisory union
## 12114                                     4-Regional Education Service Agency (RESA)
## 12123 1-Regular local school district that is NOT a component of a supervisory union
## 12131 1-Regular local school district that is NOT a component of a supervisory union
## 12138 1-Regular local school district that is NOT a component of a supervisory union
## 12149                                     4-Regional Education Service Agency (RESA)
## 12163                                                 7-Independent Charter District
## 12164                                                 7-Independent Charter District
## 12165                                                 7-Independent Charter District
## 12166                                                 7-Independent Charter District
## 12167 1-Regular local school district that is NOT a component of a supervisory union
## 12168 1-Regular local school district that is NOT a component of a supervisory union
## 12190 1-Regular local school district that is NOT a component of a supervisory union
## 12221 1-Regular local school district that is NOT a component of a supervisory union
## 12227 1-Regular local school district that is NOT a component of a supervisory union
## 12228 1-Regular local school district that is NOT a component of a supervisory union
## 12243 1-Regular local school district that is NOT a component of a supervisory union
## 12249 1-Regular local school district that is NOT a component of a supervisory union
## 12307 1-Regular local school district that is NOT a component of a supervisory union
## 12310 1-Regular local school district that is NOT a component of a supervisory union
## 12316 1-Regular local school district that is NOT a component of a supervisory union
## 12348 1-Regular local school district that is NOT a component of a supervisory union
## 12427                                                 7-Independent Charter District
## 12480 1-Regular local school district that is NOT a component of a supervisory union
## 12501 1-Regular local school district that is NOT a component of a supervisory union
## 12523 1-Regular local school district that is NOT a component of a supervisory union
## 12540                                     4-Regional Education Service Agency (RESA)
## 12567 1-Regular local school district that is NOT a component of a supervisory union
## 12591 1-Regular local school district that is NOT a component of a supervisory union
## 12677 1-Regular local school district that is NOT a component of a supervisory union
## 12746 1-Regular local school district that is NOT a component of a supervisory union
## 12749 1-Regular local school district that is NOT a component of a supervisory union
## 12756                                                 7-Independent Charter District
## 12764 1-Regular local school district that is NOT a component of a supervisory union
## 12783 1-Regular local school district that is NOT a component of a supervisory union
## 12806 1-Regular local school district that is NOT a component of a supervisory union
## 12905 1-Regular local school district that is NOT a component of a supervisory union
## 12912 1-Regular local school district that is NOT a component of a supervisory union
## 12934 1-Regular local school district that is NOT a component of a supervisory union
## 12965 1-Regular local school district that is NOT a component of a supervisory union
## 12974 1-Regular local school district that is NOT a component of a supervisory union
## 12976 1-Regular local school district that is NOT a component of a supervisory union
## 12979 1-Regular local school district that is NOT a component of a supervisory union
## 13071                                           9-Specialized public school district
## 13072                                           9-Specialized public school district
## 13073                                           9-Specialized public school district
## 13075                                           9-Specialized public school district
## 13076                                           9-Specialized public school district
## 13077                                           9-Specialized public school district
## 13079                                           9-Specialized public school district
## 13080                                           9-Specialized public school district
## 13081                                           9-Specialized public school district
## 13082                                           9-Specialized public school district
## 13085                                           9-Specialized public school district
## 13086                                           9-Specialized public school district
## 13087                                           9-Specialized public school district
## 13088                                           9-Specialized public school district
## 13089                                           9-Specialized public school district
## 13090                                           9-Specialized public school district
## 13091                                           9-Specialized public school district
## 13111         5-State agency providing elementary and/or secondary level instruction
## 13117                                     4-Regional Education Service Agency (RESA)
## 13156 1-Regular local school district that is NOT a component of a supervisory union
## 13176 1-Regular local school district that is NOT a component of a supervisory union
## 13230 1-Regular local school district that is NOT a component of a supervisory union
## 13233 1-Regular local school district that is NOT a component of a supervisory union
## 13240 1-Regular local school district that is NOT a component of a supervisory union
## 13262 1-Regular local school district that is NOT a component of a supervisory union
## 13269 1-Regular local school district that is NOT a component of a supervisory union
## 13270 1-Regular local school district that is NOT a component of a supervisory union
## 13275 1-Regular local school district that is NOT a component of a supervisory union
## 13290 1-Regular local school district that is NOT a component of a supervisory union
## 13335                                                 7-Independent Charter District
## 13338 1-Regular local school district that is NOT a component of a supervisory union
## 13340                                                 7-Independent Charter District
## 13424 1-Regular local school district that is NOT a component of a supervisory union
## 13428 1-Regular local school district that is NOT a component of a supervisory union
## 13442 1-Regular local school district that is NOT a component of a supervisory union
## 13448 1-Regular local school district that is NOT a component of a supervisory union
## 13467                                                 7-Independent Charter District
## 13468                                                 7-Independent Charter District
## 13469                                                 7-Independent Charter District
## 13470                                                 7-Independent Charter District
## 13471                                                 7-Independent Charter District
## 13483 1-Regular local school district that is NOT a component of a supervisory union
## 13487                                                 7-Independent Charter District
## 13588 1-Regular local school district that is NOT a component of a supervisory union
## 13595 1-Regular local school district that is NOT a component of a supervisory union
## 13602 1-Regular local school district that is NOT a component of a supervisory union
## 13623         5-State agency providing elementary and/or secondary level instruction
## 13625 1-Regular local school district that is NOT a component of a supervisory union
## 13677 1-Regular local school district that is NOT a component of a supervisory union
## 13704 1-Regular local school district that is NOT a component of a supervisory union
## 13755 1-Regular local school district that is NOT a component of a supervisory union
## 13816 1-Regular local school district that is NOT a component of a supervisory union
## 13964 1-Regular local school district that is NOT a component of a supervisory union
## 14045                                     4-Regional Education Service Agency (RESA)
## 14047                                     4-Regional Education Service Agency (RESA)
## 14061                                     4-Regional Education Service Agency (RESA)
## 14062         5-State agency providing elementary and/or secondary level instruction
## 14068                                     4-Regional Education Service Agency (RESA)
## 14102         5-State agency providing elementary and/or secondary level instruction
## 14112 1-Regular local school district that is NOT a component of a supervisory union
## 14118 1-Regular local school district that is NOT a component of a supervisory union
## 14124 1-Regular local school district that is NOT a component of a supervisory union
## 14129                                     4-Regional Education Service Agency (RESA)
## 14136         5-State agency providing elementary and/or secondary level instruction
## 14142         5-State agency providing elementary and/or secondary level instruction
## 14161                                     4-Regional Education Service Agency (RESA)
## 14205 1-Regular local school district that is NOT a component of a supervisory union
## 14221 1-Regular local school district that is NOT a component of a supervisory union
## 14226 1-Regular local school district that is NOT a component of a supervisory union
## 14229 1-Regular local school district that is NOT a component of a supervisory union
## 14237 1-Regular local school district that is NOT a component of a supervisory union
## 14371 1-Regular local school district that is NOT a component of a supervisory union
## 14373 1-Regular local school district that is NOT a component of a supervisory union
## 14375 1-Regular local school district that is NOT a component of a supervisory union
## 14377 1-Regular local school district that is NOT a component of a supervisory union
## 14379                                                 7-Independent Charter District
## 14387                                                 7-Independent Charter District
## 14436 1-Regular local school district that is NOT a component of a supervisory union
## 14458                                                 7-Independent Charter District
## 14464                                                 7-Independent Charter District
## 14465                                                 7-Independent Charter District
## 14516                                                 7-Independent Charter District
## 14520 1-Regular local school district that is NOT a component of a supervisory union
## 14526                                                 7-Independent Charter District
## 14531 1-Regular local school district that is NOT a component of a supervisory union
## 14618 1-Regular local school district that is NOT a component of a supervisory union
## 14671 1-Regular local school district that is NOT a component of a supervisory union
## 14768 1-Regular local school district that is NOT a component of a supervisory union
## 14876 1-Regular local school district that is NOT a component of a supervisory union
## 14877 1-Regular local school district that is NOT a component of a supervisory union
## 14880 1-Regular local school district that is NOT a component of a supervisory union
## 14882         5-State agency providing elementary and/or secondary level instruction
## 14883                                     4-Regional Education Service Agency (RESA)
## 14899 1-Regular local school district that is NOT a component of a supervisory union
## 14912 1-Regular local school district that is NOT a component of a supervisory union
## 15111 1-Regular local school district that is NOT a component of a supervisory union
## 15116 1-Regular local school district that is NOT a component of a supervisory union
## 15161 1-Regular local school district that is NOT a component of a supervisory union
## 15172         5-State agency providing elementary and/or secondary level instruction
## 15173 1-Regular local school district that is NOT a component of a supervisory union
## 15175         5-State agency providing elementary and/or secondary level instruction
## 15212 1-Regular local school district that is NOT a component of a supervisory union
## 15213                                     4-Regional Education Service Agency (RESA)
## 15215 1-Regular local school district that is NOT a component of a supervisory union
## 15297 1-Regular local school district that is NOT a component of a supervisory union
## 15298 1-Regular local school district that is NOT a component of a supervisory union
## 15304         5-State agency providing elementary and/or secondary level instruction
## 15365 1-Regular local school district that is NOT a component of a supervisory union
## 15370 1-Regular local school district that is NOT a component of a supervisory union
## 15371 1-Regular local school district that is NOT a component of a supervisory union
## 15373 1-Regular local school district that is NOT a component of a supervisory union
## 15376 1-Regular local school district that is NOT a component of a supervisory union
## 15377 1-Regular local school district that is NOT a component of a supervisory union
## 15395 1-Regular local school district that is NOT a component of a supervisory union
## 15442 1-Regular local school district that is NOT a component of a supervisory union
## 15448 1-Regular local school district that is NOT a component of a supervisory union
## 15451                                                 7-Independent Charter District
## 15452                                                 7-Independent Charter District
## 15454                                                 7-Independent Charter District
## 15458 1-Regular local school district that is NOT a component of a supervisory union
## 15473         5-State agency providing elementary and/or secondary level instruction
## 15508 1-Regular local school district that is NOT a component of a supervisory union
## 15587 1-Regular local school district that is NOT a component of a supervisory union
## 15666                                     4-Regional Education Service Agency (RESA)
## 15778 1-Regular local school district that is NOT a component of a supervisory union
## 15789 1-Regular local school district that is NOT a component of a supervisory union
## 15809 1-Regular local school district that is NOT a component of a supervisory union
## 15822 1-Regular local school district that is NOT a component of a supervisory union
## 15823 1-Regular local school district that is NOT a component of a supervisory union
## 15824 1-Regular local school district that is NOT a component of a supervisory union
## 15825 1-Regular local school district that is NOT a component of a supervisory union
## 15826 1-Regular local school district that is NOT a component of a supervisory union
## 15828 1-Regular local school district that is NOT a component of a supervisory union
## 15829 1-Regular local school district that is NOT a component of a supervisory union
## 15830 1-Regular local school district that is NOT a component of a supervisory union
## 15831 1-Regular local school district that is NOT a component of a supervisory union
## 15832 1-Regular local school district that is NOT a component of a supervisory union
## 15833 1-Regular local school district that is NOT a component of a supervisory union
## 15834 1-Regular local school district that is NOT a component of a supervisory union
## 15835 1-Regular local school district that is NOT a component of a supervisory union
## 15843 1-Regular local school district that is NOT a component of a supervisory union
## 15898 1-Regular local school district that is NOT a component of a supervisory union
## 15899 1-Regular local school district that is NOT a component of a supervisory union
## 15943 1-Regular local school district that is NOT a component of a supervisory union
## 15950 1-Regular local school district that is NOT a component of a supervisory union
## 15957 1-Regular local school district that is NOT a component of a supervisory union
## 15958 1-Regular local school district that is NOT a component of a supervisory union
## 15960                                                 7-Independent Charter District
## 15966 1-Regular local school district that is NOT a component of a supervisory union
## 15970                                                 7-Independent Charter District
## 15981 1-Regular local school district that is NOT a component of a supervisory union
## 16010 1-Regular local school district that is NOT a component of a supervisory union
## 16141 1-Regular local school district that is NOT a component of a supervisory union
## 16190 1-Regular local school district that is NOT a component of a supervisory union
## 16218 1-Regular local school district that is NOT a component of a supervisory union
## 16247 1-Regular local school district that is NOT a component of a supervisory union
## 16271 1-Regular local school district that is NOT a component of a supervisory union
## 16273 1-Regular local school district that is NOT a component of a supervisory union
## 16307         5-State agency providing elementary and/or secondary level instruction
## 16308 1-Regular local school district that is NOT a component of a supervisory union
## 16332 1-Regular local school district that is NOT a component of a supervisory union
## 16357 1-Regular local school district that is NOT a component of a supervisory union
## 16359 1-Regular local school district that is NOT a component of a supervisory union
## 16360 1-Regular local school district that is NOT a component of a supervisory union
## 16403 1-Regular local school district that is NOT a component of a supervisory union
## 16411 1-Regular local school district that is NOT a component of a supervisory union
## 16483 1-Regular local school district that is NOT a component of a supervisory union
## 16498 1-Regular local school district that is NOT a component of a supervisory union
## 16525 1-Regular local school district that is NOT a component of a supervisory union
## 16526 1-Regular local school district that is NOT a component of a supervisory union
## 16623 1-Regular local school district that is NOT a component of a supervisory union
## 16633 1-Regular local school district that is NOT a component of a supervisory union
## 16767 1-Regular local school district that is NOT a component of a supervisory union
## 16805                                     4-Regional Education Service Agency (RESA)
## 16811 1-Regular local school district that is NOT a component of a supervisory union
## 16816 1-Regular local school district that is NOT a component of a supervisory union
## 16828 1-Regular local school district that is NOT a component of a supervisory union
## 16913 1-Regular local school district that is NOT a component of a supervisory union
## 16918 1-Regular local school district that is NOT a component of a supervisory union
## 16926 1-Regular local school district that is NOT a component of a supervisory union
## 16948 1-Regular local school district that is NOT a component of a supervisory union
## 16950 1-Regular local school district that is NOT a component of a supervisory union
## 16952 1-Regular local school district that is NOT a component of a supervisory union
## 16953 1-Regular local school district that is NOT a component of a supervisory union
## 16963                                     4-Regional Education Service Agency (RESA)
## 17019                                     4-Regional Education Service Agency (RESA)
## 17046 1-Regular local school district that is NOT a component of a supervisory union
## 17116 1-Regular local school district that is NOT a component of a supervisory union
## 17160                                                 7-Independent Charter District
## 17231 1-Regular local school district that is NOT a component of a supervisory union
## 17232 1-Regular local school district that is NOT a component of a supervisory union
## 17282 1-Regular local school district that is NOT a component of a supervisory union
## 17334 1-Regular local school district that is NOT a component of a supervisory union
## 17335 1-Regular local school district that is NOT a component of a supervisory union
## 17344 1-Regular local school district that is NOT a component of a supervisory union
## 17345 1-Regular local school district that is NOT a component of a supervisory union
## 17347 1-Regular local school district that is NOT a component of a supervisory union
## 17447 1-Regular local school district that is NOT a component of a supervisory union
## 17510                                     4-Regional Education Service Agency (RESA)
## 17538 1-Regular local school district that is NOT a component of a supervisory union
## 17599 1-Regular local school district that is NOT a component of a supervisory union
## 17600 1-Regular local school district that is NOT a component of a supervisory union
## 17611 1-Regular local school district that is NOT a component of a supervisory union
## 17612 1-Regular local school district that is NOT a component of a supervisory union
## 17613 1-Regular local school district that is NOT a component of a supervisory union
## 17639 1-Regular local school district that is NOT a component of a supervisory union
## 17641 1-Regular local school district that is NOT a component of a supervisory union
## 17651 1-Regular local school district that is NOT a component of a supervisory union
## 17775                                     4-Regional Education Service Agency (RESA)
## 17787 1-Regular local school district that is NOT a component of a supervisory union
## 17793 1-Regular local school district that is NOT a component of a supervisory union
## 17800 1-Regular local school district that is NOT a component of a supervisory union
## 17802 1-Regular local school district that is NOT a component of a supervisory union
## 17803 1-Regular local school district that is NOT a component of a supervisory union
## 17805 1-Regular local school district that is NOT a component of a supervisory union
## 17815 1-Regular local school district that is NOT a component of a supervisory union
## 17823 1-Regular local school district that is NOT a component of a supervisory union
## 17845 1-Regular local school district that is NOT a component of a supervisory union
## 17850                                                 7-Independent Charter District
## 17856 1-Regular local school district that is NOT a component of a supervisory union
## 17895 1-Regular local school district that is NOT a component of a supervisory union
## 17896 1-Regular local school district that is NOT a component of a supervisory union
## 17897 1-Regular local school district that is NOT a component of a supervisory union
## 17901                                                 7-Independent Charter District
## 17907 1-Regular local school district that is NOT a component of a supervisory union
## 17925                                     4-Regional Education Service Agency (RESA)
## 17936 1-Regular local school district that is NOT a component of a supervisory union
## 17977                                                 7-Independent Charter District
## 17978                                                 7-Independent Charter District
## 18066 1-Regular local school district that is NOT a component of a supervisory union
## 18067 1-Regular local school district that is NOT a component of a supervisory union
## 18074                                     4-Regional Education Service Agency (RESA)
## 18168                                     4-Regional Education Service Agency (RESA)
## 18169 1-Regular local school district that is NOT a component of a supervisory union
## 18170 1-Regular local school district that is NOT a component of a supervisory union
## 18171 1-Regular local school district that is NOT a component of a supervisory union
## 18173 1-Regular local school district that is NOT a component of a supervisory union
## 18174 1-Regular local school district that is NOT a component of a supervisory union
## 18176 1-Regular local school district that is NOT a component of a supervisory union
## 18177 1-Regular local school district that is NOT a component of a supervisory union
## 18178 1-Regular local school district that is NOT a component of a supervisory union
## 18216 1-Regular local school district that is NOT a component of a supervisory union
## 18232 1-Regular local school district that is NOT a component of a supervisory union
## 18254 1-Regular local school district that is NOT a component of a supervisory union
## 18273                                     4-Regional Education Service Agency (RESA)
## 18285 1-Regular local school district that is NOT a component of a supervisory union
## 18338 1-Regular local school district that is NOT a component of a supervisory union
## 18375                                                 7-Independent Charter District
## 18378 1-Regular local school district that is NOT a component of a supervisory union
## 18379 1-Regular local school district that is NOT a component of a supervisory union
## 18386 1-Regular local school district that is NOT a component of a supervisory union
## 18387 1-Regular local school district that is NOT a component of a supervisory union
## 18392 1-Regular local school district that is NOT a component of a supervisory union
## 18393                                                 7-Independent Charter District
## 18408 1-Regular local school district that is NOT a component of a supervisory union
## 18423 1-Regular local school district that is NOT a component of a supervisory union
## 18424 1-Regular local school district that is NOT a component of a supervisory union
## 18425 1-Regular local school district that is NOT a component of a supervisory union
## 18431 1-Regular local school district that is NOT a component of a supervisory union
## 18432 1-Regular local school district that is NOT a component of a supervisory union
## 18468 1-Regular local school district that is NOT a component of a supervisory union
## 18490 1-Regular local school district that is NOT a component of a supervisory union
## 18508 1-Regular local school district that is NOT a component of a supervisory union
## 18553 1-Regular local school district that is NOT a component of a supervisory union
## 18557 1-Regular local school district that is NOT a component of a supervisory union
## 18567                                                 7-Independent Charter District
## 18574 1-Regular local school district that is NOT a component of a supervisory union
## 18614 1-Regular local school district that is NOT a component of a supervisory union
## 18642 1-Regular local school district that is NOT a component of a supervisory union
## 18677 1-Regular local school district that is NOT a component of a supervisory union
## 18719         5-State agency providing elementary and/or secondary level instruction
## 18726 1-Regular local school district that is NOT a component of a supervisory union
## 18762 1-Regular local school district that is NOT a component of a supervisory union
## 18787 1-Regular local school district that is NOT a component of a supervisory union
## 18792 1-Regular local school district that is NOT a component of a supervisory union
## 18795 1-Regular local school district that is NOT a component of a supervisory union
## 18796 1-Regular local school district that is NOT a component of a supervisory union
## 18840                                                 7-Independent Charter District
## 18861 1-Regular local school district that is NOT a component of a supervisory union
## 18877 1-Regular local school district that is NOT a component of a supervisory union
## 18878 1-Regular local school district that is NOT a component of a supervisory union
## 18879 1-Regular local school district that is NOT a component of a supervisory union
## 18881 1-Regular local school district that is NOT a component of a supervisory union
## 18890 1-Regular local school district that is NOT a component of a supervisory union
## 18891 1-Regular local school district that is NOT a component of a supervisory union
## 18900 1-Regular local school district that is NOT a component of a supervisory union
## 18932                                     4-Regional Education Service Agency (RESA)
## 18973 1-Regular local school district that is NOT a component of a supervisory union
## 18994 1-Regular local school district that is NOT a component of a supervisory union
## 19047 1-Regular local school district that is NOT a component of a supervisory union
## 19102 1-Regular local school district that is NOT a component of a supervisory union
## 19111 1-Regular local school district that is NOT a component of a supervisory union
## 19115         5-State agency providing elementary and/or secondary level instruction
## 19147                                                 7-Independent Charter District
## 19169 1-Regular local school district that is NOT a component of a supervisory union
## 19183 1-Regular local school district that is NOT a component of a supervisory union
## 19190 1-Regular local school district that is NOT a component of a supervisory union
## 19232 1-Regular local school district that is NOT a component of a supervisory union
## 19238 1-Regular local school district that is NOT a component of a supervisory union
## 19246 1-Regular local school district that is NOT a component of a supervisory union
## 19257         5-State agency providing elementary and/or secondary level instruction
## 19258 1-Regular local school district that is NOT a component of a supervisory union
## 19288 1-Regular local school district that is NOT a component of a supervisory union
## 19292 1-Regular local school district that is NOT a component of a supervisory union
## 19293 1-Regular local school district that is NOT a component of a supervisory union
## 19294 1-Regular local school district that is NOT a component of a supervisory union
## 19295 1-Regular local school district that is NOT a component of a supervisory union
## 19296 1-Regular local school district that is NOT a component of a supervisory union
## 19354                                                 7-Independent Charter District
## 19388 1-Regular local school district that is NOT a component of a supervisory union
## 19389 1-Regular local school district that is NOT a component of a supervisory union
## 19451 1-Regular local school district that is NOT a component of a supervisory union
## 19461         5-State agency providing elementary and/or secondary level instruction
## 19474 1-Regular local school district that is NOT a component of a supervisory union
## 19486 1-Regular local school district that is NOT a component of a supervisory union
## 19492 1-Regular local school district that is NOT a component of a supervisory union
## 19568 1-Regular local school district that is NOT a component of a supervisory union
## 19612 1-Regular local school district that is NOT a component of a supervisory union
## 19626                                     4-Regional Education Service Agency (RESA)
## 19649 1-Regular local school district that is NOT a component of a supervisory union
## 19659 1-Regular local school district that is NOT a component of a supervisory union
## 19664 1-Regular local school district that is NOT a component of a supervisory union
## 19690 1-Regular local school district that is NOT a component of a supervisory union
## 19712                                                 7-Independent Charter District
## 19719                                                 7-Independent Charter District
## 19748 1-Regular local school district that is NOT a component of a supervisory union
## 19756 1-Regular local school district that is NOT a component of a supervisory union
## 19776                                           9-Specialized public school district
## 19777                                           9-Specialized public school district
## 19778                                           9-Specialized public school district
## 19779                                           9-Specialized public school district
## 19781                                           9-Specialized public school district
## 19782                                           9-Specialized public school district
## 19783                                           9-Specialized public school district
## 19784                                           9-Specialized public school district
## 19785                                           9-Specialized public school district
## 19786                                           9-Specialized public school district
## 19788 1-Regular local school district that is NOT a component of a supervisory union
## 19832 1-Regular local school district that is NOT a component of a supervisory union
## 19833 1-Regular local school district that is NOT a component of a supervisory union
## 19835 1-Regular local school district that is NOT a component of a supervisory union
## 19837 1-Regular local school district that is NOT a component of a supervisory union
## 19860         5-State agency providing elementary and/or secondary level instruction
## 19892         5-State agency providing elementary and/or secondary level instruction
## 19900         5-State agency providing elementary and/or secondary level instruction
## 19928 1-Regular local school district that is NOT a component of a supervisory union
## 20031                                           9-Specialized public school district
## 20032                                           9-Specialized public school district
## 20033                                           9-Specialized public school district
## 20034                                           9-Specialized public school district
## 20035                                           9-Specialized public school district
## 20036                                           9-Specialized public school district
## 20061 1-Regular local school district that is NOT a component of a supervisory union
## 20099 1-Regular local school district that is NOT a component of a supervisory union
## 20101 1-Regular local school district that is NOT a component of a supervisory union
## 20161 1-Regular local school district that is NOT a component of a supervisory union
## 20167 1-Regular local school district that is NOT a component of a supervisory union
## 20175 1-Regular local school district that is NOT a component of a supervisory union
## 20182 1-Regular local school district that is NOT a component of a supervisory union
## 20196 1-Regular local school district that is NOT a component of a supervisory union
## 20223 1-Regular local school district that is NOT a component of a supervisory union
## 20247 1-Regular local school district that is NOT a component of a supervisory union
## 20266 1-Regular local school district that is NOT a component of a supervisory union
## 20268 1-Regular local school district that is NOT a component of a supervisory union
## 20272 1-Regular local school district that is NOT a component of a supervisory union
## 20273 1-Regular local school district that is NOT a component of a supervisory union
## 20335 1-Regular local school district that is NOT a component of a supervisory union
## 20413 1-Regular local school district that is NOT a component of a supervisory union
## 20424 1-Regular local school district that is NOT a component of a supervisory union
## 20545 1-Regular local school district that is NOT a component of a supervisory union
## 20590 1-Regular local school district that is NOT a component of a supervisory union
## 20654                                                 7-Independent Charter District
## 20662 1-Regular local school district that is NOT a component of a supervisory union
## 20695 1-Regular local school district that is NOT a component of a supervisory union
## 20712 1-Regular local school district that is NOT a component of a supervisory union
## 20715 1-Regular local school district that is NOT a component of a supervisory union
## 20719         5-State agency providing elementary and/or secondary level instruction
## 20764 1-Regular local school district that is NOT a component of a supervisory union
## 20770 1-Regular local school district that is NOT a component of a supervisory union
## 20774 1-Regular local school district that is NOT a component of a supervisory union
## 20775 1-Regular local school district that is NOT a component of a supervisory union
## 20826         5-State agency providing elementary and/or secondary level instruction
## 20887 1-Regular local school district that is NOT a component of a supervisory union
## 20927 1-Regular local school district that is NOT a component of a supervisory union
## 21008 1-Regular local school district that is NOT a component of a supervisory union
## 21027 1-Regular local school district that is NOT a component of a supervisory union
## 21040                                                 7-Independent Charter District
## 21073 1-Regular local school district that is NOT a component of a supervisory union
## 21095 1-Regular local school district that is NOT a component of a supervisory union
## 21101 1-Regular local school district that is NOT a component of a supervisory union
## 21115         5-State agency providing elementary and/or secondary level instruction
## 21117 1-Regular local school district that is NOT a component of a supervisory union
## 21137 1-Regular local school district that is NOT a component of a supervisory union
## 21140 1-Regular local school district that is NOT a component of a supervisory union
## 21143                                     4-Regional Education Service Agency (RESA)
## 21161 1-Regular local school district that is NOT a component of a supervisory union
## 21251 1-Regular local school district that is NOT a component of a supervisory union
## 21283 1-Regular local school district that is NOT a component of a supervisory union
## 21287 1-Regular local school district that is NOT a component of a supervisory union
## 21309 1-Regular local school district that is NOT a component of a supervisory union
## 21325 1-Regular local school district that is NOT a component of a supervisory union
## 21329 1-Regular local school district that is NOT a component of a supervisory union
## 21331 1-Regular local school district that is NOT a component of a supervisory union
## 21374 1-Regular local school district that is NOT a component of a supervisory union
## 21440 1-Regular local school district that is NOT a component of a supervisory union
## 21446 1-Regular local school district that is NOT a component of a supervisory union
## 21451 1-Regular local school district that is NOT a component of a supervisory union
## 21479         5-State agency providing elementary and/or secondary level instruction
## 21480         5-State agency providing elementary and/or secondary level instruction
## 21490         5-State agency providing elementary and/or secondary level instruction
## 21549                                                 7-Independent Charter District
## 21551                                                 7-Independent Charter District
## 21554 1-Regular local school district that is NOT a component of a supervisory union
## 21555                                                 7-Independent Charter District
## 21556 1-Regular local school district that is NOT a component of a supervisory union
## 21563                                                 7-Independent Charter District
## 21569                                                 7-Independent Charter District
## 21580                                                 7-Independent Charter District
## 21585                                                 7-Independent Charter District
## 21591 1-Regular local school district that is NOT a component of a supervisory union
## 21596                                                 7-Independent Charter District
## 21602                                                 7-Independent Charter District
## 21607                                                 7-Independent Charter District
## 21608                                                 7-Independent Charter District
## 21610 1-Regular local school district that is NOT a component of a supervisory union
## 21618         5-State agency providing elementary and/or secondary level instruction
## 21619                                                 7-Independent Charter District
## 21633 1-Regular local school district that is NOT a component of a supervisory union
## 21638 1-Regular local school district that is NOT a component of a supervisory union
## 21641 1-Regular local school district that is NOT a component of a supervisory union
## 21646 1-Regular local school district that is NOT a component of a supervisory union
## 21647 1-Regular local school district that is NOT a component of a supervisory union
## 21656 1-Regular local school district that is NOT a component of a supervisory union
## 21680 1-Regular local school district that is NOT a component of a supervisory union
## 21681 1-Regular local school district that is NOT a component of a supervisory union
## 21693                                                 7-Independent Charter District
## 21698 1-Regular local school district that is NOT a component of a supervisory union
## 21827 1-Regular local school district that is NOT a component of a supervisory union
## 21837 1-Regular local school district that is NOT a component of a supervisory union
## 21849 1-Regular local school district that is NOT a component of a supervisory union
## 21850 1-Regular local school district that is NOT a component of a supervisory union
## 21855 1-Regular local school district that is NOT a component of a supervisory union
## 21859 1-Regular local school district that is NOT a component of a supervisory union
## 21913 1-Regular local school district that is NOT a component of a supervisory union
## 21914 1-Regular local school district that is NOT a component of a supervisory union
## 21916 1-Regular local school district that is NOT a component of a supervisory union
## 21917 1-Regular local school district that is NOT a component of a supervisory union
## 21975 1-Regular local school district that is NOT a component of a supervisory union
## 22012 1-Regular local school district that is NOT a component of a supervisory union
## 22028 1-Regular local school district that is NOT a component of a supervisory union
## 22029 1-Regular local school district that is NOT a component of a supervisory union
## 22033 1-Regular local school district that is NOT a component of a supervisory union
## 22041                                                 7-Independent Charter District
## 22049 1-Regular local school district that is NOT a component of a supervisory union
## 22088                                                 7-Independent Charter District
## 22096 1-Regular local school district that is NOT a component of a supervisory union
## 22097 1-Regular local school district that is NOT a component of a supervisory union
## 22101                                                 7-Independent Charter District
## 22109 1-Regular local school district that is NOT a component of a supervisory union
## 22113 1-Regular local school district that is NOT a component of a supervisory union
## 22114 1-Regular local school district that is NOT a component of a supervisory union
## 22115 1-Regular local school district that is NOT a component of a supervisory union
## 22117 1-Regular local school district that is NOT a component of a supervisory union
## 22125 1-Regular local school district that is NOT a component of a supervisory union
## 22133 1-Regular local school district that is NOT a component of a supervisory union
## 22134 1-Regular local school district that is NOT a component of a supervisory union
## 22135 1-Regular local school district that is NOT a component of a supervisory union
## 22136 1-Regular local school district that is NOT a component of a supervisory union
## 22137 1-Regular local school district that is NOT a component of a supervisory union
## 22138 1-Regular local school district that is NOT a component of a supervisory union
## 22139 1-Regular local school district that is NOT a component of a supervisory union
## 22157 1-Regular local school district that is NOT a component of a supervisory union
## 22168 1-Regular local school district that is NOT a component of a supervisory union
## 22172 1-Regular local school district that is NOT a component of a supervisory union
## 22174                                                 7-Independent Charter District
## 22175 1-Regular local school district that is NOT a component of a supervisory union
## 22176 1-Regular local school district that is NOT a component of a supervisory union
## 22177 1-Regular local school district that is NOT a component of a supervisory union
## 22178 1-Regular local school district that is NOT a component of a supervisory union
## 22179 1-Regular local school district that is NOT a component of a supervisory union
## 22180 1-Regular local school district that is NOT a component of a supervisory union
## 22199 1-Regular local school district that is NOT a component of a supervisory union
## 22202 1-Regular local school district that is NOT a component of a supervisory union
## 22218                                                 7-Independent Charter District
## 22386         5-State agency providing elementary and/or secondary level instruction
## 22450 1-Regular local school district that is NOT a component of a supervisory union
## 22538 1-Regular local school district that is NOT a component of a supervisory union
## 22554 1-Regular local school district that is NOT a component of a supervisory union
## 22573 1-Regular local school district that is NOT a component of a supervisory union
## 22583 1-Regular local school district that is NOT a component of a supervisory union
## 22596 1-Regular local school district that is NOT a component of a supervisory union
## 22626 1-Regular local school district that is NOT a component of a supervisory union
## 22627 1-Regular local school district that is NOT a component of a supervisory union
## 22646 1-Regular local school district that is NOT a component of a supervisory union
## 22699         5-State agency providing elementary and/or secondary level instruction
## 22736 1-Regular local school district that is NOT a component of a supervisory union
## 22752 1-Regular local school district that is NOT a component of a supervisory union
## 22913 1-Regular local school district that is NOT a component of a supervisory union
## 22991 1-Regular local school district that is NOT a component of a supervisory union
## 22992 1-Regular local school district that is NOT a component of a supervisory union
## 23002                                     4-Regional Education Service Agency (RESA)
## 23004 1-Regular local school district that is NOT a component of a supervisory union
## 23059 1-Regular local school district that is NOT a component of a supervisory union
## 23060 1-Regular local school district that is NOT a component of a supervisory union
## 23087 1-Regular local school district that is NOT a component of a supervisory union
## 23115                                                 7-Independent Charter District
## 23144 1-Regular local school district that is NOT a component of a supervisory union
## 23161 1-Regular local school district that is NOT a component of a supervisory union
## 23162 1-Regular local school district that is NOT a component of a supervisory union
## 23167 1-Regular local school district that is NOT a component of a supervisory union
## 23195 1-Regular local school district that is NOT a component of a supervisory union
## 23204 1-Regular local school district that is NOT a component of a supervisory union
## 23228 1-Regular local school district that is NOT a component of a supervisory union
## 23337 1-Regular local school district that is NOT a component of a supervisory union
## 23364 1-Regular local school district that is NOT a component of a supervisory union
## 23444 1-Regular local school district that is NOT a component of a supervisory union
## 23446 1-Regular local school district that is NOT a component of a supervisory union
## 23447 1-Regular local school district that is NOT a component of a supervisory union
## 23448 1-Regular local school district that is NOT a component of a supervisory union
## 23449 1-Regular local school district that is NOT a component of a supervisory union
## 23450 1-Regular local school district that is NOT a component of a supervisory union
## 23452 1-Regular local school district that is NOT a component of a supervisory union
## 23455 1-Regular local school district that is NOT a component of a supervisory union
## 23456 1-Regular local school district that is NOT a component of a supervisory union
## 23458 1-Regular local school district that is NOT a component of a supervisory union
## 23578                                                 7-Independent Charter District
## 23579                                                 7-Independent Charter District
## 23580                                                 7-Independent Charter District
## 23581                                                 7-Independent Charter District
## 23582                                                 7-Independent Charter District
## 23583                                                 7-Independent Charter District
## 23584                                                 7-Independent Charter District
## 23656 1-Regular local school district that is NOT a component of a supervisory union
## 23667                                                 7-Independent Charter District
## 23668                                                 7-Independent Charter District
## 23669                                                 7-Independent Charter District
## 23670                                                 7-Independent Charter District
## 23673 1-Regular local school district that is NOT a component of a supervisory union
## 23737 1-Regular local school district that is NOT a component of a supervisory union
## 23762 1-Regular local school district that is NOT a component of a supervisory union
## 23768 1-Regular local school district that is NOT a component of a supervisory union
## 23773 1-Regular local school district that is NOT a component of a supervisory union
## 23858 1-Regular local school district that is NOT a component of a supervisory union
## 23861 1-Regular local school district that is NOT a component of a supervisory union
## 23872 1-Regular local school district that is NOT a component of a supervisory union
## 23891 1-Regular local school district that is NOT a component of a supervisory union
## 23895 1-Regular local school district that is NOT a component of a supervisory union
## 23932 1-Regular local school district that is NOT a component of a supervisory union
## 23935 1-Regular local school district that is NOT a component of a supervisory union
## 23938 1-Regular local school district that is NOT a component of a supervisory union
## 23939 1-Regular local school district that is NOT a component of a supervisory union
## 23949 1-Regular local school district that is NOT a component of a supervisory union
## 23951 1-Regular local school district that is NOT a component of a supervisory union
## 23952 1-Regular local school district that is NOT a component of a supervisory union
## 23953 1-Regular local school district that is NOT a component of a supervisory union
## 23959 1-Regular local school district that is NOT a component of a supervisory union
## 23964 1-Regular local school district that is NOT a component of a supervisory union
## 23965 1-Regular local school district that is NOT a component of a supervisory union
## 23971 1-Regular local school district that is NOT a component of a supervisory union
## 23972 1-Regular local school district that is NOT a component of a supervisory union
## 23974 1-Regular local school district that is NOT a component of a supervisory union
## 23975 1-Regular local school district that is NOT a component of a supervisory union
## 23979 1-Regular local school district that is NOT a component of a supervisory union
## 23980 1-Regular local school district that is NOT a component of a supervisory union
## 23985 1-Regular local school district that is NOT a component of a supervisory union
## 23988 1-Regular local school district that is NOT a component of a supervisory union
## 23991 1-Regular local school district that is NOT a component of a supervisory union
## 24066 1-Regular local school district that is NOT a component of a supervisory union
## 24073 1-Regular local school district that is NOT a component of a supervisory union
## 24074 1-Regular local school district that is NOT a component of a supervisory union
## 24088 1-Regular local school district that is NOT a component of a supervisory union
## 24093                                                 7-Independent Charter District
## 24101                                                 7-Independent Charter District
## 24122         5-State agency providing elementary and/or secondary level instruction
## 24128                                     4-Regional Education Service Agency (RESA)
## 24186 1-Regular local school district that is NOT a component of a supervisory union
## 24379 1-Regular local school district that is NOT a component of a supervisory union
## 24396 1-Regular local school district that is NOT a component of a supervisory union
## 24412                                                 7-Independent Charter District
## 24467 1-Regular local school district that is NOT a component of a supervisory union
## 24500 1-Regular local school district that is NOT a component of a supervisory union
## 24521 1-Regular local school district that is NOT a component of a supervisory union
## 24546 1-Regular local school district that is NOT a component of a supervisory union
## 24564 1-Regular local school district that is NOT a component of a supervisory union
## 24599         5-State agency providing elementary and/or secondary level instruction
## 24600         5-State agency providing elementary and/or secondary level instruction
## 24634                                     4-Regional Education Service Agency (RESA)
## 24636 1-Regular local school district that is NOT a component of a supervisory union
## 24639 1-Regular local school district that is NOT a component of a supervisory union
## 24642 1-Regular local school district that is NOT a component of a supervisory union
## 24701                                                 7-Independent Charter District
## 24706                                                 7-Independent Charter District
## 24756 1-Regular local school district that is NOT a component of a supervisory union
## 24757 1-Regular local school district that is NOT a component of a supervisory union
## 24794         5-State agency providing elementary and/or secondary level instruction
## 24819         5-State agency providing elementary and/or secondary level instruction
## 24852 1-Regular local school district that is NOT a component of a supervisory union
## 24866         5-State agency providing elementary and/or secondary level instruction
## 24871 1-Regular local school district that is NOT a component of a supervisory union
## 24899                                                 7-Independent Charter District
## 24994 1-Regular local school district that is NOT a component of a supervisory union
## 25047 1-Regular local school district that is NOT a component of a supervisory union
## 25049 1-Regular local school district that is NOT a component of a supervisory union
## 25075 1-Regular local school district that is NOT a component of a supervisory union
## 25090 1-Regular local school district that is NOT a component of a supervisory union
## 25107 1-Regular local school district that is NOT a component of a supervisory union
## 25125                                     4-Regional Education Service Agency (RESA)
## 25126 1-Regular local school district that is NOT a component of a supervisory union
## 25167                                                 7-Independent Charter District
## 25168                                                 7-Independent Charter District
## 25191 1-Regular local school district that is NOT a component of a supervisory union
## 25192 1-Regular local school district that is NOT a component of a supervisory union
## 25335 1-Regular local school district that is NOT a component of a supervisory union
## 25364 1-Regular local school district that is NOT a component of a supervisory union
## 25372 1-Regular local school district that is NOT a component of a supervisory union
## 25375                                                 7-Independent Charter District
## 25389                                                 7-Independent Charter District
## 25390                                                 7-Independent Charter District
## 25391                                                 7-Independent Charter District
## 25392                                                 7-Independent Charter District
## 25440 1-Regular local school district that is NOT a component of a supervisory union
## 25444         5-State agency providing elementary and/or secondary level instruction
## 25445 1-Regular local school district that is NOT a component of a supervisory union
## 25458                                                 7-Independent Charter District
## 25459                                                 7-Independent Charter District
## 25465 1-Regular local school district that is NOT a component of a supervisory union
## 25475                                                 7-Independent Charter District
## 25478 1-Regular local school district that is NOT a component of a supervisory union
## 25482 1-Regular local school district that is NOT a component of a supervisory union
## 25483 1-Regular local school district that is NOT a component of a supervisory union
## 25486                                                 7-Independent Charter District
## 25487                                                 7-Independent Charter District
## 25488                                                 7-Independent Charter District
## 25498 1-Regular local school district that is NOT a component of a supervisory union
## 25520 1-Regular local school district that is NOT a component of a supervisory union
## 25578 1-Regular local school district that is NOT a component of a supervisory union
## 25653 1-Regular local school district that is NOT a component of a supervisory union
## 25693 1-Regular local school district that is NOT a component of a supervisory union
## 25748 1-Regular local school district that is NOT a component of a supervisory union
## 25797 1-Regular local school district that is NOT a component of a supervisory union
## 25808 1-Regular local school district that is NOT a component of a supervisory union
## 25842 1-Regular local school district that is NOT a component of a supervisory union
## 25858         5-State agency providing elementary and/or secondary level instruction
## 25867 1-Regular local school district that is NOT a component of a supervisory union
## 25868 1-Regular local school district that is NOT a component of a supervisory union
## 25877 1-Regular local school district that is NOT a component of a supervisory union
## 25917 1-Regular local school district that is NOT a component of a supervisory union
## 25932 1-Regular local school district that is NOT a component of a supervisory union
## 25958 1-Regular local school district that is NOT a component of a supervisory union
## 26038 1-Regular local school district that is NOT a component of a supervisory union
## 26092 1-Regular local school district that is NOT a component of a supervisory union
## 26097 1-Regular local school district that is NOT a component of a supervisory union
## 26112 1-Regular local school district that is NOT a component of a supervisory union
## 26114 1-Regular local school district that is NOT a component of a supervisory union
## 26118 1-Regular local school district that is NOT a component of a supervisory union
## 26166 1-Regular local school district that is NOT a component of a supervisory union
## 26172         5-State agency providing elementary and/or secondary level instruction
## 26286 1-Regular local school district that is NOT a component of a supervisory union
## 26289 1-Regular local school district that is NOT a component of a supervisory union
## 26327 1-Regular local school district that is NOT a component of a supervisory union
## 26389 1-Regular local school district that is NOT a component of a supervisory union
## 26433 1-Regular local school district that is NOT a component of a supervisory union
## 26530 1-Regular local school district that is NOT a component of a supervisory union
## 26532 1-Regular local school district that is NOT a component of a supervisory union
## 26590 1-Regular local school district that is NOT a component of a supervisory union
## 26602 1-Regular local school district that is NOT a component of a supervisory union
## 26606 1-Regular local school district that is NOT a component of a supervisory union
## 26632 1-Regular local school district that is NOT a component of a supervisory union
## 26677 1-Regular local school district that is NOT a component of a supervisory union
## 26701                                                 7-Independent Charter District
## 26702                                                 7-Independent Charter District
## 26703 1-Regular local school district that is NOT a component of a supervisory union
## 26707 1-Regular local school district that is NOT a component of a supervisory union
## 26728 1-Regular local school district that is NOT a component of a supervisory union
## 26748                                                 7-Independent Charter District
## 26753 1-Regular local school district that is NOT a component of a supervisory union
## 26761 1-Regular local school district that is NOT a component of a supervisory union
## 26774 1-Regular local school district that is NOT a component of a supervisory union
## 26776 1-Regular local school district that is NOT a component of a supervisory union
## 26777 1-Regular local school district that is NOT a component of a supervisory union
## 26778 1-Regular local school district that is NOT a component of a supervisory union
## 26780 1-Regular local school district that is NOT a component of a supervisory union
## 26797 1-Regular local school district that is NOT a component of a supervisory union
## 26838 1-Regular local school district that is NOT a component of a supervisory union
## 26844 1-Regular local school district that is NOT a component of a supervisory union
## 26851                                     4-Regional Education Service Agency (RESA)
## 26852                                     4-Regional Education Service Agency (RESA)
## 26856 1-Regular local school district that is NOT a component of a supervisory union
## 26860                                     4-Regional Education Service Agency (RESA)
## 26875 1-Regular local school district that is NOT a component of a supervisory union
## 26886 1-Regular local school district that is NOT a component of a supervisory union
## 26888 1-Regular local school district that is NOT a component of a supervisory union
## 26889                                                 7-Independent Charter District
## 26890                                                 7-Independent Charter District
## 26892 1-Regular local school district that is NOT a component of a supervisory union
## 26907                                                 7-Independent Charter District
## 26915 1-Regular local school district that is NOT a component of a supervisory union
## 26916 1-Regular local school district that is NOT a component of a supervisory union
## 26924                                                 7-Independent Charter District
## 26930 1-Regular local school district that is NOT a component of a supervisory union
## 26947 1-Regular local school district that is NOT a component of a supervisory union
## 27064 1-Regular local school district that is NOT a component of a supervisory union
## 27066 1-Regular local school district that is NOT a component of a supervisory union
## 27069 1-Regular local school district that is NOT a component of a supervisory union
## 27070 1-Regular local school district that is NOT a component of a supervisory union
## 27071 1-Regular local school district that is NOT a component of a supervisory union
## 27073 1-Regular local school district that is NOT a component of a supervisory union
## 27076 1-Regular local school district that is NOT a component of a supervisory union
## 27078 1-Regular local school district that is NOT a component of a supervisory union
## 27082 1-Regular local school district that is NOT a component of a supervisory union
## 27083 1-Regular local school district that is NOT a component of a supervisory union
## 27085 1-Regular local school district that is NOT a component of a supervisory union
## 27086 1-Regular local school district that is NOT a component of a supervisory union
## 27087 1-Regular local school district that is NOT a component of a supervisory union
## 27089 1-Regular local school district that is NOT a component of a supervisory union
## 27098 1-Regular local school district that is NOT a component of a supervisory union
## 27106 1-Regular local school district that is NOT a component of a supervisory union
## 27111 1-Regular local school district that is NOT a component of a supervisory union
## 27115 1-Regular local school district that is NOT a component of a supervisory union
## 27121 1-Regular local school district that is NOT a component of a supervisory union
## 27151                                                 7-Independent Charter District
## 27157         5-State agency providing elementary and/or secondary level instruction
## 27175         5-State agency providing elementary and/or secondary level instruction
## 27176         5-State agency providing elementary and/or secondary level instruction
## 27188                                                 7-Independent Charter District
## 27229                                                 7-Independent Charter District
## 27238 1-Regular local school district that is NOT a component of a supervisory union
## 27266                                                 7-Independent Charter District
## 27283 1-Regular local school district that is NOT a component of a supervisory union
## 27390 1-Regular local school district that is NOT a component of a supervisory union
## 27478 1-Regular local school district that is NOT a component of a supervisory union
## 27487 1-Regular local school district that is NOT a component of a supervisory union
## 27489 1-Regular local school district that is NOT a component of a supervisory union
## 27524                                     4-Regional Education Service Agency (RESA)
## 27577 1-Regular local school district that is NOT a component of a supervisory union
## 27606                                           9-Specialized public school district
## 27607                                           9-Specialized public school district
## 27608                                           9-Specialized public school district
## 27609                                           9-Specialized public school district
## 27610                                           9-Specialized public school district
## 27611                                           9-Specialized public school district
## 27612                                           9-Specialized public school district
## 27613                                           9-Specialized public school district
## 27614                                           9-Specialized public school district
## 27615                                           9-Specialized public school district
## 27616                                           9-Specialized public school district
## 27617                                           9-Specialized public school district
## 27618                                           9-Specialized public school district
## 27619                                           9-Specialized public school district
## 27620                                           9-Specialized public school district
## 27621                                           9-Specialized public school district
## 27622                                           9-Specialized public school district
## 27623                                           9-Specialized public school district
## 27625                                           9-Specialized public school district
## 27627                                           9-Specialized public school district
## 27628                                           9-Specialized public school district
## 27629                                           9-Specialized public school district
## 27630                                           9-Specialized public school district
## 27631                                           9-Specialized public school district
## 27632                                           9-Specialized public school district
## 27633                                           9-Specialized public school district
## 27634                                           9-Specialized public school district
## 27635                                           9-Specialized public school district
## 27636                                           9-Specialized public school district
## 27637                                           9-Specialized public school district
## 27638                                           9-Specialized public school district
## 27639                                           9-Specialized public school district
## 27640                                           9-Specialized public school district
## 27641                                           9-Specialized public school district
## 27642                                           9-Specialized public school district
## 27643                                           9-Specialized public school district
## 27644                                           9-Specialized public school district
## 27645                                           9-Specialized public school district
## 27646                                           9-Specialized public school district
## 27647                                           9-Specialized public school district
## 27648                                           9-Specialized public school district
## 27650                                           9-Specialized public school district
## 27651                                           9-Specialized public school district
## 27652                                           9-Specialized public school district
## 27653                                           9-Specialized public school district
## 27654                                           9-Specialized public school district
## 27656                                           9-Specialized public school district
## 27657                                           9-Specialized public school district
## 27658                                           9-Specialized public school district
## 27671 1-Regular local school district that is NOT a component of a supervisory union
## 27689 1-Regular local school district that is NOT a component of a supervisory union
## 27690 1-Regular local school district that is NOT a component of a supervisory union
## 27691 1-Regular local school district that is NOT a component of a supervisory union
## 27692 1-Regular local school district that is NOT a component of a supervisory union
## 27693 1-Regular local school district that is NOT a component of a supervisory union
## 27697                                                 7-Independent Charter District
## 27728                                                 7-Independent Charter District
## 27730 1-Regular local school district that is NOT a component of a supervisory union
## 27737 1-Regular local school district that is NOT a component of a supervisory union
## 27749 1-Regular local school district that is NOT a component of a supervisory union
## 27756 1-Regular local school district that is NOT a component of a supervisory union
## 27804 1-Regular local school district that is NOT a component of a supervisory union
## 27805 1-Regular local school district that is NOT a component of a supervisory union
## 27851 1-Regular local school district that is NOT a component of a supervisory union
## 27896 1-Regular local school district that is NOT a component of a supervisory union
## 27913 1-Regular local school district that is NOT a component of a supervisory union
## 27935 1-Regular local school district that is NOT a component of a supervisory union
## 27937         5-State agency providing elementary and/or secondary level instruction
## 27942 1-Regular local school district that is NOT a component of a supervisory union
## 27946 1-Regular local school district that is NOT a component of a supervisory union
## 27977 1-Regular local school district that is NOT a component of a supervisory union
## 27998 1-Regular local school district that is NOT a component of a supervisory union
## 28085 1-Regular local school district that is NOT a component of a supervisory union
## 28086 1-Regular local school district that is NOT a component of a supervisory union
## 28087 1-Regular local school district that is NOT a component of a supervisory union
## 28089 1-Regular local school district that is NOT a component of a supervisory union
## 28090 1-Regular local school district that is NOT a component of a supervisory union
## 28091 1-Regular local school district that is NOT a component of a supervisory union
## 28093 1-Regular local school district that is NOT a component of a supervisory union
## 28095 1-Regular local school district that is NOT a component of a supervisory union
## 28101 1-Regular local school district that is NOT a component of a supervisory union
## 28107 1-Regular local school district that is NOT a component of a supervisory union
## 28120 1-Regular local school district that is NOT a component of a supervisory union
## 28198 1-Regular local school district that is NOT a component of a supervisory union
## 28202 1-Regular local school district that is NOT a component of a supervisory union
## 28204 1-Regular local school district that is NOT a component of a supervisory union
## 28205 1-Regular local school district that is NOT a component of a supervisory union
## 28209 1-Regular local school district that is NOT a component of a supervisory union
## 28211 1-Regular local school district that is NOT a component of a supervisory union
## 28213 1-Regular local school district that is NOT a component of a supervisory union
## 28230 1-Regular local school district that is NOT a component of a supervisory union
## 28248 1-Regular local school district that is NOT a component of a supervisory union
## 28304 1-Regular local school district that is NOT a component of a supervisory union
## 28335 1-Regular local school district that is NOT a component of a supervisory union
## 28336 1-Regular local school district that is NOT a component of a supervisory union
## 28338 1-Regular local school district that is NOT a component of a supervisory union
## 28339 1-Regular local school district that is NOT a component of a supervisory union
## 28340 1-Regular local school district that is NOT a component of a supervisory union
## 28341 1-Regular local school district that is NOT a component of a supervisory union
## 28346 1-Regular local school district that is NOT a component of a supervisory union
## 28348 1-Regular local school district that is NOT a component of a supervisory union
## 28354                                                     8-Other education agencies
## 28400 1-Regular local school district that is NOT a component of a supervisory union
## 28432         5-State agency providing elementary and/or secondary level instruction
## 28445 1-Regular local school district that is NOT a component of a supervisory union
## 28450 1-Regular local school district that is NOT a component of a supervisory union
## 28454         5-State agency providing elementary and/or secondary level instruction
## 28472 1-Regular local school district that is NOT a component of a supervisory union
## 28475 1-Regular local school district that is NOT a component of a supervisory union
## 28508                                                 7-Independent Charter District
## 28547 1-Regular local school district that is NOT a component of a supervisory union
## 28574         5-State agency providing elementary and/or secondary level instruction
## 28579 1-Regular local school district that is NOT a component of a supervisory union
## 28585 1-Regular local school district that is NOT a component of a supervisory union
## 28606 1-Regular local school district that is NOT a component of a supervisory union
## 28628         5-State agency providing elementary and/or secondary level instruction
## 28659                                     4-Regional Education Service Agency (RESA)
## 28660                                     4-Regional Education Service Agency (RESA)
## 28661                                     4-Regional Education Service Agency (RESA)
## 28730 1-Regular local school district that is NOT a component of a supervisory union
## 28754 1-Regular local school district that is NOT a component of a supervisory union
## 28781 1-Regular local school district that is NOT a component of a supervisory union
## 28791 1-Regular local school district that is NOT a component of a supervisory union
## 28830 1-Regular local school district that is NOT a component of a supervisory union
## 28842 1-Regular local school district that is NOT a component of a supervisory union
## 28843 1-Regular local school district that is NOT a component of a supervisory union
## 28921                                     4-Regional Education Service Agency (RESA)
## 28922                                     4-Regional Education Service Agency (RESA)
## 28932 1-Regular local school district that is NOT a component of a supervisory union
## 28933 1-Regular local school district that is NOT a component of a supervisory union
## 28989 1-Regular local school district that is NOT a component of a supervisory union
## 28991                                     4-Regional Education Service Agency (RESA)
## 28994 1-Regular local school district that is NOT a component of a supervisory union
## 28995 1-Regular local school district that is NOT a component of a supervisory union
## 28996 1-Regular local school district that is NOT a component of a supervisory union
## 29010 1-Regular local school district that is NOT a component of a supervisory union
## 29013                                                 7-Independent Charter District
## 29016                                                 7-Independent Charter District
## 29022         5-State agency providing elementary and/or secondary level instruction
## 29026 1-Regular local school district that is NOT a component of a supervisory union
## 29100                                     4-Regional Education Service Agency (RESA)
## 29101 1-Regular local school district that is NOT a component of a supervisory union
## 29105                                     4-Regional Education Service Agency (RESA)
## 29128 1-Regular local school district that is NOT a component of a supervisory union
## 29178 1-Regular local school district that is NOT a component of a supervisory union
## 29195 1-Regular local school district that is NOT a component of a supervisory union
## 29207 1-Regular local school district that is NOT a component of a supervisory union
## 29208 1-Regular local school district that is NOT a component of a supervisory union
## 29216 1-Regular local school district that is NOT a component of a supervisory union
## 29218 1-Regular local school district that is NOT a component of a supervisory union
## 29230 1-Regular local school district that is NOT a component of a supervisory union
## 29251 1-Regular local school district that is NOT a component of a supervisory union
## 29300 1-Regular local school district that is NOT a component of a supervisory union
## 29311                                                     8-Other education agencies
## 29318 1-Regular local school district that is NOT a component of a supervisory union
## 29395         5-State agency providing elementary and/or secondary level instruction
## 29398 1-Regular local school district that is NOT a component of a supervisory union
## 29406 1-Regular local school district that is NOT a component of a supervisory union
## 29407 1-Regular local school district that is NOT a component of a supervisory union
## 29410                                                 7-Independent Charter District
## 29411                                                 7-Independent Charter District
## 29422 1-Regular local school district that is NOT a component of a supervisory union
## 29423 1-Regular local school district that is NOT a component of a supervisory union
## 29428 1-Regular local school district that is NOT a component of a supervisory union
## 29527 1-Regular local school district that is NOT a component of a supervisory union
## 29546 1-Regular local school district that is NOT a component of a supervisory union
## 29569 1-Regular local school district that is NOT a component of a supervisory union
## 29587 1-Regular local school district that is NOT a component of a supervisory union
## 29596 1-Regular local school district that is NOT a component of a supervisory union
## 29652 1-Regular local school district that is NOT a component of a supervisory union
## 29669 1-Regular local school district that is NOT a component of a supervisory union
## 29702 1-Regular local school district that is NOT a component of a supervisory union
## 29757 1-Regular local school district that is NOT a component of a supervisory union
## 29795 1-Regular local school district that is NOT a component of a supervisory union
## 29818 1-Regular local school district that is NOT a component of a supervisory union
## 29871                                     4-Regional Education Service Agency (RESA)
## 29882 1-Regular local school district that is NOT a component of a supervisory union
## 29937 1-Regular local school district that is NOT a component of a supervisory union
## 29939                                                 7-Independent Charter District
## 29953 1-Regular local school district that is NOT a component of a supervisory union
## 29977 1-Regular local school district that is NOT a component of a supervisory union
## 30024 1-Regular local school district that is NOT a component of a supervisory union
## 30028 1-Regular local school district that is NOT a component of a supervisory union
## 30029 1-Regular local school district that is NOT a component of a supervisory union
## 30031         5-State agency providing elementary and/or secondary level instruction
## 30058 1-Regular local school district that is NOT a component of a supervisory union
## 30153 1-Regular local school district that is NOT a component of a supervisory union
## 30256 1-Regular local school district that is NOT a component of a supervisory union
## 30260 1-Regular local school district that is NOT a component of a supervisory union
## 30325 1-Regular local school district that is NOT a component of a supervisory union
## 30333 1-Regular local school district that is NOT a component of a supervisory union
## 30347                                                 7-Independent Charter District
## 30349 1-Regular local school district that is NOT a component of a supervisory union
## 30489                                                 7-Independent Charter District
## 30490                                                 7-Independent Charter District
## 30502 1-Regular local school district that is NOT a component of a supervisory union
## 30505 1-Regular local school district that is NOT a component of a supervisory union
## 30521 1-Regular local school district that is NOT a component of a supervisory union
## 30590 1-Regular local school district that is NOT a component of a supervisory union
## 30609 1-Regular local school district that is NOT a component of a supervisory union
## 30616 1-Regular local school district that is NOT a component of a supervisory union
## 30721                                                 7-Independent Charter District
## 30723                                                 7-Independent Charter District
## 30781                                                 7-Independent Charter District
## 30783                                                 7-Independent Charter District
## 30784                                                 7-Independent Charter District
## 30787 1-Regular local school district that is NOT a component of a supervisory union
## 30788 1-Regular local school district that is NOT a component of a supervisory union
## 30849 1-Regular local school district that is NOT a component of a supervisory union
## 30870 1-Regular local school district that is NOT a component of a supervisory union
## 30872 1-Regular local school district that is NOT a component of a supervisory union
## 30875 1-Regular local school district that is NOT a component of a supervisory union
## 30876 1-Regular local school district that is NOT a component of a supervisory union
## 30886 1-Regular local school district that is NOT a component of a supervisory union
## 30900 1-Regular local school district that is NOT a component of a supervisory union
## 30920 1-Regular local school district that is NOT a component of a supervisory union
## 30928 1-Regular local school district that is NOT a component of a supervisory union
## 30929 1-Regular local school district that is NOT a component of a supervisory union
## 30933                                     4-Regional Education Service Agency (RESA)
## 30957                                                 7-Independent Charter District
## 31043 1-Regular local school district that is NOT a component of a supervisory union
## 31107 1-Regular local school district that is NOT a component of a supervisory union
## 31115                                                     8-Other education agencies
## 31168 1-Regular local school district that is NOT a component of a supervisory union
## 31197         5-State agency providing elementary and/or secondary level instruction
## 31223                                                 7-Independent Charter District
## 31250 1-Regular local school district that is NOT a component of a supervisory union
## 31252 1-Regular local school district that is NOT a component of a supervisory union
## 31298 1-Regular local school district that is NOT a component of a supervisory union
## 31299 1-Regular local school district that is NOT a component of a supervisory union
## 31314 1-Regular local school district that is NOT a component of a supervisory union
## 31327 1-Regular local school district that is NOT a component of a supervisory union
## 31328 1-Regular local school district that is NOT a component of a supervisory union
## 31357         5-State agency providing elementary and/or secondary level instruction
## 31388 1-Regular local school district that is NOT a component of a supervisory union
## 31390 1-Regular local school district that is NOT a component of a supervisory union
## 31395 1-Regular local school district that is NOT a component of a supervisory union
## 31463 1-Regular local school district that is NOT a component of a supervisory union
## 31464 1-Regular local school district that is NOT a component of a supervisory union
## 31465 1-Regular local school district that is NOT a component of a supervisory union
## 31467 1-Regular local school district that is NOT a component of a supervisory union
## 31559         5-State agency providing elementary and/or secondary level instruction
## 31645 1-Regular local school district that is NOT a component of a supervisory union
## 31699 1-Regular local school district that is NOT a component of a supervisory union
## 31709 1-Regular local school district that is NOT a component of a supervisory union
## 31733 1-Regular local school district that is NOT a component of a supervisory union
## 31740 1-Regular local school district that is NOT a component of a supervisory union
## 31751 1-Regular local school district that is NOT a component of a supervisory union
## 31829 1-Regular local school district that is NOT a component of a supervisory union
## 31831 1-Regular local school district that is NOT a component of a supervisory union
## 31845 1-Regular local school district that is NOT a component of a supervisory union
## 31850                                                 7-Independent Charter District
## 31852 1-Regular local school district that is NOT a component of a supervisory union
## 31883                                                 7-Independent Charter District
## 31888 1-Regular local school district that is NOT a component of a supervisory union
## 31910 1-Regular local school district that is NOT a component of a supervisory union
## 31941 1-Regular local school district that is NOT a component of a supervisory union
## 31942 1-Regular local school district that is NOT a component of a supervisory union
## 31957 1-Regular local school district that is NOT a component of a supervisory union
## 31968 1-Regular local school district that is NOT a component of a supervisory union
## 31973 1-Regular local school district that is NOT a component of a supervisory union
## 31989                                                 7-Independent Charter District
## 32006         5-State agency providing elementary and/or secondary level instruction
## 32010 1-Regular local school district that is NOT a component of a supervisory union
## 32014 1-Regular local school district that is NOT a component of a supervisory union
## 32036 1-Regular local school district that is NOT a component of a supervisory union
## 32054                                                 7-Independent Charter District
## 32060 1-Regular local school district that is NOT a component of a supervisory union
## 32081 1-Regular local school district that is NOT a component of a supervisory union
## 32082 1-Regular local school district that is NOT a component of a supervisory union
## 32142 1-Regular local school district that is NOT a component of a supervisory union
## 32176                                                 7-Independent Charter District
## 32179 1-Regular local school district that is NOT a component of a supervisory union
## 32273         5-State agency providing elementary and/or secondary level instruction
## 32297                                                 7-Independent Charter District
## 32298                                                 7-Independent Charter District
## 32349 1-Regular local school district that is NOT a component of a supervisory union
## 32366 1-Regular local school district that is NOT a component of a supervisory union
## 32474 1-Regular local school district that is NOT a component of a supervisory union
## 32573                                           9-Specialized public school district
## 32574                                           9-Specialized public school district
## 32576                                           9-Specialized public school district
## 32577                                           9-Specialized public school district
## 32578                                           9-Specialized public school district
## 32579                                           9-Specialized public school district
## 32580                                           9-Specialized public school district
## 32581                                           9-Specialized public school district
## 32639 1-Regular local school district that is NOT a component of a supervisory union
## 32640 1-Regular local school district that is NOT a component of a supervisory union
## 32641 1-Regular local school district that is NOT a component of a supervisory union
## 32642 1-Regular local school district that is NOT a component of a supervisory union
## 32651 1-Regular local school district that is NOT a component of a supervisory union
## 32710 1-Regular local school district that is NOT a component of a supervisory union
## 32733 1-Regular local school district that is NOT a component of a supervisory union
## 32738                                                 7-Independent Charter District
## 32753 1-Regular local school district that is NOT a component of a supervisory union
## 32768 1-Regular local school district that is NOT a component of a supervisory union
## 32779 1-Regular local school district that is NOT a component of a supervisory union
## 32784 1-Regular local school district that is NOT a component of a supervisory union
## 32785 1-Regular local school district that is NOT a component of a supervisory union
## 32786 1-Regular local school district that is NOT a component of a supervisory union
## 32787 1-Regular local school district that is NOT a component of a supervisory union
## 32805 1-Regular local school district that is NOT a component of a supervisory union
## 32822 1-Regular local school district that is NOT a component of a supervisory union
## 32879 1-Regular local school district that is NOT a component of a supervisory union
## 32984 1-Regular local school district that is NOT a component of a supervisory union
## 33021                                     4-Regional Education Service Agency (RESA)
## 33083                                                 7-Independent Charter District
## 33104 1-Regular local school district that is NOT a component of a supervisory union
## 33122 1-Regular local school district that is NOT a component of a supervisory union
## 33198 1-Regular local school district that is NOT a component of a supervisory union
## 33228 1-Regular local school district that is NOT a component of a supervisory union
## 33263 1-Regular local school district that is NOT a component of a supervisory union
## 33281 1-Regular local school district that is NOT a component of a supervisory union
## 33292 1-Regular local school district that is NOT a component of a supervisory union
## 33293 1-Regular local school district that is NOT a component of a supervisory union
## 33317 1-Regular local school district that is NOT a component of a supervisory union
## 33337 1-Regular local school district that is NOT a component of a supervisory union
## 33343 1-Regular local school district that is NOT a component of a supervisory union
## 33344 1-Regular local school district that is NOT a component of a supervisory union
## 33360 1-Regular local school district that is NOT a component of a supervisory union
## 33388 1-Regular local school district that is NOT a component of a supervisory union
## 33416                                                 7-Independent Charter District
## 33473 1-Regular local school district that is NOT a component of a supervisory union
## 33496         5-State agency providing elementary and/or secondary level instruction
## 33499 1-Regular local school district that is NOT a component of a supervisory union
## 33536 1-Regular local school district that is NOT a component of a supervisory union
## 33562 1-Regular local school district that is NOT a component of a supervisory union
## 33591                                     4-Regional Education Service Agency (RESA)
## 33592                                     4-Regional Education Service Agency (RESA)
## 33614 1-Regular local school district that is NOT a component of a supervisory union
## 33620 1-Regular local school district that is NOT a component of a supervisory union
## 33666 1-Regular local school district that is NOT a component of a supervisory union
## 33701 1-Regular local school district that is NOT a component of a supervisory union
## 33758 1-Regular local school district that is NOT a component of a supervisory union
## 33804 1-Regular local school district that is NOT a component of a supervisory union
## 33805 1-Regular local school district that is NOT a component of a supervisory union
## 33829         5-State agency providing elementary and/or secondary level instruction
## 33945 1-Regular local school district that is NOT a component of a supervisory union
## 33950 1-Regular local school district that is NOT a component of a supervisory union
## 33956 1-Regular local school district that is NOT a component of a supervisory union
## 33971 1-Regular local school district that is NOT a component of a supervisory union
## 33973 1-Regular local school district that is NOT a component of a supervisory union
## 33976 1-Regular local school district that is NOT a component of a supervisory union
## 33979 1-Regular local school district that is NOT a component of a supervisory union
## 33994 1-Regular local school district that is NOT a component of a supervisory union
## 34050 1-Regular local school district that is NOT a component of a supervisory union
## 34077 1-Regular local school district that is NOT a component of a supervisory union
## 34078 1-Regular local school district that is NOT a component of a supervisory union
## 34079 1-Regular local school district that is NOT a component of a supervisory union
## 34124 1-Regular local school district that is NOT a component of a supervisory union
## 34145 1-Regular local school district that is NOT a component of a supervisory union
## 34152 1-Regular local school district that is NOT a component of a supervisory union
## 34183 1-Regular local school district that is NOT a component of a supervisory union
## 34190 1-Regular local school district that is NOT a component of a supervisory union
## 34193 1-Regular local school district that is NOT a component of a supervisory union
## 34197 1-Regular local school district that is NOT a component of a supervisory union
## 34227                                                 7-Independent Charter District
## 34235                                                 7-Independent Charter District
## 34236                                                 7-Independent Charter District
## 34237                                                 7-Independent Charter District
## 34238                                                 7-Independent Charter District
## 34239                                                 7-Independent Charter District
## 34240                                                 7-Independent Charter District
## 34241                                                 7-Independent Charter District
## 34242                                                 7-Independent Charter District
## 34243                                                 7-Independent Charter District
## 34244                                                 7-Independent Charter District
## 34245                                                 7-Independent Charter District
## 34246                                                 7-Independent Charter District
## 34247                                                 7-Independent Charter District
## 34248                                                 7-Independent Charter District
## 34249                                                 7-Independent Charter District
## 34250                                                 7-Independent Charter District
## 34251                                                 7-Independent Charter District
## 34252                                                 7-Independent Charter District
## 34253                                                 7-Independent Charter District
## 34254                                                 7-Independent Charter District
## 34255                                                 7-Independent Charter District
## 34256                                                 7-Independent Charter District
## 34302 1-Regular local school district that is NOT a component of a supervisory union
## 34303 1-Regular local school district that is NOT a component of a supervisory union
## 34323 1-Regular local school district that is NOT a component of a supervisory union
## 34329                                     4-Regional Education Service Agency (RESA)
## 34331 1-Regular local school district that is NOT a component of a supervisory union
## 34336                                     4-Regional Education Service Agency (RESA)
## 34341 1-Regular local school district that is NOT a component of a supervisory union
## 34359 1-Regular local school district that is NOT a component of a supervisory union
## 34365 1-Regular local school district that is NOT a component of a supervisory union
## 34369 1-Regular local school district that is NOT a component of a supervisory union
## 34436 1-Regular local school district that is NOT a component of a supervisory union
## 34439         5-State agency providing elementary and/or secondary level instruction
## 34445 1-Regular local school district that is NOT a component of a supervisory union
## 34525 1-Regular local school district that is NOT a component of a supervisory union
## 34559 1-Regular local school district that is NOT a component of a supervisory union
## 34560 1-Regular local school district that is NOT a component of a supervisory union
## 34583                                     4-Regional Education Service Agency (RESA)
## 34719 1-Regular local school district that is NOT a component of a supervisory union
## 34743                                                 7-Independent Charter District
## 34752 1-Regular local school district that is NOT a component of a supervisory union
## 34754 1-Regular local school district that is NOT a component of a supervisory union
## 34797 1-Regular local school district that is NOT a component of a supervisory union
## 34855 1-Regular local school district that is NOT a component of a supervisory union
## 34870         5-State agency providing elementary and/or secondary level instruction
## 34968 1-Regular local school district that is NOT a component of a supervisory union
## 34969 1-Regular local school district that is NOT a component of a supervisory union
## 34971 1-Regular local school district that is NOT a component of a supervisory union
## 35001 1-Regular local school district that is NOT a component of a supervisory union
## 35040 1-Regular local school district that is NOT a component of a supervisory union
## 35065 1-Regular local school district that is NOT a component of a supervisory union
## 35069         5-State agency providing elementary and/or secondary level instruction
## 35075 1-Regular local school district that is NOT a component of a supervisory union
## 35076                                                 7-Independent Charter District
## 35077 1-Regular local school district that is NOT a component of a supervisory union
## 35096 1-Regular local school district that is NOT a component of a supervisory union
## 35134 1-Regular local school district that is NOT a component of a supervisory union
## 35143 1-Regular local school district that is NOT a component of a supervisory union
## 35152 1-Regular local school district that is NOT a component of a supervisory union
## 35167 1-Regular local school district that is NOT a component of a supervisory union
## 35168 1-Regular local school district that is NOT a component of a supervisory union
## 35169 1-Regular local school district that is NOT a component of a supervisory union
## 35252 1-Regular local school district that is NOT a component of a supervisory union
## 35261                                     4-Regional Education Service Agency (RESA)
## 35271 1-Regular local school district that is NOT a component of a supervisory union
## 35289 1-Regular local school district that is NOT a component of a supervisory union
## 35294 1-Regular local school district that is NOT a component of a supervisory union
## 35338 1-Regular local school district that is NOT a component of a supervisory union
## 35339                                                 7-Independent Charter District
## 35428 1-Regular local school district that is NOT a component of a supervisory union
## 35457 1-Regular local school district that is NOT a component of a supervisory union
## 35479 1-Regular local school district that is NOT a component of a supervisory union
## 35494 1-Regular local school district that is NOT a component of a supervisory union
## 35595 1-Regular local school district that is NOT a component of a supervisory union
## 35694 1-Regular local school district that is NOT a component of a supervisory union
## 35695 1-Regular local school district that is NOT a component of a supervisory union
## 35696 1-Regular local school district that is NOT a component of a supervisory union
## 35697 1-Regular local school district that is NOT a component of a supervisory union
## 35875 1-Regular local school district that is NOT a component of a supervisory union
## 35962 1-Regular local school district that is NOT a component of a supervisory union
## 35972                                                 7-Independent Charter District
## 35973                                                 7-Independent Charter District
## 36024 1-Regular local school district that is NOT a component of a supervisory union
## 36025 1-Regular local school district that is NOT a component of a supervisory union
## 36026 1-Regular local school district that is NOT a component of a supervisory union
## 36038 1-Regular local school district that is NOT a component of a supervisory union
## 36065 1-Regular local school district that is NOT a component of a supervisory union
## 36116 1-Regular local school district that is NOT a component of a supervisory union
## 36316 1-Regular local school district that is NOT a component of a supervisory union
## 36382 1-Regular local school district that is NOT a component of a supervisory union
## 36383 1-Regular local school district that is NOT a component of a supervisory union
## 36384 1-Regular local school district that is NOT a component of a supervisory union
## 36385 1-Regular local school district that is NOT a component of a supervisory union
## 36402 1-Regular local school district that is NOT a component of a supervisory union
## 36449 1-Regular local school district that is NOT a component of a supervisory union
## 36458 1-Regular local school district that is NOT a component of a supervisory union
## 36510 1-Regular local school district that is NOT a component of a supervisory union
## 36557 1-Regular local school district that is NOT a component of a supervisory union
## 36571 1-Regular local school district that is NOT a component of a supervisory union
## 36588                                     4-Regional Education Service Agency (RESA)
## 36661 1-Regular local school district that is NOT a component of a supervisory union
## 36680 1-Regular local school district that is NOT a component of a supervisory union
## 36691 1-Regular local school district that is NOT a component of a supervisory union
## 36692                                                 7-Independent Charter District
## 36693                                                 7-Independent Charter District
## 36694                                                 7-Independent Charter District
## 36696 1-Regular local school district that is NOT a component of a supervisory union
## 36699 1-Regular local school district that is NOT a component of a supervisory union
## 36752 1-Regular local school district that is NOT a component of a supervisory union
## 36807 1-Regular local school district that is NOT a component of a supervisory union
## 36808                                                 7-Independent Charter District
## 36809 1-Regular local school district that is NOT a component of a supervisory union
## 36821                                                 7-Independent Charter District
## 36893                                                 7-Independent Charter District
## 36894                                                 7-Independent Charter District
## 36966 1-Regular local school district that is NOT a component of a supervisory union
## 36988 1-Regular local school district that is NOT a component of a supervisory union
## 37076 1-Regular local school district that is NOT a component of a supervisory union
## 37138 1-Regular local school district that is NOT a component of a supervisory union
## 37158 1-Regular local school district that is NOT a component of a supervisory union
## 37197                                                 7-Independent Charter District
## 37227 1-Regular local school district that is NOT a component of a supervisory union
## 37243 1-Regular local school district that is NOT a component of a supervisory union
## 37265 1-Regular local school district that is NOT a component of a supervisory union
## 37373 1-Regular local school district that is NOT a component of a supervisory union
## 37421 1-Regular local school district that is NOT a component of a supervisory union
## 37447 1-Regular local school district that is NOT a component of a supervisory union
## 37458 1-Regular local school district that is NOT a component of a supervisory union
## 37522 1-Regular local school district that is NOT a component of a supervisory union
## 37523 1-Regular local school district that is NOT a component of a supervisory union
## 37542         5-State agency providing elementary and/or secondary level instruction
## 37575 1-Regular local school district that is NOT a component of a supervisory union
## 37581 1-Regular local school district that is NOT a component of a supervisory union
## 37638 1-Regular local school district that is NOT a component of a supervisory union
## 37668 1-Regular local school district that is NOT a component of a supervisory union
## 37731 1-Regular local school district that is NOT a component of a supervisory union
## 37751                                                 7-Independent Charter District
## 37754                                                 7-Independent Charter District
## 37759                                                 7-Independent Charter District
## 37790                                                 7-Independent Charter District
## 37795                                                 7-Independent Charter District
## 37841 1-Regular local school district that is NOT a component of a supervisory union
## 37866 1-Regular local school district that is NOT a component of a supervisory union
## 37869 1-Regular local school district that is NOT a component of a supervisory union
## 37871 1-Regular local school district that is NOT a component of a supervisory union
## 37872 1-Regular local school district that is NOT a component of a supervisory union
## 37877 1-Regular local school district that is NOT a component of a supervisory union
## 37892 1-Regular local school district that is NOT a component of a supervisory union
## 37932                                                 7-Independent Charter District
## 37933 1-Regular local school district that is NOT a component of a supervisory union
## 37934 1-Regular local school district that is NOT a component of a supervisory union
## 37940 1-Regular local school district that is NOT a component of a supervisory union
## 37941 1-Regular local school district that is NOT a component of a supervisory union
## 37947 1-Regular local school district that is NOT a component of a supervisory union
## 37950 1-Regular local school district that is NOT a component of a supervisory union
## 37951 1-Regular local school district that is NOT a component of a supervisory union
## 37952 1-Regular local school district that is NOT a component of a supervisory union
## 37981 1-Regular local school district that is NOT a component of a supervisory union
## 37982 1-Regular local school district that is NOT a component of a supervisory union
## 38055 1-Regular local school district that is NOT a component of a supervisory union
## 38057 1-Regular local school district that is NOT a component of a supervisory union
## 38127 1-Regular local school district that is NOT a component of a supervisory union
## 38149 1-Regular local school district that is NOT a component of a supervisory union
## 38151 1-Regular local school district that is NOT a component of a supervisory union
## 38153 1-Regular local school district that is NOT a component of a supervisory union
## 38154 1-Regular local school district that is NOT a component of a supervisory union
## 38160 1-Regular local school district that is NOT a component of a supervisory union
## 38169 1-Regular local school district that is NOT a component of a supervisory union
## 38212 1-Regular local school district that is NOT a component of a supervisory union
## 38214 1-Regular local school district that is NOT a component of a supervisory union
## 38238 1-Regular local school district that is NOT a component of a supervisory union
## 38251 1-Regular local school district that is NOT a component of a supervisory union
## 38340                                                 7-Independent Charter District
## 38349 1-Regular local school district that is NOT a component of a supervisory union
## 38427                                                 7-Independent Charter District
## 38433 1-Regular local school district that is NOT a component of a supervisory union
## 38453 1-Regular local school district that is NOT a component of a supervisory union
## 38522 1-Regular local school district that is NOT a component of a supervisory union
## 38526                                                 7-Independent Charter District
## 38541 1-Regular local school district that is NOT a component of a supervisory union
## 38560 1-Regular local school district that is NOT a component of a supervisory union
## 38561 1-Regular local school district that is NOT a component of a supervisory union
## 38562 1-Regular local school district that is NOT a component of a supervisory union
## 38596         5-State agency providing elementary and/or secondary level instruction
## 38607 1-Regular local school district that is NOT a component of a supervisory union
## 38608 1-Regular local school district that is NOT a component of a supervisory union
## 38609 1-Regular local school district that is NOT a component of a supervisory union
## 38622                                                 7-Independent Charter District
## 38626 1-Regular local school district that is NOT a component of a supervisory union
## 38627 1-Regular local school district that is NOT a component of a supervisory union
## 38628 1-Regular local school district that is NOT a component of a supervisory union
## 38629 1-Regular local school district that is NOT a component of a supervisory union
## 38631 1-Regular local school district that is NOT a component of a supervisory union
## 38632 1-Regular local school district that is NOT a component of a supervisory union
## 38688 1-Regular local school district that is NOT a component of a supervisory union
## 38690 1-Regular local school district that is NOT a component of a supervisory union
## 38711 1-Regular local school district that is NOT a component of a supervisory union
## 38736 1-Regular local school district that is NOT a component of a supervisory union
## 38787 1-Regular local school district that is NOT a component of a supervisory union
## 38799 1-Regular local school district that is NOT a component of a supervisory union
## 38809 1-Regular local school district that is NOT a component of a supervisory union
## 38810 1-Regular local school district that is NOT a component of a supervisory union
## 38815 1-Regular local school district that is NOT a component of a supervisory union
## 38895 1-Regular local school district that is NOT a component of a supervisory union
## 38916 1-Regular local school district that is NOT a component of a supervisory union
## 38933 1-Regular local school district that is NOT a component of a supervisory union
## 38962 1-Regular local school district that is NOT a component of a supervisory union
## 38970 1-Regular local school district that is NOT a component of a supervisory union
## 39085                                                 7-Independent Charter District
## 39089 1-Regular local school district that is NOT a component of a supervisory union
## 39124 1-Regular local school district that is NOT a component of a supervisory union
## 39138                                                 7-Independent Charter District
## 39173 1-Regular local school district that is NOT a component of a supervisory union
## 39213 1-Regular local school district that is NOT a component of a supervisory union
## 39289 1-Regular local school district that is NOT a component of a supervisory union
## 39457 1-Regular local school district that is NOT a component of a supervisory union
## 39458 1-Regular local school district that is NOT a component of a supervisory union
## 39459 1-Regular local school district that is NOT a component of a supervisory union
## 39466                                                 7-Independent Charter District
## 39480 1-Regular local school district that is NOT a component of a supervisory union
## 39511 1-Regular local school district that is NOT a component of a supervisory union
## 39525 1-Regular local school district that is NOT a component of a supervisory union
## 39526 1-Regular local school district that is NOT a component of a supervisory union
## 39534 1-Regular local school district that is NOT a component of a supervisory union
## 39535 1-Regular local school district that is NOT a component of a supervisory union
## 39536 1-Regular local school district that is NOT a component of a supervisory union
## 39585 1-Regular local school district that is NOT a component of a supervisory union
## 39592 1-Regular local school district that is NOT a component of a supervisory union
## 39600 1-Regular local school district that is NOT a component of a supervisory union
## 39636 1-Regular local school district that is NOT a component of a supervisory union
## 39638 1-Regular local school district that is NOT a component of a supervisory union
## 39672 1-Regular local school district that is NOT a component of a supervisory union
## 39677 1-Regular local school district that is NOT a component of a supervisory union
## 39739 1-Regular local school district that is NOT a component of a supervisory union
## 39743 1-Regular local school district that is NOT a component of a supervisory union
## 39772 1-Regular local school district that is NOT a component of a supervisory union
## 39775                                                 7-Independent Charter District
## 39777                                                 7-Independent Charter District
## 39778 1-Regular local school district that is NOT a component of a supervisory union
## 39780 1-Regular local school district that is NOT a component of a supervisory union
## 39781 1-Regular local school district that is NOT a component of a supervisory union
## 39795                                                     8-Other education agencies
## 39874 1-Regular local school district that is NOT a component of a supervisory union
## 39915 1-Regular local school district that is NOT a component of a supervisory union
## 39933 1-Regular local school district that is NOT a component of a supervisory union
## 39959 1-Regular local school district that is NOT a component of a supervisory union
## 39961                                                 7-Independent Charter District
## 39962                                                 7-Independent Charter District
## 39976 1-Regular local school district that is NOT a component of a supervisory union
## 39978 1-Regular local school district that is NOT a component of a supervisory union
## 39979 1-Regular local school district that is NOT a component of a supervisory union
## 39980 1-Regular local school district that is NOT a component of a supervisory union
## 40009 1-Regular local school district that is NOT a component of a supervisory union
## 40025 1-Regular local school district that is NOT a component of a supervisory union
## 40044 1-Regular local school district that is NOT a component of a supervisory union
## 40065 1-Regular local school district that is NOT a component of a supervisory union
## 40068 1-Regular local school district that is NOT a component of a supervisory union
## 40070 1-Regular local school district that is NOT a component of a supervisory union
## 40071 1-Regular local school district that is NOT a component of a supervisory union
## 40073 1-Regular local school district that is NOT a component of a supervisory union
## 40074 1-Regular local school district that is NOT a component of a supervisory union
## 40075 1-Regular local school district that is NOT a component of a supervisory union
## 40077 1-Regular local school district that is NOT a component of a supervisory union
## 40078 1-Regular local school district that is NOT a component of a supervisory union
## 40079 1-Regular local school district that is NOT a component of a supervisory union
## 40081 1-Regular local school district that is NOT a component of a supervisory union
## 40138 1-Regular local school district that is NOT a component of a supervisory union
## 40145 1-Regular local school district that is NOT a component of a supervisory union
## 40146 1-Regular local school district that is NOT a component of a supervisory union
## 40243 1-Regular local school district that is NOT a component of a supervisory union
## 40253 1-Regular local school district that is NOT a component of a supervisory union
## 40255                                                     8-Other education agencies
## 40354 1-Regular local school district that is NOT a component of a supervisory union
## 40383         5-State agency providing elementary and/or secondary level instruction
## 40402 1-Regular local school district that is NOT a component of a supervisory union
## 40421         5-State agency providing elementary and/or secondary level instruction
## 40449 1-Regular local school district that is NOT a component of a supervisory union
## 40520                                                 7-Independent Charter District
## 40521                                                 7-Independent Charter District
## 40522                                                 7-Independent Charter District
## 40534 1-Regular local school district that is NOT a component of a supervisory union
## 40537                                     4-Regional Education Service Agency (RESA)
## 40561 1-Regular local school district that is NOT a component of a supervisory union
## 40592 1-Regular local school district that is NOT a component of a supervisory union
## 40595 1-Regular local school district that is NOT a component of a supervisory union
## 40598 1-Regular local school district that is NOT a component of a supervisory union
## 40657 1-Regular local school district that is NOT a component of a supervisory union
## 40730 1-Regular local school district that is NOT a component of a supervisory union
## 40732 1-Regular local school district that is NOT a component of a supervisory union
## 40733 1-Regular local school district that is NOT a component of a supervisory union
## 40735 1-Regular local school district that is NOT a component of a supervisory union
## 40762 1-Regular local school district that is NOT a component of a supervisory union
## 40763 1-Regular local school district that is NOT a component of a supervisory union
## 40789 1-Regular local school district that is NOT a component of a supervisory union
## 40808 1-Regular local school district that is NOT a component of a supervisory union
## 40832 1-Regular local school district that is NOT a component of a supervisory union
## 40851 1-Regular local school district that is NOT a component of a supervisory union
## 40918 1-Regular local school district that is NOT a component of a supervisory union
## 41002 1-Regular local school district that is NOT a component of a supervisory union
## 41005 1-Regular local school district that is NOT a component of a supervisory union
## 41020 1-Regular local school district that is NOT a component of a supervisory union
## 41021 1-Regular local school district that is NOT a component of a supervisory union
## 41034 1-Regular local school district that is NOT a component of a supervisory union
## 41035 1-Regular local school district that is NOT a component of a supervisory union
## 41036 1-Regular local school district that is NOT a component of a supervisory union
## 41038 1-Regular local school district that is NOT a component of a supervisory union
## 41053         5-State agency providing elementary and/or secondary level instruction
## 41054 1-Regular local school district that is NOT a component of a supervisory union
## 41097                                                 7-Independent Charter District
## 41098                                                 7-Independent Charter District
## 41099                                                 7-Independent Charter District
## 41100                                                 7-Independent Charter District
## 41101                                                 7-Independent Charter District
## 41109                                                 7-Independent Charter District
## 41110                                                 7-Independent Charter District
## 41111                                                 7-Independent Charter District
## 41112                                                 7-Independent Charter District
## 41113                                                 7-Independent Charter District
## 41114                                                 7-Independent Charter District
## 41115                                                 7-Independent Charter District
## 41123                                                 7-Independent Charter District
## 41124                                                 7-Independent Charter District
## 41125                                                 7-Independent Charter District
## 41126                                                 7-Independent Charter District
## 41139                                                 7-Independent Charter District
## 41140                                                 7-Independent Charter District
## 41141                                                 7-Independent Charter District
## 41142                                                 7-Independent Charter District
## 41143                                                 7-Independent Charter District
## 41146 1-Regular local school district that is NOT a component of a supervisory union
## 41186                                     4-Regional Education Service Agency (RESA)
## 41198                                                 7-Independent Charter District
## 41241 1-Regular local school district that is NOT a component of a supervisory union
## 41257                                                     8-Other education agencies
## 41277 1-Regular local school district that is NOT a component of a supervisory union
## 41301 1-Regular local school district that is NOT a component of a supervisory union
## 41307 1-Regular local school district that is NOT a component of a supervisory union
## 41310 1-Regular local school district that is NOT a component of a supervisory union
## 41316 1-Regular local school district that is NOT a component of a supervisory union
## 41331 1-Regular local school district that is NOT a component of a supervisory union
## 41342 1-Regular local school district that is NOT a component of a supervisory union
## 41344 1-Regular local school district that is NOT a component of a supervisory union
## 41395 1-Regular local school district that is NOT a component of a supervisory union
## 41402 1-Regular local school district that is NOT a component of a supervisory union
## 41486 1-Regular local school district that is NOT a component of a supervisory union
## 41488 1-Regular local school district that is NOT a component of a supervisory union
## 41542 1-Regular local school district that is NOT a component of a supervisory union
## 41545 1-Regular local school district that is NOT a component of a supervisory union
## 41574 1-Regular local school district that is NOT a component of a supervisory union
## 41577 1-Regular local school district that is NOT a component of a supervisory union
## 41599                                                 7-Independent Charter District
## 41600                                                 7-Independent Charter District
## 41607 1-Regular local school district that is NOT a component of a supervisory union
## 41608 1-Regular local school district that is NOT a component of a supervisory union
## 41609 1-Regular local school district that is NOT a component of a supervisory union
## 41611 1-Regular local school district that is NOT a component of a supervisory union
## 41612 1-Regular local school district that is NOT a component of a supervisory union
## 41616 1-Regular local school district that is NOT a component of a supervisory union
## 41626 1-Regular local school district that is NOT a component of a supervisory union
## 41629                                                 7-Independent Charter District
## 41633                                                 7-Independent Charter District
## 41637                                                 7-Independent Charter District
## 41640                                                 7-Independent Charter District
## 41641                                                 7-Independent Charter District
## 41642                                                 7-Independent Charter District
## 41643                                                 7-Independent Charter District
## 41644                                     4-Regional Education Service Agency (RESA)
## 41652 1-Regular local school district that is NOT a component of a supervisory union
## 41685                                                 7-Independent Charter District
## 41686                                                 7-Independent Charter District
## 41704 1-Regular local school district that is NOT a component of a supervisory union
## 41716 1-Regular local school district that is NOT a component of a supervisory union
## 41719 1-Regular local school district that is NOT a component of a supervisory union
## 41720 1-Regular local school district that is NOT a component of a supervisory union
## 41725 1-Regular local school district that is NOT a component of a supervisory union
## 41735 1-Regular local school district that is NOT a component of a supervisory union
## 41753 1-Regular local school district that is NOT a component of a supervisory union
## 41792 1-Regular local school district that is NOT a component of a supervisory union
## 41847 1-Regular local school district that is NOT a component of a supervisory union
## 41854 1-Regular local school district that is NOT a component of a supervisory union
## 41907 1-Regular local school district that is NOT a component of a supervisory union
## 42016 1-Regular local school district that is NOT a component of a supervisory union
## 42029 1-Regular local school district that is NOT a component of a supervisory union
## 42040 1-Regular local school district that is NOT a component of a supervisory union
## 42054                                                 7-Independent Charter District
## 42062 1-Regular local school district that is NOT a component of a supervisory union
## 42121 1-Regular local school district that is NOT a component of a supervisory union
## 42142                                                 7-Independent Charter District
## 42154 1-Regular local school district that is NOT a component of a supervisory union
## 42157 1-Regular local school district that is NOT a component of a supervisory union
## 42173 1-Regular local school district that is NOT a component of a supervisory union
## 42180 1-Regular local school district that is NOT a component of a supervisory union
## 42183         5-State agency providing elementary and/or secondary level instruction
## 42252 1-Regular local school district that is NOT a component of a supervisory union
## 42338 1-Regular local school district that is NOT a component of a supervisory union
## 42388 1-Regular local school district that is NOT a component of a supervisory union
## 42409 1-Regular local school district that is NOT a component of a supervisory union
## 42424         5-State agency providing elementary and/or secondary level instruction
## 42429 1-Regular local school district that is NOT a component of a supervisory union
## 42448 1-Regular local school district that is NOT a component of a supervisory union
## 42485                                                 7-Independent Charter District
## 42490 1-Regular local school district that is NOT a component of a supervisory union
## 42495 1-Regular local school district that is NOT a component of a supervisory union
## 42523 1-Regular local school district that is NOT a component of a supervisory union
## 42525         5-State agency providing elementary and/or secondary level instruction
## 42526 1-Regular local school district that is NOT a component of a supervisory union
## 42636                                     4-Regional Education Service Agency (RESA)
## 42637                                     4-Regional Education Service Agency (RESA)
## 42644 1-Regular local school district that is NOT a component of a supervisory union
## 42652 1-Regular local school district that is NOT a component of a supervisory union
## 42653 1-Regular local school district that is NOT a component of a supervisory union
## 42654 1-Regular local school district that is NOT a component of a supervisory union
## 42661                                     4-Regional Education Service Agency (RESA)
## 42704                                                     8-Other education agencies
## 42705                                                     8-Other education agencies
## 42706                                                     8-Other education agencies
## 42707                                                     8-Other education agencies
## 42708                                                     8-Other education agencies
## 42803 1-Regular local school district that is NOT a component of a supervisory union
## 42845         5-State agency providing elementary and/or secondary level instruction
## 42911                                                 7-Independent Charter District
## 42913 1-Regular local school district that is NOT a component of a supervisory union
## 42961 1-Regular local school district that is NOT a component of a supervisory union
## 42992 1-Regular local school district that is NOT a component of a supervisory union
## 43046 1-Regular local school district that is NOT a component of a supervisory union
## 43053 1-Regular local school district that is NOT a component of a supervisory union
## 43163         5-State agency providing elementary and/or secondary level instruction
## 43164         5-State agency providing elementary and/or secondary level instruction
## 43165         5-State agency providing elementary and/or secondary level instruction
## 43181         5-State agency providing elementary and/or secondary level instruction
## 43220                                                 7-Independent Charter District
## 43239 1-Regular local school district that is NOT a component of a supervisory union
## 43244 1-Regular local school district that is NOT a component of a supervisory union
## 43245 1-Regular local school district that is NOT a component of a supervisory union
## 43248 1-Regular local school district that is NOT a component of a supervisory union
## 43249 1-Regular local school district that is NOT a component of a supervisory union
## 43250 1-Regular local school district that is NOT a component of a supervisory union
## 43251 1-Regular local school district that is NOT a component of a supervisory union
## 43253 1-Regular local school district that is NOT a component of a supervisory union
## 43302 1-Regular local school district that is NOT a component of a supervisory union
## 43366 1-Regular local school district that is NOT a component of a supervisory union
## 43500 1-Regular local school district that is NOT a component of a supervisory union
## 43509                                                 7-Independent Charter District
## 43531 1-Regular local school district that is NOT a component of a supervisory union
## 43532 1-Regular local school district that is NOT a component of a supervisory union
## 43533 1-Regular local school district that is NOT a component of a supervisory union
## 43564 1-Regular local school district that is NOT a component of a supervisory union
## 43637 1-Regular local school district that is NOT a component of a supervisory union
## 43638 1-Regular local school district that is NOT a component of a supervisory union
## 43667 1-Regular local school district that is NOT a component of a supervisory union
## 43668 1-Regular local school district that is NOT a component of a supervisory union
## 43673 1-Regular local school district that is NOT a component of a supervisory union
## 43674 1-Regular local school district that is NOT a component of a supervisory union
## 43786                                                 7-Independent Charter District
## 43794 1-Regular local school district that is NOT a component of a supervisory union
## 43800 1-Regular local school district that is NOT a component of a supervisory union
## 43833 1-Regular local school district that is NOT a component of a supervisory union
## 43839 1-Regular local school district that is NOT a component of a supervisory union
## 43840 1-Regular local school district that is NOT a component of a supervisory union
## 43841 1-Regular local school district that is NOT a component of a supervisory union
## 43843 1-Regular local school district that is NOT a component of a supervisory union
## 43858 1-Regular local school district that is NOT a component of a supervisory union
## 43909 1-Regular local school district that is NOT a component of a supervisory union
## 43914         5-State agency providing elementary and/or secondary level instruction
## 43941 1-Regular local school district that is NOT a component of a supervisory union
## 43942 1-Regular local school district that is NOT a component of a supervisory union
## 43943 1-Regular local school district that is NOT a component of a supervisory union
## 43945 1-Regular local school district that is NOT a component of a supervisory union
## 44002         5-State agency providing elementary and/or secondary level instruction
## 44016 1-Regular local school district that is NOT a component of a supervisory union
## 44041 1-Regular local school district that is NOT a component of a supervisory union
## 44043 1-Regular local school district that is NOT a component of a supervisory union
## 44151 1-Regular local school district that is NOT a component of a supervisory union
## 44166 1-Regular local school district that is NOT a component of a supervisory union
## 44189 1-Regular local school district that is NOT a component of a supervisory union
## 44227                                                 7-Independent Charter District
## 44236 1-Regular local school district that is NOT a component of a supervisory union
## 44246 1-Regular local school district that is NOT a component of a supervisory union
## 44271 1-Regular local school district that is NOT a component of a supervisory union
## 44319 1-Regular local school district that is NOT a component of a supervisory union
## 44347 1-Regular local school district that is NOT a component of a supervisory union
## 44393 1-Regular local school district that is NOT a component of a supervisory union
## 44425 1-Regular local school district that is NOT a component of a supervisory union
## 44435 1-Regular local school district that is NOT a component of a supervisory union
## 44557 1-Regular local school district that is NOT a component of a supervisory union
## 44649 1-Regular local school district that is NOT a component of a supervisory union
## 44763 1-Regular local school district that is NOT a component of a supervisory union
## 44764 1-Regular local school district that is NOT a component of a supervisory union
## 44766 1-Regular local school district that is NOT a component of a supervisory union
## 44768 1-Regular local school district that is NOT a component of a supervisory union
## 44778 1-Regular local school district that is NOT a component of a supervisory union
## 44781 1-Regular local school district that is NOT a component of a supervisory union
## 44786 1-Regular local school district that is NOT a component of a supervisory union
## 44791 1-Regular local school district that is NOT a component of a supervisory union
## 44829 1-Regular local school district that is NOT a component of a supervisory union
## 44955 1-Regular local school district that is NOT a component of a supervisory union
## 44961 1-Regular local school district that is NOT a component of a supervisory union
## 44993 1-Regular local school district that is NOT a component of a supervisory union
## 44994 1-Regular local school district that is NOT a component of a supervisory union
## 44995 1-Regular local school district that is NOT a component of a supervisory union
## 45101 1-Regular local school district that is NOT a component of a supervisory union
## 45145 1-Regular local school district that is NOT a component of a supervisory union
## 45174 1-Regular local school district that is NOT a component of a supervisory union
## 45183 1-Regular local school district that is NOT a component of a supervisory union
## 45188 1-Regular local school district that is NOT a component of a supervisory union
## 45207 1-Regular local school district that is NOT a component of a supervisory union
## 45226                                     4-Regional Education Service Agency (RESA)
## 45241         5-State agency providing elementary and/or secondary level instruction
## 45243 1-Regular local school district that is NOT a component of a supervisory union
## 45244 1-Regular local school district that is NOT a component of a supervisory union
## 45245 1-Regular local school district that is NOT a component of a supervisory union
## 45247 1-Regular local school district that is NOT a component of a supervisory union
## 45249 1-Regular local school district that is NOT a component of a supervisory union
## 45252 1-Regular local school district that is NOT a component of a supervisory union
## 45255         5-State agency providing elementary and/or secondary level instruction
## 45256         5-State agency providing elementary and/or secondary level instruction
## 45259 1-Regular local school district that is NOT a component of a supervisory union
## 45260 1-Regular local school district that is NOT a component of a supervisory union
## 45266 1-Regular local school district that is NOT a component of a supervisory union
## 45314                                                 7-Independent Charter District
## 45316 1-Regular local school district that is NOT a component of a supervisory union
## 45322                                                 7-Independent Charter District
## 45323                                                 7-Independent Charter District
## 45324                                                 7-Independent Charter District
## 45325                                                 7-Independent Charter District
## 45326                                                 7-Independent Charter District
## 45327                                                 7-Independent Charter District
## 45328                                                 7-Independent Charter District
## 45351                                                 7-Independent Charter District
## 45383 1-Regular local school district that is NOT a component of a supervisory union
## 45384 1-Regular local school district that is NOT a component of a supervisory union
## 45385 1-Regular local school district that is NOT a component of a supervisory union
## 45389 1-Regular local school district that is NOT a component of a supervisory union
## 45393 1-Regular local school district that is NOT a component of a supervisory union
## 45401 1-Regular local school district that is NOT a component of a supervisory union
## 45449                                                 7-Independent Charter District
## 45467 1-Regular local school district that is NOT a component of a supervisory union
## 45549 1-Regular local school district that is NOT a component of a supervisory union
## 45550 1-Regular local school district that is NOT a component of a supervisory union
## 45558 1-Regular local school district that is NOT a component of a supervisory union
## 45562 1-Regular local school district that is NOT a component of a supervisory union
## 45563 1-Regular local school district that is NOT a component of a supervisory union
## 45566 1-Regular local school district that is NOT a component of a supervisory union
## 45568 1-Regular local school district that is NOT a component of a supervisory union
## 45591 1-Regular local school district that is NOT a component of a supervisory union
## 45592 1-Regular local school district that is NOT a component of a supervisory union
## 45646 1-Regular local school district that is NOT a component of a supervisory union
## 45706                                                 7-Independent Charter District
## 45803 1-Regular local school district that is NOT a component of a supervisory union
## 45907         5-State agency providing elementary and/or secondary level instruction
## 45918         5-State agency providing elementary and/or secondary level instruction
## 45946 1-Regular local school district that is NOT a component of a supervisory union
## 46044 1-Regular local school district that is NOT a component of a supervisory union
## 46105                                     4-Regional Education Service Agency (RESA)
## 46107                                     4-Regional Education Service Agency (RESA)
## 46166 1-Regular local school district that is NOT a component of a supervisory union
## 46187 1-Regular local school district that is NOT a component of a supervisory union
## 46203 1-Regular local school district that is NOT a component of a supervisory union
## 46226                                                 7-Independent Charter District
## 46233                                                 7-Independent Charter District
## 46234                                                 7-Independent Charter District
## 46289 1-Regular local school district that is NOT a component of a supervisory union
## 46375 1-Regular local school district that is NOT a component of a supervisory union
## 46430 1-Regular local school district that is NOT a component of a supervisory union
## 46455                                                 7-Independent Charter District
## 46456                                                 7-Independent Charter District
## 46457                                                 7-Independent Charter District
## 46458                                                 7-Independent Charter District
## 46468 1-Regular local school district that is NOT a component of a supervisory union
## 46471                                     4-Regional Education Service Agency (RESA)
## 46472 1-Regular local school district that is NOT a component of a supervisory union
## 46473 1-Regular local school district that is NOT a component of a supervisory union
## 46475         5-State agency providing elementary and/or secondary level instruction
## 46476 1-Regular local school district that is NOT a component of a supervisory union
## 46492 1-Regular local school district that is NOT a component of a supervisory union
## 46500 1-Regular local school district that is NOT a component of a supervisory union
## 46501 1-Regular local school district that is NOT a component of a supervisory union
## 46641 1-Regular local school district that is NOT a component of a supervisory union
## 46672 1-Regular local school district that is NOT a component of a supervisory union
## 46673 1-Regular local school district that is NOT a component of a supervisory union
## 46752 1-Regular local school district that is NOT a component of a supervisory union
## 46925 1-Regular local school district that is NOT a component of a supervisory union
## 46926 1-Regular local school district that is NOT a component of a supervisory union
## 46956 1-Regular local school district that is NOT a component of a supervisory union
## 46970 1-Regular local school district that is NOT a component of a supervisory union
## 46978 1-Regular local school district that is NOT a component of a supervisory union
## 47007 1-Regular local school district that is NOT a component of a supervisory union
## 47096 1-Regular local school district that is NOT a component of a supervisory union
## 47101 1-Regular local school district that is NOT a component of a supervisory union
## 47254 1-Regular local school district that is NOT a component of a supervisory union
## 47256 1-Regular local school district that is NOT a component of a supervisory union
## 47270 1-Regular local school district that is NOT a component of a supervisory union
## 47303 1-Regular local school district that is NOT a component of a supervisory union
## 47324 1-Regular local school district that is NOT a component of a supervisory union
## 47326 1-Regular local school district that is NOT a component of a supervisory union
## 47344 1-Regular local school district that is NOT a component of a supervisory union
## 47427 1-Regular local school district that is NOT a component of a supervisory union
## 47433                                                 7-Independent Charter District
## 47434                                                 7-Independent Charter District
## 47435                                                 7-Independent Charter District
## 47459                                     4-Regional Education Service Agency (RESA)
## 47466 1-Regular local school district that is NOT a component of a supervisory union
## 47477                                                 7-Independent Charter District
## 47478 1-Regular local school district that is NOT a component of a supervisory union
## 47498 1-Regular local school district that is NOT a component of a supervisory union
## 47515 1-Regular local school district that is NOT a component of a supervisory union
## 47568 1-Regular local school district that is NOT a component of a supervisory union
## 47580 1-Regular local school district that is NOT a component of a supervisory union
## 47581                                     4-Regional Education Service Agency (RESA)
## 47583 1-Regular local school district that is NOT a component of a supervisory union
## 47603 1-Regular local school district that is NOT a component of a supervisory union
## 47659 1-Regular local school district that is NOT a component of a supervisory union
## 47660 1-Regular local school district that is NOT a component of a supervisory union
## 47661 1-Regular local school district that is NOT a component of a supervisory union
## 47662 1-Regular local school district that is NOT a component of a supervisory union
## 47682 1-Regular local school district that is NOT a component of a supervisory union
## 47693 1-Regular local school district that is NOT a component of a supervisory union
## 47730 1-Regular local school district that is NOT a component of a supervisory union
## 47732 1-Regular local school district that is NOT a component of a supervisory union
## 47761                                     4-Regional Education Service Agency (RESA)
## 47770 1-Regular local school district that is NOT a component of a supervisory union
## 47775                                     4-Regional Education Service Agency (RESA)
## 47820 1-Regular local school district that is NOT a component of a supervisory union
## 47924 1-Regular local school district that is NOT a component of a supervisory union
## 47937 1-Regular local school district that is NOT a component of a supervisory union
## 47938 1-Regular local school district that is NOT a component of a supervisory union
## 47959 1-Regular local school district that is NOT a component of a supervisory union
## 48017 1-Regular local school district that is NOT a component of a supervisory union
## 48020 1-Regular local school district that is NOT a component of a supervisory union
## 48021 1-Regular local school district that is NOT a component of a supervisory union
## 48022 1-Regular local school district that is NOT a component of a supervisory union
## 48034 1-Regular local school district that is NOT a component of a supervisory union
## 48096 1-Regular local school district that is NOT a component of a supervisory union
## 48136 1-Regular local school district that is NOT a component of a supervisory union
## 48187 1-Regular local school district that is NOT a component of a supervisory union
## 48189         5-State agency providing elementary and/or secondary level instruction
## 48192 1-Regular local school district that is NOT a component of a supervisory union
## 48195                                                 7-Independent Charter District
## 48200 1-Regular local school district that is NOT a component of a supervisory union
## 48275 1-Regular local school district that is NOT a component of a supervisory union
## 48277 1-Regular local school district that is NOT a component of a supervisory union
## 48279 1-Regular local school district that is NOT a component of a supervisory union
## 48315 1-Regular local school district that is NOT a component of a supervisory union
## 48389 1-Regular local school district that is NOT a component of a supervisory union
## 48400 1-Regular local school district that is NOT a component of a supervisory union
## 48509 1-Regular local school district that is NOT a component of a supervisory union
## 48515 1-Regular local school district that is NOT a component of a supervisory union
## 48534 1-Regular local school district that is NOT a component of a supervisory union
## 48594 1-Regular local school district that is NOT a component of a supervisory union
## 48634 1-Regular local school district that is NOT a component of a supervisory union
## 48661 1-Regular local school district that is NOT a component of a supervisory union
## 48677 1-Regular local school district that is NOT a component of a supervisory union
## 48737 1-Regular local school district that is NOT a component of a supervisory union
## 48748 1-Regular local school district that is NOT a component of a supervisory union
## 48779                                                 7-Independent Charter District
## 48786                                     4-Regional Education Service Agency (RESA)
## 48802 1-Regular local school district that is NOT a component of a supervisory union
## 48813                                     4-Regional Education Service Agency (RESA)
## 48835 1-Regular local school district that is NOT a component of a supervisory union
## 48863 1-Regular local school district that is NOT a component of a supervisory union
## 48945 1-Regular local school district that is NOT a component of a supervisory union
## 48956 1-Regular local school district that is NOT a component of a supervisory union
## 48987 1-Regular local school district that is NOT a component of a supervisory union
## 49000 1-Regular local school district that is NOT a component of a supervisory union
## 49040 1-Regular local school district that is NOT a component of a supervisory union
## 49052 1-Regular local school district that is NOT a component of a supervisory union
## 49123 1-Regular local school district that is NOT a component of a supervisory union
## 49124 1-Regular local school district that is NOT a component of a supervisory union
## 49126 1-Regular local school district that is NOT a component of a supervisory union
## 49177                                                 7-Independent Charter District
## 49179                                                 7-Independent Charter District
## 49180                                                 7-Independent Charter District
## 49192                                                 7-Independent Charter District
## 49193                                                 7-Independent Charter District
## 49194                                                 7-Independent Charter District
## 49195                                                 7-Independent Charter District
## 49196                                                 7-Independent Charter District
## 49197                                                 7-Independent Charter District
## 49232 1-Regular local school district that is NOT a component of a supervisory union
## 49240 1-Regular local school district that is NOT a component of a supervisory union
## 49247                                                 7-Independent Charter District
## 49255 1-Regular local school district that is NOT a component of a supervisory union
## 49256                                                 7-Independent Charter District
## 49257                                                 7-Independent Charter District
## 49258                                                 7-Independent Charter District
## 49259                                                 7-Independent Charter District
## 49262                                                 7-Independent Charter District
## 49263 1-Regular local school district that is NOT a component of a supervisory union
## 49269 1-Regular local school district that is NOT a component of a supervisory union
## 49353 1-Regular local school district that is NOT a component of a supervisory union
## 49355         5-State agency providing elementary and/or secondary level instruction
## 49429 1-Regular local school district that is NOT a component of a supervisory union
## 49430 1-Regular local school district that is NOT a component of a supervisory union
## 49480 1-Regular local school district that is NOT a component of a supervisory union
## 49511 1-Regular local school district that is NOT a component of a supervisory union
## 49519                                                 7-Independent Charter District
## 49523 1-Regular local school district that is NOT a component of a supervisory union
## 49524 1-Regular local school district that is NOT a component of a supervisory union
## 49526                                                 7-Independent Charter District
## 49527                                                 7-Independent Charter District
## 49529                                                 7-Independent Charter District
## 49530                                                 7-Independent Charter District
## 49531                                                 7-Independent Charter District
## 49533                                                 7-Independent Charter District
## 49534                                                 7-Independent Charter District
## 49535                                                 7-Independent Charter District
## 49536                                                 7-Independent Charter District
## 49537                                                 7-Independent Charter District
## 49538                                                 7-Independent Charter District
## 49539                                                 7-Independent Charter District
## 49540 1-Regular local school district that is NOT a component of a supervisory union
## 49557 1-Regular local school district that is NOT a component of a supervisory union
## 49558 1-Regular local school district that is NOT a component of a supervisory union
## 49559 1-Regular local school district that is NOT a component of a supervisory union
## 49591 1-Regular local school district that is NOT a component of a supervisory union
## 49618                                                 7-Independent Charter District
## 49620                                                 7-Independent Charter District
## 49621                                                 7-Independent Charter District
## 49623                                                 7-Independent Charter District
## 49645 1-Regular local school district that is NOT a component of a supervisory union
## 49646 1-Regular local school district that is NOT a component of a supervisory union
## 49682 1-Regular local school district that is NOT a component of a supervisory union
## 49726 1-Regular local school district that is NOT a component of a supervisory union
## 49742 1-Regular local school district that is NOT a component of a supervisory union
## 49743 1-Regular local school district that is NOT a component of a supervisory union
## 49890 1-Regular local school district that is NOT a component of a supervisory union
## 49892 1-Regular local school district that is NOT a component of a supervisory union
## 49893 1-Regular local school district that is NOT a component of a supervisory union
## 49894 1-Regular local school district that is NOT a component of a supervisory union
## 49895 1-Regular local school district that is NOT a component of a supervisory union
## 49982             2-Local school district that is a component of a supervisory union
## 50014 1-Regular local school district that is NOT a component of a supervisory union
## 50039 1-Regular local school district that is NOT a component of a supervisory union
## 50092                                                 7-Independent Charter District
## 50097 1-Regular local school district that is NOT a component of a supervisory union
## 50099                                                 7-Independent Charter District
## 50223                                                 7-Independent Charter District
## 50289 1-Regular local school district that is NOT a component of a supervisory union
## 50290 1-Regular local school district that is NOT a component of a supervisory union
## 50295                                                 7-Independent Charter District
## 50296                                                 7-Independent Charter District
## 50303 1-Regular local school district that is NOT a component of a supervisory union
## 50304 1-Regular local school district that is NOT a component of a supervisory union
## 50305 1-Regular local school district that is NOT a component of a supervisory union
## 50315 1-Regular local school district that is NOT a component of a supervisory union
## 50355                                                 7-Independent Charter District
## 50366 1-Regular local school district that is NOT a component of a supervisory union
## 50368                                                 7-Independent Charter District
## 50370                                                 7-Independent Charter District
## 50400 1-Regular local school district that is NOT a component of a supervisory union
## 50403 1-Regular local school district that is NOT a component of a supervisory union
## 50465 1-Regular local school district that is NOT a component of a supervisory union
## 50478             2-Local school district that is a component of a supervisory union
## 50479             2-Local school district that is a component of a supervisory union
## 50493                                                 7-Independent Charter District
## 50495 1-Regular local school district that is NOT a component of a supervisory union
## 50522 1-Regular local school district that is NOT a component of a supervisory union
## 50561 1-Regular local school district that is NOT a component of a supervisory union
## 50830 1-Regular local school district that is NOT a component of a supervisory union
## 50899 1-Regular local school district that is NOT a component of a supervisory union
## 50901 1-Regular local school district that is NOT a component of a supervisory union
## 50911 1-Regular local school district that is NOT a component of a supervisory union
## 50916 1-Regular local school district that is NOT a component of a supervisory union
## 50951 1-Regular local school district that is NOT a component of a supervisory union
## 50952 1-Regular local school district that is NOT a component of a supervisory union
## 50965 1-Regular local school district that is NOT a component of a supervisory union
## 50966 1-Regular local school district that is NOT a component of a supervisory union
## 51003 1-Regular local school district that is NOT a component of a supervisory union
## 51022 1-Regular local school district that is NOT a component of a supervisory union
## 51083 1-Regular local school district that is NOT a component of a supervisory union
## 51093 1-Regular local school district that is NOT a component of a supervisory union
## 51196                                     4-Regional Education Service Agency (RESA)
## 51203 1-Regular local school district that is NOT a component of a supervisory union
## 51222 1-Regular local school district that is NOT a component of a supervisory union
## 51237 1-Regular local school district that is NOT a component of a supervisory union
## 51243 1-Regular local school district that is NOT a component of a supervisory union
## 51284 1-Regular local school district that is NOT a component of a supervisory union
## 51321 1-Regular local school district that is NOT a component of a supervisory union
## 51326 1-Regular local school district that is NOT a component of a supervisory union
## 51358             2-Local school district that is a component of a supervisory union
## 51374 1-Regular local school district that is NOT a component of a supervisory union
## 51419 1-Regular local school district that is NOT a component of a supervisory union
## 51459                                     4-Regional Education Service Agency (RESA)
## 51461 1-Regular local school district that is NOT a component of a supervisory union
## 51476 1-Regular local school district that is NOT a component of a supervisory union
## 51502 1-Regular local school district that is NOT a component of a supervisory union
## 51573 1-Regular local school district that is NOT a component of a supervisory union
## 51590 1-Regular local school district that is NOT a component of a supervisory union
## 51594 1-Regular local school district that is NOT a component of a supervisory union
## 51613 1-Regular local school district that is NOT a component of a supervisory union
## 51637 1-Regular local school district that is NOT a component of a supervisory union
## 51686 1-Regular local school district that is NOT a component of a supervisory union
## 51712 1-Regular local school district that is NOT a component of a supervisory union
## 51720 1-Regular local school district that is NOT a component of a supervisory union
## 51722 1-Regular local school district that is NOT a component of a supervisory union
## 51728 1-Regular local school district that is NOT a component of a supervisory union
## 51735         5-State agency providing elementary and/or secondary level instruction
## 51736         5-State agency providing elementary and/or secondary level instruction
## 51737         5-State agency providing elementary and/or secondary level instruction
## 51738         5-State agency providing elementary and/or secondary level instruction
## 51739         5-State agency providing elementary and/or secondary level instruction
## 51740         5-State agency providing elementary and/or secondary level instruction
## 51741 1-Regular local school district that is NOT a component of a supervisory union
## 51765                                     4-Regional Education Service Agency (RESA)
## 51809 1-Regular local school district that is NOT a component of a supervisory union
## 51811 1-Regular local school district that is NOT a component of a supervisory union
## 51910 1-Regular local school district that is NOT a component of a supervisory union
## 51936         5-State agency providing elementary and/or secondary level instruction
## 51963 1-Regular local school district that is NOT a component of a supervisory union
## 52033         5-State agency providing elementary and/or secondary level instruction
## 52055                                     4-Regional Education Service Agency (RESA)
## 52063                                     4-Regional Education Service Agency (RESA)
## 52069 1-Regular local school district that is NOT a component of a supervisory union
## 52092 1-Regular local school district that is NOT a component of a supervisory union
## 52129                                     4-Regional Education Service Agency (RESA)
## 52139 1-Regular local school district that is NOT a component of a supervisory union
## 52154 1-Regular local school district that is NOT a component of a supervisory union
## 52155         5-State agency providing elementary and/or secondary level instruction
## 52204 1-Regular local school district that is NOT a component of a supervisory union
## 52210 1-Regular local school district that is NOT a component of a supervisory union
## 52219         5-State agency providing elementary and/or secondary level instruction
## 52222         5-State agency providing elementary and/or secondary level instruction
## 52285                                                 7-Independent Charter District
## 52375 1-Regular local school district that is NOT a component of a supervisory union
## 52420                                                     8-Other education agencies
## 52433 1-Regular local school district that is NOT a component of a supervisory union
## 52434 1-Regular local school district that is NOT a component of a supervisory union
## 52462 1-Regular local school district that is NOT a component of a supervisory union
## 52512 1-Regular local school district that is NOT a component of a supervisory union
## 52544 1-Regular local school district that is NOT a component of a supervisory union
## 52568                                                 7-Independent Charter District
## 52677 1-Regular local school district that is NOT a component of a supervisory union
## 52705 1-Regular local school district that is NOT a component of a supervisory union
## 52711                                     4-Regional Education Service Agency (RESA)
## 52713         5-State agency providing elementary and/or secondary level instruction
## 52714 1-Regular local school district that is NOT a component of a supervisory union
## 52752 1-Regular local school district that is NOT a component of a supervisory union
## 52763 1-Regular local school district that is NOT a component of a supervisory union
## 52785 1-Regular local school district that is NOT a component of a supervisory union
## 52794 1-Regular local school district that is NOT a component of a supervisory union
## 52828 1-Regular local school district that is NOT a component of a supervisory union
## 52837         5-State agency providing elementary and/or secondary level instruction
## 52847 1-Regular local school district that is NOT a component of a supervisory union
## 52875 1-Regular local school district that is NOT a component of a supervisory union
## 52988 1-Regular local school district that is NOT a component of a supervisory union
## 52998         5-State agency providing elementary and/or secondary level instruction
## 53039                                     4-Regional Education Service Agency (RESA)
## 53054 1-Regular local school district that is NOT a component of a supervisory union
## 53072 1-Regular local school district that is NOT a component of a supervisory union
## 53073 1-Regular local school district that is NOT a component of a supervisory union
## 53075 1-Regular local school district that is NOT a component of a supervisory union
## 53176                                                 7-Independent Charter District
## 53239 1-Regular local school district that is NOT a component of a supervisory union
## 53242 1-Regular local school district that is NOT a component of a supervisory union
## 53243 1-Regular local school district that is NOT a component of a supervisory union
## 53244 1-Regular local school district that is NOT a component of a supervisory union
## 53297 1-Regular local school district that is NOT a component of a supervisory union
## 53314                                     4-Regional Education Service Agency (RESA)
## 53319 1-Regular local school district that is NOT a component of a supervisory union
## 53341 1-Regular local school district that is NOT a component of a supervisory union
## 53392 1-Regular local school district that is NOT a component of a supervisory union
## 53407 1-Regular local school district that is NOT a component of a supervisory union
## 53461 1-Regular local school district that is NOT a component of a supervisory union
## 53472 1-Regular local school district that is NOT a component of a supervisory union
## 53473 1-Regular local school district that is NOT a component of a supervisory union
## 53474 1-Regular local school district that is NOT a component of a supervisory union
## 53589                                                 7-Independent Charter District
## 53620 1-Regular local school district that is NOT a component of a supervisory union
## 53705 1-Regular local school district that is NOT a component of a supervisory union
## 53730 1-Regular local school district that is NOT a component of a supervisory union
## 53733 1-Regular local school district that is NOT a component of a supervisory union
## 53734 1-Regular local school district that is NOT a component of a supervisory union
## 53846 1-Regular local school district that is NOT a component of a supervisory union
## 53862 1-Regular local school district that is NOT a component of a supervisory union
## 53863 1-Regular local school district that is NOT a component of a supervisory union
## 53922 1-Regular local school district that is NOT a component of a supervisory union
## 53978 1-Regular local school district that is NOT a component of a supervisory union
## 53985 1-Regular local school district that is NOT a component of a supervisory union
## 54026 1-Regular local school district that is NOT a component of a supervisory union
## 54028 1-Regular local school district that is NOT a component of a supervisory union
## 54138 1-Regular local school district that is NOT a component of a supervisory union
## 54154 1-Regular local school district that is NOT a component of a supervisory union
## 54186 1-Regular local school district that is NOT a component of a supervisory union
## 54231                                                 7-Independent Charter District
## 54252                                                 7-Independent Charter District
## 54264         5-State agency providing elementary and/or secondary level instruction
## 54265         5-State agency providing elementary and/or secondary level instruction
## 54288         5-State agency providing elementary and/or secondary level instruction
## 54296                                     4-Regional Education Service Agency (RESA)
## 54301 1-Regular local school district that is NOT a component of a supervisory union
## 54336 1-Regular local school district that is NOT a component of a supervisory union
## 54347 1-Regular local school district that is NOT a component of a supervisory union
## 54357 1-Regular local school district that is NOT a component of a supervisory union
## 54405 1-Regular local school district that is NOT a component of a supervisory union
## 54414 1-Regular local school district that is NOT a component of a supervisory union
## 54416 1-Regular local school district that is NOT a component of a supervisory union
## 54426 1-Regular local school district that is NOT a component of a supervisory union
## 54637 1-Regular local school district that is NOT a component of a supervisory union
## 54646 1-Regular local school district that is NOT a component of a supervisory union
## 54683 1-Regular local school district that is NOT a component of a supervisory union
## 54691 1-Regular local school district that is NOT a component of a supervisory union
## 54721 1-Regular local school district that is NOT a component of a supervisory union
## 54743 1-Regular local school district that is NOT a component of a supervisory union
## 54765         5-State agency providing elementary and/or secondary level instruction
## 54791 1-Regular local school district that is NOT a component of a supervisory union
## 54907 1-Regular local school district that is NOT a component of a supervisory union
## 54946 1-Regular local school district that is NOT a component of a supervisory union
## 54972         5-State agency providing elementary and/or secondary level instruction
## 54976 1-Regular local school district that is NOT a component of a supervisory union
## 55018 1-Regular local school district that is NOT a component of a supervisory union
## 55110 1-Regular local school district that is NOT a component of a supervisory union
## 55121 1-Regular local school district that is NOT a component of a supervisory union
## 55164         5-State agency providing elementary and/or secondary level instruction
## 55166                                                 7-Independent Charter District
## 55187 1-Regular local school district that is NOT a component of a supervisory union
## 55203 1-Regular local school district that is NOT a component of a supervisory union
## 55238                                     4-Regional Education Service Agency (RESA)
## 55239                                     4-Regional Education Service Agency (RESA)
## 55291 1-Regular local school district that is NOT a component of a supervisory union
## 55298 1-Regular local school district that is NOT a component of a supervisory union
## 55299 1-Regular local school district that is NOT a component of a supervisory union
## 55300 1-Regular local school district that is NOT a component of a supervisory union
## 55306 1-Regular local school district that is NOT a component of a supervisory union
## 55307 1-Regular local school district that is NOT a component of a supervisory union
## 55309 1-Regular local school district that is NOT a component of a supervisory union
## 55312 1-Regular local school district that is NOT a component of a supervisory union
## 55314 1-Regular local school district that is NOT a component of a supervisory union
## 55317 1-Regular local school district that is NOT a component of a supervisory union
## 55323                                                 7-Independent Charter District
## 55331 1-Regular local school district that is NOT a component of a supervisory union
## 55369 1-Regular local school district that is NOT a component of a supervisory union
## 55412 1-Regular local school district that is NOT a component of a supervisory union
## 55413 1-Regular local school district that is NOT a component of a supervisory union
## 55414 1-Regular local school district that is NOT a component of a supervisory union
## 55530 1-Regular local school district that is NOT a component of a supervisory union
## 55677 1-Regular local school district that is NOT a component of a supervisory union
## 55748 1-Regular local school district that is NOT a component of a supervisory union
## 55754 1-Regular local school district that is NOT a component of a supervisory union
## 55901         5-State agency providing elementary and/or secondary level instruction
## 55902         5-State agency providing elementary and/or secondary level instruction
## 55903         5-State agency providing elementary and/or secondary level instruction
## 56099 1-Regular local school district that is NOT a component of a supervisory union
## 56102 1-Regular local school district that is NOT a component of a supervisory union
## 56123 1-Regular local school district that is NOT a component of a supervisory union
## 56133 1-Regular local school district that is NOT a component of a supervisory union
## 56183 1-Regular local school district that is NOT a component of a supervisory union
## 56184 1-Regular local school district that is NOT a component of a supervisory union
## 56213         5-State agency providing elementary and/or secondary level instruction
## 56232 1-Regular local school district that is NOT a component of a supervisory union
## 56233 1-Regular local school district that is NOT a component of a supervisory union
## 56243 1-Regular local school district that is NOT a component of a supervisory union
## 56295 1-Regular local school district that is NOT a component of a supervisory union
## 56337 1-Regular local school district that is NOT a component of a supervisory union
## 56358 1-Regular local school district that is NOT a component of a supervisory union
## 56361 1-Regular local school district that is NOT a component of a supervisory union
## 56384 1-Regular local school district that is NOT a component of a supervisory union
## 56419 1-Regular local school district that is NOT a component of a supervisory union
## 56428 1-Regular local school district that is NOT a component of a supervisory union
## 56619 1-Regular local school district that is NOT a component of a supervisory union
## 56678 1-Regular local school district that is NOT a component of a supervisory union
## 56739 1-Regular local school district that is NOT a component of a supervisory union
## 56817                                     4-Regional Education Service Agency (RESA)
## 56838 1-Regular local school district that is NOT a component of a supervisory union
## 56863 1-Regular local school district that is NOT a component of a supervisory union
## 56873 1-Regular local school district that is NOT a component of a supervisory union
## 56880                                     4-Regional Education Service Agency (RESA)
## 56904 1-Regular local school district that is NOT a component of a supervisory union
## 56918         5-State agency providing elementary and/or secondary level instruction
## 56931 1-Regular local school district that is NOT a component of a supervisory union
## 56932 1-Regular local school district that is NOT a component of a supervisory union
## 56933 1-Regular local school district that is NOT a component of a supervisory union
## 56982                                                 7-Independent Charter District
## 57060                                                 7-Independent Charter District
## 57140 1-Regular local school district that is NOT a component of a supervisory union
## 57141 1-Regular local school district that is NOT a component of a supervisory union
## 57144 1-Regular local school district that is NOT a component of a supervisory union
## 57152                                                 7-Independent Charter District
## 57160         5-State agency providing elementary and/or secondary level instruction
## 57161                                     4-Regional Education Service Agency (RESA)
## 57167 1-Regular local school district that is NOT a component of a supervisory union
## 57171                                                 7-Independent Charter District
## 57198                                                 7-Independent Charter District
## 57199                                                 7-Independent Charter District
## 57226 1-Regular local school district that is NOT a component of a supervisory union
## 57228 1-Regular local school district that is NOT a component of a supervisory union
## 57230 1-Regular local school district that is NOT a component of a supervisory union
## 57231 1-Regular local school district that is NOT a component of a supervisory union
## 57234 1-Regular local school district that is NOT a component of a supervisory union
## 57238 1-Regular local school district that is NOT a component of a supervisory union
## 57252 1-Regular local school district that is NOT a component of a supervisory union
## 57264 1-Regular local school district that is NOT a component of a supervisory union
## 57270 1-Regular local school district that is NOT a component of a supervisory union
## 57276 1-Regular local school district that is NOT a component of a supervisory union
## 57278 1-Regular local school district that is NOT a component of a supervisory union
## 57287 1-Regular local school district that is NOT a component of a supervisory union
## 57288 1-Regular local school district that is NOT a component of a supervisory union
## 57289 1-Regular local school district that is NOT a component of a supervisory union
## 57297 1-Regular local school district that is NOT a component of a supervisory union
## 57298 1-Regular local school district that is NOT a component of a supervisory union
## 57354 1-Regular local school district that is NOT a component of a supervisory union
## 57379 1-Regular local school district that is NOT a component of a supervisory union
## 57385 1-Regular local school district that is NOT a component of a supervisory union
## 57420         5-State agency providing elementary and/or secondary level instruction
## 57472                                     4-Regional Education Service Agency (RESA)
## 57478         5-State agency providing elementary and/or secondary level instruction
## 57533 1-Regular local school district that is NOT a component of a supervisory union
## 57571 1-Regular local school district that is NOT a component of a supervisory union
## 57595                                                 7-Independent Charter District
## 57596                                                 7-Independent Charter District
## 57603 1-Regular local school district that is NOT a component of a supervisory union
## 57604 1-Regular local school district that is NOT a component of a supervisory union
## 57609 1-Regular local school district that is NOT a component of a supervisory union
## 57656 1-Regular local school district that is NOT a component of a supervisory union
## 57665                                     4-Regional Education Service Agency (RESA)
## 57685 1-Regular local school district that is NOT a component of a supervisory union
## 57688                                           9-Specialized public school district
## 57689                                           9-Specialized public school district
## 57690                                           9-Specialized public school district
## 57691                                           9-Specialized public school district
## 57692                                           9-Specialized public school district
## 57694                                           9-Specialized public school district
## 57695                                           9-Specialized public school district
## 57696 1-Regular local school district that is NOT a component of a supervisory union
## 57778                                                 7-Independent Charter District
## 57780 1-Regular local school district that is NOT a component of a supervisory union
## 57788 1-Regular local school district that is NOT a component of a supervisory union
## 57791 1-Regular local school district that is NOT a component of a supervisory union
## 57800 1-Regular local school district that is NOT a component of a supervisory union
## 57848 1-Regular local school district that is NOT a component of a supervisory union
## 57882 1-Regular local school district that is NOT a component of a supervisory union
## 57904 1-Regular local school district that is NOT a component of a supervisory union
## 57907 1-Regular local school district that is NOT a component of a supervisory union
## 57912 1-Regular local school district that is NOT a component of a supervisory union
## 57913 1-Regular local school district that is NOT a component of a supervisory union
## 57925 1-Regular local school district that is NOT a component of a supervisory union
## 57927 1-Regular local school district that is NOT a component of a supervisory union
## 57966 1-Regular local school district that is NOT a component of a supervisory union
## 57984 1-Regular local school district that is NOT a component of a supervisory union
## 57993 1-Regular local school district that is NOT a component of a supervisory union
## 58065 1-Regular local school district that is NOT a component of a supervisory union
## 58141         5-State agency providing elementary and/or secondary level instruction
## 58185 1-Regular local school district that is NOT a component of a supervisory union
## 58204 1-Regular local school district that is NOT a component of a supervisory union
## 58205 1-Regular local school district that is NOT a component of a supervisory union
## 58219 1-Regular local school district that is NOT a component of a supervisory union
## 58222                                                 7-Independent Charter District
## 58355 1-Regular local school district that is NOT a component of a supervisory union
## 58359 1-Regular local school district that is NOT a component of a supervisory union
## 58363 1-Regular local school district that is NOT a component of a supervisory union
## 58371                                                 7-Independent Charter District
## 58373 1-Regular local school district that is NOT a component of a supervisory union
## 58383                                                 7-Independent Charter District
## 58393                                     4-Regional Education Service Agency (RESA)
## 58400                                     4-Regional Education Service Agency (RESA)
## 58405 1-Regular local school district that is NOT a component of a supervisory union
## 58420         5-State agency providing elementary and/or secondary level instruction
## 58432 1-Regular local school district that is NOT a component of a supervisory union
## 58489 1-Regular local school district that is NOT a component of a supervisory union
## 58492                                     4-Regional Education Service Agency (RESA)
## 58502         5-State agency providing elementary and/or secondary level instruction
## 58505         5-State agency providing elementary and/or secondary level instruction
## 58506         5-State agency providing elementary and/or secondary level instruction
## 58520                                                 7-Independent Charter District
## 58530 1-Regular local school district that is NOT a component of a supervisory union
## 58536         5-State agency providing elementary and/or secondary level instruction
## 58537         5-State agency providing elementary and/or secondary level instruction
## 58554 1-Regular local school district that is NOT a component of a supervisory union
## 58555                                     4-Regional Education Service Agency (RESA)
## 58571                                                 7-Independent Charter District
## 58572                                                 7-Independent Charter District
## 58573                                                 7-Independent Charter District
## 58600 1-Regular local school district that is NOT a component of a supervisory union
## 58635 1-Regular local school district that is NOT a component of a supervisory union
## 58658 1-Regular local school district that is NOT a component of a supervisory union
## 58701         5-State agency providing elementary and/or secondary level instruction
## 58702         5-State agency providing elementary and/or secondary level instruction
## 58707                                     4-Regional Education Service Agency (RESA)
## 58741 1-Regular local school district that is NOT a component of a supervisory union
## 58747 1-Regular local school district that is NOT a component of a supervisory union
## 58800 1-Regular local school district that is NOT a component of a supervisory union
## 58813 1-Regular local school district that is NOT a component of a supervisory union
## 58814 1-Regular local school district that is NOT a component of a supervisory union
## 58817 1-Regular local school district that is NOT a component of a supervisory union
## 58821 1-Regular local school district that is NOT a component of a supervisory union
## 58822 1-Regular local school district that is NOT a component of a supervisory union
## 58823 1-Regular local school district that is NOT a component of a supervisory union
## 58824 1-Regular local school district that is NOT a component of a supervisory union
## 58843 1-Regular local school district that is NOT a component of a supervisory union
## 58848 1-Regular local school district that is NOT a component of a supervisory union
## 58930 1-Regular local school district that is NOT a component of a supervisory union
## 58953 1-Regular local school district that is NOT a component of a supervisory union
## 58954 1-Regular local school district that is NOT a component of a supervisory union
## 58981                                                 7-Independent Charter District
## 58985                                                 7-Independent Charter District
## 58987                                                 7-Independent Charter District
## 58988                                                 7-Independent Charter District
## 58989                                                 7-Independent Charter District
## 58991                                                 7-Independent Charter District
## 58992                                                 7-Independent Charter District
## 58995                                                 7-Independent Charter District
## 59000 1-Regular local school district that is NOT a component of a supervisory union
## 59006                                                 7-Independent Charter District
## 59007                                                 7-Independent Charter District
## 59016 1-Regular local school district that is NOT a component of a supervisory union
## 59031 1-Regular local school district that is NOT a component of a supervisory union
## 59035         5-State agency providing elementary and/or secondary level instruction
## 59038 1-Regular local school district that is NOT a component of a supervisory union
## 59076 1-Regular local school district that is NOT a component of a supervisory union
## 59081                                                 7-Independent Charter District
## 59091 1-Regular local school district that is NOT a component of a supervisory union
## 59108 1-Regular local school district that is NOT a component of a supervisory union
## 59129 1-Regular local school district that is NOT a component of a supervisory union
## 59158 1-Regular local school district that is NOT a component of a supervisory union
## 59205 1-Regular local school district that is NOT a component of a supervisory union
## 59331 1-Regular local school district that is NOT a component of a supervisory union
## 59335 1-Regular local school district that is NOT a component of a supervisory union
## 59346 1-Regular local school district that is NOT a component of a supervisory union
## 59351 1-Regular local school district that is NOT a component of a supervisory union
## 59355 1-Regular local school district that is NOT a component of a supervisory union
## 59359 1-Regular local school district that is NOT a component of a supervisory union
## 59360 1-Regular local school district that is NOT a component of a supervisory union
## 59416 1-Regular local school district that is NOT a component of a supervisory union
## 59421 1-Regular local school district that is NOT a component of a supervisory union
## 59447         5-State agency providing elementary and/or secondary level instruction
## 59472         5-State agency providing elementary and/or secondary level instruction
## 59477 1-Regular local school district that is NOT a component of a supervisory union
## 59478         5-State agency providing elementary and/or secondary level instruction
## 59482                                     4-Regional Education Service Agency (RESA)
## 59489 1-Regular local school district that is NOT a component of a supervisory union
## 59491 1-Regular local school district that is NOT a component of a supervisory union
## 59534                                     4-Regional Education Service Agency (RESA)
## 59564 1-Regular local school district that is NOT a component of a supervisory union
## 59677 1-Regular local school district that is NOT a component of a supervisory union
## 59716 1-Regular local school district that is NOT a component of a supervisory union
## 59758 1-Regular local school district that is NOT a component of a supervisory union
## 59759 1-Regular local school district that is NOT a component of a supervisory union
## 59770 1-Regular local school district that is NOT a component of a supervisory union
## 59848         5-State agency providing elementary and/or secondary level instruction
## 59861 1-Regular local school district that is NOT a component of a supervisory union
## 59864 1-Regular local school district that is NOT a component of a supervisory union
## 59865 1-Regular local school district that is NOT a component of a supervisory union
## 59868 1-Regular local school district that is NOT a component of a supervisory union
## 59870 1-Regular local school district that is NOT a component of a supervisory union
## 59875                                                 7-Independent Charter District
## 59877 1-Regular local school district that is NOT a component of a supervisory union
## 59881 1-Regular local school district that is NOT a component of a supervisory union
## 59886 1-Regular local school district that is NOT a component of a supervisory union
## 59901                                                 7-Independent Charter District
## 59917 1-Regular local school district that is NOT a component of a supervisory union
## 59922                                                 7-Independent Charter District
## 59924                                                 7-Independent Charter District
## 59928 1-Regular local school district that is NOT a component of a supervisory union
## 59933 1-Regular local school district that is NOT a component of a supervisory union
## 59967 1-Regular local school district that is NOT a component of a supervisory union
## 60008 1-Regular local school district that is NOT a component of a supervisory union
## 60040 1-Regular local school district that is NOT a component of a supervisory union
## 60041 1-Regular local school district that is NOT a component of a supervisory union
## 60043 1-Regular local school district that is NOT a component of a supervisory union
## 60058 1-Regular local school district that is NOT a component of a supervisory union
## 60068                                                 7-Independent Charter District
## 60081 1-Regular local school district that is NOT a component of a supervisory union
## 60084         5-State agency providing elementary and/or secondary level instruction
## 60089                                                 7-Independent Charter District
## 60098 1-Regular local school district that is NOT a component of a supervisory union
## 60099 1-Regular local school district that is NOT a component of a supervisory union
## 60113 1-Regular local school district that is NOT a component of a supervisory union
## 60118 1-Regular local school district that is NOT a component of a supervisory union
## 60162                                     4-Regional Education Service Agency (RESA)
## 60254 1-Regular local school district that is NOT a component of a supervisory union
## 60255 1-Regular local school district that is NOT a component of a supervisory union
## 60276 1-Regular local school district that is NOT a component of a supervisory union
## 60285 1-Regular local school district that is NOT a component of a supervisory union
## 60289 1-Regular local school district that is NOT a component of a supervisory union
## 60300 1-Regular local school district that is NOT a component of a supervisory union
## 60329                                     4-Regional Education Service Agency (RESA)
## 60346 1-Regular local school district that is NOT a component of a supervisory union
## 60368 1-Regular local school district that is NOT a component of a supervisory union
## 60375 1-Regular local school district that is NOT a component of a supervisory union
## 60464 1-Regular local school district that is NOT a component of a supervisory union
## 60517 1-Regular local school district that is NOT a component of a supervisory union
## 60528 1-Regular local school district that is NOT a component of a supervisory union
## 60558 1-Regular local school district that is NOT a component of a supervisory union
## 60606 1-Regular local school district that is NOT a component of a supervisory union
## 60658 1-Regular local school district that is NOT a component of a supervisory union
## 60662 1-Regular local school district that is NOT a component of a supervisory union
## 60679         5-State agency providing elementary and/or secondary level instruction
## 60682         5-State agency providing elementary and/or secondary level instruction
## 60683 1-Regular local school district that is NOT a component of a supervisory union
## 60689         5-State agency providing elementary and/or secondary level instruction
## 60721 1-Regular local school district that is NOT a component of a supervisory union
## 60755 1-Regular local school district that is NOT a component of a supervisory union
## 60764 1-Regular local school district that is NOT a component of a supervisory union
## 60765                                     4-Regional Education Service Agency (RESA)
## 60768 1-Regular local school district that is NOT a component of a supervisory union
## 60787 1-Regular local school district that is NOT a component of a supervisory union
## 60859 1-Regular local school district that is NOT a component of a supervisory union
## 60860 1-Regular local school district that is NOT a component of a supervisory union
## 60862 1-Regular local school district that is NOT a component of a supervisory union
## 60863 1-Regular local school district that is NOT a component of a supervisory union
## 60864 1-Regular local school district that is NOT a component of a supervisory union
## 60865 1-Regular local school district that is NOT a component of a supervisory union
## 60932 1-Regular local school district that is NOT a component of a supervisory union
## 60938 1-Regular local school district that is NOT a component of a supervisory union
## 60940                                           9-Specialized public school district
## 60941                                           9-Specialized public school district
## 60942                                           9-Specialized public school district
## 60943                                           9-Specialized public school district
## 60944                                           9-Specialized public school district
## 60945                                           9-Specialized public school district
## 60946                                           9-Specialized public school district
## 60947                                           9-Specialized public school district
## 60948                                           9-Specialized public school district
## 60956 1-Regular local school district that is NOT a component of a supervisory union
## 60994 1-Regular local school district that is NOT a component of a supervisory union
## 61018                                                 7-Independent Charter District
## 61021                                           9-Specialized public school district
## 61022                                           9-Specialized public school district
## 61023                                           9-Specialized public school district
## 61024                                           9-Specialized public school district
## 61025                                           9-Specialized public school district
## 61027                                           9-Specialized public school district
## 61028                                           9-Specialized public school district
## 61029                                           9-Specialized public school district
## 61030                                           9-Specialized public school district
## 61031                                           9-Specialized public school district
## 61032                                           9-Specialized public school district
## 61051                                                     8-Other education agencies
## 61054                                     4-Regional Education Service Agency (RESA)
## 61055                                     4-Regional Education Service Agency (RESA)
## 61065 1-Regular local school district that is NOT a component of a supervisory union
## 61070 1-Regular local school district that is NOT a component of a supervisory union
## 61073 1-Regular local school district that is NOT a component of a supervisory union
## 61077 1-Regular local school district that is NOT a component of a supervisory union
## 61140 1-Regular local school district that is NOT a component of a supervisory union
## 61161 1-Regular local school district that is NOT a component of a supervisory union
## 61222 1-Regular local school district that is NOT a component of a supervisory union
## 61225 1-Regular local school district that is NOT a component of a supervisory union
## 61229 1-Regular local school district that is NOT a component of a supervisory union
## 61270 1-Regular local school district that is NOT a component of a supervisory union
## 61284 1-Regular local school district that is NOT a component of a supervisory union
## 61296                                                 7-Independent Charter District
## 61298                                                 7-Independent Charter District
## 61356                                     4-Regional Education Service Agency (RESA)
## 61357 1-Regular local school district that is NOT a component of a supervisory union
## 61359 1-Regular local school district that is NOT a component of a supervisory union
## 61360 1-Regular local school district that is NOT a component of a supervisory union
## 61369 1-Regular local school district that is NOT a component of a supervisory union
## 61376 1-Regular local school district that is NOT a component of a supervisory union
## 61378 1-Regular local school district that is NOT a component of a supervisory union
## 61379 1-Regular local school district that is NOT a component of a supervisory union
## 61380 1-Regular local school district that is NOT a component of a supervisory union
## 61384 1-Regular local school district that is NOT a component of a supervisory union
## 61386 1-Regular local school district that is NOT a component of a supervisory union
## 61438 1-Regular local school district that is NOT a component of a supervisory union
## 61450 1-Regular local school district that is NOT a component of a supervisory union
## 61453                                     4-Regional Education Service Agency (RESA)
## 61455 1-Regular local school district that is NOT a component of a supervisory union
## 61456 1-Regular local school district that is NOT a component of a supervisory union
## 61457 1-Regular local school district that is NOT a component of a supervisory union
## 61459                                     4-Regional Education Service Agency (RESA)
## 61463 1-Regular local school district that is NOT a component of a supervisory union
## 61464                                     4-Regional Education Service Agency (RESA)
## 61563 1-Regular local school district that is NOT a component of a supervisory union
## 61586 1-Regular local school district that is NOT a component of a supervisory union
## 61588 1-Regular local school district that is NOT a component of a supervisory union
## 61591                                                 7-Independent Charter District
## 61600                                     4-Regional Education Service Agency (RESA)
## 61611         5-State agency providing elementary and/or secondary level instruction
## 61612 1-Regular local school district that is NOT a component of a supervisory union
## 61637         5-State agency providing elementary and/or secondary level instruction
## 61697 1-Regular local school district that is NOT a component of a supervisory union
## 61699         5-State agency providing elementary and/or secondary level instruction
## 61754         5-State agency providing elementary and/or secondary level instruction
## 61766                                                 7-Independent Charter District
## 61767                                                 7-Independent Charter District
## 61781 1-Regular local school district that is NOT a component of a supervisory union
## 61802 1-Regular local school district that is NOT a component of a supervisory union
## 61803 1-Regular local school district that is NOT a component of a supervisory union
## 61843                                                 7-Independent Charter District
## 61845                                                 7-Independent Charter District
## 61866                                     4-Regional Education Service Agency (RESA)
## 61868                                     4-Regional Education Service Agency (RESA)
## 61876 1-Regular local school district that is NOT a component of a supervisory union
## 62013 1-Regular local school district that is NOT a component of a supervisory union
## 62051         5-State agency providing elementary and/or secondary level instruction
## 62125                                                 7-Independent Charter District
## 62139 1-Regular local school district that is NOT a component of a supervisory union
## 62140 1-Regular local school district that is NOT a component of a supervisory union
## 62141 1-Regular local school district that is NOT a component of a supervisory union
## 62144 1-Regular local school district that is NOT a component of a supervisory union
## 62147 1-Regular local school district that is NOT a component of a supervisory union
## 62185 1-Regular local school district that is NOT a component of a supervisory union
## 62192 1-Regular local school district that is NOT a component of a supervisory union
## 62266 1-Regular local school district that is NOT a component of a supervisory union
## 62267 1-Regular local school district that is NOT a component of a supervisory union
## 62269 1-Regular local school district that is NOT a component of a supervisory union
## 62305 1-Regular local school district that is NOT a component of a supervisory union
## 62309         5-State agency providing elementary and/or secondary level instruction
## 62310         5-State agency providing elementary and/or secondary level instruction
## 62312                                                 7-Independent Charter District
## 62315                                                 7-Independent Charter District
## 62316                                                 7-Independent Charter District
## 62317                                                 7-Independent Charter District
## 62339 1-Regular local school district that is NOT a component of a supervisory union
## 62340 1-Regular local school district that is NOT a component of a supervisory union
## 62341 1-Regular local school district that is NOT a component of a supervisory union
## 62342 1-Regular local school district that is NOT a component of a supervisory union
## 62343 1-Regular local school district that is NOT a component of a supervisory union
## 62344 1-Regular local school district that is NOT a component of a supervisory union
## 62345 1-Regular local school district that is NOT a component of a supervisory union
## 62346 1-Regular local school district that is NOT a component of a supervisory union
## 62347 1-Regular local school district that is NOT a component of a supervisory union
## 62348 1-Regular local school district that is NOT a component of a supervisory union
## 62349 1-Regular local school district that is NOT a component of a supervisory union
## 62350 1-Regular local school district that is NOT a component of a supervisory union
## 62351 1-Regular local school district that is NOT a component of a supervisory union
## 62352 1-Regular local school district that is NOT a component of a supervisory union
## 62353 1-Regular local school district that is NOT a component of a supervisory union
## 62354 1-Regular local school district that is NOT a component of a supervisory union
## 62355 1-Regular local school district that is NOT a component of a supervisory union
## 62373 1-Regular local school district that is NOT a component of a supervisory union
## 62408 1-Regular local school district that is NOT a component of a supervisory union
## 62409 1-Regular local school district that is NOT a component of a supervisory union
## 62410 1-Regular local school district that is NOT a component of a supervisory union
## 62414 1-Regular local school district that is NOT a component of a supervisory union
## 62415 1-Regular local school district that is NOT a component of a supervisory union
## 62445 1-Regular local school district that is NOT a component of a supervisory union
## 62446 1-Regular local school district that is NOT a component of a supervisory union
## 62450         5-State agency providing elementary and/or secondary level instruction
## 62453 1-Regular local school district that is NOT a component of a supervisory union
## 62456 1-Regular local school district that is NOT a component of a supervisory union
## 62523 1-Regular local school district that is NOT a component of a supervisory union
## 62531 1-Regular local school district that is NOT a component of a supervisory union
## 62557 1-Regular local school district that is NOT a component of a supervisory union
## 62574 1-Regular local school district that is NOT a component of a supervisory union
## 62644 1-Regular local school district that is NOT a component of a supervisory union
## 62678         5-State agency providing elementary and/or secondary level instruction
## 62679 1-Regular local school district that is NOT a component of a supervisory union
## 62687 1-Regular local school district that is NOT a component of a supervisory union
## 62693 1-Regular local school district that is NOT a component of a supervisory union
## 62731                                     4-Regional Education Service Agency (RESA)
## 62755 1-Regular local school district that is NOT a component of a supervisory union
## 62756                                                 7-Independent Charter District
## 62788 1-Regular local school district that is NOT a component of a supervisory union
## 62803 1-Regular local school district that is NOT a component of a supervisory union
## 62866 1-Regular local school district that is NOT a component of a supervisory union
## 62978 1-Regular local school district that is NOT a component of a supervisory union
## 63014                                     4-Regional Education Service Agency (RESA)
## 63041 1-Regular local school district that is NOT a component of a supervisory union
## 63042 1-Regular local school district that is NOT a component of a supervisory union
## 63044 1-Regular local school district that is NOT a component of a supervisory union
## 63058 1-Regular local school district that is NOT a component of a supervisory union
## 63094 1-Regular local school district that is NOT a component of a supervisory union
## 63111 1-Regular local school district that is NOT a component of a supervisory union
## 63144 1-Regular local school district that is NOT a component of a supervisory union
## 63145 1-Regular local school district that is NOT a component of a supervisory union
## 63151                                     4-Regional Education Service Agency (RESA)
## 63152 1-Regular local school district that is NOT a component of a supervisory union
## 63169 1-Regular local school district that is NOT a component of a supervisory union
## 63173 1-Regular local school district that is NOT a component of a supervisory union
## 63174 1-Regular local school district that is NOT a component of a supervisory union
## 63175 1-Regular local school district that is NOT a component of a supervisory union
## 63206 1-Regular local school district that is NOT a component of a supervisory union
## 63211                                                 7-Independent Charter District
## 63239         5-State agency providing elementary and/or secondary level instruction
## 63240 1-Regular local school district that is NOT a component of a supervisory union
## 63279 1-Regular local school district that is NOT a component of a supervisory union
## 63280 1-Regular local school district that is NOT a component of a supervisory union
## 63291 1-Regular local school district that is NOT a component of a supervisory union
## 63292 1-Regular local school district that is NOT a component of a supervisory union
## 63344                                                 7-Independent Charter District
## 63363 1-Regular local school district that is NOT a component of a supervisory union
## 63365 1-Regular local school district that is NOT a component of a supervisory union
## 63379 1-Regular local school district that is NOT a component of a supervisory union
## 63380 1-Regular local school district that is NOT a component of a supervisory union
## 63381 1-Regular local school district that is NOT a component of a supervisory union
## 63382 1-Regular local school district that is NOT a component of a supervisory union
## 63397 1-Regular local school district that is NOT a component of a supervisory union
## 63509                                     4-Regional Education Service Agency (RESA)
## 63511                                     4-Regional Education Service Agency (RESA)
## 63519 1-Regular local school district that is NOT a component of a supervisory union
## 63615 1-Regular local school district that is NOT a component of a supervisory union
## 63616         5-State agency providing elementary and/or secondary level instruction
## 63622 1-Regular local school district that is NOT a component of a supervisory union
## 63623                                                 7-Independent Charter District
## 63672                                     4-Regional Education Service Agency (RESA)
## 63674                                     4-Regional Education Service Agency (RESA)
## 63685                                     4-Regional Education Service Agency (RESA)
## 63686                                     4-Regional Education Service Agency (RESA)
## 63687                                     4-Regional Education Service Agency (RESA)
## 63698         5-State agency providing elementary and/or secondary level instruction
## 63703         5-State agency providing elementary and/or secondary level instruction
## 63711 1-Regular local school district that is NOT a component of a supervisory union
## 63741 1-Regular local school district that is NOT a component of a supervisory union
## 63749                                     4-Regional Education Service Agency (RESA)
## 63756                                                 7-Independent Charter District
## 63780                                                 7-Independent Charter District
## 63802 1-Regular local school district that is NOT a component of a supervisory union
## 63818 1-Regular local school district that is NOT a component of a supervisory union
## 63821 1-Regular local school district that is NOT a component of a supervisory union
## 63822 1-Regular local school district that is NOT a component of a supervisory union
## 63834 1-Regular local school district that is NOT a component of a supervisory union
## 63903 1-Regular local school district that is NOT a component of a supervisory union
## 64038 1-Regular local school district that is NOT a component of a supervisory union
## 64095         5-State agency providing elementary and/or secondary level instruction
## 64146 1-Regular local school district that is NOT a component of a supervisory union
## 64246                                                 7-Independent Charter District
## 64284 1-Regular local school district that is NOT a component of a supervisory union
## 64285 1-Regular local school district that is NOT a component of a supervisory union
## 64321 1-Regular local school district that is NOT a component of a supervisory union
## 64322 1-Regular local school district that is NOT a component of a supervisory union
## 64323 1-Regular local school district that is NOT a component of a supervisory union
## 64327 1-Regular local school district that is NOT a component of a supervisory union
## 64334         5-State agency providing elementary and/or secondary level instruction
## 64368 1-Regular local school district that is NOT a component of a supervisory union
## 64381 1-Regular local school district that is NOT a component of a supervisory union
## 64460 1-Regular local school district that is NOT a component of a supervisory union
## 64502 1-Regular local school district that is NOT a component of a supervisory union
## 64599 1-Regular local school district that is NOT a component of a supervisory union
## 64601 1-Regular local school district that is NOT a component of a supervisory union
## 64612 1-Regular local school district that is NOT a component of a supervisory union
## 64629 1-Regular local school district that is NOT a component of a supervisory union
## 64646 1-Regular local school district that is NOT a component of a supervisory union
## 64679                                     4-Regional Education Service Agency (RESA)
## 64684 1-Regular local school district that is NOT a component of a supervisory union
## 64733 1-Regular local school district that is NOT a component of a supervisory union
## 64739 1-Regular local school district that is NOT a component of a supervisory union
## 64753 1-Regular local school district that is NOT a component of a supervisory union
## 64766 1-Regular local school district that is NOT a component of a supervisory union
## 64783         5-State agency providing elementary and/or secondary level instruction
## 64796 1-Regular local school district that is NOT a component of a supervisory union
## 64797 1-Regular local school district that is NOT a component of a supervisory union
## 64911 1-Regular local school district that is NOT a component of a supervisory union
## 64913 1-Regular local school district that is NOT a component of a supervisory union
## 64984 1-Regular local school district that is NOT a component of a supervisory union
## 65028                                                 7-Independent Charter District
## 65030 1-Regular local school district that is NOT a component of a supervisory union
## 65046         5-State agency providing elementary and/or secondary level instruction
## 65056 1-Regular local school district that is NOT a component of a supervisory union
## 65063         5-State agency providing elementary and/or secondary level instruction
## 65064         5-State agency providing elementary and/or secondary level instruction
## 65072 1-Regular local school district that is NOT a component of a supervisory union
## 65075         5-State agency providing elementary and/or secondary level instruction
## 65076 1-Regular local school district that is NOT a component of a supervisory union
## 65129 1-Regular local school district that is NOT a component of a supervisory union
## 65134 1-Regular local school district that is NOT a component of a supervisory union
## 65136 1-Regular local school district that is NOT a component of a supervisory union
## 65172 1-Regular local school district that is NOT a component of a supervisory union
## 65175                                                 7-Independent Charter District
## 65186                                                 7-Independent Charter District
## 65193 1-Regular local school district that is NOT a component of a supervisory union
## 65194 1-Regular local school district that is NOT a component of a supervisory union
## 65211 1-Regular local school district that is NOT a component of a supervisory union
## 65214 1-Regular local school district that is NOT a component of a supervisory union
## 65219                                                 7-Independent Charter District
## 65220 1-Regular local school district that is NOT a component of a supervisory union
## 65281 1-Regular local school district that is NOT a component of a supervisory union
## 65282 1-Regular local school district that is NOT a component of a supervisory union
## 65285 1-Regular local school district that is NOT a component of a supervisory union
## 65286 1-Regular local school district that is NOT a component of a supervisory union
## 65287 1-Regular local school district that is NOT a component of a supervisory union
## 65288 1-Regular local school district that is NOT a component of a supervisory union
## 65309 1-Regular local school district that is NOT a component of a supervisory union
## 65310 1-Regular local school district that is NOT a component of a supervisory union
## 65311 1-Regular local school district that is NOT a component of a supervisory union
## 65323                                                 7-Independent Charter District
## 65324                                                 7-Independent Charter District
## 65325                                                 7-Independent Charter District
## 65329                                                 7-Independent Charter District
## 65330                                                 7-Independent Charter District
## 65333         5-State agency providing elementary and/or secondary level instruction
## 65334         5-State agency providing elementary and/or secondary level instruction
## 65335         5-State agency providing elementary and/or secondary level instruction
## 65336         5-State agency providing elementary and/or secondary level instruction
## 65389 1-Regular local school district that is NOT a component of a supervisory union
## 65404 1-Regular local school district that is NOT a component of a supervisory union
## 65405 1-Regular local school district that is NOT a component of a supervisory union
## 65429                                                 7-Independent Charter District
## 65430 1-Regular local school district that is NOT a component of a supervisory union
## 65485 1-Regular local school district that is NOT a component of a supervisory union
## 65559 1-Regular local school district that is NOT a component of a supervisory union
## 65575 1-Regular local school district that is NOT a component of a supervisory union
## 65602 1-Regular local school district that is NOT a component of a supervisory union
## 65622 1-Regular local school district that is NOT a component of a supervisory union
## 65623 1-Regular local school district that is NOT a component of a supervisory union
## 65636                                                 7-Independent Charter District
## 65637                                                 7-Independent Charter District
## 65638                                                 7-Independent Charter District
## 65639                                                 7-Independent Charter District
## 65640                                                 7-Independent Charter District
## 65641                                                 7-Independent Charter District
## 65642                                                 7-Independent Charter District
## 65643 1-Regular local school district that is NOT a component of a supervisory union
## 65644                                                 7-Independent Charter District
## 65687 1-Regular local school district that is NOT a component of a supervisory union
## 65711 1-Regular local school district that is NOT a component of a supervisory union
## 65712 1-Regular local school district that is NOT a component of a supervisory union
## 65755 1-Regular local school district that is NOT a component of a supervisory union
## 65761                                                 7-Independent Charter District
## 65768                                                 7-Independent Charter District
## 65793 1-Regular local school district that is NOT a component of a supervisory union
## 65794 1-Regular local school district that is NOT a component of a supervisory union
## 65795 1-Regular local school district that is NOT a component of a supervisory union
## 65796 1-Regular local school district that is NOT a component of a supervisory union
## 65797 1-Regular local school district that is NOT a component of a supervisory union
## 65799 1-Regular local school district that is NOT a component of a supervisory union
## 65800 1-Regular local school district that is NOT a component of a supervisory union
## 65821 1-Regular local school district that is NOT a component of a supervisory union
## 65822 1-Regular local school district that is NOT a component of a supervisory union
## 65823 1-Regular local school district that is NOT a component of a supervisory union
## 65824 1-Regular local school district that is NOT a component of a supervisory union
## 65825 1-Regular local school district that is NOT a component of a supervisory union
## 65833 1-Regular local school district that is NOT a component of a supervisory union
## 65834 1-Regular local school district that is NOT a component of a supervisory union
## 65835 1-Regular local school district that is NOT a component of a supervisory union
## 65837 1-Regular local school district that is NOT a component of a supervisory union
## 65859 1-Regular local school district that is NOT a component of a supervisory union
## 65861 1-Regular local school district that is NOT a component of a supervisory union
## 65899 1-Regular local school district that is NOT a component of a supervisory union
## 65905 1-Regular local school district that is NOT a component of a supervisory union
## 65919 1-Regular local school district that is NOT a component of a supervisory union
## 65956 1-Regular local school district that is NOT a component of a supervisory union
## 65980 1-Regular local school district that is NOT a component of a supervisory union
## 65981 1-Regular local school district that is NOT a component of a supervisory union
## 66018         5-State agency providing elementary and/or secondary level instruction
## 66035 1-Regular local school district that is NOT a component of a supervisory union
## 66036 1-Regular local school district that is NOT a component of a supervisory union
## 66037 1-Regular local school district that is NOT a component of a supervisory union
## 66044 1-Regular local school district that is NOT a component of a supervisory union
## 66049 1-Regular local school district that is NOT a component of a supervisory union
## 66059 1-Regular local school district that is NOT a component of a supervisory union
## 66083 1-Regular local school district that is NOT a component of a supervisory union
## 66089 1-Regular local school district that is NOT a component of a supervisory union
## 66186 1-Regular local school district that is NOT a component of a supervisory union
## 66187 1-Regular local school district that is NOT a component of a supervisory union
## 66188 1-Regular local school district that is NOT a component of a supervisory union
## 66220 1-Regular local school district that is NOT a component of a supervisory union
## 66221 1-Regular local school district that is NOT a component of a supervisory union
## 66222 1-Regular local school district that is NOT a component of a supervisory union
## 66228         5-State agency providing elementary and/or secondary level instruction
## 66242 1-Regular local school district that is NOT a component of a supervisory union
## 66267                                     4-Regional Education Service Agency (RESA)
## 66370 1-Regular local school district that is NOT a component of a supervisory union
## 66397 1-Regular local school district that is NOT a component of a supervisory union
## 66455 1-Regular local school district that is NOT a component of a supervisory union
## 66470 1-Regular local school district that is NOT a component of a supervisory union
## 66471 1-Regular local school district that is NOT a component of a supervisory union
## 66496 1-Regular local school district that is NOT a component of a supervisory union
## 66509 1-Regular local school district that is NOT a component of a supervisory union
## 66543 1-Regular local school district that is NOT a component of a supervisory union
## 66544 1-Regular local school district that is NOT a component of a supervisory union
## 66558                                                 7-Independent Charter District
## 66560                                                 7-Independent Charter District
## 66569         5-State agency providing elementary and/or secondary level instruction
## 66592 1-Regular local school district that is NOT a component of a supervisory union
## 66593 1-Regular local school district that is NOT a component of a supervisory union
## 66594 1-Regular local school district that is NOT a component of a supervisory union
## 66595 1-Regular local school district that is NOT a component of a supervisory union
## 66601 1-Regular local school district that is NOT a component of a supervisory union
## 66602 1-Regular local school district that is NOT a component of a supervisory union
## 66620                                                     8-Other education agencies
## 66631 1-Regular local school district that is NOT a component of a supervisory union
## 66632 1-Regular local school district that is NOT a component of a supervisory union
## 66640 1-Regular local school district that is NOT a component of a supervisory union
## 66641 1-Regular local school district that is NOT a component of a supervisory union
## 66643 1-Regular local school district that is NOT a component of a supervisory union
## 66648 1-Regular local school district that is NOT a component of a supervisory union
## 66651 1-Regular local school district that is NOT a component of a supervisory union
## 66653 1-Regular local school district that is NOT a component of a supervisory union
## 66660                                                 7-Independent Charter District
## 66669 1-Regular local school district that is NOT a component of a supervisory union
## 66681             2-Local school district that is a component of a supervisory union
## 66687 1-Regular local school district that is NOT a component of a supervisory union
## 66691                                                 7-Independent Charter District
## 66698 1-Regular local school district that is NOT a component of a supervisory union
## 66705 1-Regular local school district that is NOT a component of a supervisory union
## 66706 1-Regular local school district that is NOT a component of a supervisory union
## 66747 1-Regular local school district that is NOT a component of a supervisory union
## 66758 1-Regular local school district that is NOT a component of a supervisory union
## 66775 1-Regular local school district that is NOT a component of a supervisory union
## 66794                                                 7-Independent Charter District
## 66822 1-Regular local school district that is NOT a component of a supervisory union
## 66844 1-Regular local school district that is NOT a component of a supervisory union
## 66852 1-Regular local school district that is NOT a component of a supervisory union
## 66855 1-Regular local school district that is NOT a component of a supervisory union
## 66859 1-Regular local school district that is NOT a component of a supervisory union
## 66871 1-Regular local school district that is NOT a component of a supervisory union
## 66876 1-Regular local school district that is NOT a component of a supervisory union
## 66902 1-Regular local school district that is NOT a component of a supervisory union
## 66908 1-Regular local school district that is NOT a component of a supervisory union
## 66966 1-Regular local school district that is NOT a component of a supervisory union
## 66967 1-Regular local school district that is NOT a component of a supervisory union
## 67008 1-Regular local school district that is NOT a component of a supervisory union
## 67038                                                 7-Independent Charter District
## 67043 1-Regular local school district that is NOT a component of a supervisory union
## 67056 1-Regular local school district that is NOT a component of a supervisory union
## 67057 1-Regular local school district that is NOT a component of a supervisory union
## 67058 1-Regular local school district that is NOT a component of a supervisory union
## 67063 1-Regular local school district that is NOT a component of a supervisory union
## 67078 1-Regular local school district that is NOT a component of a supervisory union
## 67110         5-State agency providing elementary and/or secondary level instruction
## 67116                                                 7-Independent Charter District
## 67117 1-Regular local school district that is NOT a component of a supervisory union
## 67119 1-Regular local school district that is NOT a component of a supervisory union
## 67121                                                 7-Independent Charter District
## 67132                                                 7-Independent Charter District
## 67138 1-Regular local school district that is NOT a component of a supervisory union
## 67151                                                 7-Independent Charter District
## 67155                                                 7-Independent Charter District
## 67158                                                 7-Independent Charter District
## 67230 1-Regular local school district that is NOT a component of a supervisory union
## 67295 1-Regular local school district that is NOT a component of a supervisory union
## 67326 1-Regular local school district that is NOT a component of a supervisory union
## 67339 1-Regular local school district that is NOT a component of a supervisory union
## 67340 1-Regular local school district that is NOT a component of a supervisory union
## 67360                                                 7-Independent Charter District
## 67361 1-Regular local school district that is NOT a component of a supervisory union
## 67366 1-Regular local school district that is NOT a component of a supervisory union
## 67487 1-Regular local school district that is NOT a component of a supervisory union
## 67488 1-Regular local school district that is NOT a component of a supervisory union
## 67558 1-Regular local school district that is NOT a component of a supervisory union
## 67620 1-Regular local school district that is NOT a component of a supervisory union
## 67621 1-Regular local school district that is NOT a component of a supervisory union
## 67642 1-Regular local school district that is NOT a component of a supervisory union
## 67643 1-Regular local school district that is NOT a component of a supervisory union
## 67681 1-Regular local school district that is NOT a component of a supervisory union
## 67693 1-Regular local school district that is NOT a component of a supervisory union
## 67703 1-Regular local school district that is NOT a component of a supervisory union
## 67709 1-Regular local school district that is NOT a component of a supervisory union
## 67715 1-Regular local school district that is NOT a component of a supervisory union
## 67733 1-Regular local school district that is NOT a component of a supervisory union
## 67743         5-State agency providing elementary and/or secondary level instruction
## 67756                                                 7-Independent Charter District
## 67773 1-Regular local school district that is NOT a component of a supervisory union
## 67774                                                 7-Independent Charter District
## 67802 1-Regular local school district that is NOT a component of a supervisory union
## 67803 1-Regular local school district that is NOT a component of a supervisory union
## 67806 1-Regular local school district that is NOT a component of a supervisory union
## 67812 1-Regular local school district that is NOT a component of a supervisory union
## 67818                                                 7-Independent Charter District
## 67822 1-Regular local school district that is NOT a component of a supervisory union
## 67831                                     4-Regional Education Service Agency (RESA)
## 67861 1-Regular local school district that is NOT a component of a supervisory union
## 68022                                                 7-Independent Charter District
## 68038                                                 7-Independent Charter District
## 68039                                                 7-Independent Charter District
## 68053 1-Regular local school district that is NOT a component of a supervisory union
## 68057 1-Regular local school district that is NOT a component of a supervisory union
## 68079                                     4-Regional Education Service Agency (RESA)
## 68080                                     4-Regional Education Service Agency (RESA)
## 68113 1-Regular local school district that is NOT a component of a supervisory union
## 68115 1-Regular local school district that is NOT a component of a supervisory union
## 68118                                           9-Specialized public school district
## 68119                                           9-Specialized public school district
## 68120                                           9-Specialized public school district
## 68121                                           9-Specialized public school district
## 68122                                           9-Specialized public school district
## 68123                                           9-Specialized public school district
## 68124                                           9-Specialized public school district
## 68125                                           9-Specialized public school district
## 68126                                           9-Specialized public school district
## 68127                                           9-Specialized public school district
## 68128                                           9-Specialized public school district
## 68130                                           9-Specialized public school district
## 68131                                           9-Specialized public school district
## 68132                                           9-Specialized public school district
## 68133                                           9-Specialized public school district
## 68134                                           9-Specialized public school district
## 68135                                           9-Specialized public school district
## 68136                                           9-Specialized public school district
## 68137                                           9-Specialized public school district
## 68138                                           9-Specialized public school district
## 68139                                           9-Specialized public school district
## 68140                                           9-Specialized public school district
## 68141                                           9-Specialized public school district
## 68142                                           9-Specialized public school district
## 68143                                           9-Specialized public school district
## 68144                                           9-Specialized public school district
## 68145                                           9-Specialized public school district
## 68146                                           9-Specialized public school district
## 68147                                           9-Specialized public school district
## 68148                                           9-Specialized public school district
## 68149                                           9-Specialized public school district
## 68150                                           9-Specialized public school district
## 68151                                           9-Specialized public school district
## 68152                                           9-Specialized public school district
## 68153                                           9-Specialized public school district
## 68154                                           9-Specialized public school district
## 68155                                           9-Specialized public school district
## 68156                                           9-Specialized public school district
## 68157                                           9-Specialized public school district
## 68158                                           9-Specialized public school district
## 68209 1-Regular local school district that is NOT a component of a supervisory union
## 68303 1-Regular local school district that is NOT a component of a supervisory union
## 68304 1-Regular local school district that is NOT a component of a supervisory union
## 68307 1-Regular local school district that is NOT a component of a supervisory union
## 68338 1-Regular local school district that is NOT a component of a supervisory union
## 68449 1-Regular local school district that is NOT a component of a supervisory union
## 68464                                                 7-Independent Charter District
## 68468 1-Regular local school district that is NOT a component of a supervisory union
## 68474         5-State agency providing elementary and/or secondary level instruction
## 68501 1-Regular local school district that is NOT a component of a supervisory union
## 68568                                                 7-Independent Charter District
## 68579                                                 7-Independent Charter District
## 68580 1-Regular local school district that is NOT a component of a supervisory union
## 68597 1-Regular local school district that is NOT a component of a supervisory union
## 68598 1-Regular local school district that is NOT a component of a supervisory union
## 68698 1-Regular local school district that is NOT a component of a supervisory union
## 68774 1-Regular local school district that is NOT a component of a supervisory union
## 68782 1-Regular local school district that is NOT a component of a supervisory union
## 68801 1-Regular local school district that is NOT a component of a supervisory union
## 68802 1-Regular local school district that is NOT a component of a supervisory union
## 68803 1-Regular local school district that is NOT a component of a supervisory union
## 68804 1-Regular local school district that is NOT a component of a supervisory union
## 68811 1-Regular local school district that is NOT a component of a supervisory union
## 68839 1-Regular local school district that is NOT a component of a supervisory union
## 68870                                     4-Regional Education Service Agency (RESA)
## 68940 1-Regular local school district that is NOT a component of a supervisory union
## 69031 1-Regular local school district that is NOT a component of a supervisory union
## 69060                                                 7-Independent Charter District
## 69064 1-Regular local school district that is NOT a component of a supervisory union
## 69066 1-Regular local school district that is NOT a component of a supervisory union
## 69068         5-State agency providing elementary and/or secondary level instruction
## 69070                                                 7-Independent Charter District
## 69071                                                 7-Independent Charter District
## 69072                                                 7-Independent Charter District
## 69073                                                 7-Independent Charter District
## 69096 1-Regular local school district that is NOT a component of a supervisory union
## 69099 1-Regular local school district that is NOT a component of a supervisory union
## 69100 1-Regular local school district that is NOT a component of a supervisory union
## 69117 1-Regular local school district that is NOT a component of a supervisory union
## 69153 1-Regular local school district that is NOT a component of a supervisory union
## 69157 1-Regular local school district that is NOT a component of a supervisory union
## 69161                                     4-Regional Education Service Agency (RESA)
## 69170                                     4-Regional Education Service Agency (RESA)
## 69184 1-Regular local school district that is NOT a component of a supervisory union
## 69186         5-State agency providing elementary and/or secondary level instruction
## 69232 1-Regular local school district that is NOT a component of a supervisory union
## 69244 1-Regular local school district that is NOT a component of a supervisory union
## 69289                                                 7-Independent Charter District
## 69290                                                 7-Independent Charter District
## 69314                                           9-Specialized public school district
## 69324                                           9-Specialized public school district
## 69330                                                 7-Independent Charter District
## 69331                                                 7-Independent Charter District
## 69332                                                 7-Independent Charter District
## 69333                                                 7-Independent Charter District
## 69334                                                 7-Independent Charter District
## 69394                                                 7-Independent Charter District
## 69420         5-State agency providing elementary and/or secondary level instruction
## 69518 1-Regular local school district that is NOT a component of a supervisory union
## 69519 1-Regular local school district that is NOT a component of a supervisory union
## 69533 1-Regular local school district that is NOT a component of a supervisory union
## 69551 1-Regular local school district that is NOT a component of a supervisory union
## 69552 1-Regular local school district that is NOT a component of a supervisory union
## 69576         5-State agency providing elementary and/or secondary level instruction
## 69581 1-Regular local school district that is NOT a component of a supervisory union
## 69583 1-Regular local school district that is NOT a component of a supervisory union
## 69594 1-Regular local school district that is NOT a component of a supervisory union
## 69595 1-Regular local school district that is NOT a component of a supervisory union
## 69596 1-Regular local school district that is NOT a component of a supervisory union
## 69688                                                 7-Independent Charter District
## 69689                                                 7-Independent Charter District
## 69690                                                 7-Independent Charter District
## 69695                                                 7-Independent Charter District
## 69696                                                 7-Independent Charter District
## 69698                                                 7-Independent Charter District
## 69699                                                 7-Independent Charter District
## 69701                                                 7-Independent Charter District
## 69766 1-Regular local school district that is NOT a component of a supervisory union
## 69774                                                 7-Independent Charter District
## 69792 1-Regular local school district that is NOT a component of a supervisory union
## 69794                                                 7-Independent Charter District
## 69802 1-Regular local school district that is NOT a component of a supervisory union
## 69803 1-Regular local school district that is NOT a component of a supervisory union
## 69957 1-Regular local school district that is NOT a component of a supervisory union
## 69958 1-Regular local school district that is NOT a component of a supervisory union
## 69963 1-Regular local school district that is NOT a component of a supervisory union
## 69964 1-Regular local school district that is NOT a component of a supervisory union
## 69965 1-Regular local school district that is NOT a component of a supervisory union
## 69970 1-Regular local school district that is NOT a component of a supervisory union
## 69971 1-Regular local school district that is NOT a component of a supervisory union
## 69973 1-Regular local school district that is NOT a component of a supervisory union
## 69986 1-Regular local school district that is NOT a component of a supervisory union
## 70053                                     4-Regional Education Service Agency (RESA)
## 70059 1-Regular local school district that is NOT a component of a supervisory union
## 70115         5-State agency providing elementary and/or secondary level instruction
## 70143                                                 7-Independent Charter District
## 70148 1-Regular local school district that is NOT a component of a supervisory union
## 70157 1-Regular local school district that is NOT a component of a supervisory union
## 70173 1-Regular local school district that is NOT a component of a supervisory union
## 70177 1-Regular local school district that is NOT a component of a supervisory union
## 70240 1-Regular local school district that is NOT a component of a supervisory union
## 70286 1-Regular local school district that is NOT a component of a supervisory union
## 70351 1-Regular local school district that is NOT a component of a supervisory union
## 70365 1-Regular local school district that is NOT a component of a supervisory union
## 70366 1-Regular local school district that is NOT a component of a supervisory union
## 70367                                     4-Regional Education Service Agency (RESA)
## 70397 1-Regular local school district that is NOT a component of a supervisory union
## 70469 1-Regular local school district that is NOT a component of a supervisory union
## 70504 1-Regular local school district that is NOT a component of a supervisory union
## 70505 1-Regular local school district that is NOT a component of a supervisory union
## 70524 1-Regular local school district that is NOT a component of a supervisory union
## 70528 1-Regular local school district that is NOT a component of a supervisory union
## 70529 1-Regular local school district that is NOT a component of a supervisory union
## 70535 1-Regular local school district that is NOT a component of a supervisory union
## 70536 1-Regular local school district that is NOT a component of a supervisory union
## 70586 1-Regular local school district that is NOT a component of a supervisory union
## 70658 1-Regular local school district that is NOT a component of a supervisory union
## 70674 1-Regular local school district that is NOT a component of a supervisory union
## 70755 1-Regular local school district that is NOT a component of a supervisory union
## 70769 1-Regular local school district that is NOT a component of a supervisory union
## 70808 1-Regular local school district that is NOT a component of a supervisory union
## 70809                                     4-Regional Education Service Agency (RESA)
## 70851 1-Regular local school district that is NOT a component of a supervisory union
## 70883 1-Regular local school district that is NOT a component of a supervisory union
## 70889 1-Regular local school district that is NOT a component of a supervisory union
## 70895 1-Regular local school district that is NOT a component of a supervisory union
## 71038 1-Regular local school district that is NOT a component of a supervisory union
## 71047                                                 7-Independent Charter District
## 71048                                                 7-Independent Charter District
## 71049                                                 7-Independent Charter District
## 71050                                                 7-Independent Charter District
## 71051                                                 7-Independent Charter District
## 71053                                                 7-Independent Charter District
## 71064 1-Regular local school district that is NOT a component of a supervisory union
## 71161 1-Regular local school district that is NOT a component of a supervisory union
## 71180 1-Regular local school district that is NOT a component of a supervisory union
## 71182 1-Regular local school district that is NOT a component of a supervisory union
## 71226 1-Regular local school district that is NOT a component of a supervisory union
## 71238 1-Regular local school district that is NOT a component of a supervisory union
## 71260 1-Regular local school district that is NOT a component of a supervisory union
## 71263 1-Regular local school district that is NOT a component of a supervisory union
## 71264 1-Regular local school district that is NOT a component of a supervisory union
## 71267                                                 7-Independent Charter District
## 71271 1-Regular local school district that is NOT a component of a supervisory union
## 71272 1-Regular local school district that is NOT a component of a supervisory union
## 71273 1-Regular local school district that is NOT a component of a supervisory union
## 71278 1-Regular local school district that is NOT a component of a supervisory union
## 71279 1-Regular local school district that is NOT a component of a supervisory union
## 71280 1-Regular local school district that is NOT a component of a supervisory union
## 71281 1-Regular local school district that is NOT a component of a supervisory union
## 71285                                                 7-Independent Charter District
## 71337 1-Regular local school district that is NOT a component of a supervisory union
## 71338 1-Regular local school district that is NOT a component of a supervisory union
## 71339 1-Regular local school district that is NOT a component of a supervisory union
## 71344 1-Regular local school district that is NOT a component of a supervisory union
## 71345 1-Regular local school district that is NOT a component of a supervisory union
## 71368                                                 7-Independent Charter District
## 71380 1-Regular local school district that is NOT a component of a supervisory union
## 71384                                                 7-Independent Charter District
## 71389         5-State agency providing elementary and/or secondary level instruction
## 71390         5-State agency providing elementary and/or secondary level instruction
## 71468 1-Regular local school district that is NOT a component of a supervisory union
## 71473                                                 7-Independent Charter District
## 71482 1-Regular local school district that is NOT a component of a supervisory union
## 71491         5-State agency providing elementary and/or secondary level instruction
## 71499 1-Regular local school district that is NOT a component of a supervisory union
## 71500 1-Regular local school district that is NOT a component of a supervisory union
## 71507 1-Regular local school district that is NOT a component of a supervisory union
## 71527 1-Regular local school district that is NOT a component of a supervisory union
## 71577 1-Regular local school district that is NOT a component of a supervisory union
## 71586 1-Regular local school district that is NOT a component of a supervisory union
## 71588                                     4-Regional Education Service Agency (RESA)
## 71595                                     4-Regional Education Service Agency (RESA)
## 71598                                     4-Regional Education Service Agency (RESA)
## 71599 1-Regular local school district that is NOT a component of a supervisory union
## 71600 1-Regular local school district that is NOT a component of a supervisory union
## 71602                                     4-Regional Education Service Agency (RESA)
## 71603                                     4-Regional Education Service Agency (RESA)
## 71608 1-Regular local school district that is NOT a component of a supervisory union
## 71609 1-Regular local school district that is NOT a component of a supervisory union
## 71611                                     4-Regional Education Service Agency (RESA)
## 71613 1-Regular local school district that is NOT a component of a supervisory union
## 71614         5-State agency providing elementary and/or secondary level instruction
## 71615         5-State agency providing elementary and/or secondary level instruction
## 71616         5-State agency providing elementary and/or secondary level instruction
## 71617         5-State agency providing elementary and/or secondary level instruction
## 71618         5-State agency providing elementary and/or secondary level instruction
## 71619         5-State agency providing elementary and/or secondary level instruction
## 71627                                                 7-Independent Charter District
## 71669 1-Regular local school district that is NOT a component of a supervisory union
## 71696                                                 7-Independent Charter District
## 71700 1-Regular local school district that is NOT a component of a supervisory union
## 71715 1-Regular local school district that is NOT a component of a supervisory union
## 71716 1-Regular local school district that is NOT a component of a supervisory union
## 71717 1-Regular local school district that is NOT a component of a supervisory union
## 71718 1-Regular local school district that is NOT a component of a supervisory union
## 71719 1-Regular local school district that is NOT a component of a supervisory union
## 72527 1-Regular local school district that is NOT a component of a supervisory union
## 72555 1-Regular local school district that is NOT a component of a supervisory union
## 72606 1-Regular local school district that is NOT a component of a supervisory union
## 72618 1-Regular local school district that is NOT a component of a supervisory union
## 72637 1-Regular local school district that is NOT a component of a supervisory union
## 72638 1-Regular local school district that is NOT a component of a supervisory union
## 72639 1-Regular local school district that is NOT a component of a supervisory union
## 72651 1-Regular local school district that is NOT a component of a supervisory union
## 72671 1-Regular local school district that is NOT a component of a supervisory union
## 72684 1-Regular local school district that is NOT a component of a supervisory union
## 72695 1-Regular local school district that is NOT a component of a supervisory union
## 72756                                                 7-Independent Charter District
## 72762 1-Regular local school district that is NOT a component of a supervisory union
## 72814 1-Regular local school district that is NOT a component of a supervisory union
## 72922 1-Regular local school district that is NOT a component of a supervisory union
## 72923 1-Regular local school district that is NOT a component of a supervisory union
## 72959         5-State agency providing elementary and/or secondary level instruction
## 72980                                     4-Regional Education Service Agency (RESA)
## 72981                                     4-Regional Education Service Agency (RESA)
## 72983                                     4-Regional Education Service Agency (RESA)
## 72986 1-Regular local school district that is NOT a component of a supervisory union
## 72991 1-Regular local school district that is NOT a component of a supervisory union
## 73021 1-Regular local school district that is NOT a component of a supervisory union
## 73095 1-Regular local school district that is NOT a component of a supervisory union
## 73146 1-Regular local school district that is NOT a component of a supervisory union
## 73180 1-Regular local school district that is NOT a component of a supervisory union
## 73185                                                 7-Independent Charter District
## 73220 1-Regular local school district that is NOT a component of a supervisory union
## 73300 1-Regular local school district that is NOT a component of a supervisory union
## 73303 1-Regular local school district that is NOT a component of a supervisory union
## 73304 1-Regular local school district that is NOT a component of a supervisory union
## 73355         5-State agency providing elementary and/or secondary level instruction
## 73356                                     4-Regional Education Service Agency (RESA)
## 73395 1-Regular local school district that is NOT a component of a supervisory union
## 73437 1-Regular local school district that is NOT a component of a supervisory union
## 73473 1-Regular local school district that is NOT a component of a supervisory union
## 73489 1-Regular local school district that is NOT a component of a supervisory union
## 73527                                                 7-Independent Charter District
## 73528                                                 7-Independent Charter District
## 73537 1-Regular local school district that is NOT a component of a supervisory union
## 73551         5-State agency providing elementary and/or secondary level instruction
## 73554 1-Regular local school district that is NOT a component of a supervisory union
## 73573 1-Regular local school district that is NOT a component of a supervisory union
## 73582                                                 7-Independent Charter District
## 73601 1-Regular local school district that is NOT a component of a supervisory union
## 73603                                                 7-Independent Charter District
## 73604 1-Regular local school district that is NOT a component of a supervisory union
## 73643 1-Regular local school district that is NOT a component of a supervisory union
## 73656 1-Regular local school district that is NOT a component of a supervisory union
## 73676 1-Regular local school district that is NOT a component of a supervisory union
## 73688 1-Regular local school district that is NOT a component of a supervisory union
## 73712 1-Regular local school district that is NOT a component of a supervisory union
## 73781 1-Regular local school district that is NOT a component of a supervisory union
## 73782 1-Regular local school district that is NOT a component of a supervisory union
## 73790         5-State agency providing elementary and/or secondary level instruction
## 73792 1-Regular local school district that is NOT a component of a supervisory union
## 73816 1-Regular local school district that is NOT a component of a supervisory union
## 73846 1-Regular local school district that is NOT a component of a supervisory union
## 73862 1-Regular local school district that is NOT a component of a supervisory union
## 73901 1-Regular local school district that is NOT a component of a supervisory union
## 73908 1-Regular local school district that is NOT a component of a supervisory union
## 73927                                     4-Regional Education Service Agency (RESA)
## 73928                                     4-Regional Education Service Agency (RESA)
## 73931                                     4-Regional Education Service Agency (RESA)
## 73933                                     4-Regional Education Service Agency (RESA)
## 73954                                     4-Regional Education Service Agency (RESA)
## 73955                                     4-Regional Education Service Agency (RESA)
## 73956                                     4-Regional Education Service Agency (RESA)
## 73957 1-Regular local school district that is NOT a component of a supervisory union
## 73958                                     4-Regional Education Service Agency (RESA)
## 73959                                     4-Regional Education Service Agency (RESA)
## 73965 1-Regular local school district that is NOT a component of a supervisory union
## 73968                                     4-Regional Education Service Agency (RESA)
## 73971 1-Regular local school district that is NOT a component of a supervisory union
## 73988                                                 7-Independent Charter District
## 73989                                                 7-Independent Charter District
## 74028                                                 7-Independent Charter District
## 74032 1-Regular local school district that is NOT a component of a supervisory union
## 74068 1-Regular local school district that is NOT a component of a supervisory union
## 74094                                     4-Regional Education Service Agency (RESA)
## 74122 1-Regular local school district that is NOT a component of a supervisory union
## 74159 1-Regular local school district that is NOT a component of a supervisory union
## 74161 1-Regular local school district that is NOT a component of a supervisory union
## 74198                                                 7-Independent Charter District
## 74199 1-Regular local school district that is NOT a component of a supervisory union
## 74294 1-Regular local school district that is NOT a component of a supervisory union
## 74298 1-Regular local school district that is NOT a component of a supervisory union
## 74300 1-Regular local school district that is NOT a component of a supervisory union
## 74369 1-Regular local school district that is NOT a component of a supervisory union
## 74414 1-Regular local school district that is NOT a component of a supervisory union
## 74432 1-Regular local school district that is NOT a component of a supervisory union
## 74444 1-Regular local school district that is NOT a component of a supervisory union
## 74447 1-Regular local school district that is NOT a component of a supervisory union
## 74462                                                 7-Independent Charter District
## 74476 1-Regular local school district that is NOT a component of a supervisory union
## 74511 1-Regular local school district that is NOT a component of a supervisory union
## 74515 1-Regular local school district that is NOT a component of a supervisory union
## 74516 1-Regular local school district that is NOT a component of a supervisory union
## 74522 1-Regular local school district that is NOT a component of a supervisory union
## 74529 1-Regular local school district that is NOT a component of a supervisory union
## 74531 1-Regular local school district that is NOT a component of a supervisory union
## 74538 1-Regular local school district that is NOT a component of a supervisory union
## 74552         5-State agency providing elementary and/or secondary level instruction
## 74554         5-State agency providing elementary and/or secondary level instruction
## 74558 1-Regular local school district that is NOT a component of a supervisory union
## 74562 1-Regular local school district that is NOT a component of a supervisory union
## 74563 1-Regular local school district that is NOT a component of a supervisory union
## 74634 1-Regular local school district that is NOT a component of a supervisory union
## 74659 1-Regular local school district that is NOT a component of a supervisory union
## 74676                                                 7-Independent Charter District
## 74677 1-Regular local school district that is NOT a component of a supervisory union
## 74680 1-Regular local school district that is NOT a component of a supervisory union
## 74681 1-Regular local school district that is NOT a component of a supervisory union
## 74751 1-Regular local school district that is NOT a component of a supervisory union
## 74784 1-Regular local school district that is NOT a component of a supervisory union
## 74800 1-Regular local school district that is NOT a component of a supervisory union
## 74805 1-Regular local school district that is NOT a component of a supervisory union
## 74809 1-Regular local school district that is NOT a component of a supervisory union
## 74912 1-Regular local school district that is NOT a component of a supervisory union
## 74940                                     4-Regional Education Service Agency (RESA)
## 74993 1-Regular local school district that is NOT a component of a supervisory union
## 75052 1-Regular local school district that is NOT a component of a supervisory union
## 75053 1-Regular local school district that is NOT a component of a supervisory union
## 75078 1-Regular local school district that is NOT a component of a supervisory union
## 75084 1-Regular local school district that is NOT a component of a supervisory union
## 75087 1-Regular local school district that is NOT a component of a supervisory union
## 75109 1-Regular local school district that is NOT a component of a supervisory union
## 75122 1-Regular local school district that is NOT a component of a supervisory union
## 75141 1-Regular local school district that is NOT a component of a supervisory union
## 75194                                                 7-Independent Charter District
## 75213 1-Regular local school district that is NOT a component of a supervisory union
## 75237 1-Regular local school district that is NOT a component of a supervisory union
## 75241 1-Regular local school district that is NOT a component of a supervisory union
## 75244 1-Regular local school district that is NOT a component of a supervisory union
## 75268 1-Regular local school district that is NOT a component of a supervisory union
## 75272 1-Regular local school district that is NOT a component of a supervisory union
## 75283         5-State agency providing elementary and/or secondary level instruction
## 75295                                     4-Regional Education Service Agency (RESA)
## 75400 1-Regular local school district that is NOT a component of a supervisory union
## 75407 1-Regular local school district that is NOT a component of a supervisory union
## 75408 1-Regular local school district that is NOT a component of a supervisory union
## 75421         5-State agency providing elementary and/or secondary level instruction
## 75422         5-State agency providing elementary and/or secondary level instruction
## 75429 1-Regular local school district that is NOT a component of a supervisory union
## 75439 1-Regular local school district that is NOT a component of a supervisory union
## 75483 1-Regular local school district that is NOT a component of a supervisory union
## 75499 1-Regular local school district that is NOT a component of a supervisory union
## 75500 1-Regular local school district that is NOT a component of a supervisory union
## 75530 1-Regular local school district that is NOT a component of a supervisory union
## 75536 1-Regular local school district that is NOT a component of a supervisory union
## 75545 1-Regular local school district that is NOT a component of a supervisory union
## 75554                                     4-Regional Education Service Agency (RESA)
## 75555         5-State agency providing elementary and/or secondary level instruction
## 75563 1-Regular local school district that is NOT a component of a supervisory union
## 75581 1-Regular local school district that is NOT a component of a supervisory union
## 75637 1-Regular local school district that is NOT a component of a supervisory union
## 75694 1-Regular local school district that is NOT a component of a supervisory union
## 75725         5-State agency providing elementary and/or secondary level instruction
## 75745         5-State agency providing elementary and/or secondary level instruction
## 75922 1-Regular local school district that is NOT a component of a supervisory union
## 75976 1-Regular local school district that is NOT a component of a supervisory union
## 76028                                     4-Regional Education Service Agency (RESA)
## 76076         5-State agency providing elementary and/or secondary level instruction
## 76137 1-Regular local school district that is NOT a component of a supervisory union
## 76138 1-Regular local school district that is NOT a component of a supervisory union
## 76139 1-Regular local school district that is NOT a component of a supervisory union
## 76174                                                 7-Independent Charter District
## 76226 1-Regular local school district that is NOT a component of a supervisory union
## 76227 1-Regular local school district that is NOT a component of a supervisory union
## 76235 1-Regular local school district that is NOT a component of a supervisory union
## 76239 1-Regular local school district that is NOT a component of a supervisory union
## 76257 1-Regular local school district that is NOT a component of a supervisory union
## 76286                                     4-Regional Education Service Agency (RESA)
## 76287                                     4-Regional Education Service Agency (RESA)
## 76288                                     4-Regional Education Service Agency (RESA)
## 76291                                     4-Regional Education Service Agency (RESA)
## 76405 1-Regular local school district that is NOT a component of a supervisory union
## 76435 1-Regular local school district that is NOT a component of a supervisory union
## 76488         5-State agency providing elementary and/or secondary level instruction
## 76530 1-Regular local school district that is NOT a component of a supervisory union
## 76670 1-Regular local school district that is NOT a component of a supervisory union
## 76683 1-Regular local school district that is NOT a component of a supervisory union
## 76703 1-Regular local school district that is NOT a component of a supervisory union
## 76704 1-Regular local school district that is NOT a component of a supervisory union
## 76721                                                 7-Independent Charter District
## 76728 1-Regular local school district that is NOT a component of a supervisory union
## 76771 1-Regular local school district that is NOT a component of a supervisory union
## 76793 1-Regular local school district that is NOT a component of a supervisory union
## 76795 1-Regular local school district that is NOT a component of a supervisory union
## 76820 1-Regular local school district that is NOT a component of a supervisory union
## 76824 1-Regular local school district that is NOT a component of a supervisory union
## 76849 1-Regular local school district that is NOT a component of a supervisory union
## 76996                                                 7-Independent Charter District
## 77018         5-State agency providing elementary and/or secondary level instruction
## 77091                                     4-Regional Education Service Agency (RESA)
## 77094 1-Regular local school district that is NOT a component of a supervisory union
## 77111 1-Regular local school district that is NOT a component of a supervisory union
## 77151 1-Regular local school district that is NOT a component of a supervisory union
## 77156 1-Regular local school district that is NOT a component of a supervisory union
## 77167 1-Regular local school district that is NOT a component of a supervisory union
## 77194 1-Regular local school district that is NOT a component of a supervisory union
## 77218                                     4-Regional Education Service Agency (RESA)
## 77242                                                 7-Independent Charter District
## 77264 1-Regular local school district that is NOT a component of a supervisory union
## 77417 1-Regular local school district that is NOT a component of a supervisory union
## 77448 1-Regular local school district that is NOT a component of a supervisory union
## 77612 1-Regular local school district that is NOT a component of a supervisory union
## 77625         5-State agency providing elementary and/or secondary level instruction
## 77651                                                 7-Independent Charter District
## 77656                                                 7-Independent Charter District
## 77683                                     4-Regional Education Service Agency (RESA)
## 77686 1-Regular local school district that is NOT a component of a supervisory union
## 77696 1-Regular local school district that is NOT a component of a supervisory union
## 77698 1-Regular local school district that is NOT a component of a supervisory union
## 77731                                                 7-Independent Charter District
## 77733 1-Regular local school district that is NOT a component of a supervisory union
## 77738 1-Regular local school district that is NOT a component of a supervisory union
## 77745 1-Regular local school district that is NOT a component of a supervisory union
## 77831 1-Regular local school district that is NOT a component of a supervisory union
## 77833 1-Regular local school district that is NOT a component of a supervisory union
## 77892 1-Regular local school district that is NOT a component of a supervisory union
## 77894 1-Regular local school district that is NOT a component of a supervisory union
## 77903 1-Regular local school district that is NOT a component of a supervisory union
## 77928 1-Regular local school district that is NOT a component of a supervisory union
## 77972 1-Regular local school district that is NOT a component of a supervisory union
## 78005                                                 7-Independent Charter District
## 78006                                                 7-Independent Charter District
## 78008 1-Regular local school district that is NOT a component of a supervisory union
## 78009                                                 7-Independent Charter District
## 78010                                                 7-Independent Charter District
## 78011                                                 7-Independent Charter District
## 78066         5-State agency providing elementary and/or secondary level instruction
## 78095 1-Regular local school district that is NOT a component of a supervisory union
## 78160                                     4-Regional Education Service Agency (RESA)
## 78168 1-Regular local school district that is NOT a component of a supervisory union
## 78176                                     4-Regional Education Service Agency (RESA)
## 78179 1-Regular local school district that is NOT a component of a supervisory union
## 78183 1-Regular local school district that is NOT a component of a supervisory union
## 78193                                     4-Regional Education Service Agency (RESA)
## 78198 1-Regular local school district that is NOT a component of a supervisory union
## 78202 1-Regular local school district that is NOT a component of a supervisory union
## 78203 1-Regular local school district that is NOT a component of a supervisory union
## 78217                                     4-Regional Education Service Agency (RESA)
## 78228 1-Regular local school district that is NOT a component of a supervisory union
## 78243 1-Regular local school district that is NOT a component of a supervisory union
## 78245                                     4-Regional Education Service Agency (RESA)
## 78255 1-Regular local school district that is NOT a component of a supervisory union
## 78263 1-Regular local school district that is NOT a component of a supervisory union
## 78265 1-Regular local school district that is NOT a component of a supervisory union
## 78272 1-Regular local school district that is NOT a component of a supervisory union
## 78279 1-Regular local school district that is NOT a component of a supervisory union
## 78296 1-Regular local school district that is NOT a component of a supervisory union
## 78306                                     4-Regional Education Service Agency (RESA)
## 78311 1-Regular local school district that is NOT a component of a supervisory union
## 78312 1-Regular local school district that is NOT a component of a supervisory union
## 78313 1-Regular local school district that is NOT a component of a supervisory union
## 78332 1-Regular local school district that is NOT a component of a supervisory union
## 78340 1-Regular local school district that is NOT a component of a supervisory union
## 78346 1-Regular local school district that is NOT a component of a supervisory union
## 78348                                                 7-Independent Charter District
## 78351 1-Regular local school district that is NOT a component of a supervisory union
## 78399 1-Regular local school district that is NOT a component of a supervisory union
## 78400         5-State agency providing elementary and/or secondary level instruction
## 78405 1-Regular local school district that is NOT a component of a supervisory union
## 78408 1-Regular local school district that is NOT a component of a supervisory union
## 78436         5-State agency providing elementary and/or secondary level instruction
## 78482 1-Regular local school district that is NOT a component of a supervisory union
## 78492 1-Regular local school district that is NOT a component of a supervisory union
## 78494 1-Regular local school district that is NOT a component of a supervisory union
## 78522 1-Regular local school district that is NOT a component of a supervisory union
## 78570 1-Regular local school district that is NOT a component of a supervisory union
## 78584 1-Regular local school district that is NOT a component of a supervisory union
## 78585 1-Regular local school district that is NOT a component of a supervisory union
## 78586                                     4-Regional Education Service Agency (RESA)
## 78587                                     4-Regional Education Service Agency (RESA)
## 78588 1-Regular local school district that is NOT a component of a supervisory union
## 78591 1-Regular local school district that is NOT a component of a supervisory union
## 78595                                     4-Regional Education Service Agency (RESA)
## 78597 1-Regular local school district that is NOT a component of a supervisory union
## 78601 1-Regular local school district that is NOT a component of a supervisory union
## 78603 1-Regular local school district that is NOT a component of a supervisory union
## 78606 1-Regular local school district that is NOT a component of a supervisory union
## 78609                                     4-Regional Education Service Agency (RESA)
## 78652 1-Regular local school district that is NOT a component of a supervisory union
## 78663 1-Regular local school district that is NOT a component of a supervisory union
## 78670 1-Regular local school district that is NOT a component of a supervisory union
## 78671 1-Regular local school district that is NOT a component of a supervisory union
## 78685 1-Regular local school district that is NOT a component of a supervisory union
## 78686 1-Regular local school district that is NOT a component of a supervisory union
## 78689 1-Regular local school district that is NOT a component of a supervisory union
## 78690 1-Regular local school district that is NOT a component of a supervisory union
## 78699 1-Regular local school district that is NOT a component of a supervisory union
## 78702 1-Regular local school district that is NOT a component of a supervisory union
## 78708 1-Regular local school district that is NOT a component of a supervisory union
## 78744 1-Regular local school district that is NOT a component of a supervisory union
## 78787 1-Regular local school district that is NOT a component of a supervisory union
## 78788 1-Regular local school district that is NOT a component of a supervisory union
## 78797 1-Regular local school district that is NOT a component of a supervisory union
## 78841 1-Regular local school district that is NOT a component of a supervisory union
## 78842                                                 7-Independent Charter District
## 78908         5-State agency providing elementary and/or secondary level instruction
## 78926 1-Regular local school district that is NOT a component of a supervisory union
## 78955 1-Regular local school district that is NOT a component of a supervisory union
## 78956 1-Regular local school district that is NOT a component of a supervisory union
## 78963 1-Regular local school district that is NOT a component of a supervisory union
## 79001 1-Regular local school district that is NOT a component of a supervisory union
## 79055                                                 7-Independent Charter District
## 79162 1-Regular local school district that is NOT a component of a supervisory union
## 79249 1-Regular local school district that is NOT a component of a supervisory union
## 79257 1-Regular local school district that is NOT a component of a supervisory union
## 79413 1-Regular local school district that is NOT a component of a supervisory union
## 79443 1-Regular local school district that is NOT a component of a supervisory union
## 79478                                                 7-Independent Charter District
## 79484 1-Regular local school district that is NOT a component of a supervisory union
## 79485 1-Regular local school district that is NOT a component of a supervisory union
## 79544 1-Regular local school district that is NOT a component of a supervisory union
## 79545                                                 7-Independent Charter District
## 79573                                     4-Regional Education Service Agency (RESA)
## 79582 1-Regular local school district that is NOT a component of a supervisory union
## 79583 1-Regular local school district that is NOT a component of a supervisory union
## 79610 1-Regular local school district that is NOT a component of a supervisory union
## 79634 1-Regular local school district that is NOT a component of a supervisory union
## 79638 1-Regular local school district that is NOT a component of a supervisory union
## 79644 1-Regular local school district that is NOT a component of a supervisory union
## 79645 1-Regular local school district that is NOT a component of a supervisory union
## 79646 1-Regular local school district that is NOT a component of a supervisory union
## 79647 1-Regular local school district that is NOT a component of a supervisory union
## 79672                                                 7-Independent Charter District
## 79673 1-Regular local school district that is NOT a component of a supervisory union
## 79681 1-Regular local school district that is NOT a component of a supervisory union
## 79689 1-Regular local school district that is NOT a component of a supervisory union
## 79698 1-Regular local school district that is NOT a component of a supervisory union
## 79700 1-Regular local school district that is NOT a component of a supervisory union
## 79722 1-Regular local school district that is NOT a component of a supervisory union
## 79723                                                 7-Independent Charter District
## 79724                                                 7-Independent Charter District
## 79770 1-Regular local school district that is NOT a component of a supervisory union
## 79789 1-Regular local school district that is NOT a component of a supervisory union
## 79795 1-Regular local school district that is NOT a component of a supervisory union
## 79817 1-Regular local school district that is NOT a component of a supervisory union
## 79825 1-Regular local school district that is NOT a component of a supervisory union
## 79834 1-Regular local school district that is NOT a component of a supervisory union
## 79850 1-Regular local school district that is NOT a component of a supervisory union
## 79864                                                 7-Independent Charter District
## 79875                                                 7-Independent Charter District
## 79887                                                 7-Independent Charter District
## 79889                                                 7-Independent Charter District
## 79891                                                 7-Independent Charter District
## 79892                                                 7-Independent Charter District
## 79894         5-State agency providing elementary and/or secondary level instruction
## 79942 1-Regular local school district that is NOT a component of a supervisory union
## 79945                                     4-Regional Education Service Agency (RESA)
## 79946 1-Regular local school district that is NOT a component of a supervisory union
## 79959 1-Regular local school district that is NOT a component of a supervisory union
## 79974                                                 7-Independent Charter District
## 80014 1-Regular local school district that is NOT a component of a supervisory union
## 80015 1-Regular local school district that is NOT a component of a supervisory union
## 80073 1-Regular local school district that is NOT a component of a supervisory union
## 80104 1-Regular local school district that is NOT a component of a supervisory union
## 80225 1-Regular local school district that is NOT a component of a supervisory union
## 80241 1-Regular local school district that is NOT a component of a supervisory union
## 80273 1-Regular local school district that is NOT a component of a supervisory union
## 80286                                     4-Regional Education Service Agency (RESA)
## 80443 1-Regular local school district that is NOT a component of a supervisory union
## 80474 1-Regular local school district that is NOT a component of a supervisory union
## 80477                                     4-Regional Education Service Agency (RESA)
## 80479         5-State agency providing elementary and/or secondary level instruction
## 80480                                     4-Regional Education Service Agency (RESA)
## 80569 1-Regular local school district that is NOT a component of a supervisory union
## 80570 1-Regular local school district that is NOT a component of a supervisory union
## 80603 1-Regular local school district that is NOT a component of a supervisory union
## 80604 1-Regular local school district that is NOT a component of a supervisory union
## 80605 1-Regular local school district that is NOT a component of a supervisory union
## 80615 1-Regular local school district that is NOT a component of a supervisory union
## 80653 1-Regular local school district that is NOT a component of a supervisory union
## 80752                                                 7-Independent Charter District
## 80789 1-Regular local school district that is NOT a component of a supervisory union
## 80834 1-Regular local school district that is NOT a component of a supervisory union
## 80835 1-Regular local school district that is NOT a component of a supervisory union
## 80885 1-Regular local school district that is NOT a component of a supervisory union
## 80889 1-Regular local school district that is NOT a component of a supervisory union
## 80891 1-Regular local school district that is NOT a component of a supervisory union
## 80892 1-Regular local school district that is NOT a component of a supervisory union
## 80893 1-Regular local school district that is NOT a component of a supervisory union
## 80900 1-Regular local school district that is NOT a component of a supervisory union
## 80920 1-Regular local school district that is NOT a component of a supervisory union
## 80928 1-Regular local school district that is NOT a component of a supervisory union
## 80929 1-Regular local school district that is NOT a component of a supervisory union
## 80944 1-Regular local school district that is NOT a component of a supervisory union
## 80969 1-Regular local school district that is NOT a component of a supervisory union
## 80990 1-Regular local school district that is NOT a component of a supervisory union
## 80991 1-Regular local school district that is NOT a component of a supervisory union
## 81005                                     4-Regional Education Service Agency (RESA)
## 81039 1-Regular local school district that is NOT a component of a supervisory union
## 81041 1-Regular local school district that is NOT a component of a supervisory union
## 81048 1-Regular local school district that is NOT a component of a supervisory union
## 81067 1-Regular local school district that is NOT a component of a supervisory union
## 81093 1-Regular local school district that is NOT a component of a supervisory union
## 81094 1-Regular local school district that is NOT a component of a supervisory union
## 81149                                           9-Specialized public school district
## 81217                                     4-Regional Education Service Agency (RESA)
## 81306                                                 7-Independent Charter District
## 81307 1-Regular local school district that is NOT a component of a supervisory union
## 81314 1-Regular local school district that is NOT a component of a supervisory union
## 81328                                                 7-Independent Charter District
## 81346 1-Regular local school district that is NOT a component of a supervisory union
## 81359                                                 7-Independent Charter District
## 81364 1-Regular local school district that is NOT a component of a supervisory union
## 81376                                                 7-Independent Charter District
## 81384                                                 7-Independent Charter District
## 81401 1-Regular local school district that is NOT a component of a supervisory union
## 81411 1-Regular local school district that is NOT a component of a supervisory union
## 81434 1-Regular local school district that is NOT a component of a supervisory union
## 81621 1-Regular local school district that is NOT a component of a supervisory union
## 81653 1-Regular local school district that is NOT a component of a supervisory union
## 81654 1-Regular local school district that is NOT a component of a supervisory union
## 81665 1-Regular local school district that is NOT a component of a supervisory union
## 81669 1-Regular local school district that is NOT a component of a supervisory union
## 81670 1-Regular local school district that is NOT a component of a supervisory union
## 81681 1-Regular local school district that is NOT a component of a supervisory union
## 81702                                     4-Regional Education Service Agency (RESA)
## 81709 1-Regular local school district that is NOT a component of a supervisory union
## 81761                                                 7-Independent Charter District
## 81771 1-Regular local school district that is NOT a component of a supervisory union
## 81772 1-Regular local school district that is NOT a component of a supervisory union
## 81778 1-Regular local school district that is NOT a component of a supervisory union
## 81817 1-Regular local school district that is NOT a component of a supervisory union
## 81818 1-Regular local school district that is NOT a component of a supervisory union
## 81848 1-Regular local school district that is NOT a component of a supervisory union
## 81854 1-Regular local school district that is NOT a component of a supervisory union
## 81855 1-Regular local school district that is NOT a component of a supervisory union
## 81857 1-Regular local school district that is NOT a component of a supervisory union
## 81882 1-Regular local school district that is NOT a component of a supervisory union
## 81894 1-Regular local school district that is NOT a component of a supervisory union
## 81917 1-Regular local school district that is NOT a component of a supervisory union
## 81918 1-Regular local school district that is NOT a component of a supervisory union
## 81919                                     4-Regional Education Service Agency (RESA)
## 81920 1-Regular local school district that is NOT a component of a supervisory union
## 81938                                                 7-Independent Charter District
## 81941                                                 7-Independent Charter District
## 81942                                                 7-Independent Charter District
## 81943                                                 7-Independent Charter District
## 81944                                                 7-Independent Charter District
## 81945                                                 7-Independent Charter District
## 81978 1-Regular local school district that is NOT a component of a supervisory union
## 82019 1-Regular local school district that is NOT a component of a supervisory union
## 82029 1-Regular local school district that is NOT a component of a supervisory union
## 82053 1-Regular local school district that is NOT a component of a supervisory union
## 82064                                                 7-Independent Charter District
## 82078 1-Regular local school district that is NOT a component of a supervisory union
## 82096         5-State agency providing elementary and/or secondary level instruction
## 82123 1-Regular local school district that is NOT a component of a supervisory union
## 82125             2-Local school district that is a component of a supervisory union
## 82138 1-Regular local school district that is NOT a component of a supervisory union
## 82159 1-Regular local school district that is NOT a component of a supervisory union
## 82186 1-Regular local school district that is NOT a component of a supervisory union
## 82297 1-Regular local school district that is NOT a component of a supervisory union
## 82353 1-Regular local school district that is NOT a component of a supervisory union
## 82355 1-Regular local school district that is NOT a component of a supervisory union
## 82372         5-State agency providing elementary and/or secondary level instruction
## 82376 1-Regular local school district that is NOT a component of a supervisory union
## 82377 1-Regular local school district that is NOT a component of a supervisory union
## 82381 1-Regular local school district that is NOT a component of a supervisory union
## 82472                                                 7-Independent Charter District
## 82487 1-Regular local school district that is NOT a component of a supervisory union
## 82497 1-Regular local school district that is NOT a component of a supervisory union
## 82525                                                 7-Independent Charter District
## 82548                                                 7-Independent Charter District
## 82549                                                 7-Independent Charter District
## 82575         5-State agency providing elementary and/or secondary level instruction
## 82576 1-Regular local school district that is NOT a component of a supervisory union
## 82581                                                 7-Independent Charter District
## 82606 1-Regular local school district that is NOT a component of a supervisory union
## 82618 1-Regular local school district that is NOT a component of a supervisory union
## 82619 1-Regular local school district that is NOT a component of a supervisory union
## 82677 1-Regular local school district that is NOT a component of a supervisory union
## 82678 1-Regular local school district that is NOT a component of a supervisory union
## 82679 1-Regular local school district that is NOT a component of a supervisory union
## 82680 1-Regular local school district that is NOT a component of a supervisory union
## 82683 1-Regular local school district that is NOT a component of a supervisory union
## 82694 1-Regular local school district that is NOT a component of a supervisory union
## 82717                                                 7-Independent Charter District
## 82718 1-Regular local school district that is NOT a component of a supervisory union
## 82742 1-Regular local school district that is NOT a component of a supervisory union
## 82752 1-Regular local school district that is NOT a component of a supervisory union
## 82787         5-State agency providing elementary and/or secondary level instruction
## 82788 1-Regular local school district that is NOT a component of a supervisory union
## 82793         5-State agency providing elementary and/or secondary level instruction
## 82848         5-State agency providing elementary and/or secondary level instruction
## 82877         5-State agency providing elementary and/or secondary level instruction
## 82880                                                 7-Independent Charter District
## 82888                                     4-Regional Education Service Agency (RESA)
## 82928 1-Regular local school district that is NOT a component of a supervisory union
## 82949         5-State agency providing elementary and/or secondary level instruction
## 82958         5-State agency providing elementary and/or secondary level instruction
## 82967 1-Regular local school district that is NOT a component of a supervisory union
## 82975                                                 7-Independent Charter District
## 82996 1-Regular local school district that is NOT a component of a supervisory union
## 83016 1-Regular local school district that is NOT a component of a supervisory union
## 83040 1-Regular local school district that is NOT a component of a supervisory union
## 83041         5-State agency providing elementary and/or secondary level instruction
## 83045                                                 7-Independent Charter District
## 83058 1-Regular local school district that is NOT a component of a supervisory union
## 83096                                     4-Regional Education Service Agency (RESA)
## 83107 1-Regular local school district that is NOT a component of a supervisory union
## 83111         5-State agency providing elementary and/or secondary level instruction
## 83142 1-Regular local school district that is NOT a component of a supervisory union
## 83179 1-Regular local school district that is NOT a component of a supervisory union
## 83189 1-Regular local school district that is NOT a component of a supervisory union
## 83192                                                 7-Independent Charter District
## 83199 1-Regular local school district that is NOT a component of a supervisory union
## 83223         5-State agency providing elementary and/or secondary level instruction
## 83233                                     4-Regional Education Service Agency (RESA)
## 83254         5-State agency providing elementary and/or secondary level instruction
## 83255         5-State agency providing elementary and/or secondary level instruction
## 83288 1-Regular local school district that is NOT a component of a supervisory union
## 83297 1-Regular local school district that is NOT a component of a supervisory union
## 83305 1-Regular local school district that is NOT a component of a supervisory union
## 83306 1-Regular local school district that is NOT a component of a supervisory union
## 83313 1-Regular local school district that is NOT a component of a supervisory union
## 83315 1-Regular local school district that is NOT a component of a supervisory union
## 83322 1-Regular local school district that is NOT a component of a supervisory union
## 83337 1-Regular local school district that is NOT a component of a supervisory union
## 83387 1-Regular local school district that is NOT a component of a supervisory union
## 83389 1-Regular local school district that is NOT a component of a supervisory union
## 83393 1-Regular local school district that is NOT a component of a supervisory union
## 83395 1-Regular local school district that is NOT a component of a supervisory union
## 83398 1-Regular local school district that is NOT a component of a supervisory union
## 83408 1-Regular local school district that is NOT a component of a supervisory union
## 83409 1-Regular local school district that is NOT a component of a supervisory union
## 83410 1-Regular local school district that is NOT a component of a supervisory union
## 83411 1-Regular local school district that is NOT a component of a supervisory union
## 83412 1-Regular local school district that is NOT a component of a supervisory union
## 83416 1-Regular local school district that is NOT a component of a supervisory union
## 83417 1-Regular local school district that is NOT a component of a supervisory union
## 83419 1-Regular local school district that is NOT a component of a supervisory union
## 83425 1-Regular local school district that is NOT a component of a supervisory union
## 83430 1-Regular local school district that is NOT a component of a supervisory union
## 83436                                                 7-Independent Charter District
## 83437                                                 7-Independent Charter District
## 83446 1-Regular local school district that is NOT a component of a supervisory union
## 83485 1-Regular local school district that is NOT a component of a supervisory union
## 83527 1-Regular local school district that is NOT a component of a supervisory union
## 83549 1-Regular local school district that is NOT a component of a supervisory union
## 83550 1-Regular local school district that is NOT a component of a supervisory union
## 83555 1-Regular local school district that is NOT a component of a supervisory union
## 83562 1-Regular local school district that is NOT a component of a supervisory union
## 83589 1-Regular local school district that is NOT a component of a supervisory union
## 83615 1-Regular local school district that is NOT a component of a supervisory union
## 83617 1-Regular local school district that is NOT a component of a supervisory union
## 83621         5-State agency providing elementary and/or secondary level instruction
## 83644 1-Regular local school district that is NOT a component of a supervisory union
## 83675 1-Regular local school district that is NOT a component of a supervisory union
## 83693 1-Regular local school district that is NOT a component of a supervisory union
## 83694 1-Regular local school district that is NOT a component of a supervisory union
## 83695 1-Regular local school district that is NOT a component of a supervisory union
## 83774 1-Regular local school district that is NOT a component of a supervisory union
## 83775         5-State agency providing elementary and/or secondary level instruction
## 83781 1-Regular local school district that is NOT a component of a supervisory union
## 83783 1-Regular local school district that is NOT a component of a supervisory union
## 83805 1-Regular local school district that is NOT a component of a supervisory union
## 83816 1-Regular local school district that is NOT a component of a supervisory union
## 83835 1-Regular local school district that is NOT a component of a supervisory union
## 83841 1-Regular local school district that is NOT a component of a supervisory union
## 83867 1-Regular local school district that is NOT a component of a supervisory union
## 83886 1-Regular local school district that is NOT a component of a supervisory union
## 83888 1-Regular local school district that is NOT a component of a supervisory union
## 83912 1-Regular local school district that is NOT a component of a supervisory union
## 83927 1-Regular local school district that is NOT a component of a supervisory union
## 83947 1-Regular local school district that is NOT a component of a supervisory union
## 83957 1-Regular local school district that is NOT a component of a supervisory union
## 83958         5-State agency providing elementary and/or secondary level instruction
## 83995 1-Regular local school district that is NOT a component of a supervisory union
## 84024                                     4-Regional Education Service Agency (RESA)
## 84061 1-Regular local school district that is NOT a component of a supervisory union
## 84094                                                 7-Independent Charter District
## 84100 1-Regular local school district that is NOT a component of a supervisory union
## 84121 1-Regular local school district that is NOT a component of a supervisory union
## 84122 1-Regular local school district that is NOT a component of a supervisory union
## 84128 1-Regular local school district that is NOT a component of a supervisory union
## 84129 1-Regular local school district that is NOT a component of a supervisory union
## 84130 1-Regular local school district that is NOT a component of a supervisory union
## 84132 1-Regular local school district that is NOT a component of a supervisory union
## 84135 1-Regular local school district that is NOT a component of a supervisory union
## 84138 1-Regular local school district that is NOT a component of a supervisory union
## 84141 1-Regular local school district that is NOT a component of a supervisory union
## 84289         5-State agency providing elementary and/or secondary level instruction
## 84314 1-Regular local school district that is NOT a component of a supervisory union
## 84315 1-Regular local school district that is NOT a component of a supervisory union
## 84316 1-Regular local school district that is NOT a component of a supervisory union
## 84364                                                 7-Independent Charter District
## 84381 1-Regular local school district that is NOT a component of a supervisory union
## 84414 1-Regular local school district that is NOT a component of a supervisory union
## 84442                                                 7-Independent Charter District
## 84521                                           9-Specialized public school district
## 84524                                           9-Specialized public school district
## 84525                                           9-Specialized public school district
## 84526                                           9-Specialized public school district
## 84527                                           9-Specialized public school district
## 84528                                           9-Specialized public school district
## 84529                                           9-Specialized public school district
## 84530                                           9-Specialized public school district
## 84535                                                 7-Independent Charter District
## 84591 1-Regular local school district that is NOT a component of a supervisory union
## 84599 1-Regular local school district that is NOT a component of a supervisory union
## 84624                                                 7-Independent Charter District
## 84679                                                 7-Independent Charter District
## 84684 1-Regular local school district that is NOT a component of a supervisory union
## 84717 1-Regular local school district that is NOT a component of a supervisory union
## 84791 1-Regular local school district that is NOT a component of a supervisory union
## 84822 1-Regular local school district that is NOT a component of a supervisory union
## 84857 1-Regular local school district that is NOT a component of a supervisory union
## 84910 1-Regular local school district that is NOT a component of a supervisory union
## 84912 1-Regular local school district that is NOT a component of a supervisory union
## 84913 1-Regular local school district that is NOT a component of a supervisory union
## 84940 1-Regular local school district that is NOT a component of a supervisory union
## 85144 1-Regular local school district that is NOT a component of a supervisory union
## 85152 1-Regular local school district that is NOT a component of a supervisory union
## 85280 1-Regular local school district that is NOT a component of a supervisory union
## 85282 1-Regular local school district that is NOT a component of a supervisory union
## 85283 1-Regular local school district that is NOT a component of a supervisory union
## 85289 1-Regular local school district that is NOT a component of a supervisory union
## 85292 1-Regular local school district that is NOT a component of a supervisory union
## 85295                                                 7-Independent Charter District
## 85296                                                 7-Independent Charter District
## 85301 1-Regular local school district that is NOT a component of a supervisory union
## 85305 1-Regular local school district that is NOT a component of a supervisory union
## 85353                                     4-Regional Education Service Agency (RESA)
## 85356 1-Regular local school district that is NOT a component of a supervisory union
## 85357                                     4-Regional Education Service Agency (RESA)
## 85362 1-Regular local school district that is NOT a component of a supervisory union
## 85365                                     4-Regional Education Service Agency (RESA)
## 85398                                     4-Regional Education Service Agency (RESA)
## 85399                                                     8-Other education agencies
## 85400                                                     8-Other education agencies
## 85402                                                     8-Other education agencies
## 85403                                                     8-Other education agencies
## 85404                                                 7-Independent Charter District
## 85412                                     4-Regional Education Service Agency (RESA)
## 85413                                                 7-Independent Charter District
## 85435 1-Regular local school district that is NOT a component of a supervisory union
## 85534 1-Regular local school district that is NOT a component of a supervisory union
## 85589                                                 7-Independent Charter District
## 85590                                                 7-Independent Charter District
## 85591                                                 7-Independent Charter District
## 85606                                                 7-Independent Charter District
## 85630 1-Regular local school district that is NOT a component of a supervisory union
## 85642 1-Regular local school district that is NOT a component of a supervisory union
## 85660 1-Regular local school district that is NOT a component of a supervisory union
## 85688 1-Regular local school district that is NOT a component of a supervisory union
## 85689 1-Regular local school district that is NOT a component of a supervisory union
## 85692 1-Regular local school district that is NOT a component of a supervisory union
## 85697 1-Regular local school district that is NOT a component of a supervisory union
## 85733 1-Regular local school district that is NOT a component of a supervisory union
## 85738 1-Regular local school district that is NOT a component of a supervisory union
## 85741 1-Regular local school district that is NOT a component of a supervisory union
## 85757                                                 7-Independent Charter District
## 85768                                                 7-Independent Charter District
## 85785 1-Regular local school district that is NOT a component of a supervisory union
## 85790 1-Regular local school district that is NOT a component of a supervisory union
## 85791 1-Regular local school district that is NOT a component of a supervisory union
## 85795 1-Regular local school district that is NOT a component of a supervisory union
## 85831 1-Regular local school district that is NOT a component of a supervisory union
## 85969 1-Regular local school district that is NOT a component of a supervisory union
## 85970 1-Regular local school district that is NOT a component of a supervisory union
## 85971 1-Regular local school district that is NOT a component of a supervisory union
## 85973 1-Regular local school district that is NOT a component of a supervisory union
## 85974 1-Regular local school district that is NOT a component of a supervisory union
## 86024 1-Regular local school district that is NOT a component of a supervisory union
## 86049 1-Regular local school district that is NOT a component of a supervisory union
## 86051 1-Regular local school district that is NOT a component of a supervisory union
## 86052 1-Regular local school district that is NOT a component of a supervisory union
## 86065 1-Regular local school district that is NOT a component of a supervisory union
## 86067 1-Regular local school district that is NOT a component of a supervisory union
## 86081 1-Regular local school district that is NOT a component of a supervisory union
## 86096 1-Regular local school district that is NOT a component of a supervisory union
## 86101 1-Regular local school district that is NOT a component of a supervisory union
## 86180 1-Regular local school district that is NOT a component of a supervisory union
## 86205 1-Regular local school district that is NOT a component of a supervisory union
## 86233 1-Regular local school district that is NOT a component of a supervisory union
## 86234 1-Regular local school district that is NOT a component of a supervisory union
## 86235 1-Regular local school district that is NOT a component of a supervisory union
## 86254                                     4-Regional Education Service Agency (RESA)
## 86342 1-Regular local school district that is NOT a component of a supervisory union
## 86438 1-Regular local school district that is NOT a component of a supervisory union
## 86494                                                 7-Independent Charter District
## 86498                                                 7-Independent Charter District
## 86499                                                 7-Independent Charter District
## 86503 1-Regular local school district that is NOT a component of a supervisory union
## 86504 1-Regular local school district that is NOT a component of a supervisory union
## 86506 1-Regular local school district that is NOT a component of a supervisory union
## 86511                                                 7-Independent Charter District
## 86522 1-Regular local school district that is NOT a component of a supervisory union
## 86533         5-State agency providing elementary and/or secondary level instruction
## 86570 1-Regular local school district that is NOT a component of a supervisory union
## 86584 1-Regular local school district that is NOT a component of a supervisory union
## 86585 1-Regular local school district that is NOT a component of a supervisory union
## 86593 1-Regular local school district that is NOT a component of a supervisory union
## 86616 1-Regular local school district that is NOT a component of a supervisory union
## 86640 1-Regular local school district that is NOT a component of a supervisory union
## 86691 1-Regular local school district that is NOT a component of a supervisory union
## 86693 1-Regular local school district that is NOT a component of a supervisory union
## 86781 1-Regular local school district that is NOT a component of a supervisory union
## 86782 1-Regular local school district that is NOT a component of a supervisory union
## 86788 1-Regular local school district that is NOT a component of a supervisory union
## 86827 1-Regular local school district that is NOT a component of a supervisory union
## 86828 1-Regular local school district that is NOT a component of a supervisory union
## 86829 1-Regular local school district that is NOT a component of a supervisory union
## 86831 1-Regular local school district that is NOT a component of a supervisory union
## 86832 1-Regular local school district that is NOT a component of a supervisory union
## 86834 1-Regular local school district that is NOT a component of a supervisory union
## 86835 1-Regular local school district that is NOT a component of a supervisory union
## 86839 1-Regular local school district that is NOT a component of a supervisory union
## 86892 1-Regular local school district that is NOT a component of a supervisory union
## 86893 1-Regular local school district that is NOT a component of a supervisory union
## 86898 1-Regular local school district that is NOT a component of a supervisory union
## 86906 1-Regular local school district that is NOT a component of a supervisory union
## 86917 1-Regular local school district that is NOT a component of a supervisory union
## 86966 1-Regular local school district that is NOT a component of a supervisory union
## 86967 1-Regular local school district that is NOT a component of a supervisory union
## 86970 1-Regular local school district that is NOT a component of a supervisory union
## 86971 1-Regular local school district that is NOT a component of a supervisory union
## 86984 1-Regular local school district that is NOT a component of a supervisory union
## 86985 1-Regular local school district that is NOT a component of a supervisory union
## 86991 1-Regular local school district that is NOT a component of a supervisory union
## 87055 1-Regular local school district that is NOT a component of a supervisory union
## 87058 1-Regular local school district that is NOT a component of a supervisory union
## 87061 1-Regular local school district that is NOT a component of a supervisory union
## 87097 1-Regular local school district that is NOT a component of a supervisory union
## 87099 1-Regular local school district that is NOT a component of a supervisory union
## 87101 1-Regular local school district that is NOT a component of a supervisory union
## 87107                                     4-Regional Education Service Agency (RESA)
## 87125                                                 7-Independent Charter District
## 87126                                                 7-Independent Charter District
## 87127 1-Regular local school district that is NOT a component of a supervisory union
## 87148 1-Regular local school district that is NOT a component of a supervisory union
## 87151 1-Regular local school district that is NOT a component of a supervisory union
## 87152 1-Regular local school district that is NOT a component of a supervisory union
## 87158                                                 7-Independent Charter District
## 87243                                                 7-Independent Charter District
## 87251 1-Regular local school district that is NOT a component of a supervisory union
## 87284         5-State agency providing elementary and/or secondary level instruction
## 87331 1-Regular local school district that is NOT a component of a supervisory union
## 87332 1-Regular local school district that is NOT a component of a supervisory union
## 87341 1-Regular local school district that is NOT a component of a supervisory union
## 87342 1-Regular local school district that is NOT a component of a supervisory union
## 87343 1-Regular local school district that is NOT a component of a supervisory union
## 87346         5-State agency providing elementary and/or secondary level instruction
## 87347         5-State agency providing elementary and/or secondary level instruction
## 87401 1-Regular local school district that is NOT a component of a supervisory union
## 87407 1-Regular local school district that is NOT a component of a supervisory union
## 87430 1-Regular local school district that is NOT a component of a supervisory union
## 87447                                                 7-Independent Charter District
## 87456 1-Regular local school district that is NOT a component of a supervisory union
## 87457 1-Regular local school district that is NOT a component of a supervisory union
## 87465 1-Regular local school district that is NOT a component of a supervisory union
## 87487 1-Regular local school district that is NOT a component of a supervisory union
## 87501 1-Regular local school district that is NOT a component of a supervisory union
## 87505                                                 7-Independent Charter District
## 87511                                                 7-Independent Charter District
## 87519 1-Regular local school district that is NOT a component of a supervisory union
## 87521         5-State agency providing elementary and/or secondary level instruction
## 87523                                     4-Regional Education Service Agency (RESA)
## 87525                                                 7-Independent Charter District
## 87532 1-Regular local school district that is NOT a component of a supervisory union
## 87535 1-Regular local school district that is NOT a component of a supervisory union
## 87542 1-Regular local school district that is NOT a component of a supervisory union
## 87555 1-Regular local school district that is NOT a component of a supervisory union
## 87570 1-Regular local school district that is NOT a component of a supervisory union
## 87590 1-Regular local school district that is NOT a component of a supervisory union
## 87603                                                 7-Independent Charter District
## 87604                                                 7-Independent Charter District
## 87605                                                 7-Independent Charter District
## 87608 1-Regular local school district that is NOT a component of a supervisory union
## 87611                                                 7-Independent Charter District
## 87617                                                 7-Independent Charter District
## 87618 1-Regular local school district that is NOT a component of a supervisory union
## 87623 1-Regular local school district that is NOT a component of a supervisory union
## 87636 1-Regular local school district that is NOT a component of a supervisory union
## 87639                                     4-Regional Education Service Agency (RESA)
## 87640 1-Regular local school district that is NOT a component of a supervisory union
## 87648                                                 7-Independent Charter District
## 87662 1-Regular local school district that is NOT a component of a supervisory union
## 87663                                                 7-Independent Charter District
## 87664 1-Regular local school district that is NOT a component of a supervisory union
## 87676 1-Regular local school district that is NOT a component of a supervisory union
## 87749 1-Regular local school district that is NOT a component of a supervisory union
## 87752 1-Regular local school district that is NOT a component of a supervisory union
## 87775 1-Regular local school district that is NOT a component of a supervisory union
## 87828 1-Regular local school district that is NOT a component of a supervisory union
## 87832                                                 7-Independent Charter District
## 87833                                                 7-Independent Charter District
## 87880 1-Regular local school district that is NOT a component of a supervisory union
## 87915 1-Regular local school district that is NOT a component of a supervisory union
## 87931 1-Regular local school district that is NOT a component of a supervisory union
## 87963 1-Regular local school district that is NOT a component of a supervisory union
## 87997 1-Regular local school district that is NOT a component of a supervisory union
## 88027         5-State agency providing elementary and/or secondary level instruction
## 88044 1-Regular local school district that is NOT a component of a supervisory union
## 88153 1-Regular local school district that is NOT a component of a supervisory union
## 88164 1-Regular local school district that is NOT a component of a supervisory union
## 88171 1-Regular local school district that is NOT a component of a supervisory union
## 88172 1-Regular local school district that is NOT a component of a supervisory union
## 88173 1-Regular local school district that is NOT a component of a supervisory union
## 88191 1-Regular local school district that is NOT a component of a supervisory union
## 88212 1-Regular local school district that is NOT a component of a supervisory union
## 88265                                                 7-Independent Charter District
## 88266                                                 7-Independent Charter District
## 88281         5-State agency providing elementary and/or secondary level instruction
## 88283                                     4-Regional Education Service Agency (RESA)
## 88314 1-Regular local school district that is NOT a component of a supervisory union
## 88394 1-Regular local school district that is NOT a component of a supervisory union
## 88418                                                 7-Independent Charter District
## 88419 1-Regular local school district that is NOT a component of a supervisory union
## 88420 1-Regular local school district that is NOT a component of a supervisory union
## 88421 1-Regular local school district that is NOT a component of a supervisory union
## 88423 1-Regular local school district that is NOT a component of a supervisory union
## 88445 1-Regular local school district that is NOT a component of a supervisory union
## 88446 1-Regular local school district that is NOT a component of a supervisory union
## 88449 1-Regular local school district that is NOT a component of a supervisory union
## 88500 1-Regular local school district that is NOT a component of a supervisory union
## 88509 1-Regular local school district that is NOT a component of a supervisory union
## 88586 1-Regular local school district that is NOT a component of a supervisory union
## 88590 1-Regular local school district that is NOT a component of a supervisory union
## 88595                                                 7-Independent Charter District
## 88640 1-Regular local school district that is NOT a component of a supervisory union
## 88672 1-Regular local school district that is NOT a component of a supervisory union
## 88706 1-Regular local school district that is NOT a component of a supervisory union
## 88707 1-Regular local school district that is NOT a component of a supervisory union
## 88708 1-Regular local school district that is NOT a component of a supervisory union
## 88709 1-Regular local school district that is NOT a component of a supervisory union
## 88753 1-Regular local school district that is NOT a component of a supervisory union
## 88760 1-Regular local school district that is NOT a component of a supervisory union
## 88893 1-Regular local school district that is NOT a component of a supervisory union
## 88894 1-Regular local school district that is NOT a component of a supervisory union
## 88918 1-Regular local school district that is NOT a component of a supervisory union
## 88926 1-Regular local school district that is NOT a component of a supervisory union
## 88928                                     4-Regional Education Service Agency (RESA)
## 88931 1-Regular local school district that is NOT a component of a supervisory union
## 88932 1-Regular local school district that is NOT a component of a supervisory union
## 88957 1-Regular local school district that is NOT a component of a supervisory union
## 88966 1-Regular local school district that is NOT a component of a supervisory union
## 88969 1-Regular local school district that is NOT a component of a supervisory union
## 89013 1-Regular local school district that is NOT a component of a supervisory union
## 89016 1-Regular local school district that is NOT a component of a supervisory union
## 89023 1-Regular local school district that is NOT a component of a supervisory union
## 89025                                                 7-Independent Charter District
## 89065         5-State agency providing elementary and/or secondary level instruction
## 89069 1-Regular local school district that is NOT a component of a supervisory union
## 89105                                     4-Regional Education Service Agency (RESA)
## 89106                                                 7-Independent Charter District
## 89107 1-Regular local school district that is NOT a component of a supervisory union
## 89108 1-Regular local school district that is NOT a component of a supervisory union
## 89109 1-Regular local school district that is NOT a component of a supervisory union
## 89130                                     4-Regional Education Service Agency (RESA)
## 89153                                     4-Regional Education Service Agency (RESA)
## 89210 1-Regular local school district that is NOT a component of a supervisory union
## 89211 1-Regular local school district that is NOT a component of a supervisory union
## 89212 1-Regular local school district that is NOT a component of a supervisory union
## 89247 1-Regular local school district that is NOT a component of a supervisory union
## 89274                                                 7-Independent Charter District
## 89353 1-Regular local school district that is NOT a component of a supervisory union
## 89406 1-Regular local school district that is NOT a component of a supervisory union
## 89414 1-Regular local school district that is NOT a component of a supervisory union
## 89417                                                 7-Independent Charter District
## 89433 1-Regular local school district that is NOT a component of a supervisory union
## 89447         5-State agency providing elementary and/or secondary level instruction
## 89448                                                 7-Independent Charter District
## 89449                                                 7-Independent Charter District
## 89450                                                 7-Independent Charter District
## 89451                                                 7-Independent Charter District
## 89453                                                 7-Independent Charter District
## 89454         5-State agency providing elementary and/or secondary level instruction
## 89480 1-Regular local school district that is NOT a component of a supervisory union
## 89481 1-Regular local school district that is NOT a component of a supervisory union
## 89531 1-Regular local school district that is NOT a component of a supervisory union
## 89533 1-Regular local school district that is NOT a component of a supervisory union
## 89554 1-Regular local school district that is NOT a component of a supervisory union
## 89569 1-Regular local school district that is NOT a component of a supervisory union
## 89601 1-Regular local school district that is NOT a component of a supervisory union
## 89604 1-Regular local school district that is NOT a component of a supervisory union
## 89609 1-Regular local school district that is NOT a component of a supervisory union
## 89636 1-Regular local school district that is NOT a component of a supervisory union
## 89638 1-Regular local school district that is NOT a component of a supervisory union
## 89744 1-Regular local school district that is NOT a component of a supervisory union
## 89769 1-Regular local school district that is NOT a component of a supervisory union
## 89778 1-Regular local school district that is NOT a component of a supervisory union
## 89783 1-Regular local school district that is NOT a component of a supervisory union
## 89788                                     4-Regional Education Service Agency (RESA)
## 89826 1-Regular local school district that is NOT a component of a supervisory union
## 89890 1-Regular local school district that is NOT a component of a supervisory union
## 89900 1-Regular local school district that is NOT a component of a supervisory union
## 89902 1-Regular local school district that is NOT a component of a supervisory union
## 89919 1-Regular local school district that is NOT a component of a supervisory union
## 89920 1-Regular local school district that is NOT a component of a supervisory union
## 89921 1-Regular local school district that is NOT a component of a supervisory union
## 89922                                                 7-Independent Charter District
## 89923 1-Regular local school district that is NOT a component of a supervisory union
## 89924 1-Regular local school district that is NOT a component of a supervisory union
## 89925 1-Regular local school district that is NOT a component of a supervisory union
## 89950         5-State agency providing elementary and/or secondary level instruction
## 89973 1-Regular local school district that is NOT a component of a supervisory union
## 90028 1-Regular local school district that is NOT a component of a supervisory union
## 90050 1-Regular local school district that is NOT a component of a supervisory union
## 90102 1-Regular local school district that is NOT a component of a supervisory union
## 90115 1-Regular local school district that is NOT a component of a supervisory union
## 90117 1-Regular local school district that is NOT a component of a supervisory union
## 90134 1-Regular local school district that is NOT a component of a supervisory union
## 90154         5-State agency providing elementary and/or secondary level instruction
## 90167 1-Regular local school district that is NOT a component of a supervisory union
## 90175 1-Regular local school district that is NOT a component of a supervisory union
## 90176 1-Regular local school district that is NOT a component of a supervisory union
## 90177 1-Regular local school district that is NOT a component of a supervisory union
## 90204 1-Regular local school district that is NOT a component of a supervisory union
## 90207 1-Regular local school district that is NOT a component of a supervisory union
## 90221 1-Regular local school district that is NOT a component of a supervisory union
## 90249 1-Regular local school district that is NOT a component of a supervisory union
## 90255 1-Regular local school district that is NOT a component of a supervisory union
## 90256 1-Regular local school district that is NOT a component of a supervisory union
## 90257 1-Regular local school district that is NOT a component of a supervisory union
## 90258 1-Regular local school district that is NOT a component of a supervisory union
## 90281 1-Regular local school district that is NOT a component of a supervisory union
## 90325         5-State agency providing elementary and/or secondary level instruction
## 90347 1-Regular local school district that is NOT a component of a supervisory union
## 90348 1-Regular local school district that is NOT a component of a supervisory union
## 90383 1-Regular local school district that is NOT a component of a supervisory union
## 90385 1-Regular local school district that is NOT a component of a supervisory union
## 90386 1-Regular local school district that is NOT a component of a supervisory union
## 90387 1-Regular local school district that is NOT a component of a supervisory union
## 90405 1-Regular local school district that is NOT a component of a supervisory union
## 90414                                                 7-Independent Charter District
## 90520 1-Regular local school district that is NOT a component of a supervisory union
## 90531 1-Regular local school district that is NOT a component of a supervisory union
## 90532 1-Regular local school district that is NOT a component of a supervisory union
## 90533 1-Regular local school district that is NOT a component of a supervisory union
## 90541 1-Regular local school district that is NOT a component of a supervisory union
## 90569                                                 7-Independent Charter District
## 90570                                                 7-Independent Charter District
## 90571                                                 7-Independent Charter District
## 90572                                                 7-Independent Charter District
## 90573                                                 7-Independent Charter District
## 90574                                                 7-Independent Charter District
## 90575 1-Regular local school district that is NOT a component of a supervisory union
## 90576 1-Regular local school district that is NOT a component of a supervisory union
## 90578                                                 7-Independent Charter District
## 90615 1-Regular local school district that is NOT a component of a supervisory union
## 90619                                           9-Specialized public school district
## 90620                                           9-Specialized public school district
## 90621                                           9-Specialized public school district
## 90622                                           9-Specialized public school district
## 90623                                           9-Specialized public school district
## 90627 1-Regular local school district that is NOT a component of a supervisory union
## 90689                                                 7-Independent Charter District
## 90690                                                 7-Independent Charter District
## 90694 1-Regular local school district that is NOT a component of a supervisory union
## 90720                                                 7-Independent Charter District
## 90726                                     4-Regional Education Service Agency (RESA)
## 90748 1-Regular local school district that is NOT a component of a supervisory union
## 90787 1-Regular local school district that is NOT a component of a supervisory union
## 90802 1-Regular local school district that is NOT a component of a supervisory union
## 90807 1-Regular local school district that is NOT a component of a supervisory union
## 90810 1-Regular local school district that is NOT a component of a supervisory union
## 90825 1-Regular local school district that is NOT a component of a supervisory union
## 90831 1-Regular local school district that is NOT a component of a supervisory union
## 90835             2-Local school district that is a component of a supervisory union
## 90846                                                 7-Independent Charter District
## 90855                                     4-Regional Education Service Agency (RESA)
## 90856 1-Regular local school district that is NOT a component of a supervisory union
## 90858 1-Regular local school district that is NOT a component of a supervisory union
## 90879 1-Regular local school district that is NOT a component of a supervisory union
## 90951 1-Regular local school district that is NOT a component of a supervisory union
## 90952 1-Regular local school district that is NOT a component of a supervisory union
## 90953 1-Regular local school district that is NOT a component of a supervisory union
## 90981 1-Regular local school district that is NOT a component of a supervisory union
## 91064 1-Regular local school district that is NOT a component of a supervisory union
## 91146                                                 7-Independent Charter District
## 91180 1-Regular local school district that is NOT a component of a supervisory union
## 91223                                                 7-Independent Charter District
## 91266 1-Regular local school district that is NOT a component of a supervisory union
## 91274 1-Regular local school district that is NOT a component of a supervisory union
## 91277                                                 7-Independent Charter District
## 91293 1-Regular local school district that is NOT a component of a supervisory union
## 91298                                                 7-Independent Charter District
## 91322 1-Regular local school district that is NOT a component of a supervisory union
## 91345 1-Regular local school district that is NOT a component of a supervisory union
## 91367 1-Regular local school district that is NOT a component of a supervisory union
## 91377 1-Regular local school district that is NOT a component of a supervisory union
## 91425 1-Regular local school district that is NOT a component of a supervisory union
## 91468 1-Regular local school district that is NOT a component of a supervisory union
## 91481         5-State agency providing elementary and/or secondary level instruction
## 91528                                                 7-Independent Charter District
## 91537                                                 7-Independent Charter District
## 91543 1-Regular local school district that is NOT a component of a supervisory union
## 91544 1-Regular local school district that is NOT a component of a supervisory union
## 91586 1-Regular local school district that is NOT a component of a supervisory union
## 91587 1-Regular local school district that is NOT a component of a supervisory union
## 91607                                                 7-Independent Charter District
## 91622 1-Regular local school district that is NOT a component of a supervisory union
## 91682 1-Regular local school district that is NOT a component of a supervisory union
## 91709         5-State agency providing elementary and/or secondary level instruction
## 91724 1-Regular local school district that is NOT a component of a supervisory union
## 91761 1-Regular local school district that is NOT a component of a supervisory union
## 91781         5-State agency providing elementary and/or secondary level instruction
## 91813         5-State agency providing elementary and/or secondary level instruction
## 91827 1-Regular local school district that is NOT a component of a supervisory union
## 91841                                                 7-Independent Charter District
## 91868                                                 7-Independent Charter District
## 91872                                                 7-Independent Charter District
## 91873                                                 7-Independent Charter District
## 91898                                                 7-Independent Charter District
## 91899 1-Regular local school district that is NOT a component of a supervisory union
## 91923 1-Regular local school district that is NOT a component of a supervisory union
## 91928 1-Regular local school district that is NOT a component of a supervisory union
## 91950 1-Regular local school district that is NOT a component of a supervisory union
## 91975 1-Regular local school district that is NOT a component of a supervisory union
## 91979 1-Regular local school district that is NOT a component of a supervisory union
## 91988         5-State agency providing elementary and/or secondary level instruction
## 91998                                                 7-Independent Charter District
## 92024 1-Regular local school district that is NOT a component of a supervisory union
## 92100 1-Regular local school district that is NOT a component of a supervisory union
## 92120 1-Regular local school district that is NOT a component of a supervisory union
## 92183         5-State agency providing elementary and/or secondary level instruction
## 92189 1-Regular local school district that is NOT a component of a supervisory union
## 92217 1-Regular local school district that is NOT a component of a supervisory union
## 92258 1-Regular local school district that is NOT a component of a supervisory union
## 92275 1-Regular local school district that is NOT a component of a supervisory union
## 92365 1-Regular local school district that is NOT a component of a supervisory union
## 92369 1-Regular local school district that is NOT a component of a supervisory union
## 92385                                                 7-Independent Charter District
## 92422 1-Regular local school district that is NOT a component of a supervisory union
## 92423 1-Regular local school district that is NOT a component of a supervisory union
## 92489 1-Regular local school district that is NOT a component of a supervisory union
## 92490 1-Regular local school district that is NOT a component of a supervisory union
## 92493 1-Regular local school district that is NOT a component of a supervisory union
## 92494 1-Regular local school district that is NOT a component of a supervisory union
## 92495 1-Regular local school district that is NOT a component of a supervisory union
## 92519 1-Regular local school district that is NOT a component of a supervisory union
## 92526                                                 7-Independent Charter District
## 92547 1-Regular local school district that is NOT a component of a supervisory union
## 92555 1-Regular local school district that is NOT a component of a supervisory union
## 92632 1-Regular local school district that is NOT a component of a supervisory union
## 92693 1-Regular local school district that is NOT a component of a supervisory union
## 92700 1-Regular local school district that is NOT a component of a supervisory union
## 92754 1-Regular local school district that is NOT a component of a supervisory union
## 92763 1-Regular local school district that is NOT a component of a supervisory union
## 92771 1-Regular local school district that is NOT a component of a supervisory union
## 92791         5-State agency providing elementary and/or secondary level instruction
## 92792         5-State agency providing elementary and/or secondary level instruction
## 92870 1-Regular local school district that is NOT a component of a supervisory union
## 92972         5-State agency providing elementary and/or secondary level instruction
## 92974         5-State agency providing elementary and/or secondary level instruction
## 93049 1-Regular local school district that is NOT a component of a supervisory union
## 93051 1-Regular local school district that is NOT a component of a supervisory union
## 93052 1-Regular local school district that is NOT a component of a supervisory union
## 93053 1-Regular local school district that is NOT a component of a supervisory union
## 93054                                                 7-Independent Charter District
## 93055 1-Regular local school district that is NOT a component of a supervisory union
## 93056 1-Regular local school district that is NOT a component of a supervisory union
## 93057 1-Regular local school district that is NOT a component of a supervisory union
## 93058 1-Regular local school district that is NOT a component of a supervisory union
## 93059                                                 7-Independent Charter District
## 93068 1-Regular local school district that is NOT a component of a supervisory union
## 93116 1-Regular local school district that is NOT a component of a supervisory union
## 93117 1-Regular local school district that is NOT a component of a supervisory union
## 93120 1-Regular local school district that is NOT a component of a supervisory union
## 93154 1-Regular local school district that is NOT a component of a supervisory union
## 93349 1-Regular local school district that is NOT a component of a supervisory union
## 93394 1-Regular local school district that is NOT a component of a supervisory union
## 93416 1-Regular local school district that is NOT a component of a supervisory union
## 93433 1-Regular local school district that is NOT a component of a supervisory union
## 93434 1-Regular local school district that is NOT a component of a supervisory union
## 93438 1-Regular local school district that is NOT a component of a supervisory union
## 93457 1-Regular local school district that is NOT a component of a supervisory union
## 93459 1-Regular local school district that is NOT a component of a supervisory union
## 93466 1-Regular local school district that is NOT a component of a supervisory union
## 93490 1-Regular local school district that is NOT a component of a supervisory union
## 93519 1-Regular local school district that is NOT a component of a supervisory union
## 93520 1-Regular local school district that is NOT a component of a supervisory union
## 93521 1-Regular local school district that is NOT a component of a supervisory union
## 93680 1-Regular local school district that is NOT a component of a supervisory union
## 93685                                     4-Regional Education Service Agency (RESA)
## 93696 1-Regular local school district that is NOT a component of a supervisory union
## 93722         5-State agency providing elementary and/or secondary level instruction
## 93746                                           9-Specialized public school district
## 93747                                           9-Specialized public school district
## 93748                                           9-Specialized public school district
## 93749                                           9-Specialized public school district
## 93750                                           9-Specialized public school district
## 93752                                           9-Specialized public school district
## 93757 1-Regular local school district that is NOT a component of a supervisory union
## 93816         5-State agency providing elementary and/or secondary level instruction
## 93861 1-Regular local school district that is NOT a component of a supervisory union
## 93873 1-Regular local school district that is NOT a component of a supervisory union
## 93967 1-Regular local school district that is NOT a component of a supervisory union
## 93976 1-Regular local school district that is NOT a component of a supervisory union
## 94003 1-Regular local school district that is NOT a component of a supervisory union
## 94004 1-Regular local school district that is NOT a component of a supervisory union
## 94006 1-Regular local school district that is NOT a component of a supervisory union
## 94007                                                 7-Independent Charter District
## 94113                                                 7-Independent Charter District
## 94114 1-Regular local school district that is NOT a component of a supervisory union
## 94142 1-Regular local school district that is NOT a component of a supervisory union
## 94191 1-Regular local school district that is NOT a component of a supervisory union
## 94200 1-Regular local school district that is NOT a component of a supervisory union
## 94227 1-Regular local school district that is NOT a component of a supervisory union
## 94241 1-Regular local school district that is NOT a component of a supervisory union
## 94249 1-Regular local school district that is NOT a component of a supervisory union
## 94257 1-Regular local school district that is NOT a component of a supervisory union
## 94289 1-Regular local school district that is NOT a component of a supervisory union
## 94324 1-Regular local school district that is NOT a component of a supervisory union
## 94349                                     4-Regional Education Service Agency (RESA)
## 94362         5-State agency providing elementary and/or secondary level instruction
## 94369                                     4-Regional Education Service Agency (RESA)
## 94396 1-Regular local school district that is NOT a component of a supervisory union
## 94403 1-Regular local school district that is NOT a component of a supervisory union
## 94460 1-Regular local school district that is NOT a component of a supervisory union
## 94467 1-Regular local school district that is NOT a component of a supervisory union
## 94468                                     4-Regional Education Service Agency (RESA)
## 94501 1-Regular local school district that is NOT a component of a supervisory union
## 94534 1-Regular local school district that is NOT a component of a supervisory union
## 94535 1-Regular local school district that is NOT a component of a supervisory union
## 94696 1-Regular local school district that is NOT a component of a supervisory union
## 94701                                     4-Regional Education Service Agency (RESA)
## 94719 1-Regular local school district that is NOT a component of a supervisory union
## 94738 1-Regular local school district that is NOT a component of a supervisory union
## 94742 1-Regular local school district that is NOT a component of a supervisory union
## 94782 1-Regular local school district that is NOT a component of a supervisory union
## 94783 1-Regular local school district that is NOT a component of a supervisory union
## 94784 1-Regular local school district that is NOT a component of a supervisory union
## 94790 1-Regular local school district that is NOT a component of a supervisory union
## 94798 1-Regular local school district that is NOT a component of a supervisory union
## 94800 1-Regular local school district that is NOT a component of a supervisory union
## 94948 1-Regular local school district that is NOT a component of a supervisory union
## 94976                                                 7-Independent Charter District
## 94997 1-Regular local school district that is NOT a component of a supervisory union
## 95001 1-Regular local school district that is NOT a component of a supervisory union
## 95007 1-Regular local school district that is NOT a component of a supervisory union
## 95064 1-Regular local school district that is NOT a component of a supervisory union
## 95100 1-Regular local school district that is NOT a component of a supervisory union
## 95109 1-Regular local school district that is NOT a component of a supervisory union
## 95116 1-Regular local school district that is NOT a component of a supervisory union
## 95141 1-Regular local school district that is NOT a component of a supervisory union
## 95151                                     4-Regional Education Service Agency (RESA)
## 95176 1-Regular local school district that is NOT a component of a supervisory union
## 95198         5-State agency providing elementary and/or secondary level instruction
## 95199         5-State agency providing elementary and/or secondary level instruction
## 95200         5-State agency providing elementary and/or secondary level instruction
## 95206 1-Regular local school district that is NOT a component of a supervisory union
## 95232                                           9-Specialized public school district
## 95233                                           9-Specialized public school district
## 95234                                           9-Specialized public school district
## 95235                                           9-Specialized public school district
## 95236                                           9-Specialized public school district
## 95237                                           9-Specialized public school district
## 95238                                           9-Specialized public school district
## 95240                                           9-Specialized public school district
## 95241                                           9-Specialized public school district
## 95242                                           9-Specialized public school district
## 95243                                           9-Specialized public school district
## 95244                                           9-Specialized public school district
## 95245                                           9-Specialized public school district
## 95246                                           9-Specialized public school district
## 95247                                           9-Specialized public school district
## 95248                                           9-Specialized public school district
## 95249                                           9-Specialized public school district
## 95250                                           9-Specialized public school district
## 95251                                           9-Specialized public school district
## 95252                                           9-Specialized public school district
## 95254                                           9-Specialized public school district
## 95255                                           9-Specialized public school district
## 95256                                           9-Specialized public school district
## 95257                                           9-Specialized public school district
## 95258                                           9-Specialized public school district
## 95259                                           9-Specialized public school district
## 95261                                           9-Specialized public school district
## 95262                                           9-Specialized public school district
## 95263                                           9-Specialized public school district
## 95264                                           9-Specialized public school district
## 95265                                           9-Specialized public school district
## 95266                                           9-Specialized public school district
## 95267                                           9-Specialized public school district
## 95268                                           9-Specialized public school district
## 95269                                           9-Specialized public school district
## 95270                                           9-Specialized public school district
## 95271                                           9-Specialized public school district
## 95272                                           9-Specialized public school district
## 95273                                           9-Specialized public school district
## 95275                                           9-Specialized public school district
## 95276                                           9-Specialized public school district
## 95277                                           9-Specialized public school district
## 95278                                           9-Specialized public school district
## 95279                                           9-Specialized public school district
## 95303 1-Regular local school district that is NOT a component of a supervisory union
## 95335 1-Regular local school district that is NOT a component of a supervisory union
## 95343 1-Regular local school district that is NOT a component of a supervisory union
## 95401 1-Regular local school district that is NOT a component of a supervisory union
## 95413         5-State agency providing elementary and/or secondary level instruction
## 95417         5-State agency providing elementary and/or secondary level instruction
## 95429         5-State agency providing elementary and/or secondary level instruction
## 95430         5-State agency providing elementary and/or secondary level instruction
## 95442                                                 7-Independent Charter District
## 95444 1-Regular local school district that is NOT a component of a supervisory union
## 95446         5-State agency providing elementary and/or secondary level instruction
## 95486 1-Regular local school district that is NOT a component of a supervisory union
## 95534 1-Regular local school district that is NOT a component of a supervisory union
## 95549 1-Regular local school district that is NOT a component of a supervisory union
## 95550                                                 7-Independent Charter District
## 95551                                                 7-Independent Charter District
## 95593 1-Regular local school district that is NOT a component of a supervisory union
## 95670 1-Regular local school district that is NOT a component of a supervisory union
## 95748 1-Regular local school district that is NOT a component of a supervisory union
## 95752 1-Regular local school district that is NOT a component of a supervisory union
## 95806 1-Regular local school district that is NOT a component of a supervisory union
## 95886 1-Regular local school district that is NOT a component of a supervisory union
## 95930 1-Regular local school district that is NOT a component of a supervisory union
## 96039 1-Regular local school district that is NOT a component of a supervisory union
## 96120 1-Regular local school district that is NOT a component of a supervisory union
## 96180 1-Regular local school district that is NOT a component of a supervisory union
## 96209 1-Regular local school district that is NOT a component of a supervisory union
## 96241 1-Regular local school district that is NOT a component of a supervisory union
## 96369 1-Regular local school district that is NOT a component of a supervisory union
## 96399 1-Regular local school district that is NOT a component of a supervisory union
## 96408 1-Regular local school district that is NOT a component of a supervisory union
## 96409 1-Regular local school district that is NOT a component of a supervisory union
## 96426 1-Regular local school district that is NOT a component of a supervisory union
## 96450 1-Regular local school district that is NOT a component of a supervisory union
## 96498 1-Regular local school district that is NOT a component of a supervisory union
## 96502 1-Regular local school district that is NOT a component of a supervisory union
## 96541 1-Regular local school district that is NOT a component of a supervisory union
## 96544 1-Regular local school district that is NOT a component of a supervisory union
## 96572 1-Regular local school district that is NOT a component of a supervisory union
## 96689 1-Regular local school district that is NOT a component of a supervisory union
## 96726 1-Regular local school district that is NOT a component of a supervisory union
## 96834 1-Regular local school district that is NOT a component of a supervisory union
## 96927 1-Regular local school district that is NOT a component of a supervisory union
## 96945                                     4-Regional Education Service Agency (RESA)
## 97010 1-Regular local school district that is NOT a component of a supervisory union
## 97070 1-Regular local school district that is NOT a component of a supervisory union
## 97071 1-Regular local school district that is NOT a component of a supervisory union
## 97072 1-Regular local school district that is NOT a component of a supervisory union
## 97073 1-Regular local school district that is NOT a component of a supervisory union
## 97074 1-Regular local school district that is NOT a component of a supervisory union
## 97075                                     4-Regional Education Service Agency (RESA)
## 97078 1-Regular local school district that is NOT a component of a supervisory union
## 97080 1-Regular local school district that is NOT a component of a supervisory union
## 97084 1-Regular local school district that is NOT a component of a supervisory union
## 97085 1-Regular local school district that is NOT a component of a supervisory union
## 97087 1-Regular local school district that is NOT a component of a supervisory union
## 97091 1-Regular local school district that is NOT a component of a supervisory union
## 97159 1-Regular local school district that is NOT a component of a supervisory union
## 97166 1-Regular local school district that is NOT a component of a supervisory union
## 97181 1-Regular local school district that is NOT a component of a supervisory union
## 97187                                                 7-Independent Charter District
## 97220 1-Regular local school district that is NOT a component of a supervisory union
## 97244 1-Regular local school district that is NOT a component of a supervisory union
## 97255 1-Regular local school district that is NOT a component of a supervisory union
## 97258 1-Regular local school district that is NOT a component of a supervisory union
## 97267 1-Regular local school district that is NOT a component of a supervisory union
## 97335 1-Regular local school district that is NOT a component of a supervisory union
## 97338 1-Regular local school district that is NOT a component of a supervisory union
## 97339 1-Regular local school district that is NOT a component of a supervisory union
## 97452 1-Regular local school district that is NOT a component of a supervisory union
## 97453 1-Regular local school district that is NOT a component of a supervisory union
## 97541             2-Local school district that is a component of a supervisory union
## 97546             2-Local school district that is a component of a supervisory union
## 97564 1-Regular local school district that is NOT a component of a supervisory union
## 97614 1-Regular local school district that is NOT a component of a supervisory union
## 97769 1-Regular local school district that is NOT a component of a supervisory union
## 97803 1-Regular local school district that is NOT a component of a supervisory union
## 97824                                                 7-Independent Charter District
## 97879 1-Regular local school district that is NOT a component of a supervisory union
## 97908 1-Regular local school district that is NOT a component of a supervisory union
## 97909 1-Regular local school district that is NOT a component of a supervisory union
## 97960 1-Regular local school district that is NOT a component of a supervisory union
## 98030                                     4-Regional Education Service Agency (RESA)
## 98031         5-State agency providing elementary and/or secondary level instruction
## 98032         5-State agency providing elementary and/or secondary level instruction
## 98034         5-State agency providing elementary and/or secondary level instruction
## 98051 1-Regular local school district that is NOT a component of a supervisory union
## 98063 1-Regular local school district that is NOT a component of a supervisory union
## 98197 1-Regular local school district that is NOT a component of a supervisory union
## 98206 1-Regular local school district that is NOT a component of a supervisory union
## 98261 1-Regular local school district that is NOT a component of a supervisory union
## 98267 1-Regular local school district that is NOT a component of a supervisory union
## 98288 1-Regular local school district that is NOT a component of a supervisory union
## 98299 1-Regular local school district that is NOT a component of a supervisory union
## 98309                                                 7-Independent Charter District
## 98310                                                 7-Independent Charter District
## 98359 1-Regular local school district that is NOT a component of a supervisory union
## 98435         5-State agency providing elementary and/or secondary level instruction
## 98437 1-Regular local school district that is NOT a component of a supervisory union
## 98450 1-Regular local school district that is NOT a component of a supervisory union
## 98454 1-Regular local school district that is NOT a component of a supervisory union
## 98455 1-Regular local school district that is NOT a component of a supervisory union
## 98471                                     4-Regional Education Service Agency (RESA)
## 98485         5-State agency providing elementary and/or secondary level instruction
## 98506 1-Regular local school district that is NOT a component of a supervisory union
## 98511 1-Regular local school district that is NOT a component of a supervisory union
## 98512 1-Regular local school district that is NOT a component of a supervisory union
## 98617 1-Regular local school district that is NOT a component of a supervisory union
## 98619 1-Regular local school district that is NOT a component of a supervisory union
## 98627 1-Regular local school district that is NOT a component of a supervisory union
## 98628 1-Regular local school district that is NOT a component of a supervisory union
## 98644 1-Regular local school district that is NOT a component of a supervisory union
## 98645 1-Regular local school district that is NOT a component of a supervisory union
## 98693                                     4-Regional Education Service Agency (RESA)
## 98711         5-State agency providing elementary and/or secondary level instruction
## 98787 1-Regular local school district that is NOT a component of a supervisory union
## 98807 1-Regular local school district that is NOT a component of a supervisory union
## 98885 1-Regular local school district that is NOT a component of a supervisory union
## 98886 1-Regular local school district that is NOT a component of a supervisory union
## 98887 1-Regular local school district that is NOT a component of a supervisory union
## 98888 1-Regular local school district that is NOT a component of a supervisory union
## 98889 1-Regular local school district that is NOT a component of a supervisory union
## 98890 1-Regular local school district that is NOT a component of a supervisory union
## 98891 1-Regular local school district that is NOT a component of a supervisory union
## 98892 1-Regular local school district that is NOT a component of a supervisory union
## 98893 1-Regular local school district that is NOT a component of a supervisory union
## 98894 1-Regular local school district that is NOT a component of a supervisory union
## 98895 1-Regular local school district that is NOT a component of a supervisory union
## 98897 1-Regular local school district that is NOT a component of a supervisory union
## 98898 1-Regular local school district that is NOT a component of a supervisory union
## 98899 1-Regular local school district that is NOT a component of a supervisory union
## 98901 1-Regular local school district that is NOT a component of a supervisory union
## 98902 1-Regular local school district that is NOT a component of a supervisory union
## 98903 1-Regular local school district that is NOT a component of a supervisory union
## 98904 1-Regular local school district that is NOT a component of a supervisory union
## 98905                                     4-Regional Education Service Agency (RESA)
## 98965                                     4-Regional Education Service Agency (RESA)
## 99046                                     4-Regional Education Service Agency (RESA)
## 99047 1-Regular local school district that is NOT a component of a supervisory union
## 99056 1-Regular local school district that is NOT a component of a supervisory union
## 99070 1-Regular local school district that is NOT a component of a supervisory union
## 99073 1-Regular local school district that is NOT a component of a supervisory union
## 99074                                                 7-Independent Charter District
## 99085                                                 7-Independent Charter District
## 99086 1-Regular local school district that is NOT a component of a supervisory union
## 99129 1-Regular local school district that is NOT a component of a supervisory union
## 99148                                                 7-Independent Charter District
## 99149         5-State agency providing elementary and/or secondary level instruction
## 99170 1-Regular local school district that is NOT a component of a supervisory union
## 99174 1-Regular local school district that is NOT a component of a supervisory union
## 99175 1-Regular local school district that is NOT a component of a supervisory union
## 99176 1-Regular local school district that is NOT a component of a supervisory union
## 99181 1-Regular local school district that is NOT a component of a supervisory union
## 99203 1-Regular local school district that is NOT a component of a supervisory union
## 99265         5-State agency providing elementary and/or secondary level instruction
## 99294 1-Regular local school district that is NOT a component of a supervisory union
## 99333                                     4-Regional Education Service Agency (RESA)
##                      School.Type Members Male Female FTE.Equivalent
## 3     4-Alternative/other school      37   20     17           <NA>
## 4     4-Alternative/other school     366  198    168           <NA>
## 108             1-Regular school     436  228    208             28
## 129             1-Regular school     485  249    236             29
## 133             1-Regular school     n/a  n/a    n/a           <NA>
## 163             1-Regular school     397  201    196             22
## 177             1-Regular school     n/a  n/a    n/a           <NA>
## 209             1-Regular school     313  107    206           <NA>
## 210             1-Regular school     444  194    250           <NA>
## 212   4-Alternative/other school      32   25      7           <NA>
## 263   4-Alternative/other school       2    2      0           <NA>
## 283             1-Regular school      84   45     39           <NA>
## 397             1-Regular school     359  195    164           <NA>
## 398             1-Regular school     706  371    335           <NA>
## 399             1-Regular school     619  295    324           <NA>
## 400             1-Regular school     441  210    231           <NA>
## 404   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 406             1-Regular school      61   37     24           <NA>
## 407             1-Regular school      59   25     34           <NA>
## 413   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 421             1-Regular school      85   46     39           <NA>
## 422             1-Regular school     519  264    255           <NA>
## 427             1-Regular school    1435  716    719          63.29
## 432          3-Vocational school      19    9     10           <NA>
## 446          3-Vocational school      31   16     15           <NA>
## 455          3-Vocational school      18    7     11           <NA>
## 457             1-Regular school     478  244    234           <NA>
## 458          3-Vocational school     121   66     55           <NA>
## 496             1-Regular school     115   76     39           <NA>
## 497             1-Regular school     184  163     21           <NA>
## 499          3-Vocational school    <NA>  n/a    n/a             21
## 506   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 508             1-Regular school      83   40     43           <NA>
## 516             1-Regular school     455  204    251           <NA>
## 517             1-Regular school     807  405    402           <NA>
## 518             1-Regular school      46   24     22           <NA>
## 535             1-Regular school     280  137    143           <NA>
## 536             1-Regular school     147   62     85           <NA>
## 537             1-Regular school     271  131    140           <NA>
## 544             1-Regular school     519  261    258           <NA>
## 545             1-Regular school     n/a  n/a    n/a           <NA>
## 546   4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 552             1-Regular school     107   64     43           <NA>
## 574             1-Regular school     166  101     65           <NA>
## 575             1-Regular school     165   92     73           <NA>
## 579             1-Regular school     245  118    127              7
## 584   4-Alternative/other school      10    4      6           <NA>
## 591             1-Regular school     341  191    150           <NA>
## 637             1-Regular school     236  103    133            9.5
## 661   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 680             1-Regular school     318  157    161           <NA>
## 681             1-Regular school     120   63     57           <NA>
## 688             1-Regular school    <NA>  n/a    n/a              6
## 717             1-Regular school     357  176    181             17
## 803             1-Regular school     620  318    302           <NA>
## 805             1-Regular school     336  185    151           <NA>
## 807             1-Regular school     646  328    318           <NA>
## 849             1-Regular school     545  291    254           <NA>
## 875             1-Regular school    4185 2161   2024          273.6
## 898   4-Alternative/other school     154  143     11           <NA>
## 899   2-Special education school    <NA>  n/a    n/a           <NA>
## 915   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 919   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 924   4-Alternative/other school      11    3      8           <NA>
## 925             1-Regular school     n/a  n/a    n/a           <NA>
## 929             1-Regular school     n/a  n/a    n/a           <NA>
## 930   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 932             1-Regular school     n/a  n/a    n/a           <NA>
## 933             1-Regular school     n/a  n/a    n/a           <NA>
## 936   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 937             1-Regular school     n/a  n/a    n/a           <NA>
## 938             1-Regular school     n/a  n/a    n/a           <NA>
## 942             1-Regular school     n/a  n/a    n/a           <NA>
## 943             1-Regular school     n/a  n/a    n/a           <NA>
## 950          3-Vocational school     n/a  n/a    n/a           <NA>
## 951          3-Vocational school     n/a  n/a    n/a           <NA>
## 952   2-Special education school       9    3      6           <NA>
## 959          3-Vocational school     n/a  n/a    n/a           <NA>
## 969             1-Regular school     128   69     59           <NA>
## 1028            1-Regular school       0    0      0           <NA>
## 1072            1-Regular school      53   33     20           <NA>
## 1105            1-Regular school      82   45     37           <NA>
## 1106            1-Regular school      17    7     10           <NA>
## 1139            1-Regular school     473  235    238           <NA>
## 1140            1-Regular school       0    0      0           <NA>
## 1141            1-Regular school     636  326    310           <NA>
## 1144  4-Alternative/other school      22    0     22           <NA>
## 1145  4-Alternative/other school       0    0      0           <NA>
## 1150  4-Alternative/other school      26   23      3           <NA>
## 1151            1-Regular school       0    0      0           <NA>
## 1160            1-Regular school     368  198    170          14.03
## 1163  2-Special education school     n/a  n/a    n/a           <NA>
## 1247            1-Regular school     205  112     93           13.1
## 1252  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1290            1-Regular school     318  160    158           <NA>
## 1318            1-Regular school     931  475    456           <NA>
## 1335  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1336  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1337  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1338  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1345  4-Alternative/other school      24   12     12           <NA>
## 1347  4-Alternative/other school       2    0      2           <NA>
## 1358  4-Alternative/other school     132   69     63           <NA>
## 1431  4-Alternative/other school       1    1      0           <NA>
## 1470            1-Regular school     452  238    214           <NA>
## 1506  4-Alternative/other school       1    1      0           <NA>
## 1557  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1633  4-Alternative/other school       9    6      3           <NA>
## 1656            1-Regular school     121   65     56           <NA>
## 1660            1-Regular school      51   33     18            4.5
## 1661            1-Regular school      38   19     19            4.5
## 1692            1-Regular school       8    5      3           <NA>
## 1693  4-Alternative/other school       9    3      6           <NA>
## 1738         3-Vocational school    <NA>  n/a    n/a              2
## 1766  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1837            1-Regular school     n/a  n/a    n/a           <NA>
## 1844  4-Alternative/other school       1    0      1           <NA>
## 1853            1-Regular school     304  164    140             15
## 1857            1-Regular school       0    0      0           <NA>
## 1877  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1902            1-Regular school      19   13      6           <NA>
## 1906  4-Alternative/other school       0    0      0           <NA>
## 1907  4-Alternative/other school       0    0      0           <NA>
## 1921            1-Regular school     140   64     76           <NA>
## 1922            1-Regular school     732  347    385           <NA>
## 1932            1-Regular school       0    0      0           <NA>
## 1940            1-Regular school    1996 1018    978           <NA>
## 1952            1-Regular school     597  311    286           <NA>
## 1971            1-Regular school     428  219    209           <NA>
## 1972            1-Regular school     975  447    528           36.9
## 1974            1-Regular school     746  364    382          32.71
## 1987            1-Regular school     302  151    151           <NA>
## 1989            1-Regular school     342  168    174           <NA>
## 1992            1-Regular school     545  276    269           <NA>
## 2008  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2014  4-Alternative/other school     346  157    189           <NA>
## 2016  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2017  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2020  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2027  4-Alternative/other school       9    7      2           <NA>
## 2034  4-Alternative/other school       0    0      0           <NA>
## 2036  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2038  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2054  4-Alternative/other school     115   78     37           <NA>
## 2057  4-Alternative/other school       1    1      0           <NA>
## 2060  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2061  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2067            1-Regular school     183   98     85            8.4
## 2160            1-Regular school     738  392    346           <NA>
## 2162         3-Vocational school       0    0      0           <NA>
## 2163  2-Special education school     156  110     46           26.8
## 2194            1-Regular school     190   76    114            7.2
## 2195            1-Regular school    <NA>  n/a    n/a           1.35
## 2210            1-Regular school     261  140    121             19
## 2212            1-Regular school     216  109    107             19
## 2213            1-Regular school     207  110     97             19
## 2219            1-Regular school     394  188    206           <NA>
## 2230            1-Regular school     504  236    268           <NA>
## 2236         3-Vocational school     n/a  n/a    n/a           <NA>
## 2242            1-Regular school     313  193    120           <NA>
## 2251            1-Regular school    2275 1153   1122           <NA>
## 2252            1-Regular school    1957 1001    956           <NA>
## 2253            1-Regular school     164   83     81           <NA>
## 2254            1-Regular school     296  146    150           <NA>
## 2266            1-Regular school    1357  720    637           <NA>
## 2268            1-Regular school    1766  873    893           <NA>
## 2269            1-Regular school     510  273    237           <NA>
## 2270            1-Regular school    1393  691    702           <NA>
## 2271            1-Regular school     111   48     63           <NA>
## 2272            1-Regular school    2064  998   1066           <NA>
## 2273            1-Regular school    2218 1129   1089           <NA>
## 2274            1-Regular school     369  188    181           <NA>
## 2275            1-Regular school     124   65     59           <NA>
## 2279            1-Regular school    1441  696    745           <NA>
## 2280            1-Regular school     616  303    313           <NA>
## 2281            1-Regular school    1019  500    519           <NA>
## 2282            1-Regular school     552  280    272           <NA>
## 2283            1-Regular school     476  232    244           <NA>
## 2284            1-Regular school     600  277    323           <NA>
## 2288            1-Regular school     n/a  n/a    n/a           <NA>
## 2297            1-Regular school     191   77    114           <NA>
## 2298            1-Regular school     197   92    105           <NA>
## 2299            1-Regular school     162   87     75           <NA>
## 2300            1-Regular school     209  111     98           <NA>
## 2310            1-Regular school     592  321    271           <NA>
## 2334  4-Alternative/other school      24   24      0           <NA>
## 2335  4-Alternative/other school      32   24      8           <NA>
## 2342  4-Alternative/other school      35   26      9           <NA>
## 2343  4-Alternative/other school      33   25      8           <NA>
## 2348  4-Alternative/other school      45   33     12           <NA>
## 2350  4-Alternative/other school      67   55     12           <NA>
## 2351  4-Alternative/other school      61   57      4           <NA>
## 2352  4-Alternative/other school      42   38      4           <NA>
## 2355  4-Alternative/other school      27   23      4           <NA>
## 2440            1-Regular school     n/a  n/a    n/a           <NA>
## 2442  4-Alternative/other school       5    1      4           <NA>
## 2552            1-Regular school     501  238    263             28
## 2669  4-Alternative/other school       1    1    n/a           <NA>
## 2682            1-Regular school      33   20     13           <NA>
## 2704            1-Regular school     985  504    481           <NA>
## 2720            1-Regular school     213  119     94           <NA>
## 2724  4-Alternative/other school       9    0      9           <NA>
## 2743  4-Alternative/other school     249  157     92           <NA>
## 2786  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2832  4-Alternative/other school       0    0      0           <NA>
## 2842            1-Regular school     756  404    352           <NA>
## 2846            1-Regular school    1646  846    800          63.59
## 2847         3-Vocational school       0    0      0           <NA>
## 2857  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2886            1-Regular school      22   12     10           <NA>
## 2887            1-Regular school     197   96    101              9
## 2888            1-Regular school     202   98    104            9.5
## 2926  4-Alternative/other school       0    0      0           <NA>
## 2927  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2928  4-Alternative/other school      17   15      2           <NA>
## 2929  4-Alternative/other school       8    5      3           <NA>
## 2930  4-Alternative/other school      12   10      2           <NA>
## 2931  4-Alternative/other school       1    1      0           <NA>
## 2932  4-Alternative/other school       0    0      0           <NA>
## 2941            1-Regular school    <NA>  n/a    n/a          47.67
## 2943            1-Regular school     161   87     74           <NA>
## 3000            1-Regular school     n/a  n/a    n/a           <NA>
## 3009            1-Regular school     n/a  n/a    n/a           <NA>
## 3049            1-Regular school     n/a  n/a    n/a           <NA>
## 3129  2-Special education school      26   15     11           <NA>
## 3130  2-Special education school      68   37     31           <NA>
## 3155            1-Regular school     456  238    218           <NA>
## 3274            1-Regular school      34   17     17           <NA>
## 3275            1-Regular school      41   13     28           <NA>
## 3276            1-Regular school     236   78    158           <NA>
## 3277            1-Regular school     144   55     89           <NA>
## 3278            1-Regular school     400  163    237           <NA>
## 3279            1-Regular school     106   93     13           <NA>
## 3280            1-Regular school      71   61     10           <NA>
## 3281            1-Regular school     147   62     85           <NA>
## 3282            1-Regular school     749  389    360           <NA>
## 3284            1-Regular school     109   53     56           <NA>
## 3287            1-Regular school     162   77     85           <NA>
## 3288            1-Regular school    2196 1042   1154           <NA>
## 3289            1-Regular school     180   59    121           <NA>
## 3290            1-Regular school     269  105    164           <NA>
## 3291            1-Regular school     194   71    123           <NA>
## 3295            1-Regular school     965  466    499           <NA>
## 3296            1-Regular school       0    0      0           <NA>
## 3297            1-Regular school      77   36     41           <NA>
## 3299            1-Regular school     348  159    189           <NA>
## 3300            1-Regular school     840  232    608           <NA>
## 3301            1-Regular school    3632 1760   1872           <NA>
## 3330            1-Regular school     530  268    262             32
## 3512            1-Regular school     691  344    347           <NA>
## 3544            1-Regular school     553  303    250           <NA>
## 3613            1-Regular school    1115  503    612           <NA>
## 3646            1-Regular school     213  109    104           14.5
## 3666            1-Regular school     516  277    239           <NA>
## 3667            1-Regular school     593  298    295           <NA>
## 3668            1-Regular school     811  413    398           <NA>
## 3673  2-Special education school     264  148    116           <NA>
## 3674  2-Special education school      40   22     18           <NA>
## 3675  2-Special education school      71   47     24           <NA>
## 3763            1-Regular school     495  275    220             23
## 3770            1-Regular school     567  287    280           <NA>
## 3771  4-Alternative/other school     123   58     65           <NA>
## 3772            1-Regular school     473  240    233           <NA>
## 3780            1-Regular school     268  134    134          20.33
## 3781            1-Regular school     233  126    107          13.83
## 3782            1-Regular school    <NA>  n/a    n/a              4
## 3791            1-Regular school     452  228    224           <NA>
## 3796  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3797  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3798  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3799  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3800  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3801  4-Alternative/other school      24   24      0           <NA>
## 3802  4-Alternative/other school      12   12      0           <NA>
## 3803  4-Alternative/other school       1    1      0           <NA>
## 3804  4-Alternative/other school       2    2      0           <NA>
## 3825            1-Regular school     469  237    232           <NA>
## 3834            1-Regular school     364  176    188           <NA>
## 3835            1-Regular school     425  204    221           <NA>
## 3837            1-Regular school     489  213    276           <NA>
## 3841  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3898            1-Regular school    2620 1205   1415         122.41
## 3914            1-Regular school     149  106     43           <NA>
## 3915            1-Regular school     346  171    175           <NA>
## 3916            1-Regular school      38   23     15           <NA>
## 3917            1-Regular school      17    8      9           <NA>
## 3918            1-Regular school     364  178    186           <NA>
## 3919            1-Regular school     379  177    202           <NA>
## 3920            1-Regular school     369  187    182           <NA>
## 3921            1-Regular school     266  138    128           <NA>
## 3922            1-Regular school     295  151    144           <NA>
## 3931  4-Alternative/other school       3    3      0           <NA>
## 3934  4-Alternative/other school       1    1      0           <NA>
## 3953            1-Regular school     552  294    258           <NA>
## 3986            1-Regular school     687  359    328           <NA>
## 3987            1-Regular school     874  504    370           <NA>
## 4006            1-Regular school      37   19     18            2.5
## 4034  4-Alternative/other school      12   12    n/a           <NA>
## 4042            1-Regular school     n/a  n/a    n/a           <NA>
## 4051  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4053  4-Alternative/other school      35   18     17           <NA>
## 4196  4-Alternative/other school       4    4      0           <NA>
## 4204            1-Regular school      25   13     12              0
## 4283            1-Regular school     170   89     81           <NA>
## 4308  4-Alternative/other school    <NA>  n/a    n/a              5
## 4309         3-Vocational school    <NA>  n/a    n/a           17.5
## 4332            1-Regular school     300  140    160           <NA>
## 4384            1-Regular school     424  227    197             19
## 4472  4-Alternative/other school       4    4      0           <NA>
## 4497            1-Regular school     173   99     74           <NA>
## 4513            1-Regular school      91   55     36           <NA>
## 4514  4-Alternative/other school      18   18    n/a           <NA>
## 4534  4-Alternative/other school     342  170    172           <NA>
## 4547  2-Special education school       0    0      0           <NA>
## 4557            1-Regular school     410  189    221             30
## 4576            1-Regular school       0    0      0           <NA>
## 4592            1-Regular school     495  258    237           <NA>
## 4622         3-Vocational school     n/a  n/a    n/a           <NA>
## 4623         3-Vocational school     n/a  n/a    n/a           <NA>
## 4626            1-Regular school     303  156    147           <NA>
## 4635  4-Alternative/other school       3    3      0           <NA>
## 4644            1-Regular school     269  146    123           <NA>
## 4690            1-Regular school     n/a  n/a    n/a           <NA>
## 4695            1-Regular school       1    0      1           <NA>
## 4727            1-Regular school       0    0      0           <NA>
## 4728            1-Regular school       1    1      0           <NA>
## 4800         3-Vocational school       0    0      0           <NA>
## 4807            1-Regular school     287  150    137           <NA>
## 4948            1-Regular school      65   43     22           <NA>
## 4949            1-Regular school    1019  547    472           <NA>
## 4950  4-Alternative/other school     229  129    100           <NA>
## 4952            1-Regular school     n/a  n/a    n/a           <NA>
## 5054  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 5128  4-Alternative/other school    <NA>  n/a    n/a             12
## 5137            1-Regular school     523  280    243           <NA>
## 5164            1-Regular school      74   41     33              5
## 5174            1-Regular school     543  284    259           <NA>
## 5189            1-Regular school     237  143     94           <NA>
## 5305            1-Regular school     769  348    421           <NA>
## 5306            1-Regular school     951  476    475           <NA>
## 5307            1-Regular school     577  287    290           <NA>
## 5308            1-Regular school     464  265    199           <NA>
## 5310            1-Regular school     631  305    326           <NA>
## 5311            1-Regular school     217   97    120           <NA>
## 5312            1-Regular school     623  309    314           <NA>
## 5313            1-Regular school     622  322    300           <NA>
## 5314            1-Regular school     552  275    277           <NA>
## 5315            1-Regular school     731  347    384           <NA>
## 5316            1-Regular school     831  422    409           <NA>
## 5317            1-Regular school     627  323    304           <NA>
## 5318            1-Regular school     787  393    394           <NA>
## 5319            1-Regular school     898  462    436           <NA>
## 5320            1-Regular school       0    0      0           <NA>
## 5321            1-Regular school     201  100    101           <NA>
## 5322            1-Regular school     756  416    340           <NA>
## 5323            1-Regular school     747  382    365           <NA>
## 5324            1-Regular school     677  347    330           <NA>
## 5325            1-Regular school    1028  530    498           <NA>
## 5326            1-Regular school    1148  604    544           <NA>
## 5327            1-Regular school     550  264    286           <NA>
## 5328            1-Regular school     960  469    491           <NA>
## 5329            1-Regular school     773  370    403           <NA>
## 5347            1-Regular school     543  264    279           <NA>
## 5348  4-Alternative/other school       2    2      0           <NA>
## 5375            1-Regular school     776  392    384           <NA>
## 5457            1-Regular school     145  124     21           <NA>
## 5532            1-Regular school      80   30     50           <NA>
## 5533            1-Regular school      16    6     10           <NA>
## 5534            1-Regular school      22   11     11           <NA>
## 5588            1-Regular school      95   51     44              4
## 5623  4-Alternative/other school      14   13      1           <NA>
## 5670            1-Regular school     502  254    248           <NA>
## 5672  4-Alternative/other school     284  205     79           <NA>
## 5735            1-Regular school     166   93     73           <NA>
## 5737            1-Regular school     994  502    492           <NA>
## 5738            1-Regular school     755  383    372           <NA>
## 5803            1-Regular school     n/a  n/a    n/a           <NA>
## 5809            1-Regular school     424  208    216           <NA>
## 5825            1-Regular school     466  257    209           <NA>
## 5829            1-Regular school     n/a  n/a    n/a           <NA>
## 5834  2-Special education school      42   21     21           <NA>
## 5873  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 5885  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5908         3-Vocational school     n/a  n/a    n/a           <NA>
## 5937            1-Regular school     983  507    476           <NA>
## 5967            1-Regular school     641  331    310           <NA>
## 5968            1-Regular school     308  200    108           <NA>
## 5989            1-Regular school      26   22      4              4
## 6059            1-Regular school     481  282    199           <NA>
## 6075  4-Alternative/other school       1    1      0           <NA>
## 6114            1-Regular school     318  148    170           <NA>
## 6122            1-Regular school      11    6      5           <NA>
## 6131            1-Regular school     286  162    124           <NA>
## 6152         3-Vocational school    <NA>  n/a    n/a              1
## 6156            1-Regular school     230  111    119           17.3
## 6184  2-Special education school       7    4      3           <NA>
## 6263            1-Regular school     160   78     82              7
## 6397  2-Special education school      23   13     10           <NA>
## 6416         3-Vocational school    <NA>  n/a    n/a             27
## 6426            1-Regular school     248  132    116           <NA>
## 6428            1-Regular school     114   52     62           <NA>
## 6441            1-Regular school    1255  603    652           <NA>
## 6456            1-Regular school     446  210    236          25.55
## 6463            1-Regular school     405  202    203           <NA>
## 6506            1-Regular school     212  106    106           8.75
## 6508            1-Regular school     736  358    378           <NA>
## 6509            1-Regular school     538  282    256           <NA>
## 6510            1-Regular school     716  359    357           <NA>
## 6531            1-Regular school     995  502    493           <NA>
## 6541            1-Regular school     788  383    405           49.6
## 6574            1-Regular school     179   92     87           <NA>
## 6575            1-Regular school     119   58     61           <NA>
## 6616            1-Regular school    1009  532    477           <NA>
## 6617            1-Regular school     582  280    302           <NA>
## 6684  2-Special education school      12    9      3           <NA>
## 6685  2-Special education school      62   38     24           <NA>
## 6687  2-Special education school       5    4      1           <NA>
## 6710            1-Regular school     320  181    139           <NA>
## 6723  4-Alternative/other school      13    9      4           <NA>
## 6729  4-Alternative/other school      44   23     21           <NA>
## 6753            1-Regular school     n/a  n/a    n/a           <NA>
## 6872  4-Alternative/other school       0    0      0           <NA>
## 6933         3-Vocational school    <NA>  n/a    n/a              9
## 6965  4-Alternative/other school       1    0      1           <NA>
## 7127  4-Alternative/other school       7    6      1           <NA>
## 7128  4-Alternative/other school       1    1      0           <NA>
## 7129  4-Alternative/other school       4    4      0           <NA>
## 7130  4-Alternative/other school       3    2      1           <NA>
## 7135  4-Alternative/other school       1    1      0           <NA>
## 7146         3-Vocational school    <NA>  n/a    n/a              1
## 7166  4-Alternative/other school       2    2      0           <NA>
## 7200            1-Regular school      17   12      5              1
## 7211            1-Regular school     322  163    159           <NA>
## 7213            1-Regular school      87   39     48           <NA>
## 7214            1-Regular school      78   41     37           <NA>
## 7252            1-Regular school     103   57     46           3.75
## 7263            1-Regular school      26   10     16           <NA>
## 7264            1-Regular school      35   17     18           <NA>
## 7280  4-Alternative/other school       0    0      0           <NA>
## 7296  4-Alternative/other school      18   17      1           <NA>
## 7338            1-Regular school    2524 1245   1279           <NA>
## 7351            1-Regular school     573  295    278           <NA>
## 7424  2-Special education school      78   52     26           <NA>
## 7430  4-Alternative/other school     134   73     61           <NA>
## 7470            1-Regular school      34    9     25              2
## 7498            1-Regular school     244  127    117          17.91
## 7522            1-Regular school    1272  634    638           <NA>
## 7523  4-Alternative/other school       0    0      0           <NA>
## 7576            1-Regular school    1092  570    522           <NA>
## 7588            1-Regular school     156   74     82           <NA>
## 7659            1-Regular school      13    7      6              1
## 7709            1-Regular school     610  320    290           <NA>
## 7752  2-Special education school      17    7     10           <NA>
## 7753  2-Special education school       1    1      0           <NA>
## 7769            1-Regular school    1681  850    831             91
## 7770            1-Regular school    1266  621    645           73.8
## 7816            1-Regular school       3    0      3           <NA>
## 7825            1-Regular school     556  283    273           <NA>
## 7828            1-Regular school     596  295    301           <NA>
## 7829  2-Special education school       4    3      1           <NA>
## 7836            1-Regular school     314  168    146           <NA>
## 7839            1-Regular school     605  325    280           24.1
## 7843         3-Vocational school    <NA>  n/a    n/a              2
## 7844  2-Special education school    <NA>  n/a    n/a              1
## 7900  4-Alternative/other school    2065 1098    967           <NA>
## 7922            1-Regular school     n/a  n/a    n/a           <NA>
## 7931  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 7963  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 7976            1-Regular school      53   25     28           <NA>
## 7995            1-Regular school    1002  526    476           <NA>
## 7996            1-Regular school     108   50     58           <NA>
## 8003            1-Regular school    1172  601    571           <NA>
## 8030            1-Regular school     n/a  n/a    n/a           <NA>
## 8046  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 8068  4-Alternative/other school       9    6      3           <NA>
## 8084            1-Regular school     n/a  n/a    n/a           <NA>
## 8108            1-Regular school      13    6      7              1
## 8136            1-Regular school       7    3      4           <NA>
## 8173            1-Regular school     638  315    323             38
## 8252            1-Regular school     628  343    285           <NA>
## 8255            1-Regular school    1363  697    666           <NA>
## 8257            1-Regular school     525  281    244           <NA>
## 8260            1-Regular school     507  272    235           <NA>
## 8261            1-Regular school     529  268    261           <NA>
## 8262            1-Regular school     654  337    317           <NA>
## 8284            1-Regular school     110   56     54           <NA>
## 8313         3-Vocational school    <NA>  n/a    n/a             16
## 8319  2-Special education school    <NA>  n/a    n/a           <NA>
## 8352  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 8358  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 8441         3-Vocational school     n/a  n/a    n/a           <NA>
## 8470            1-Regular school      16    6     10           <NA>
## 8480            1-Regular school     535  285    250           <NA>
## 8481            1-Regular school     164   68     96           <NA>
## 8485            1-Regular school    1646  834    812           <NA>
## 8486            1-Regular school     618  322    296           <NA>
## 8487            1-Regular school     449  226    223           <NA>
## 8604            1-Regular school    1463  760    703           <NA>
## 8606            1-Regular school    1024  535    489           <NA>
## 8663            1-Regular school     n/a  n/a    n/a           <NA>
## 8677  4-Alternative/other school      13    7      6           <NA>
## 8679  4-Alternative/other school      46   42      4           <NA>
## 8728            1-Regular school       1    0      1           <NA>
## 8729            1-Regular school       1    1      0           <NA>
## 8730            1-Regular school       1    0      1           <NA>
## 8735            1-Regular school     551  283    268           <NA>
## 8748            1-Regular school      77   36     41            4.5
## 8768            1-Regular school       0    0      0           <NA>
## 8808  2-Special education school      18   10      8           <NA>
## 8859            1-Regular school       0    0      0           <NA>
## 8902  4-Alternative/other school       4    1      3           <NA>
## 8905  4-Alternative/other school       5    4      1           <NA>
## 8910  4-Alternative/other school      15   12      3           <NA>
## 8928  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 8942  4-Alternative/other school       7    5      2           <NA>
## 9056            1-Regular school     n/a  n/a    n/a           <NA>
## 9063            1-Regular school       0    0      0           <NA>
## 9065            1-Regular school       0    0      0           <NA>
## 9066            1-Regular school       0    0      0           <NA>
## 9073  4-Alternative/other school      31   26      5           <NA>
## 9107            1-Regular school     421  216    205          26.15
## 9201            1-Regular school     307  168    139           <NA>
## 9218            1-Regular school     690  364    326           <NA>
## 9227            1-Regular school     n/a  n/a    n/a           <NA>
## 9228            1-Regular school     397  209    188          18.83
## 9239  2-Special education school     147   78     69           <NA>
## 9271         3-Vocational school     n/a  n/a    n/a           <NA>
## 9272         3-Vocational school     n/a  n/a    n/a           <NA>
## 9305            1-Regular school     246  129    117           <NA>
## 9327            1-Regular school    1957 1023    934           <NA>
## 9406  4-Alternative/other school       2    0      2           <NA>
## 9491            1-Regular school     630  341    289           <NA>
## 9694  4-Alternative/other school      40   18     22           <NA>
## 9787            1-Regular school     370  186    184           <NA>
## 9814            1-Regular school     530  280    250           <NA>
## 9863            1-Regular school     441  232    209           <NA>
## 9878            1-Regular school      34   15     19           <NA>
## 9879            1-Regular school      48   31     17           <NA>
## 9880  4-Alternative/other school      86   79      7           <NA>
## 9885            1-Regular school      76   45     31           <NA>
## 9886            1-Regular school       0    0      0           <NA>
## 9887  4-Alternative/other school      37   37      0           <NA>
## 10043 2-Special education school     387  210    177           <NA>
## 10044           1-Regular school     113   64     49           <NA>
## 10095           1-Regular school      48   25     23            5.5
## 10096           1-Regular school      77   43     34           10.5
## 10145           1-Regular school     376  193    183           <NA>
## 10159           1-Regular school     138   81     57           <NA>
## 10160           1-Regular school     176   94     82           <NA>
## 10174           1-Regular school     n/a  n/a    n/a           <NA>
## 10177           1-Regular school       0    0      0           <NA>
## 10178        3-Vocational school     n/a  n/a    n/a           <NA>
## 10314 4-Alternative/other school       0    0      0           <NA>
## 10330 4-Alternative/other school      68   47     21           6.25
## 10373           1-Regular school    1029  545    484           <NA>
## 10402           1-Regular school       0    0      0           <NA>
## 10426           1-Regular school     879  440    439           47.6
## 10432        3-Vocational school    <NA>  n/a    n/a              2
## 10487           1-Regular school     n/a  n/a    n/a           <NA>
## 10491           1-Regular school     600  307    293           <NA>
## 10525           1-Regular school     881  436    445           <NA>
## 10538 2-Special education school     n/a  n/a    n/a           <NA>
## 10565 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 10567 4-Alternative/other school      21   17      4           <NA>
## 10569 4-Alternative/other school     102   64     38           <NA>
## 10591 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 10597 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 10621 4-Alternative/other school       0    0      0           <NA>
## 10644           1-Regular school     451  229    222           <NA>
## 10650 4-Alternative/other school     980  492    488           <NA>
## 10655 4-Alternative/other school      21    7     14           <NA>
## 10702        3-Vocational school     n/a  n/a    n/a           <NA>
## 10767        3-Vocational school    <NA>  n/a    n/a           <NA>
## 10776           1-Regular school     406  220    186          23.16
## 10782        3-Vocational school     n/a  n/a    n/a           <NA>
## 10789           1-Regular school     911  476    435           <NA>
## 10793           1-Regular school     595  303    292           <NA>
## 10805        3-Vocational school       0    0      0           <NA>
## 10816           1-Regular school     n/a  n/a    n/a           <NA>
## 10817           1-Regular school     906  446    460           <NA>
## 10823           1-Regular school     629  320    309           <NA>
## 10928           1-Regular school     990  490    500          68.05
## 10937           1-Regular school     270  154    116          20.45
## 10938 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 10948           1-Regular school     821  415    406           46.5
## 10957 4-Alternative/other school    <NA>  n/a    n/a              2
## 10962 2-Special education school      54   32     22           <NA>
## 11016 2-Special education school      17   10      7           <NA>
## 11017           1-Regular school     321  166    155           <NA>
## 11021        3-Vocational school       0    0      0           <NA>
## 11030           1-Regular school     304  172    132           <NA>
## 11033        3-Vocational school    <NA>  n/a    n/a          24.37
## 11059 4-Alternative/other school     145   95     50           <NA>
## 11065 2-Special education school     462  299    163           <NA>
## 11125 4-Alternative/other school    <NA>  n/a    n/a            1.6
## 11156 2-Special education school      31   21     10           <NA>
## 11192           1-Regular school    1027  528    499           <NA>
## 11230 4-Alternative/other school    <NA>  n/a    n/a           2.36
## 11231        3-Vocational school    <NA>  n/a    n/a              2
## 11255           1-Regular school      28   20      8           <NA>
## 11256           1-Regular school       0    0      0           <NA>
## 11257           1-Regular school       0    0      0           <NA>
## 11258           1-Regular school       7    2      5           <NA>
## 11259        3-Vocational school    <NA>  n/a    n/a             13
## 11263           1-Regular school     496  230    266           <NA>
## 11272           1-Regular school     360  182    178              3
## 11273           1-Regular school      36   12     24              1
## 11299           1-Regular school     327  175    152          16.67
## 11300           1-Regular school     456  222    234           21.5
## 11301           1-Regular school    1318  658    660          60.82
## 11302           1-Regular school     456  243    213           23.2
## 11303           1-Regular school    1489  718    771         112.98
## 11307 2-Special education school      40   18     22             13
## 11308 2-Special education school     375  188    187          73.91
## 11309 2-Special education school     361  194    167          64.53
## 11310           1-Regular school     406   81    325           16.3
## 11312           1-Regular school      51   24     27              2
## 11313           1-Regular school     556  288    268            3.5
## 11314           1-Regular school      16    8      8              3
## 11351 2-Special education school      85   44     41           <NA>
## 11405           1-Regular school     755  372    383           <NA>
## 11422           1-Regular school     578  285    293          22.25
## 11439           1-Regular school     193   83    110           <NA>
## 11440           1-Regular school     145   74     71           <NA>
## 11483 4-Alternative/other school      37   35      2           <NA>
## 11484 4-Alternative/other school       0    0      0           <NA>
## 11512 4-Alternative/other school      10   10    n/a           <NA>
## 11513 4-Alternative/other school       8    5      3           <NA>
## 11514 4-Alternative/other school      10    1      9           <NA>
## 11522           1-Regular school     543  279    264           <NA>
## 11534           1-Regular school       1    1    n/a           <NA>
## 11535           1-Regular school      15   11      4           <NA>
## 11539           1-Regular school     n/a  n/a    n/a           <NA>
## 11541 4-Alternative/other school       6    5      1           <NA>
## 11543 4-Alternative/other school      18    7     11           <NA>
## 11544 4-Alternative/other school      21   17      4           <NA>
## 11546 4-Alternative/other school      12   10      2           <NA>
## 11547 4-Alternative/other school       1    1      0           <NA>
## 11551 4-Alternative/other school       5    4      1           <NA>
## 11582           1-Regular school      86   42     44           <NA>
## 11589 4-Alternative/other school      33   27      6           <NA>
## 11591           1-Regular school      74   44     30           4.55
## 11612           1-Regular school     335  160    175             16
## 11621        3-Vocational school     n/a  n/a    n/a           <NA>
## 11683 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 11685           1-Regular school      97   43     54           <NA>
## 11728           1-Regular school     536  256    280           <NA>
## 11869           1-Regular school     837  425    412           <NA>
## 11872           1-Regular school     524  256    268           <NA>
## 11876           1-Regular school     n/a  n/a    n/a           <NA>
## 11877           1-Regular school      72   38     34              4
## 11881           1-Regular school     630  337    293           <NA>
## 11900           1-Regular school     240  105    135           <NA>
## 11908           1-Regular school     504  260    244           <NA>
## 11911 4-Alternative/other school     224  122    102           <NA>
## 11912           1-Regular school      39   22     17           <NA>
## 11913           1-Regular school     672  340    332           <NA>
## 11914           1-Regular school     642  330    312           <NA>
## 11925           1-Regular school    1089  583    506           <NA>
## 11926           1-Regular school       0    0      0           <NA>
## 11927           1-Regular school    1158  590    568           <NA>
## 11928           1-Regular school     236  113    123           <NA>
## 11929           1-Regular school     972  484    488           <NA>
## 11930           1-Regular school     110   52     58           <NA>
## 11931 2-Special education school     145  111     34           <NA>
## 11932           1-Regular school     409  213    196           <NA>
## 11935        3-Vocational school       0    0      0           <NA>
## 11936 2-Special education school      63   40     23           <NA>
## 11937           1-Regular school     688  292    396           <NA>
## 11967 4-Alternative/other school      10    4      6           <NA>
## 11968 4-Alternative/other school      26   19      7           <NA>
## 11975        3-Vocational school    <NA>  n/a    n/a           <NA>
## 12070           1-Regular school     890  425    465           <NA>
## 12083           1-Regular school      93   54     39           <NA>
## 12088           1-Regular school     346  173    173           17.4
## 12114 2-Special education school      13   10      3           <NA>
## 12123 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 12131 2-Special education school      21    9     12           <NA>
## 12138        3-Vocational school    <NA>  n/a    n/a             12
## 12149        3-Vocational school       0    0      0           <NA>
## 12163           1-Regular school      53   28     25           <NA>
## 12164           1-Regular school     357  150    207           <NA>
## 12165           1-Regular school      72   40     32           <NA>
## 12166           1-Regular school     164   78     86           <NA>
## 12167        3-Vocational school    <NA>  n/a    n/a              1
## 12168        3-Vocational school    <NA>  n/a    n/a             13
## 12190 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 12221           1-Regular school     393  182    211           20.6
## 12227           1-Regular school     355  199    156           <NA>
## 12228           1-Regular school     407  203    204           <NA>
## 12243           1-Regular school     414  220    194           40.2
## 12249           1-Regular school      61   26     35           <NA>
## 12307 2-Special education school       0    0      0           <NA>
## 12310           1-Regular school     606  321    285           43.5
## 12316           1-Regular school     527  263    264             22
## 12348           1-Regular school       0    0      0           <NA>
## 12427           1-Regular school     201  111     90           <NA>
## 12480           1-Regular school     958  474    484           <NA>
## 12501 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 12523        3-Vocational school    <NA>  n/a    n/a              1
## 12540 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 12567 4-Alternative/other school       0  n/a    n/a           <NA>
## 12591           1-Regular school     n/a  n/a    n/a           <NA>
## 12677        3-Vocational school    <NA>  n/a    n/a             28
## 12746           1-Regular school     899  456    443          57.82
## 12749           1-Regular school    1705  853    852          94.45
## 12756           1-Regular school     157   78     79           <NA>
## 12764           1-Regular school     170   94     76           11.5
## 12783 4-Alternative/other school       0    0      0           <NA>
## 12806           1-Regular school     739  414    325           <NA>
## 12905           1-Regular school     177  111     66           <NA>
## 12912           1-Regular school     462  258    204           <NA>
## 12934 2-Special education school      98   69     29           <NA>
## 12965           1-Regular school     n/a  n/a    n/a           <NA>
## 12974           1-Regular school    1071  528    543           <NA>
## 12976           1-Regular school     521  264    257           <NA>
## 12979 4-Alternative/other school     750  421    329           <NA>
## 13071        3-Vocational school       0    0      0           <NA>
## 13072        3-Vocational school       0    0      0           <NA>
## 13073        3-Vocational school       0    0      0           <NA>
## 13075        3-Vocational school       0    0      0           <NA>
## 13076        3-Vocational school       0    0      0           <NA>
## 13077        3-Vocational school       0    0      0           <NA>
## 13079        3-Vocational school       0    0      0           <NA>
## 13080        3-Vocational school       0    0      0           <NA>
## 13081        3-Vocational school       0    0      0           <NA>
## 13082        3-Vocational school       0    0      0           <NA>
## 13085        3-Vocational school       0    0      0           <NA>
## 13086        3-Vocational school       0    0      0           <NA>
## 13087        3-Vocational school       0    0      0           <NA>
## 13088        3-Vocational school       0    0      0           <NA>
## 13089        3-Vocational school       0    0      0           <NA>
## 13090        3-Vocational school       0    0      0           <NA>
## 13091        3-Vocational school       0    0      0           <NA>
## 13111 2-Special education school       0    0      0           <NA>
## 13117 4-Alternative/other school      63   40     23           <NA>
## 13156           1-Regular school    1213  603    610           <NA>
## 13176           1-Regular school     530  251    279           <NA>
## 13230 2-Special education school     n/a  n/a    n/a           <NA>
## 13233           1-Regular school    1049  549    500           <NA>
## 13240           1-Regular school     562  290    272           <NA>
## 13262 4-Alternative/other school      45   25     20           <NA>
## 13269           1-Regular school     785  396    389           <NA>
## 13270           1-Regular school     880  396    484           <NA>
## 13275           1-Regular school     477  239    238           <NA>
## 13290           1-Regular school     113   63     50           <NA>
## 13335           1-Regular school     615  319    296             20
## 13338           1-Regular school     411  183    228           <NA>
## 13340           1-Regular school     309  158    151           <NA>
## 13424           1-Regular school    1530  809    721           <NA>
## 13428           1-Regular school    1116  550    566           <NA>
## 13442           1-Regular school     549  279    270           <NA>
## 13448 4-Alternative/other school       0    0      0           <NA>
## 13467           1-Regular school     123   60     63           <NA>
## 13468           1-Regular school     160   70     90           <NA>
## 13469           1-Regular school     229  119    110           <NA>
## 13470           1-Regular school     255  118    137           <NA>
## 13471           1-Regular school     395  203    192           <NA>
## 13483 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 13487           1-Regular school     341  156    185           <NA>
## 13588 4-Alternative/other school       0    0      0           <NA>
## 13595           1-Regular school     967  474    493           <NA>
## 13602           1-Regular school     482  244    238           <NA>
## 13623 2-Special education school     n/a  n/a    n/a           <NA>
## 13625           1-Regular school     n/a  n/a    n/a           <NA>
## 13677           1-Regular school    1001  534    467           <NA>
## 13704           1-Regular school     390  191    199          25.52
## 13755           1-Regular school     745  392    353           <NA>
## 13816           1-Regular school     481  229    252           <NA>
## 13964           1-Regular school     233  128    105          15.54
## 14045 4-Alternative/other school       2    1      1           <NA>
## 14047 4-Alternative/other school      17    4     13           <NA>
## 14061        3-Vocational school       0    0      0           <NA>
## 14062 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 14068        3-Vocational school       0    0      0           <NA>
## 14102 2-Special education school      49   29     20           <NA>
## 14112           1-Regular school     609  334    275           <NA>
## 14118 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 14124 4-Alternative/other school       0    0      0           <NA>
## 14129        3-Vocational school       0    0      0           <NA>
## 14136 2-Special education school       0    0      0           <NA>
## 14142 2-Special education school       0    0      0           <NA>
## 14161           1-Regular school     n/a  n/a    n/a           <NA>
## 14205           1-Regular school     215   99    116           <NA>
## 14221           1-Regular school      15    9      6           2.99
## 14226 4-Alternative/other school      30   14     16           <NA>
## 14229           1-Regular school     481  238    243           <NA>
## 14237 2-Special education school       1    1      0           <NA>
## 14371 4-Alternative/other school       2    1      1           <NA>
## 14373 4-Alternative/other school       3    3      0           <NA>
## 14375 4-Alternative/other school       1    1      0           <NA>
## 14377 4-Alternative/other school       3    3      0           <NA>
## 14379           1-Regular school     502  244    258           <NA>
## 14387           1-Regular school     270  146    124           <NA>
## 14436        3-Vocational school    <NA>  n/a    n/a           <NA>
## 14458           1-Regular school     510  297    213           <NA>
## 14464           1-Regular school     429  236    193           <NA>
## 14465           1-Regular school     556  291    265           <NA>
## 14516           1-Regular school     110   65     45           <NA>
## 14520           1-Regular school     284  136    148           18.8
## 14526           1-Regular school     649  328    321           <NA>
## 14531        3-Vocational school     n/a  n/a    n/a           <NA>
## 14618           1-Regular school      43   24     19           <NA>
## 14671 4-Alternative/other school      26   26      0           <NA>
## 14768           1-Regular school     263  143    120           <NA>
## 14876           1-Regular school     105   43     62           <NA>
## 14877           1-Regular school       0    0      0           <NA>
## 14880 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 14882 2-Special education school       0    0      0           <NA>
## 14883        3-Vocational school     n/a  n/a    n/a           <NA>
## 14899           1-Regular school     135   74     61           <NA>
## 14912           1-Regular school     646  323    323          31.47
## 15111        3-Vocational school    <NA>  n/a    n/a              2
## 15116           1-Regular school     563  297    266             33
## 15161           1-Regular school     608  297    311           <NA>
## 15172 4-Alternative/other school      45   21     24           <NA>
## 15173           1-Regular school     794  375    419           <NA>
## 15175 4-Alternative/other school       5    4      1           <NA>
## 15212 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 15213           1-Regular school     n/a  n/a    n/a           <NA>
## 15215        3-Vocational school     n/a  n/a    n/a           <NA>
## 15297        3-Vocational school     n/a  n/a    n/a           <NA>
## 15298        3-Vocational school     n/a  n/a    n/a           <NA>
## 15304 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 15365 4-Alternative/other school      73   51     22           <NA>
## 15370           1-Regular school     374  200    174           <NA>
## 15371           1-Regular school     281  158    123           <NA>
## 15373           1-Regular school     612  207    405           <NA>
## 15376           1-Regular school      63   33     30           2.92
## 15377           1-Regular school     123   66     57           5.66
## 15395           1-Regular school     557  271    286          24.18
## 15442           1-Regular school     138   85     53           8.05
## 15448 2-Special education school      24   20      4           <NA>
## 15451           1-Regular school       0    0      0           <NA>
## 15452           1-Regular school     225  108    117           <NA>
## 15454           1-Regular school     139   62     77           <NA>
## 15458           1-Regular school     220  100    120             10
## 15473 4-Alternative/other school      27    8     19           <NA>
## 15508 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 15587 4-Alternative/other school       1    1      0           <NA>
## 15666 4-Alternative/other school      23   17      6           <NA>
## 15778 4-Alternative/other school       0  n/a    n/a           <NA>
## 15789           1-Regular school     567  251    316           <NA>
## 15809           1-Regular school     639  341    298           <NA>
## 15822           1-Regular school     478  237    241           <NA>
## 15823           1-Regular school     736  363    373           <NA>
## 15824           1-Regular school     338  164    174           <NA>
## 15825           1-Regular school     707  368    339           <NA>
## 15826           1-Regular school     555  270    285           <NA>
## 15828           1-Regular school     561  296    265           <NA>
## 15829           1-Regular school     917  483    434           <NA>
## 15830           1-Regular school     418  197    221           <NA>
## 15831           1-Regular school     258  142    116           <NA>
## 15832           1-Regular school     415  186    229           <NA>
## 15833           1-Regular school     458  234    224           <NA>
## 15834           1-Regular school     527  264    263           <NA>
## 15835           1-Regular school     764  388    376           <NA>
## 15843           1-Regular school      30   15     15           1.91
## 15898 2-Special education school      21   13      8           <NA>
## 15899           1-Regular school      88   37     51           <NA>
## 15943 4-Alternative/other school       3    1      2           <NA>
## 15950 4-Alternative/other school      87   41     46           <NA>
## 15957           1-Regular school       0    0      0           <NA>
## 15958           1-Regular school       0    0      0           <NA>
## 15960           1-Regular school     178   90     88           <NA>
## 15966 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 15970           1-Regular school     183   90     93           <NA>
## 15981           1-Regular school     824  453    371           <NA>
## 16010           1-Regular school      71   37     34            3.2
## 16141 4-Alternative/other school      59   58      1           <NA>
## 16190           1-Regular school      78   49     29           <NA>
## 16218           1-Regular school     806  400    406           <NA>
## 16247           1-Regular school     679  335    344          29.84
## 16271           1-Regular school    1353  641    712          42.98
## 16273           1-Regular school    1195  545    650           48.7
## 16307 4-Alternative/other school       7    7      0           <NA>
## 16308           1-Regular school      70   60     10           12.8
## 16332 4-Alternative/other school       7    3      4           <NA>
## 16357           1-Regular school       0    0      0           <NA>
## 16359           1-Regular school       0    0      0           <NA>
## 16360           1-Regular school       0    0      0           <NA>
## 16403           1-Regular school     770  390    380           <NA>
## 16411           1-Regular school    2187 1070   1117           77.6
## 16483           1-Regular school    1898  967    931           <NA>
## 16498           1-Regular school     580  296    284             42
## 16525 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 16526        3-Vocational school    <NA>  n/a    n/a              1
## 16623           1-Regular school     139   71     68           <NA>
## 16633           1-Regular school     n/a  n/a    n/a           <NA>
## 16767           1-Regular school     539  297    242           <NA>
## 16805 4-Alternative/other school    <NA>  n/a    n/a             11
## 16811 2-Special education school      69   52     17           <NA>
## 16816           1-Regular school     n/a  n/a    n/a           <NA>
## 16828 4-Alternative/other school      11    8      3           <NA>
## 16913           1-Regular school    <NA>  n/a    n/a              2
## 16918           1-Regular school     n/a  n/a    n/a           <NA>
## 16926 4-Alternative/other school       0    0      0           <NA>
## 16948           1-Regular school    1914  948    966          64.65
## 16950 4-Alternative/other school       1    0      1           <NA>
## 16952 4-Alternative/other school      10    9      1           <NA>
## 16953 2-Special education school       0    0      0           <NA>
## 16963        3-Vocational school       0    0      0           <NA>
## 17019 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 17046           1-Regular school       5    3      2              1
## 17116           1-Regular school     170   77     93           <NA>
## 17160           1-Regular school     141   75     66           <NA>
## 17231        3-Vocational school    <NA>  n/a    n/a              1
## 17232        3-Vocational school       0    0      0           <NA>
## 17282           1-Regular school     239  139    100          12.46
## 17334           1-Regular school       0    0      0           <NA>
## 17335           1-Regular school      28   11     17           <NA>
## 17344 4-Alternative/other school       1    1      0           <NA>
## 17345 4-Alternative/other school       3    2      1           <NA>
## 17347 4-Alternative/other school       4    4      0           <NA>
## 17447        3-Vocational school     n/a  n/a    n/a           <NA>
## 17510        3-Vocational school       0    0      0           <NA>
## 17538           1-Regular school     559  284    275           <NA>
## 17599           1-Regular school     629  301    328           <NA>
## 17600           1-Regular school     676  371    305           <NA>
## 17611           1-Regular school       0    0      0           <NA>
## 17612           1-Regular school       2    1      1           <NA>
## 17613           1-Regular school       4    2      2           <NA>
## 17639 4-Alternative/other school       6    3      3           <NA>
## 17641        3-Vocational school       0    0      0           <NA>
## 17651 2-Special education school       0    0      0           <NA>
## 17775           1-Regular school     n/a  n/a    n/a           <NA>
## 17787 2-Special education school       1    1      0           <NA>
## 17793        3-Vocational school     n/a  n/a    n/a           <NA>
## 17800           1-Regular school    2030  948   1082         124.84
## 17802           1-Regular school      99   55     44          19.15
## 17803           1-Regular school     232  131    101           48.1
## 17805 4-Alternative/other school       7    6      1           2.45
## 17815 4-Alternative/other school      11    7      4           <NA>
## 17823           1-Regular school       0    0      0           <NA>
## 17845           1-Regular school     676  380    296           20.2
## 17850           1-Regular school     148   79     69           <NA>
## 17856           1-Regular school     667  345    322          30.65
## 17895           1-Regular school     133   67     66          13.69
## 17896           1-Regular school     462  215    247          20.37
## 17897           1-Regular school     396  193    203          18.05
## 17901           1-Regular school     402  229    173           <NA>
## 17907           1-Regular school      12    9      3           <NA>
## 17925        3-Vocational school       0    0      0           <NA>
## 17936 2-Special education school      93   60     33           <NA>
## 17977           1-Regular school     110   49     61           <NA>
## 17978           1-Regular school       0    0      0           <NA>
## 18066           1-Regular school    2175 1075   1100          98.98
## 18067           1-Regular school     106   62     44          27.81
## 18074 2-Special education school    <NA>  n/a    n/a           <NA>
## 18168        3-Vocational school       0    0      0           <NA>
## 18169           1-Regular school     420  127    293           13.5
## 18170           1-Regular school       0    0      0           <NA>
## 18171           1-Regular school       0    0      0           <NA>
## 18173 2-Special education school    <NA>  n/a    n/a           <NA>
## 18174 2-Special education school    <NA>  n/a    n/a           <NA>
## 18176 2-Special education school       0    0      0           <NA>
## 18177 2-Special education school       0    0      0           <NA>
## 18178 2-Special education school       0    0      0           <NA>
## 18216           1-Regular school     182  167     15           <NA>
## 18232           1-Regular school     830  458    372           <NA>
## 18254           1-Regular school     844  452    392           41.4
## 18273 4-Alternative/other school       4    2      2           <NA>
## 18285           1-Regular school     n/a  n/a    n/a           <NA>
## 18338        3-Vocational school    <NA>  n/a    n/a              6
## 18375           1-Regular school     154   77     77           <NA>
## 18378           1-Regular school     432  216    216           <NA>
## 18379           1-Regular school     726  372    354           <NA>
## 18386           1-Regular school    2733 1380   1353           <NA>
## 18387           1-Regular school     532  265    267           <NA>
## 18392           1-Regular school    1525  764    761           <NA>
## 18393           1-Regular school     143   91     52           <NA>
## 18408           1-Regular school     452  235    217           <NA>
## 18423           1-Regular school     493  258    235           <NA>
## 18424           1-Regular school     254  146    108           <NA>
## 18425           1-Regular school     555  286    269           <NA>
## 18431           1-Regular school     510  277    233           <NA>
## 18432           1-Regular school     525  294    231           <NA>
## 18468 4-Alternative/other school       3    1      2           <NA>
## 18490           1-Regular school     n/a  n/a    n/a           <NA>
## 18508           1-Regular school     272  168    104           <NA>
## 18553           1-Regular school    2094 1114    980           <NA>
## 18557 4-Alternative/other school      15   12      3           <NA>
## 18567           1-Regular school     186  102     84           <NA>
## 18574 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 18614 4-Alternative/other school       4    0      4           <NA>
## 18642           1-Regular school     n/a  n/a    n/a           <NA>
## 18677           1-Regular school     343  184    159          25.51
## 18719 4-Alternative/other school      20   20    n/a           <NA>
## 18726 2-Special education school     n/a  n/a    n/a           <NA>
## 18762           1-Regular school     225   86    139           9.85
## 18787           1-Regular school    1742  903    839           <NA>
## 18792           1-Regular school     n/a  n/a    n/a           <NA>
## 18795           1-Regular school     507  249    258           <NA>
## 18796           1-Regular school     155  100     55           <NA>
## 18840           1-Regular school     462  217    245           <NA>
## 18861           1-Regular school     689  343    346           <NA>
## 18877           1-Regular school      32   15     17              2
## 18878 4-Alternative/other school       0    0      0           <NA>
## 18879 4-Alternative/other school       5    3      2              1
## 18881           1-Regular school     368  194    174           <NA>
## 18890 2-Special education school     107   63     44           <NA>
## 18891 2-Special education school      14    9      5           <NA>
## 18900 2-Special education school     n/a  n/a    n/a           <NA>
## 18932 2-Special education school       4    4    n/a           <NA>
## 18973 4-Alternative/other school      57   37     20           <NA>
## 18994           1-Regular school       0    0      0           <NA>
## 19047        3-Vocational school     n/a  n/a    n/a           <NA>
## 19102           1-Regular school       7    5      2              1
## 19111 4-Alternative/other school      19   13      6            5.1
## 19115 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 19147           1-Regular school     114   50     64           <NA>
## 19169           1-Regular school     337  155    182          14.48
## 19183           1-Regular school     586  290    296           21.5
## 19190           1-Regular school     144   79     65           8.45
## 19232           1-Regular school     786  421    365          52.39
## 19238           1-Regular school     760  414    346           <NA>
## 19246           1-Regular school     492  247    245           <NA>
## 19257 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 19258        3-Vocational school    <NA>  n/a    n/a           <NA>
## 19288           1-Regular school     532  266    266           <NA>
## 19292           1-Regular school     111   45     66          13.18
## 19293           1-Regular school     384  176    208          10.98
## 19294           1-Regular school    <NA>  n/a    n/a          11.75
## 19295           1-Regular school     584  279    305          16.69
## 19296           1-Regular school    1518  690    828           62.2
## 19354           1-Regular school     275  161    114           <NA>
## 19388           1-Regular school     398  201    197           <NA>
## 19389           1-Regular school     697  359    338           <NA>
## 19451           1-Regular school     607  323    284           <NA>
## 19461 4-Alternative/other school      11   11      0           <NA>
## 19474           1-Regular school       0    0      0           <NA>
## 19486           1-Regular school     505  265    240          36.17
## 19492 4-Alternative/other school     134   58     76           <NA>
## 19568 4-Alternative/other school       1    0      1           <NA>
## 19612 4-Alternative/other school      90   54     36           <NA>
## 19626 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 19649 4-Alternative/other school      21   21      0           <NA>
## 19659 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 19664 4-Alternative/other school      28   28      0           <NA>
## 19690           1-Regular school     309  150    159          31.47
## 19712           1-Regular school     326  141    185           <NA>
## 19719           1-Regular school      97   50     47           <NA>
## 19748           1-Regular school    1508  764    744           80.4
## 19756           1-Regular school    1462  797    665          82.59
## 19776        3-Vocational school       0    0      0           <NA>
## 19777        3-Vocational school       0    0      0           <NA>
## 19778        3-Vocational school       0    0      0           <NA>
## 19779        3-Vocational school       0    0      0           <NA>
## 19781        3-Vocational school       0    0      0           <NA>
## 19782        3-Vocational school       0    0      0           <NA>
## 19783        3-Vocational school       0    0      0           <NA>
## 19784        3-Vocational school       0    0      0           <NA>
## 19785        3-Vocational school       0    0      0           <NA>
## 19786        3-Vocational school       0    0      0           <NA>
## 19788           1-Regular school     n/a  n/a    n/a           <NA>
## 19832 4-Alternative/other school    <NA>  n/a    n/a              1
## 19833        3-Vocational school    <NA>  n/a    n/a              7
## 19835        3-Vocational school    <NA>  n/a    n/a           <NA>
## 19837 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 19860 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 19892 4-Alternative/other school      10    8      2           <NA>
## 19900 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 19928           1-Regular school    2295 1207   1088          95.03
## 20031        3-Vocational school       0    0      0           <NA>
## 20032        3-Vocational school       0    0      0           <NA>
## 20033        3-Vocational school       0    0      0           <NA>
## 20034        3-Vocational school       0    0      0           <NA>
## 20035        3-Vocational school       0    0      0           <NA>
## 20036        3-Vocational school       0    0      0           <NA>
## 20061           1-Regular school     n/a  n/a    n/a           <NA>
## 20099 4-Alternative/other school       7    4      3           <NA>
## 20101           1-Regular school    2518 1293   1225           <NA>
## 20161           1-Regular school     411  216    195             13
## 20167           1-Regular school      41   31     10           <NA>
## 20175 4-Alternative/other school      47   46      1           <NA>
## 20182 4-Alternative/other school       4    4      0           <NA>
## 20196 2-Special education school       0    0      0           <NA>
## 20223 4-Alternative/other school       6    5      1           <NA>
## 20247 4-Alternative/other school     136   88     48           <NA>
## 20266 4-Alternative/other school       4    3      1           <NA>
## 20268        3-Vocational school    <NA>  n/a    n/a           1.25
## 20272 4-Alternative/other school       3    2      1           <NA>
## 20273 4-Alternative/other school       1    1      0           <NA>
## 20335 2-Special education school     235  148     87           <NA>
## 20413           1-Regular school     626  302    324             40
## 20424           1-Regular school     625  321    304           <NA>
## 20545           1-Regular school     538  295    243             23
## 20590           1-Regular school     665  365    300           <NA>
## 20654           1-Regular school    1187  572    615           <NA>
## 20662 2-Special education school     n/a  n/a    n/a           <NA>
## 20695           1-Regular school    2604 1342   1262           <NA>
## 20712           1-Regular school     497  251    246           <NA>
## 20715           1-Regular school     n/a  n/a    n/a           <NA>
## 20719 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 20764           1-Regular school     234  119    115           <NA>
## 20770 2-Special education school     n/a  n/a    n/a           <NA>
## 20774           1-Regular school     674  350    324           <NA>
## 20775           1-Regular school     113   46     67           <NA>
## 20826 4-Alternative/other school      54   45      9           <NA>
## 20887           1-Regular school     302  157    145           18.4
## 20927 2-Special education school      36   25     11           <NA>
## 21008           1-Regular school      98   63     35             11
## 21027           1-Regular school     571  303    268             37
## 21040           1-Regular school      28   12     16           <NA>
## 21073           1-Regular school     777  402    375           <NA>
## 21095           1-Regular school     922  450    472          51.77
## 21101 2-Special education school    <NA>  n/a    n/a           <NA>
## 21115 4-Alternative/other school      23   23      0           <NA>
## 21117        3-Vocational school    <NA>  n/a    n/a              4
## 21137           1-Regular school     504  258    246          21.78
## 21140           1-Regular school     310  158    152          13.04
## 21143        3-Vocational school       0    0      0           <NA>
## 21161           1-Regular school     422  231    191             20
## 21251           1-Regular school      34   13     21           <NA>
## 21283           1-Regular school      61   36     25              3
## 21287           1-Regular school     n/a  n/a    n/a           <NA>
## 21309           1-Regular school     515  251    264           <NA>
## 21325           1-Regular school     395  187    208           <NA>
## 21329           1-Regular school     432  228    204           <NA>
## 21331           1-Regular school     492  242    250           <NA>
## 21374           1-Regular school       0    0      0           <NA>
## 21440 4-Alternative/other school       1    1      0           <NA>
## 21446 4-Alternative/other school       5    4      1           <NA>
## 21451 4-Alternative/other school       2    2      0           <NA>
## 21479 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 21480 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 21490 2-Special education school       0    0      0           <NA>
## 21549           1-Regular school     382  203    179           <NA>
## 21551           1-Regular school     460  217    243           <NA>
## 21554           1-Regular school    1425  674    750           <NA>
## 21555           1-Regular school     186  114     72           <NA>
## 21556           1-Regular school    1097  556    541           <NA>
## 21563           1-Regular school     336  146    190           <NA>
## 21569           1-Regular school     172   97     75           <NA>
## 21580           1-Regular school      33   19     14           <NA>
## 21585 4-Alternative/other school     172   76     96           <NA>
## 21591           1-Regular school    1234  590    644          53.53
## 21596           1-Regular school      53   33     20           <NA>
## 21602           1-Regular school      77   36     41           <NA>
## 21607           1-Regular school     397  208    189           <NA>
## 21608           1-Regular school     194  102     92           <NA>
## 21610           1-Regular school     345  173    172           16.7
## 21618 2-Special education school     151   75     76           <NA>
## 21619           1-Regular school     789  421    368           <NA>
## 21633 2-Special education school       0    0      0           <NA>
## 21638           1-Regular school     626  306    320           28.2
## 21641 2-Special education school      14    5      9           <NA>
## 21646 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 21647        3-Vocational school    <NA>  n/a    n/a           3.25
## 21656           1-Regular school     552  328    224          17.37
## 21680           1-Regular school       0    0      0           <NA>
## 21681           1-Regular school       0    0      0           <NA>
## 21693           1-Regular school     305  148    157           <NA>
## 21698 4-Alternative/other school       0    0      0           <NA>
## 21827 2-Special education school       0    0      0           <NA>
## 21837           1-Regular school    1114  574    540           <NA>
## 21849 4-Alternative/other school      91   43     48           <NA>
## 21850           1-Regular school     762  373    389           <NA>
## 21855           1-Regular school     300  168    132           <NA>
## 21859           1-Regular school      20    7     13           <NA>
## 21913           1-Regular school     620  316    304           30.7
## 21914           1-Regular school    <NA>  n/a    n/a           22.1
## 21916           1-Regular school       2    2      0            0.5
## 21917           1-Regular school     455  236    219          21.57
## 21975           1-Regular school     637  339    298           <NA>
## 22012           1-Regular school     707  352    355          42.35
## 22028           1-Regular school     567  299    268           26.6
## 22029           1-Regular school     372  193    179             10
## 22033           1-Regular school     550  286    264          22.66
## 22041           1-Regular school    <NA>  n/a    n/a           <NA>
## 22049           1-Regular school     815  415    400           <NA>
## 22088           1-Regular school     116   58     58           <NA>
## 22096           1-Regular school     455  251    204           <NA>
## 22097           1-Regular school     714  360    354           <NA>
## 22101           1-Regular school      96   54     42           <NA>
## 22109           1-Regular school     431  205    226           <NA>
## 22113           1-Regular school      63   38     25              6
## 22114 2-Special education school       0    0      0           <NA>
## 22115 2-Special education school       2    2      0           <NA>
## 22117           1-Regular school      39   16     23           <NA>
## 22125           1-Regular school       0    0      0           <NA>
## 22133           1-Regular school       0    0      0           <NA>
## 22134           1-Regular school       0    0      0           <NA>
## 22135           1-Regular school       0    0      0           <NA>
## 22136           1-Regular school       0    0      0           <NA>
## 22137           1-Regular school       0    0      0           <NA>
## 22138           1-Regular school       0    0      0           <NA>
## 22139           1-Regular school       0    0      0           <NA>
## 22157           1-Regular school     n/a  n/a    n/a           <NA>
## 22168           1-Regular school    1199  620    579           <NA>
## 22172           1-Regular school     809  426    383           <NA>
## 22174           1-Regular school     409  205    204           <NA>
## 22175           1-Regular school     458  222    236           <NA>
## 22176 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 22177           1-Regular school       3    0      3           <NA>
## 22178           1-Regular school       0    0      0           <NA>
## 22179           1-Regular school       0    0      0           <NA>
## 22180           1-Regular school       3    1      2           <NA>
## 22199           1-Regular school     837  462    375           <NA>
## 22202           1-Regular school     409  207    202           19.2
## 22218           1-Regular school     426  207    219           <NA>
## 22386 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 22450           1-Regular school       6    3      3           <NA>
## 22538           1-Regular school     n/a  n/a    n/a           <NA>
## 22554        3-Vocational school    <NA>  n/a    n/a           <NA>
## 22573 4-Alternative/other school       5    4      1           <NA>
## 22583 4-Alternative/other school       0  n/a    n/a           <NA>
## 22596           1-Regular school     236  125    111             13
## 22626           1-Regular school      22   19      3           17.9
## 22627           1-Regular school     571  313    258           <NA>
## 22646 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 22699 4-Alternative/other school       5  n/a      5           <NA>
## 22736           1-Regular school     275  142    133           <NA>
## 22752           1-Regular school     410  209    201           <NA>
## 22913 2-Special education school      26   19      7           <NA>
## 22991           1-Regular school    1503  775    728           <NA>
## 22992           1-Regular school     744  371    373           <NA>
## 23002 4-Alternative/other school     140   75     65           <NA>
## 23004           1-Regular school    <NA>  n/a    n/a          19.93
## 23059 4-Alternative/other school     233  147     86           <NA>
## 23060           1-Regular school     107   54     53           10.8
## 23087           1-Regular school    1030  493    537           <NA>
## 23115           1-Regular school     490  246    244           <NA>
## 23144           1-Regular school     420  239    181           28.9
## 23161           1-Regular school     346  182    164           <NA>
## 23162           1-Regular school     459  243    216           <NA>
## 23167           1-Regular school       4    2      2           <NA>
## 23195           1-Regular school     127   74     53           <NA>
## 23204           1-Regular school    <NA>  n/a    n/a           <NA>
## 23228           1-Regular school     n/a  n/a    n/a           <NA>
## 23337 4-Alternative/other school       0    0      0           <NA>
## 23364 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 23444           1-Regular school     449  232    217           <NA>
## 23446           1-Regular school     551  275    276           <NA>
## 23447           1-Regular school     775  377    398           <NA>
## 23448           1-Regular school     938  447    491           <NA>
## 23449           1-Regular school     858  435    423           <NA>
## 23450           1-Regular school     845  432    413           <NA>
## 23452 4-Alternative/other school     195  106     89           <NA>
## 23455           1-Regular school       0    0      0           <NA>
## 23456           1-Regular school       0    0      0           <NA>
## 23458           1-Regular school       0    0      0           <NA>
## 23578           1-Regular school      65   32     33           <NA>
## 23579           1-Regular school      52   30     22           <NA>
## 23580           1-Regular school      29   15     14           <NA>
## 23581           1-Regular school      75   43     32           <NA>
## 23582           1-Regular school     121   74     47           <NA>
## 23583           1-Regular school     222   88    134           <NA>
## 23584           1-Regular school     116   67     49           <NA>
## 23656           1-Regular school     598  292    306           <NA>
## 23667           1-Regular school     673  366    307           <NA>
## 23668           1-Regular school     204  104    100           <NA>
## 23669           1-Regular school     333  168    165           <NA>
## 23670           1-Regular school     180   90     90           <NA>
## 23673 4-Alternative/other school       0    0      0           <NA>
## 23737 4-Alternative/other school      11    6      5           <NA>
## 23762           1-Regular school     693  344    349           <NA>
## 23768           1-Regular school     416  211    205           <NA>
## 23773           1-Regular school    1081  562    519           <NA>
## 23858 2-Special education school       9    5      4           <NA>
## 23861           1-Regular school      12    8      4           <NA>
## 23872           1-Regular school       0    0      0           <NA>
## 23891 2-Special education school      23   15      8           <NA>
## 23895 2-Special education school     149   80     69           <NA>
## 23932           1-Regular school     288  154    134             15
## 23935           1-Regular school     109   55     54           <NA>
## 23938           1-Regular school     n/a  n/a    n/a           <NA>
## 23939           1-Regular school     n/a  n/a    n/a           <NA>
## 23949           1-Regular school     n/a  n/a    n/a           <NA>
## 23951           1-Regular school    <NA>  n/a    n/a           <NA>
## 23952           1-Regular school      31   14     17           <NA>
## 23953 2-Special education school     123   75     48           <NA>
## 23959           1-Regular school     n/a  n/a    n/a           <NA>
## 23964           1-Regular school     311  164    147           <NA>
## 23965 4-Alternative/other school      36   26     10           <NA>
## 23971 2-Special education school     104   77     27           <NA>
## 23972           1-Regular school     246  150     96           <NA>
## 23974           1-Regular school     158   88     70           <NA>
## 23975           1-Regular school     174   89     85           <NA>
## 23979 2-Special education school      57   41     16           <NA>
## 23980 2-Special education school     132   98     34           <NA>
## 23985 2-Special education school      61   44     17           <NA>
## 23988 2-Special education school     140   77     63           <NA>
## 23991 2-Special education school      10    6      4           <NA>
## 24066           1-Regular school     681  369    312             31
## 24073           1-Regular school     255  138    117             21
## 24074 2-Special education school     175  100     75           <NA>
## 24088           1-Regular school     n/a  n/a    n/a           <NA>
## 24093           1-Regular school    1002  513    489           <NA>
## 24101           1-Regular school      19   15      4           <NA>
## 24122 2-Special education school     n/a  n/a    n/a           <NA>
## 24128 4-Alternative/other school      12    8      4           <NA>
## 24186 4-Alternative/other school      34   29      5           <NA>
## 24379           1-Regular school    1972 1038    934           <NA>
## 24396           1-Regular school    3904 2014   1890            221
## 24412           1-Regular school     365  160    205           <NA>
## 24467           1-Regular school     640  334    306           <NA>
## 24500           1-Regular school     784  412    372           <NA>
## 24521           1-Regular school     638  345    293           <NA>
## 24546           1-Regular school      33   15     18           <NA>
## 24564           1-Regular school     567  288    279          38.25
## 24599 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 24600 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 24634        3-Vocational school       0    0      0           <NA>
## 24636           1-Regular school     425  230    195           <NA>
## 24639           1-Regular school     447  255    192           <NA>
## 24642           1-Regular school       0    0      0           <NA>
## 24701           1-Regular school      19    6     13           <NA>
## 24706           1-Regular school     178  107     71           <NA>
## 24756 2-Special education school      75   58     17           <NA>
## 24757           1-Regular school     n/a  n/a    n/a           <NA>
## 24794 2-Special education school      16    7      9           <NA>
## 24819 2-Special education school       0    0      0           <NA>
## 24852           1-Regular school    1031  554    477           <NA>
## 24866 4-Alternative/other school       7    7      0           <NA>
## 24871           1-Regular school     705  353    352           <NA>
## 24899           1-Regular school     655  276    379           <NA>
## 24994           1-Regular school     308  149    159           <NA>
## 25047           1-Regular school     142   62     80           6.54
## 25049           1-Regular school       0    0      0           <NA>
## 25075           1-Regular school     774  421    353           <NA>
## 25090 2-Special education school      48   34     14           <NA>
## 25107 2-Special education school      60   47     13           <NA>
## 25125        3-Vocational school       0    0      0           <NA>
## 25126        3-Vocational school    <NA>  n/a    n/a           <NA>
## 25167 4-Alternative/other school     154   84     70           <NA>
## 25168           1-Regular school      54   26     28           <NA>
## 25191           1-Regular school     642  314    328           <NA>
## 25192           1-Regular school     370  208    162           <NA>
## 25335        3-Vocational school     n/a  n/a    n/a           <NA>
## 25364           1-Regular school     486  242    244           <NA>
## 25372           1-Regular school    <NA>  n/a    n/a              0
## 25375           1-Regular school     358  192    166           <NA>
## 25389           1-Regular school     104   53     51           <NA>
## 25390           1-Regular school     119   66     53           <NA>
## 25391 2-Special education school      58   30     28           <NA>
## 25392           1-Regular school     278  142    136           <NA>
## 25440           1-Regular school     374  173    201             25
## 25444 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 25445           1-Regular school     333  175    158           21.8
## 25458           1-Regular school     689  329    360           <NA>
## 25459           1-Regular school     123   64     59           <NA>
## 25465           1-Regular school      92   38     54           <NA>
## 25475           1-Regular school      93   40     53           <NA>
## 25478           1-Regular school     n/a  n/a    n/a           <NA>
## 25482 4-Alternative/other school       0    0      0           <NA>
## 25483 4-Alternative/other school       0    0      0           <NA>
## 25486           1-Regular school      63   33     30           <NA>
## 25487           1-Regular school    1619  815    804           <NA>
## 25488           1-Regular school    1756  890    866           <NA>
## 25498        3-Vocational school    <NA>  n/a    n/a              1
## 25520           1-Regular school     675  324    351          39.62
## 25578           1-Regular school     243  137    106          23.38
## 25653           1-Regular school     240  106    134           12.4
## 25693           1-Regular school    1198  627    571           <NA>
## 25748           1-Regular school     n/a  n/a    n/a           <NA>
## 25797           1-Regular school     n/a  n/a    n/a           <NA>
## 25808           1-Regular school     n/a  n/a    n/a           <NA>
## 25842        3-Vocational school    <NA>  n/a    n/a           <NA>
## 25858 4-Alternative/other school       2    1      1           <NA>
## 25867 2-Special education school      12    8      4           <NA>
## 25868           1-Regular school     135   70     65           <NA>
## 25877 4-Alternative/other school       1    0      1           <NA>
## 25917           1-Regular school     267  138    129             12
## 25932 2-Special education school       0    0      0           <NA>
## 25958           1-Regular school     309  161    148          13.05
## 26038           1-Regular school     213  119     94          20.29
## 26092           1-Regular school     187   91     96              8
## 26097           1-Regular school     833  432    401           <NA>
## 26112           1-Regular school    1149  575    574           <NA>
## 26114 4-Alternative/other school       3    2      1           <NA>
## 26118           1-Regular school     762  377    385           <NA>
## 26166           1-Regular school      15    5     10              1
## 26172 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 26286           1-Regular school     363  174    189           <NA>
## 26289           1-Regular school     998  528    470           <NA>
## 26327           1-Regular school     502  271    231           29.5
## 26389        3-Vocational school    <NA>  n/a    n/a             11
## 26433           1-Regular school      34   22     12           11.9
## 26530           1-Regular school     105   70     35           <NA>
## 26532           1-Regular school     120   75     45           <NA>
## 26590           1-Regular school     583  296    287           <NA>
## 26602           1-Regular school     591  309    282           <NA>
## 26606           1-Regular school     n/a  n/a    n/a           <NA>
## 26632           1-Regular school      11    4      7           <NA>
## 26677           1-Regular school     302  148    154             27
## 26701           1-Regular school     351  188    163           <NA>
## 26702           1-Regular school     290  147    143           <NA>
## 26703           1-Regular school      55   11     44            2.5
## 26707 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 26728           1-Regular school      85   34     51           <NA>
## 26748           1-Regular school     492  268    224           <NA>
## 26753           1-Regular school     780  386    394           <NA>
## 26761           1-Regular school     920  479    441           <NA>
## 26774           1-Regular school     576  291    285           <NA>
## 26776           1-Regular school     415  208    207           <NA>
## 26777           1-Regular school     173   93     80           <NA>
## 26778           1-Regular school     368  183    185           <NA>
## 26780           1-Regular school     202  106     96           <NA>
## 26797 2-Special education school    <NA>  n/a    n/a           <NA>
## 26838           1-Regular school     555  299    256           <NA>
## 26844           1-Regular school     269  138    131           25.3
## 26851 2-Special education school       8    6      2           <NA>
## 26852 2-Special education school       8    5      3           <NA>
## 26856           1-Regular school     343  188    155           <NA>
## 26860 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 26875           1-Regular school     434  235    199           <NA>
## 26886           1-Regular school     456  255    201           <NA>
## 26888 4-Alternative/other school       0    0      0           <NA>
## 26889           1-Regular school     577  308    269           <NA>
## 26890           1-Regular school     478  247    231           <NA>
## 26892           1-Regular school      17   17      0           <NA>
## 26907           1-Regular school       6    1      5           <NA>
## 26915           1-Regular school     513  250    263           <NA>
## 26916           1-Regular school     587  304    283           <NA>
## 26924           1-Regular school     595  267    328           <NA>
## 26930           1-Regular school     399  130    269           9.36
## 26947        3-Vocational school    <NA>  n/a    n/a              3
## 27064 2-Special education school       1    1      0           <NA>
## 27066           1-Regular school      65   32     33           <NA>
## 27069           1-Regular school     472  236    236           <NA>
## 27070           1-Regular school      78   42     36           <NA>
## 27071           1-Regular school     132   65     67           <NA>
## 27073           1-Regular school     341  157    184          11.88
## 27076 4-Alternative/other school      20   20      0           <NA>
## 27078 4-Alternative/other school    <NA>  n/a    n/a           0.19
## 27082 4-Alternative/other school      70   52     18           <NA>
## 27083 4-Alternative/other school      11   11      0           <NA>
## 27085           1-Regular school       0    0      0           <NA>
## 27086           1-Regular school      73   36     37           <NA>
## 27087           1-Regular school       0    0      0           <NA>
## 27089        3-Vocational school    <NA>  n/a    n/a           <NA>
## 27098           1-Regular school     818  374    444          45.38
## 27106           1-Regular school     697  276    421            9.2
## 27111 2-Special education school      11    6      5           <NA>
## 27115 2-Special education school      36   25     11           <NA>
## 27121           1-Regular school      21    5     16           <NA>
## 27151           1-Regular school     502  266    236           <NA>
## 27157 4-Alternative/other school      72   67      5           <NA>
## 27175 4-Alternative/other school       5    5    n/a           <NA>
## 27176 4-Alternative/other school      20   11      9           <NA>
## 27188           1-Regular school     491  250    241           <NA>
## 27229           1-Regular school     223  106    117           <NA>
## 27238           1-Regular school       0    0      0           <NA>
## 27266           1-Regular school     296  147    149           <NA>
## 27283 2-Special education school    <NA>  n/a    n/a              2
## 27390           1-Regular school      92   44     48           <NA>
## 27478           1-Regular school     376  192    184             30
## 27487 4-Alternative/other school      56   26     30           <NA>
## 27489 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 27524 4-Alternative/other school      19   19    n/a           <NA>
## 27577           1-Regular school     695  347    348           <NA>
## 27606        3-Vocational school       0    0      0           <NA>
## 27607        3-Vocational school       0    0      0           <NA>
## 27608        3-Vocational school       0    0      0           <NA>
## 27609        3-Vocational school       0    0      0           <NA>
## 27610        3-Vocational school       0    0      0           <NA>
## 27611        3-Vocational school       0    0      0           <NA>
## 27612        3-Vocational school       0    0      0           <NA>
## 27613        3-Vocational school       0    0      0           <NA>
## 27614        3-Vocational school       0    0      0           <NA>
## 27615        3-Vocational school       0    0      0           <NA>
## 27616        3-Vocational school       0    0      0           <NA>
## 27617        3-Vocational school       0    0      0           <NA>
## 27618        3-Vocational school       0    0      0           <NA>
## 27619        3-Vocational school       0    0      0           <NA>
## 27620        3-Vocational school       0    0      0           <NA>
## 27621        3-Vocational school       0    0      0           <NA>
## 27622        3-Vocational school       0    0      0           <NA>
## 27623        3-Vocational school       0    0      0           <NA>
## 27625        3-Vocational school     n/a  n/a    n/a           <NA>
## 27627        3-Vocational school       0    0      0           <NA>
## 27628        3-Vocational school       0    0      0           <NA>
## 27629        3-Vocational school       0    0      0           <NA>
## 27630        3-Vocational school       0    0      0           <NA>
## 27631        3-Vocational school       0    0      0           <NA>
## 27632        3-Vocational school       0    0      0           <NA>
## 27633        3-Vocational school       0    0      0           <NA>
## 27634        3-Vocational school       0    0      0           <NA>
## 27635        3-Vocational school       0    0      0           <NA>
## 27636        3-Vocational school       0    0      0           <NA>
## 27637        3-Vocational school       0    0      0           <NA>
## 27638        3-Vocational school       0    0      0           <NA>
## 27639        3-Vocational school       0    0      0           <NA>
## 27640        3-Vocational school       0    0      0           <NA>
## 27641        3-Vocational school       0    0      0           <NA>
## 27642        3-Vocational school       0    0      0           <NA>
## 27643        3-Vocational school       0    0      0           <NA>
## 27644        3-Vocational school       0    0      0           <NA>
## 27645        3-Vocational school       0    0      0           <NA>
## 27646        3-Vocational school       0    0      0           <NA>
## 27647        3-Vocational school       0    0      0           <NA>
## 27648        3-Vocational school       0    0      0           <NA>
## 27650        3-Vocational school       0    0      0           <NA>
## 27651        3-Vocational school       0    0      0           <NA>
## 27652        3-Vocational school       0    0      0           <NA>
## 27653        3-Vocational school       0    0      0           <NA>
## 27654        3-Vocational school       0    0      0           <NA>
## 27656        3-Vocational school       0    0      0           <NA>
## 27657        3-Vocational school       0    0      0           <NA>
## 27658        3-Vocational school       0    0      0           <NA>
## 27671           1-Regular school      11    4      7           <NA>
## 27689 4-Alternative/other school       9    6      3           <NA>
## 27690 4-Alternative/other school       1    1      0           <NA>
## 27691           1-Regular school     233  114    119           <NA>
## 27692           1-Regular school     110   58     52           <NA>
## 27693           1-Regular school     145   82     63           <NA>
## 27697 4-Alternative/other school      32   26      6           <NA>
## 27728           1-Regular school     701  373    328           <NA>
## 27730           1-Regular school     445  208    237           <NA>
## 27737           1-Regular school     260  137    123           <NA>
## 27749 2-Special education school       0    0      0           <NA>
## 27756 4-Alternative/other school       0    0      0           <NA>
## 27804           1-Regular school      88   31     57           <NA>
## 27805 4-Alternative/other school      60   37     23           <NA>
## 27851 2-Special education school       0    0      0           <NA>
## 27896           1-Regular school     848  446    402          44.84
## 27913           1-Regular school     394  214    180           <NA>
## 27935        3-Vocational school     n/a  n/a    n/a           <NA>
## 27937 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 27942 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 27946        3-Vocational school    <NA>  n/a    n/a           8.94
## 27977           1-Regular school    1047  575    472           <NA>
## 27998 4-Alternative/other school       0    0      0           <NA>
## 28085 4-Alternative/other school      10    6      4           <NA>
## 28086 4-Alternative/other school       1    0      1           <NA>
## 28087 4-Alternative/other school       2    1      1           <NA>
## 28089 4-Alternative/other school       1    0      1           <NA>
## 28090 4-Alternative/other school       1    0      1           <NA>
## 28091 4-Alternative/other school       2    1      1           <NA>
## 28093 4-Alternative/other school       2    2      0           <NA>
## 28095 4-Alternative/other school       1    1      0           <NA>
## 28101 4-Alternative/other school       1    0      1           <NA>
## 28107 4-Alternative/other school       4    0      4           <NA>
## 28120           1-Regular school     249  123    126          18.11
## 28198 4-Alternative/other school       2    1      1           <NA>
## 28202           1-Regular school     290  148    142           <NA>
## 28204 4-Alternative/other school       1    0      1           <NA>
## 28205           1-Regular school      31   14     17           <NA>
## 28209 4-Alternative/other school       6    5      1           <NA>
## 28211 4-Alternative/other school       4    2      2           <NA>
## 28213           1-Regular school       1    1      0           <NA>
## 28230           1-Regular school     101   53     48              0
## 28248           1-Regular school     749  396    353           <NA>
## 28304        3-Vocational school     n/a  n/a    n/a           <NA>
## 28335 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 28336 4-Alternative/other school      22   19      3           <NA>
## 28338 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 28339 2-Special education school     164  106     58           <NA>
## 28340           1-Regular school     682  211    471           12.5
## 28341           1-Regular school     n/a  n/a    n/a           <NA>
## 28346 4-Alternative/other school       0    0      0           <NA>
## 28348           1-Regular school     368  171    197          21.96
## 28354           1-Regular school       0    0      0           <NA>
## 28400           1-Regular school     n/a  n/a    n/a           <NA>
## 28432 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 28445           1-Regular school    1229  602    627           <NA>
## 28450           1-Regular school     515  252    263           <NA>
## 28454 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 28472           1-Regular school    1046  532    514           <NA>
## 28475           1-Regular school     682  357    325           37.5
## 28508 4-Alternative/other school     236  117    119           <NA>
## 28547        3-Vocational school    <NA>  n/a    n/a             23
## 28574 2-Special education school      11    7      4           <NA>
## 28579           1-Regular school      83   46     37           <NA>
## 28585           1-Regular school      23   11     12           <NA>
## 28606           1-Regular school     380  205    175          34.45
## 28628 4-Alternative/other school       0    0      0           <NA>
## 28659 2-Special education school      70   50     20           <NA>
## 28660 2-Special education school       9    8      1           <NA>
## 28661 2-Special education school       6    5      1           <NA>
## 28730           1-Regular school     241  135    106           <NA>
## 28754           1-Regular school     561  307    254           <NA>
## 28781           1-Regular school    <NA>  n/a    n/a              1
## 28791           1-Regular school     350  175    175           <NA>
## 28830 4-Alternative/other school      13   12      1           <NA>
## 28842           1-Regular school     374  184    190           <NA>
## 28843           1-Regular school     443  229    214           <NA>
## 28921 2-Special education school      17   13      4           <NA>
## 28922 2-Special education school       8    6      2           <NA>
## 28932 4-Alternative/other school       2    2      0           <NA>
## 28933 4-Alternative/other school       2    2      0           <NA>
## 28989           1-Regular school     n/a  n/a    n/a           <NA>
## 28991 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 28994           1-Regular school     141  123     18            5.6
## 28995           1-Regular school     354  354    n/a          10.85
## 28996           1-Regular school    3203 2015   1188          98.39
## 29010           1-Regular school       0    0      0           <NA>
## 29013           1-Regular school     273  101    172           <NA>
## 29016           1-Regular school     298  157    141           <NA>
## 29022 4-Alternative/other school       0    0      0           <NA>
## 29026           1-Regular school      21   11     10           <NA>
## 29100 4-Alternative/other school       7    3      4           <NA>
## 29101 4-Alternative/other school      22   14      8           <NA>
## 29105 2-Special education school       9    8      1           <NA>
## 29128 4-Alternative/other school       1    0      1           <NA>
## 29178 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 29195           1-Regular school       0    0      0           <NA>
## 29207 4-Alternative/other school       1    0      1           <NA>
## 29208 4-Alternative/other school      11   10      1           <NA>
## 29216           1-Regular school     395  202    193           <NA>
## 29218           1-Regular school     959  434    525           <NA>
## 29230           1-Regular school      81   40     41           <NA>
## 29251           1-Regular school      26   10     16            0.8
## 29300 4-Alternative/other school       6    4      2           <NA>
## 29311           1-Regular school    4364 1734   2630           <NA>
## 29318 4-Alternative/other school      14   10      4           <NA>
## 29395 4-Alternative/other school      47   47    n/a           <NA>
## 29398           1-Regular school     138   71     67              6
## 29406           1-Regular school     718  373    345           <NA>
## 29407           1-Regular school     520  276    244           <NA>
## 29410           1-Regular school     282  143    139           <NA>
## 29411           1-Regular school      16    6     10           <NA>
## 29422           1-Regular school     861  427    434           <NA>
## 29423           1-Regular school    1055  561    494           <NA>
## 29428           1-Regular school     498  255    243           <NA>
## 29527           1-Regular school     n/a  n/a    n/a           <NA>
## 29546 2-Special education school       0    0      0           <NA>
## 29569 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 29587           1-Regular school     350  159    191           16.4
## 29596           1-Regular school     131   62     69            7.2
## 29652           1-Regular school       9    1      8              1
## 29669           1-Regular school     435  204    231             30
## 29702 4-Alternative/other school       1    1      0           <NA>
## 29757           1-Regular school    1629  798    831           <NA>
## 29795           1-Regular school     376  198    178             23
## 29818           1-Regular school      19   11      8            2.4
## 29871        3-Vocational school       0    0      0           <NA>
## 29882           1-Regular school     903  457    446           <NA>
## 29937           1-Regular school     150   71     79           <NA>
## 29939           1-Regular school      78   42     36           <NA>
## 29953           1-Regular school       0    0      0           <NA>
## 29977 2-Special education school    <NA>  n/a    n/a           <NA>
## 30024           1-Regular school     771  378    393           <NA>
## 30028           1-Regular school    1101  598    503           <NA>
## 30029           1-Regular school    1039  527    512           <NA>
## 30031 4-Alternative/other school       3    3    n/a           <NA>
## 30058           1-Regular school     848  436    412           <NA>
## 30153           1-Regular school      37   21     16           <NA>
## 30256           1-Regular school     n/a  n/a    n/a           <NA>
## 30260           1-Regular school      65   35     30           <NA>
## 30325        3-Vocational school    <NA>  n/a    n/a              1
## 30333           1-Regular school     n/a  n/a    n/a           <NA>
## 30347           1-Regular school     498  263    235           <NA>
## 30349           1-Regular school    <NA>  n/a    n/a              8
## 30489           1-Regular school     452  209    243           <NA>
## 30490           1-Regular school      79   39     40           <NA>
## 30502           1-Regular school     437  234    203           <NA>
## 30505           1-Regular school     406  199    207           <NA>
## 30521           1-Regular school      10    1      9           <NA>
## 30590 2-Special education school       0    0      0           <NA>
## 30609           1-Regular school     449  205    244          25.73
## 30616        3-Vocational school    <NA>  n/a    n/a             12
## 30721           1-Regular school     419  228    191           <NA>
## 30723           1-Regular school      95   45     50           <NA>
## 30781           1-Regular school     905  454    451           <NA>
## 30783           1-Regular school    1222  599    623           <NA>
## 30784           1-Regular school     326  164    162           <NA>
## 30787           1-Regular school     880  429    451           <NA>
## 30788           1-Regular school    1061  559    502           <NA>
## 30849           1-Regular school     733  400    333           40.8
## 30870           1-Regular school    2002  971   1031           <NA>
## 30872           1-Regular school    2123 1102   1021          93.71
## 30875           1-Regular school     764  400    364             46
## 30876           1-Regular school     700  360    340             40
## 30886           1-Regular school     285  156    129           <NA>
## 30900           1-Regular school      29   15     14            2.4
## 30920 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 30928           1-Regular school     n/a  n/a    n/a           <NA>
## 30929           1-Regular school     n/a  n/a    n/a           <NA>
## 30933        3-Vocational school       0    0      0           <NA>
## 30957           1-Regular school     374  188    186           <NA>
## 31043           1-Regular school    1703  840    863           <NA>
## 31107           1-Regular school     713  367    346           <NA>
## 31115           1-Regular school       0    0      0           <NA>
## 31168 2-Special education school      22   14      8           <NA>
## 31197 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 31223           1-Regular school      59   35     24           <NA>
## 31250           1-Regular school     557  268    289           32.2
## 31252 4-Alternative/other school       1    1      0           <NA>
## 31298           1-Regular school       7    6      1           <NA>
## 31299           1-Regular school       5    2      3           <NA>
## 31314 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 31327           1-Regular school       0    0      0           <NA>
## 31328           1-Regular school       8    4      4           <NA>
## 31357 4-Alternative/other school      12   11      1           <NA>
## 31388           1-Regular school     243  113    130          20.12
## 31390           1-Regular school     249  125    124          23.13
## 31395           1-Regular school     341  179    162           22.3
## 31463 4-Alternative/other school       2    2      0           <NA>
## 31464 4-Alternative/other school       3    2      1           <NA>
## 31465 4-Alternative/other school       2    2      0           <NA>
## 31467 4-Alternative/other school       3    3      0           <NA>
## 31559 4-Alternative/other school      83   83    n/a           <NA>
## 31645           1-Regular school      62   33     29              3
## 31699           1-Regular school     778  397    381           <NA>
## 31709        3-Vocational school    <NA>  n/a    n/a           <NA>
## 31733           1-Regular school     168  128     40           <NA>
## 31740           1-Regular school       0    0      0           <NA>
## 31751           1-Regular school      19   13      6           <NA>
## 31829 2-Special education school       0    0      0           <NA>
## 31831 2-Special education school     n/a  n/a    n/a           <NA>
## 31845           1-Regular school     174  103     71              5
## 31850           1-Regular school     254  132    122           <NA>
## 31852 4-Alternative/other school       0    0      0           <NA>
## 31883           1-Regular school     676  370    306           <NA>
## 31888           1-Regular school       4    4    n/a           <NA>
## 31910 4-Alternative/other school      90   52     38           <NA>
## 31941           1-Regular school     498  275    223          30.26
## 31942           1-Regular school     343  169    174          25.56
## 31957           1-Regular school      26   16     10            1.8
## 31968           1-Regular school     823  440    383           <NA>
## 31973           1-Regular school     n/a  n/a    n/a           <NA>
## 31989           1-Regular school      29   19     10           <NA>
## 32006 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 32010 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 32014           1-Regular school     n/a  n/a    n/a           <NA>
## 32036 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 32054           1-Regular school      82   50     32           <NA>
## 32060 4-Alternative/other school    <NA>  n/a    n/a              1
## 32081        3-Vocational school    <NA>  n/a    n/a              1
## 32082           1-Regular school     432  235    197           <NA>
## 32142 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 32176           1-Regular school     212  117     95           <NA>
## 32179        3-Vocational school    <NA>  n/a    n/a             15
## 32273 4-Alternative/other school      35   35    n/a           <NA>
## 32297           1-Regular school     135   63     72           <NA>
## 32298           1-Regular school    1016  528    488           <NA>
## 32349 4-Alternative/other school     217  134     83           <NA>
## 32366           1-Regular school     638  327    311           <NA>
## 32474           1-Regular school     262  147    115           17.7
## 32573        3-Vocational school       0    0      0           <NA>
## 32574        3-Vocational school       0    0      0           <NA>
## 32576        3-Vocational school       0    0      0           <NA>
## 32577        3-Vocational school       0    0      0           <NA>
## 32578        3-Vocational school       0    0      0           <NA>
## 32579        3-Vocational school       0    0      0           <NA>
## 32580        3-Vocational school       0    0      0           <NA>
## 32581        3-Vocational school       0    0      0           <NA>
## 32639           1-Regular school       5    3      2           <NA>
## 32640           1-Regular school       0    0      0           <NA>
## 32641           1-Regular school       0    0      0           <NA>
## 32642           1-Regular school       1    0      1           <NA>
## 32651        3-Vocational school     n/a  n/a    n/a           <NA>
## 32710           1-Regular school     n/a  n/a    n/a           <NA>
## 32733           1-Regular school     319    0    319           <NA>
## 32738           1-Regular school     112    0    112           <NA>
## 32753           1-Regular school     120   55     65            5.5
## 32768           1-Regular school     547  274    273             30
## 32779           1-Regular school     n/a  n/a    n/a           <NA>
## 32784           1-Regular school       7    3      4           <NA>
## 32785           1-Regular school       1    0      1           <NA>
## 32786           1-Regular school       0    0      0           <NA>
## 32787 2-Special education school       5    1      4           <NA>
## 32805           1-Regular school      43   15     28           <NA>
## 32822 2-Special education school       0    0      0           <NA>
## 32879           1-Regular school     494  248    246             26
## 32984           1-Regular school     798  414    384           <NA>
## 33021        3-Vocational school       0    0      0           <NA>
## 33083           1-Regular school     315  135    180           <NA>
## 33104           1-Regular school       0    0      0           <NA>
## 33122           1-Regular school     745  377    368             39
## 33198           1-Regular school     474  251    223             20
## 33228           1-Regular school    <NA>  n/a    n/a              4
## 33263           1-Regular school     419  208    211             23
## 33281           1-Regular school     451  233    218           20.5
## 33292           1-Regular school     688  352    336           <NA>
## 33293 4-Alternative/other school      84   51     33              7
## 33317           1-Regular school     249  125    124             10
## 33337           1-Regular school     633  284    349             22
## 33343           1-Regular school     256  126    130            9.5
## 33344           1-Regular school     307  149    158             12
## 33360           1-Regular school       7    4      3           <NA>
## 33388           1-Regular school     879  478    401           61.7
## 33416           1-Regular school     503  266    237           <NA>
## 33473 2-Special education school      17   14      3           <NA>
## 33496 4-Alternative/other school       0    0      0           <NA>
## 33499           1-Regular school       0    0      0           <NA>
## 33536           1-Regular school      85   42     43              4
## 33562           1-Regular school     362  200    162           <NA>
## 33591           1-Regular school     n/a  n/a    n/a           <NA>
## 33592           1-Regular school     n/a  n/a    n/a           <NA>
## 33614        3-Vocational school     n/a  n/a    n/a           <NA>
## 33620           1-Regular school     407  218    189             15
## 33666           1-Regular school     884  440    444          37.38
## 33701           1-Regular school     183   89     94           6.87
## 33758           1-Regular school     366  190    176           <NA>
## 33804           1-Regular school     451  247    204           <NA>
## 33805           1-Regular school     261  125    136           <NA>
## 33829 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 33945           1-Regular school    3129 1613   1516           <NA>
## 33950           1-Regular school     928  490    438           <NA>
## 33956 4-Alternative/other school     487  271    216           <NA>
## 33971           1-Regular school     580  305    275           <NA>
## 33973           1-Regular school       0    0      0           <NA>
## 33976           1-Regular school     381  183    198           <NA>
## 33979        3-Vocational school     157   89     68           <NA>
## 33994 2-Special education school       0    0      0           <NA>
## 34050           1-Regular school     371  167    204           <NA>
## 34077           1-Regular school     918  460    458           <NA>
## 34078           1-Regular school     455  231    224           <NA>
## 34079           1-Regular school     841  430    411           <NA>
## 34124           1-Regular school     n/a  n/a    n/a           <NA>
## 34145 4-Alternative/other school       0    0      0           <NA>
## 34152           1-Regular school      40   20     20              2
## 34183           1-Regular school      47   21     26           6.67
## 34190           1-Regular school    1353  685    668           93.3
## 34193           1-Regular school    1476  760    716          99.38
## 34197        3-Vocational school     n/a  n/a    n/a           <NA>
## 34227           1-Regular school     284  135    149           <NA>
## 34235           1-Regular school     795  384    411           <NA>
## 34236           1-Regular school     534  246    288           <NA>
## 34237           1-Regular school     532  275    257           <NA>
## 34238           1-Regular school     520  231    289           <NA>
## 34239           1-Regular school     520  235    285           <NA>
## 34240           1-Regular school     673  334    339           <NA>
## 34241           1-Regular school     811  377    434           <NA>
## 34242           1-Regular school     399  201    198           <NA>
## 34243           1-Regular school     493  252    241           <NA>
## 34244           1-Regular school     536  289    247           <NA>
## 34245           1-Regular school     539  276    263           <NA>
## 34246           1-Regular school     555  270    285           <NA>
## 34247           1-Regular school     728  318    410           <NA>
## 34248           1-Regular school     444  197    247           <NA>
## 34249           1-Regular school     538  236    302           <NA>
## 34250           1-Regular school     366  156    210           <NA>
## 34251           1-Regular school     486  250    236           <NA>
## 34252           1-Regular school     395  202    193           <NA>
## 34253           1-Regular school     829  360    469           <NA>
## 34254           1-Regular school     206  117     89           <NA>
## 34255           1-Regular school     736  334    402           <NA>
## 34256           1-Regular school     712  320    392           <NA>
## 34302           1-Regular school     910  436    474           36.5
## 34303           1-Regular school     832  430    402           33.1
## 34323 2-Special education school     213  148     65           <NA>
## 34329        3-Vocational school     n/a  n/a    n/a           <NA>
## 34331           1-Regular school     245  120    125          10.75
## 34336 4-Alternative/other school      25   14     11           <NA>
## 34341           1-Regular school     274  141    133           27.8
## 34359           1-Regular school     524  291    233           <NA>
## 34365           1-Regular school     241  140    101             15
## 34369           1-Regular school    1218  616    602           <NA>
## 34436           1-Regular school      14    4     10            1.5
## 34439 4-Alternative/other school       7    7    n/a           <NA>
## 34445           1-Regular school      91   41     50           <NA>
## 34525        3-Vocational school    <NA>  n/a    n/a           <NA>
## 34559        3-Vocational school     n/a  n/a    n/a           <NA>
## 34560        3-Vocational school    <NA>  n/a    n/a           <NA>
## 34583 2-Special education school       0    0      0           <NA>
## 34719           1-Regular school     557  256    301           <NA>
## 34743           1-Regular school     359  193    166           <NA>
## 34752           1-Regular school     326  158    168             27
## 34754           1-Regular school     298  144    154           19.4
## 34797           1-Regular school     706  354    352           <NA>
## 34855           1-Regular school     363  164    199             15
## 34870 4-Alternative/other school       2    2    n/a           <NA>
## 34968           1-Regular school       6    5      1           <NA>
## 34969           1-Regular school       1    0      1           <NA>
## 34971           1-Regular school     224  114    110           18.4
## 35001           1-Regular school     757  387    370           <NA>
## 35040           1-Regular school     112   67     45              4
## 35065 4-Alternative/other school      56   30     26           <NA>
## 35069 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 35075           1-Regular school     n/a  n/a    n/a           <NA>
## 35076           1-Regular school     303  136    167           <NA>
## 35077           1-Regular school      81   38     43            4.8
## 35096           1-Regular school     820  384    436             27
## 35134           1-Regular school     n/a  n/a    n/a           <NA>
## 35143           1-Regular school       0    0      0           <NA>
## 35152 2-Special education school      73   43     30           <NA>
## 35167           1-Regular school     315  166    149           <NA>
## 35168           1-Regular school     261  149    112           <NA>
## 35169           1-Regular school     584  306    278           <NA>
## 35252           1-Regular school     776  402    374           <NA>
## 35261 2-Special education school    <NA>  n/a    n/a           <NA>
## 35271           1-Regular school     466  251    215           <NA>
## 35289           1-Regular school     454  245    209             29
## 35294 4-Alternative/other school       5    3      2           <NA>
## 35338           1-Regular school     n/a  n/a    n/a           <NA>
## 35339           1-Regular school      97   56     41           <NA>
## 35428           1-Regular school      88   43     45           <NA>
## 35457 4-Alternative/other school      29   19     10           <NA>
## 35479        3-Vocational school    <NA>  n/a    n/a           9.28
## 35494 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 35595 4-Alternative/other school       0    0      0           <NA>
## 35694           1-Regular school       9    5      4           <NA>
## 35695           1-Regular school       1    1      0           <NA>
## 35696           1-Regular school      11    3      8           <NA>
## 35697           1-Regular school     n/a  n/a    n/a           <NA>
## 35875           1-Regular school      24    9     15           <NA>
## 35962           1-Regular school     120   65     55            6.2
## 35972           1-Regular school     544  258    286           <NA>
## 35973           1-Regular school     525  259    266           <NA>
## 36024           1-Regular school      11    6      5           <NA>
## 36025           1-Regular school       0    0      0           <NA>
## 36026           1-Regular school       2    1      1           <NA>
## 36038 4-Alternative/other school       2    1      1           <NA>
## 36065           1-Regular school    <NA>  n/a    n/a          10.19
## 36116           1-Regular school     285  157    128           <NA>
## 36316           1-Regular school     n/a  n/a    n/a           <NA>
## 36382 4-Alternative/other school       5    5      0           <NA>
## 36383 4-Alternative/other school       1    1      0           <NA>
## 36384 4-Alternative/other school      28   23      5           <NA>
## 36385 4-Alternative/other school       1    1      0           <NA>
## 36402           1-Regular school     788  436    352           <NA>
## 36449 4-Alternative/other school      15   11      4           <NA>
## 36458 2-Special education school       0    0      0           <NA>
## 36510           1-Regular school      42   33      9           <NA>
## 36557 4-Alternative/other school      32   26      6           3.25
## 36571           1-Regular school     583  321    262           <NA>
## 36588        3-Vocational school       0    0      0           <NA>
## 36661 2-Special education school      72   44     28           <NA>
## 36680           1-Regular school     411  204    207          30.72
## 36691           1-Regular school     n/a  n/a    n/a           <NA>
## 36692           1-Regular school     940  492    448           <NA>
## 36693           1-Regular school     291  152    139           <NA>
## 36694           1-Regular school     611  332    279           <NA>
## 36696           1-Regular school     498  258    240          14.75
## 36699           1-Regular school     993  485    508           <NA>
## 36752 4-Alternative/other school       0    0      0           <NA>
## 36807           1-Regular school     n/a  n/a    n/a           <NA>
## 36808           1-Regular school     266  121    145           <NA>
## 36809           1-Regular school       0    0      0           <NA>
## 36821           1-Regular school      90   46     44           <NA>
## 36893           1-Regular school     623  307    316           <NA>
## 36894           1-Regular school     818  416    402           <NA>
## 36966           1-Regular school     439  229    210           <NA>
## 36988           1-Regular school     797  412    385           <NA>
## 37076           1-Regular school     180   92     88           14.4
## 37138 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 37158 2-Special education school      10    3      7           <NA>
## 37197           1-Regular school     584  248    336           <NA>
## 37227           1-Regular school     566  322    244           <NA>
## 37243 4-Alternative/other school      37   35      2           <NA>
## 37265           1-Regular school     599  301    298           <NA>
## 37373           1-Regular school     734  377    357           <NA>
## 37421           1-Regular school     166   78     88           <NA>
## 37447           1-Regular school     570  298    272           <NA>
## 37458 4-Alternative/other school       4    2      2           <NA>
## 37522           1-Regular school       0    0      0           <NA>
## 37523           1-Regular school       0    0      0           <NA>
## 37542 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 37575 4-Alternative/other school    <NA>  n/a    n/a            0.1
## 37581           1-Regular school      44    7     37              0
## 37638           1-Regular school      64   35     29           <NA>
## 37668           1-Regular school     950  495    455          65.38
## 37731 4-Alternative/other school      12   12      0           <NA>
## 37751           1-Regular school     678  329    349           <NA>
## 37754           1-Regular school     444  199    245           <NA>
## 37759           1-Regular school     474  264    210           <NA>
## 37790           1-Regular school      73   37     36           <NA>
## 37795           1-Regular school     834  397    437           <NA>
## 37841           1-Regular school    1128  549    579           51.7
## 37866           1-Regular school       0    0      0           <NA>
## 37869           1-Regular school     590  304    286           <NA>
## 37871           1-Regular school     923  472    451           <NA>
## 37872           1-Regular school     599  294    305           <NA>
## 37877           1-Regular school     683  351    332           <NA>
## 37892           1-Regular school     259  132    127             23
## 37932           1-Regular school     232  116    116           <NA>
## 37933           1-Regular school     789  413    376          34.13
## 37934           1-Regular school     571  316    255             24
## 37940           1-Regular school     n/a  n/a    n/a           <NA>
## 37941 4-Alternative/other school       5    5      0           <NA>
## 37947           1-Regular school     n/a  n/a    n/a           <NA>
## 37950           1-Regular school       7    3      4           <NA>
## 37951           1-Regular school       0    0      0           <NA>
## 37952           1-Regular school       0    0      0           <NA>
## 37981           1-Regular school    3021 1527   1494           <NA>
## 37982           1-Regular school     873  455    418           <NA>
## 38055           1-Regular school     n/a  n/a    n/a           <NA>
## 38057           1-Regular school     n/a  n/a    n/a           <NA>
## 38127           1-Regular school     383  201    182          30.19
## 38149 4-Alternative/other school      13    8      5           <NA>
## 38151 4-Alternative/other school       1    1      0           <NA>
## 38153 4-Alternative/other school       6    4      2           <NA>
## 38154 4-Alternative/other school       2    2      0           <NA>
## 38160 4-Alternative/other school       1    1      0           <NA>
## 38169           1-Regular school     971  477    494           <NA>
## 38212           1-Regular school     411  183    228           <NA>
## 38214 4-Alternative/other school       0  n/a    n/a           <NA>
## 38238 4-Alternative/other school       6    5      1           <NA>
## 38251 4-Alternative/other school       6    6      0           <NA>
## 38340           1-Regular school     225  119    106           <NA>
## 38349           1-Regular school     337  169    168           11.4
## 38427           1-Regular school      56   29     27           <NA>
## 38433           1-Regular school    1683  853    830           <NA>
## 38453           1-Regular school     877  452    425           <NA>
## 38522           1-Regular school     653  364    289           <NA>
## 38526           1-Regular school      75   49     26           <NA>
## 38541           1-Regular school     837  472    365           <NA>
## 38560           1-Regular school    1856  615   1241             40
## 38561 2-Special education school      16   11      5           <NA>
## 38562 4-Alternative/other school       2    1      1           <NA>
## 38596 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 38607           1-Regular school       1    1      0           <NA>
## 38608           1-Regular school       0    0      0           <NA>
## 38609           1-Regular school      67   29     38           <NA>
## 38622           1-Regular school     676  353    323           <NA>
## 38626 4-Alternative/other school      22   18      4           <NA>
## 38627 4-Alternative/other school       3    3      0           <NA>
## 38628 4-Alternative/other school       3    3      0           <NA>
## 38629 4-Alternative/other school       8    5      3           <NA>
## 38631 4-Alternative/other school      18   15      3           <NA>
## 38632 4-Alternative/other school       2    2      0           <NA>
## 38688 4-Alternative/other school       1    1      0           <NA>
## 38690 4-Alternative/other school       1    1      0           <NA>
## 38711           1-Regular school     473  245    228           <NA>
## 38736 4-Alternative/other school       0    0      0           <NA>
## 38787           1-Regular school    2098 1032   1066           <NA>
## 38799           1-Regular school     856  397    459           <NA>
## 38809           1-Regular school     353  196    157           <NA>
## 38810           1-Regular school     466  263    203           <NA>
## 38815           1-Regular school     376  197    179           <NA>
## 38895 2-Special education school       2    2      0           <NA>
## 38916           1-Regular school     870  435    435           <NA>
## 38933           1-Regular school       0    0      0           <NA>
## 38962           1-Regular school     583  282    301           <NA>
## 38970           1-Regular school     631  319    312           <NA>
## 39085           1-Regular school     152   78     74           <NA>
## 39089 4-Alternative/other school      60   41     19           <NA>
## 39124           1-Regular school     606  316    290           <NA>
## 39138           1-Regular school     296  146    150           <NA>
## 39173           1-Regular school     526  284    242           <NA>
## 39213           1-Regular school     546  298    248           <NA>
## 39289 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 39457           1-Regular school       0    0      0           <NA>
## 39458           1-Regular school       9    5      4           <NA>
## 39459           1-Regular school       0    0      0           <NA>
## 39466           1-Regular school      48   23     25           <NA>
## 39480           1-Regular school     519  285    234           <NA>
## 39511 4-Alternative/other school      24   16      8           <NA>
## 39525 4-Alternative/other school       5    1      4           <NA>
## 39526 4-Alternative/other school       2    0      2           <NA>
## 39534 2-Special education school       4    2      2           <NA>
## 39535 2-Special education school    <NA>  n/a    n/a           <NA>
## 39536 2-Special education school       2    2      0           <NA>
## 39585           1-Regular school    2452 1279   1173         101.41
## 39592           1-Regular school     155   70     85            6.6
## 39600           1-Regular school    2757 1396   1361         183.87
## 39636 4-Alternative/other school       0    0      0           <NA>
## 39638           1-Regular school       3    1      2              1
## 39672           1-Regular school     621  323    298           <NA>
## 39677           1-Regular school     401  206    195           <NA>
## 39739 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 39743 4-Alternative/other school      17   13      4           <NA>
## 39772 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 39775           1-Regular school     229  126    103           <NA>
## 39777           1-Regular school     217   77    140           <NA>
## 39778           1-Regular school     398  193    205           34.1
## 39780           1-Regular school     n/a  n/a    n/a           <NA>
## 39781           1-Regular school     359  194    165           <NA>
## 39795 4-Alternative/other school       0    0      0           <NA>
## 39874           1-Regular school     n/a  n/a    n/a           <NA>
## 39915           1-Regular school     415  216    199           <NA>
## 39933           1-Regular school    1455  685    770          68.68
## 39959 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 39961           1-Regular school     821  450    371           <NA>
## 39962           1-Regular school     670  319    351           <NA>
## 39976 2-Special education school     122   80     42           <NA>
## 39978           1-Regular school     608  330    278           <NA>
## 39979           1-Regular school     678  328    350           <NA>
## 39980           1-Regular school     723  377    346           <NA>
## 40009 4-Alternative/other school     434  225    209           <NA>
## 40025           1-Regular school     486  262    224           <NA>
## 40044           1-Regular school     651  338    313           29.2
## 40065 2-Special education school      34   15     19           <NA>
## 40068 2-Special education school      96   54     42           <NA>
## 40070 2-Special education school      27   16     11           <NA>
## 40071 2-Special education school       0    0      0           <NA>
## 40073 2-Special education school       0    0      0           <NA>
## 40074 2-Special education school      10    6      4           <NA>
## 40075 2-Special education school      38   15     23           <NA>
## 40077 2-Special education school       0    0      0           <NA>
## 40078 2-Special education school     174   89     85           <NA>
## 40079 4-Alternative/other school      10    1      9           <NA>
## 40081 2-Special education school      52   34     18           <NA>
## 40138 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 40145 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 40146        3-Vocational school    <NA>  n/a    n/a           <NA>
## 40243 2-Special education school      19   14      5           <NA>
## 40253           1-Regular school     647  329    318           <NA>
## 40255           1-Regular school      83   39     44             12
## 40354           1-Regular school     281  144    137             27
## 40383 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 40402           1-Regular school     n/a  n/a    n/a           <NA>
## 40421 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 40449           1-Regular school    1170  583    587           71.7
## 40520           1-Regular school       4    2      2           <NA>
## 40521           1-Regular school       0    0      0           <NA>
## 40522           1-Regular school       5    2      3           <NA>
## 40534 4-Alternative/other school       0  n/a    n/a           <NA>
## 40537        3-Vocational school       0    0      0           <NA>
## 40561           1-Regular school     768  383    385           34.7
## 40592           1-Regular school    2607 1296   1311           <NA>
## 40595           1-Regular school     786  406    380           <NA>
## 40598           1-Regular school     651  333    318           <NA>
## 40657           1-Regular school     297  169    128           <NA>
## 40730           1-Regular school     970  493    477           <NA>
## 40732           1-Regular school     713  355    358           <NA>
## 40733           1-Regular school     748  380    368           <NA>
## 40735           1-Regular school     656  341    315           <NA>
## 40762 4-Alternative/other school      37   22     15           <NA>
## 40763 4-Alternative/other school       4    2      2           <NA>
## 40789           1-Regular school       0    0      0           <NA>
## 40808           1-Regular school     290  157    133             20
## 40832           1-Regular school     172   85     87           <NA>
## 40851           1-Regular school      36   15     21           <NA>
## 40918 4-Alternative/other school       0    0      0           <NA>
## 41002           1-Regular school      38   11     27           <NA>
## 41005 2-Special education school      51   36     15           <NA>
## 41020           1-Regular school     749  354    395           <NA>
## 41021           1-Regular school      86   54     32           <NA>
## 41034           1-Regular school    2889 1448   1441          99.15
## 41035           1-Regular school     706  349    357             26
## 41036           1-Regular school      13    6      7           2.23
## 41038           1-Regular school     393  195    198             24
## 41053 4-Alternative/other school     627  313    314           <NA>
## 41054           1-Regular school     483  294    189           <NA>
## 41097           1-Regular school     528  270    258           <NA>
## 41098           1-Regular school     223  125     98           <NA>
## 41099           1-Regular school     347  162    185           <NA>
## 41100           1-Regular school     422  217    205           <NA>
## 41101           1-Regular school     181   84     97           <NA>
## 41109           1-Regular school     624  301    323           <NA>
## 41110           1-Regular school     585  300    285           <NA>
## 41111           1-Regular school     245  126    119           <NA>
## 41112           1-Regular school     792  403    389           <NA>
## 41113           1-Regular school     396  211    185           <NA>
## 41114           1-Regular school     670  323    347           <NA>
## 41115           1-Regular school     132   68     64           <NA>
## 41123           1-Regular school     488  253    235           <NA>
## 41124           1-Regular school     365  193    172           <NA>
## 41125           1-Regular school     346  194    152           <NA>
## 41126           1-Regular school     749  377    372           <NA>
## 41139           1-Regular school     164   86     78           <NA>
## 41140           1-Regular school     372  193    179           <NA>
## 41141           1-Regular school     264  146    118           <NA>
## 41142           1-Regular school     256  138    118           <NA>
## 41143           1-Regular school      73   46     27           <NA>
## 41146           1-Regular school     662  327    335           <NA>
## 41186        3-Vocational school       0    0      0           <NA>
## 41198           1-Regular school     371  185    186           <NA>
## 41241 4-Alternative/other school     195  112     83           <NA>
## 41257 4-Alternative/other school       0    0      0           <NA>
## 41277 2-Special education school     n/a  n/a    n/a           <NA>
## 41301           1-Regular school     269  143    126           23.9
## 41307           1-Regular school     211  113     98          18.86
## 41310           1-Regular school     210   96    114          21.25
## 41316           1-Regular school      19    7     12            0.8
## 41331 4-Alternative/other school       0    0      0           <NA>
## 41342           1-Regular school    1113  588    525           <NA>
## 41344           1-Regular school     431  228    203           <NA>
## 41395           1-Regular school      17    8      9           <NA>
## 41402           1-Regular school       7    4      3              2
## 41486           1-Regular school     n/a  n/a    n/a           <NA>
## 41488           1-Regular school     n/a  n/a    n/a           <NA>
## 41542           1-Regular school     964  516    448             46
## 41545           1-Regular school     n/a  n/a    n/a           <NA>
## 41574           1-Regular school     429  213    216           <NA>
## 41577           1-Regular school       0    0      0           <NA>
## 41599           1-Regular school     319  147    172           <NA>
## 41600           1-Regular school      77   34     43           <NA>
## 41607           1-Regular school    3019 1463   1556         128.33
## 41608           1-Regular school    4127 1963   2164         146.78
## 41609           1-Regular school    4183 2100   2083          142.5
## 41611           1-Regular school    1592  815    777          64.91
## 41612           1-Regular school     975  491    484          42.13
## 41616 4-Alternative/other school     303  157    146           <NA>
## 41626           1-Regular school     112   66     46           <NA>
## 41629           1-Regular school     171  110     61           <NA>
## 41633           1-Regular school     331  160    171           <NA>
## 41637           1-Regular school      38   24     14           <NA>
## 41640           1-Regular school      76   37     39           <NA>
## 41641           1-Regular school     118   57     61           <NA>
## 41642           1-Regular school      93   46     47           <NA>
## 41643           1-Regular school      83   49     34           <NA>
## 41644 2-Special education school       1    1      0           <NA>
## 41652 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 41685           1-Regular school     448  222    226           <NA>
## 41686           1-Regular school     247  127    120           <NA>
## 41704 4-Alternative/other school     547  274    273           <NA>
## 41716           1-Regular school     417  188    229          21.25
## 41719           1-Regular school     404  207    197           <NA>
## 41720           1-Regular school     312  170    142           <NA>
## 41725           1-Regular school       4    2      2           <NA>
## 41735           1-Regular school    1010  527    483           <NA>
## 41753           1-Regular school     n/a  n/a    n/a           <NA>
## 41792           1-Regular school      66   34     32            4.4
## 41847 2-Special education school     188  118     70           <NA>
## 41854           1-Regular school     613  301    312           <NA>
## 41907           1-Regular school     274  133    141          15.01
## 42016 4-Alternative/other school       2    0      2           <NA>
## 42029           1-Regular school     628  315    313           37.8
## 42040           1-Regular school     297  136    161           <NA>
## 42054           1-Regular school       7    3      4           <NA>
## 42062 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 42121           1-Regular school     507  262    245          29.38
## 42142           1-Regular school     398  189    209           <NA>
## 42154 4-Alternative/other school       2    2      0           <NA>
## 42157 4-Alternative/other school       2    0      2           <NA>
## 42173           1-Regular school     821  354    467           <NA>
## 42180           1-Regular school      92   53     39           2.95
## 42183 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 42252 4-Alternative/other school       3    3      0           <NA>
## 42338 4-Alternative/other school      41   38      3              3
## 42388           1-Regular school     728  372    356           <NA>
## 42409           1-Regular school     574  298    276             31
## 42424 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 42429           1-Regular school     679  360    319           <NA>
## 42448           1-Regular school     607  299    308             44
## 42485           1-Regular school      29   16     13           <NA>
## 42490           1-Regular school     399  195    204           <NA>
## 42495           1-Regular school      22   11     11           <NA>
## 42523 4-Alternative/other school      11    8      3           <NA>
## 42525 4-Alternative/other school       1    1    n/a           <NA>
## 42526 4-Alternative/other school    <NA>  n/a    n/a              2
## 42636           1-Regular school     n/a  n/a    n/a           <NA>
## 42637        3-Vocational school     n/a  n/a    n/a           <NA>
## 42644 4-Alternative/other school       2    1      1           <NA>
## 42652           1-Regular school       0    0      0           <NA>
## 42653           1-Regular school       0    0      0           <NA>
## 42654           1-Regular school      24   16      8           <NA>
## 42661 4-Alternative/other school       9    4      5           <NA>
## 42704 4-Alternative/other school       0    0      0           <NA>
## 42705 4-Alternative/other school       0    0      0           <NA>
## 42706 4-Alternative/other school       0    0      0           <NA>
## 42707 4-Alternative/other school      10   10      0           <NA>
## 42708 4-Alternative/other school       1    1      0           <NA>
## 42803           1-Regular school     585  296    289           <NA>
## 42845 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 42911           1-Regular school     194  106     88           <NA>
## 42913           1-Regular school     502  256    246           <NA>
## 42961        3-Vocational school    <NA>  n/a    n/a             24
## 42992           1-Regular school     n/a  n/a    n/a           <NA>
## 43046 4-Alternative/other school      12    9      3              1
## 43053           1-Regular school     281  133    148           22.4
## 43163 4-Alternative/other school       0    0      0           <NA>
## 43164 4-Alternative/other school       0    0      0           <NA>
## 43165 4-Alternative/other school       0    0      0           <NA>
## 43181 2-Special education school      75   38     37           <NA>
## 43220           1-Regular school     579  286    293           <NA>
## 43239 4-Alternative/other school       2    2      0           <NA>
## 43244 4-Alternative/other school       3    3      0           <NA>
## 43245 4-Alternative/other school       8    7      1           <NA>
## 43248           1-Regular school     n/a  n/a    n/a           <NA>
## 43249 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 43250 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 43251 4-Alternative/other school    <NA>  n/a    n/a              2
## 43253 2-Special education school       0    0      0           <NA>
## 43302           1-Regular school     218  118    100             18
## 43366           1-Regular school       9    4      5              1
## 43500           1-Regular school     561  278    283          42.94
## 43509           1-Regular school     196   75    121           <NA>
## 43531           1-Regular school       0    0      0           <NA>
## 43532           1-Regular school       0    0      0           <NA>
## 43533           1-Regular school       1    1      0           <NA>
## 43564           1-Regular school     563  295    268           <NA>
## 43637 2-Special education school      54   23     31           <NA>
## 43638           1-Regular school     538  286    252           <NA>
## 43667           1-Regular school    1005  520    485           50.5
## 43668           1-Regular school     519  256    263             28
## 43673           1-Regular school     445  224    221          24.34
## 43674           1-Regular school     390  204    186             22
## 43786 4-Alternative/other school      58   34     24           <NA>
## 43794 4-Alternative/other school      13   10      3              1
## 43800           1-Regular school     586  311    275           <NA>
## 43833 4-Alternative/other school       1    1      0           <NA>
## 43839 4-Alternative/other school       2    2      0           <NA>
## 43840 4-Alternative/other school       3    3      0           <NA>
## 43841 4-Alternative/other school       3    2      1           <NA>
## 43843 4-Alternative/other school       8    7      1           <NA>
## 43858 4-Alternative/other school      18    0     18           <NA>
## 43909           1-Regular school     874  433    441           <NA>
## 43914 4-Alternative/other school     108  108      0          27.93
## 43941           1-Regular school    1385  667    718          61.17
## 43942           1-Regular school     227  125    102              9
## 43943           1-Regular school     177   91     86              8
## 43945           1-Regular school       1    0      1           <NA>
## 44002 4-Alternative/other school       0    0      0           <NA>
## 44016           1-Regular school     474  235    239           <NA>
## 44041        3-Vocational school    <NA>  n/a    n/a             13
## 44043           1-Regular school      22   14      8           <NA>
## 44151           1-Regular school     728  378    350           <NA>
## 44166           1-Regular school     n/a  n/a    n/a           <NA>
## 44189           1-Regular school     552  280    272           34.9
## 44227           1-Regular school     188  102     86           <NA>
## 44236           1-Regular school     257  129    128           <NA>
## 44246           1-Regular school     n/a  n/a    n/a           <NA>
## 44271 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 44319        3-Vocational school    <NA>  n/a    n/a           <NA>
## 44347           1-Regular school     893  583    310          50.63
## 44393 4-Alternative/other school       6    6      0           <NA>
## 44425           1-Regular school     236  121    115             20
## 44435           1-Regular school    <NA>  n/a    n/a              1
## 44557 4-Alternative/other school       5    4      1           <NA>
## 44649           1-Regular school     765  404    361           <NA>
## 44763        3-Vocational school       0    0      0           <NA>
## 44764        3-Vocational school       0    0      0           <NA>
## 44766           1-Regular school     267  179     88           32.3
## 44768 2-Special education school      37   25     12           <NA>
## 44778           1-Regular school    2025 1083    942           <NA>
## 44781           1-Regular school     613  315    298           <NA>
## 44786           1-Regular school     979  510    469           <NA>
## 44791 2-Special education school     108   74     34           <NA>
## 44829 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 44955 4-Alternative/other school       6    4      2           <NA>
## 44961           1-Regular school     528  299    229             21
## 44993           1-Regular school     743  380    363           <NA>
## 44994           1-Regular school     390  217    173           <NA>
## 44995           1-Regular school      25   11     14              2
## 45101           1-Regular school    2279 1115   1164         102.91
## 45145           1-Regular school      28   14     14              2
## 45174           1-Regular school       7    3      4              1
## 45183           1-Regular school     n/a  n/a    n/a           <NA>
## 45188           1-Regular school     n/a  n/a    n/a           <NA>
## 45207 2-Special education school     n/a  n/a    n/a           <NA>
## 45226 4-Alternative/other school    <NA>  n/a    n/a              2
## 45241 4-Alternative/other school       9  n/a      9           <NA>
## 45243 4-Alternative/other school      11   11      0           <NA>
## 45244 4-Alternative/other school       1    1      0           <NA>
## 45245 4-Alternative/other school       2    2      0           <NA>
## 45247 4-Alternative/other school       1    1      0           <NA>
## 45249 4-Alternative/other school      14   11      3           <NA>
## 45252 4-Alternative/other school       0    0      0           <NA>
## 45255 4-Alternative/other school      64   64    n/a           <NA>
## 45256 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 45259 4-Alternative/other school       0    0      0           <NA>
## 45260 4-Alternative/other school      38   33      5           <NA>
## 45266           1-Regular school     964  531    433          62.55
## 45314           1-Regular school       0    0      0           <NA>
## 45316           1-Regular school     554  293    261             24
## 45322           1-Regular school     126   87     39           <NA>
## 45323           1-Regular school     145   53     92           <NA>
## 45324           1-Regular school     428  265    163           <NA>
## 45325           1-Regular school      67   35     32           <NA>
## 45326           1-Regular school     283  156    127           <NA>
## 45327           1-Regular school     321  188    133           <NA>
## 45328           1-Regular school     277  156    121           <NA>
## 45351           1-Regular school     101   56     45           <NA>
## 45383           1-Regular school     259  137    122           <NA>
## 45384           1-Regular school     142   79     63           <NA>
## 45385           1-Regular school     497  259    238           <NA>
## 45389           1-Regular school     283  128    155           <NA>
## 45393 2-Special education school      74   44     30           <NA>
## 45401           1-Regular school     737  360    377           <NA>
## 45449           1-Regular school     639  329    310           <NA>
## 45467           1-Regular school      12    7      5              1
## 45549 2-Special education school     217  142     75           <NA>
## 45550           1-Regular school     177   89     88           11.5
## 45558           1-Regular school     667  338    329           <NA>
## 45562           1-Regular school     958  498    460           <NA>
## 45563           1-Regular school     713  394    319           <NA>
## 45566           1-Regular school     n/a  n/a    n/a           <NA>
## 45568 4-Alternative/other school       1    1      0           <NA>
## 45591           1-Regular school    2374 1241   1133           <NA>
## 45592           1-Regular school     545  282    263           <NA>
## 45646           1-Regular school     595  320    275           <NA>
## 45706           1-Regular school      33   27      6           <NA>
## 45803           1-Regular school      27   11     16           <NA>
## 45907 2-Special education school      20   12      8           <NA>
## 45918 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 45946 2-Special education school       3    3      0           <NA>
## 46044           1-Regular school     141   77     64           6.85
## 46105        3-Vocational school       0    0      0           <NA>
## 46107        3-Vocational school       0    0      0           <NA>
## 46166           1-Regular school     561  294    267          33.06
## 46187           1-Regular school      71   42     29           <NA>
## 46203           1-Regular school    1888 1016    872           <NA>
## 46226           1-Regular school     211  109    102           <NA>
## 46233           1-Regular school     149   70     79           <NA>
## 46234           1-Regular school     278  136    142           <NA>
## 46289 4-Alternative/other school       3    1      2           <NA>
## 46375           1-Regular school     300  175    125             13
## 46430           1-Regular school     571  299    272           <NA>
## 46455           1-Regular school     391  176    215           <NA>
## 46456           1-Regular school     330  150    180           <NA>
## 46457           1-Regular school     337  169    168           <NA>
## 46458           1-Regular school     296  156    140           <NA>
## 46468           1-Regular school     n/a  n/a    n/a           <NA>
## 46471        3-Vocational school       0    0      0           <NA>
## 46472           1-Regular school     n/a  n/a    n/a           <NA>
## 46473 2-Special education school     308  196    112             28
## 46475 2-Special education school       0    0      0           <NA>
## 46476           1-Regular school      80   39     41           11.5
## 46492           1-Regular school     468  243    225           <NA>
## 46500           1-Regular school      28    9     19           3.25
## 46501           1-Regular school     692  341    351          24.45
## 46641           1-Regular school     347  193    154           <NA>
## 46672           1-Regular school     352  168    184           <NA>
## 46673           1-Regular school     896  474    422           <NA>
## 46752           1-Regular school     418  187    231           <NA>
## 46925           1-Regular school     483  273    210           <NA>
## 46926 4-Alternative/other school      87   62     25           <NA>
## 46956           1-Regular school      13    6      7           1.07
## 46970           1-Regular school     144   79     65              6
## 46978           1-Regular school     833  442    391           <NA>
## 47007           1-Regular school     735  370    365           <NA>
## 47096           1-Regular school     n/a  n/a    n/a           <NA>
## 47101           1-Regular school      39   16     23           <NA>
## 47254 4-Alternative/other school       1    1      0           <NA>
## 47256           1-Regular school     373  198    175           21.5
## 47270 4-Alternative/other school       2    2      0           <NA>
## 47303 4-Alternative/other school     550  216    334           <NA>
## 47324           1-Regular school     671  357    314          28.38
## 47326           1-Regular school    2079 1092    987          83.02
## 47344           1-Regular school    <NA>  n/a    n/a           <NA>
## 47427           1-Regular school     780  378    402           <NA>
## 47433           1-Regular school     733  379    354           <NA>
## 47434           1-Regular school     845  445    400           <NA>
## 47435           1-Regular school     400  217    183           <NA>
## 47459        3-Vocational school       0    0      0           <NA>
## 47466           1-Regular school      12    6      6           <NA>
## 47477           1-Regular school     117   59     58           <NA>
## 47478           1-Regular school     n/a  n/a    n/a           <NA>
## 47498           1-Regular school      81   45     36           7.73
## 47515           1-Regular school     n/a  n/a    n/a           <NA>
## 47568           1-Regular school     211  110    101             16
## 47580        3-Vocational school    <NA>  n/a    n/a           <NA>
## 47581 2-Special education school    <NA>  n/a    n/a           <NA>
## 47583           1-Regular school       1    1    n/a           <NA>
## 47603           1-Regular school     100   66     34           <NA>
## 47659           1-Regular school       1    1      0           <NA>
## 47660           1-Regular school       0    0      0           <NA>
## 47661           1-Regular school       3    0      3           <NA>
## 47662           1-Regular school       0    0      0           <NA>
## 47682           1-Regular school      13    8      5           1.75
## 47693           1-Regular school      98   48     50              5
## 47730           1-Regular school     570  299    271          43.17
## 47732           1-Regular school     326  160    166          34.06
## 47761 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 47770 4-Alternative/other school      10   10      0           <NA>
## 47775        3-Vocational school       0    0      0           <NA>
## 47820           1-Regular school    1611  818    793          129.4
## 47924 4-Alternative/other school      14    6      8           <NA>
## 47937           1-Regular school      10    5      5           <NA>
## 47938           1-Regular school       6    4      2           <NA>
## 47959           1-Regular school     487  246    241           <NA>
## 48017           1-Regular school     621  314    307           <NA>
## 48020           1-Regular school       0    0      0           <NA>
## 48021           1-Regular school      18    9      9           <NA>
## 48022           1-Regular school       0    0      0           <NA>
## 48034           1-Regular school     n/a  n/a    n/a           <NA>
## 48096           1-Regular school    1238  619    619           <NA>
## 48136           1-Regular school     n/a  n/a    n/a           <NA>
## 48187           1-Regular school     880  450    430           <NA>
## 48189 4-Alternative/other school      76   76      0           <NA>
## 48192           1-Regular school     191  102     89           17.5
## 48195           1-Regular school    1022  518    504           <NA>
## 48200 4-Alternative/other school      12    9      3           <NA>
## 48275 4-Alternative/other school       4    3      1           <NA>
## 48277           1-Regular school     816  443    373           <NA>
## 48279           1-Regular school     481  258    223           <NA>
## 48315           1-Regular school     335  168    167             25
## 48389        3-Vocational school    <NA>  n/a    n/a              1
## 48400           1-Regular school     371  195    176           <NA>
## 48509           1-Regular school     n/a  n/a    n/a           <NA>
## 48515 4-Alternative/other school       0  n/a    n/a           <NA>
## 48534 4-Alternative/other school     287  172    115           <NA>
## 48594 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 48634           1-Regular school    1199  588    611          76.56
## 48661           1-Regular school     n/a  n/a    n/a           <NA>
## 48677           1-Regular school     223  122    101           <NA>
## 48737           1-Regular school     472  233    239           <NA>
## 48748           1-Regular school     n/a  n/a    n/a           <NA>
## 48779           1-Regular school      61   34     27           <NA>
## 48786 4-Alternative/other school       2    2    n/a           <NA>
## 48802           1-Regular school     n/a  n/a    n/a           <NA>
## 48813        3-Vocational school       0    0      0           <NA>
## 48835           1-Regular school     129   89     40           <NA>
## 48863           1-Regular school     n/a  n/a    n/a           <NA>
## 48945           1-Regular school     133   69     64           4.98
## 48956           1-Regular school     124   70     54           <NA>
## 48987           1-Regular school     862  471    391           <NA>
## 49000           1-Regular school     505  274    231           <NA>
## 49040        3-Vocational school    <NA>  n/a    n/a             10
## 49052           1-Regular school    <NA>  n/a    n/a              3
## 49123           1-Regular school    2074 1087    987           <NA>
## 49124           1-Regular school     628  311    317           <NA>
## 49126 4-Alternative/other school       0    0      0           <NA>
## 49177           1-Regular school     273  146    127           <NA>
## 49179           1-Regular school     543  297    246           <NA>
## 49180           1-Regular school     302  164    138           <NA>
## 49192           1-Regular school     165   81     84           <NA>
## 49193           1-Regular school     269  131    138           <NA>
## 49194           1-Regular school     230  124    106           <NA>
## 49195           1-Regular school     668  335    333           <NA>
## 49196           1-Regular school     356  175    181           <NA>
## 49197           1-Regular school      47   24     23           <NA>
## 49232           1-Regular school     159   84     75             10
## 49240           1-Regular school     486  251    235             36
## 49247           1-Regular school     179   91     88           <NA>
## 49255           1-Regular school     124   60     64           4.65
## 49256           1-Regular school     172   83     89           <NA>
## 49257           1-Regular school     225   96    129           <NA>
## 49258           1-Regular school     441  161    280           <NA>
## 49259           1-Regular school     428  179    249           <NA>
## 49262           1-Regular school     115   60     55           <NA>
## 49263           1-Regular school     627  303    324          29.54
## 49269           1-Regular school     n/a  n/a    n/a           <NA>
## 49353        3-Vocational school     n/a  n/a    n/a           <NA>
## 49355 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 49429           1-Regular school       0    0      0           <NA>
## 49430           1-Regular school       0    0      0           <NA>
## 49480 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 49511           1-Regular school    1391  706    685           <NA>
## 49519           1-Regular school    1108  548    560           <NA>
## 49523           1-Regular school     790  417    373           <NA>
## 49524           1-Regular school     629  330    299           <NA>
## 49526           1-Regular school    1040  510    530           <NA>
## 49527           1-Regular school    1053  488    565           <NA>
## 49529           1-Regular school    1281  642    639           <NA>
## 49530           1-Regular school    1087  514    573           <NA>
## 49531           1-Regular school    1133  601    532           <NA>
## 49533           1-Regular school    1038  491    547           <NA>
## 49534           1-Regular school    1100  563    537           <NA>
## 49535           1-Regular school     563  274    289           <NA>
## 49536           1-Regular school    1192  585    607           <NA>
## 49537           1-Regular school     361  171    190           <NA>
## 49538           1-Regular school    1142  550    592           <NA>
## 49539           1-Regular school    1797  867    930           <NA>
## 49540           1-Regular school     306  131    175           <NA>
## 49557           1-Regular school    1394  693    701           <NA>
## 49558           1-Regular school    1331  647    684           <NA>
## 49559           1-Regular school     679  363    316           <NA>
## 49591 4-Alternative/other school       2    1      1           <NA>
## 49618           1-Regular school    1033  514    519           <NA>
## 49620           1-Regular school     530  264    266           <NA>
## 49621           1-Regular school     456  237    219           <NA>
## 49623           1-Regular school      21   11     10           <NA>
## 49645           1-Regular school     246  103    143          12.98
## 49646           1-Regular school      14    7      7           <NA>
## 49682           1-Regular school     583  268    315          27.01
## 49726           1-Regular school       7    6      1           <NA>
## 49742           1-Regular school       0    0      0           <NA>
## 49743           1-Regular school       0    0      0           <NA>
## 49890 4-Alternative/other school      21   16      5           <NA>
## 49892           1-Regular school       0    0      0           <NA>
## 49893           1-Regular school       0    0      0           <NA>
## 49894           1-Regular school       2    2      0           <NA>
## 49895           1-Regular school       6    2      4           <NA>
## 49982 4-Alternative/other school       0    0      0           <NA>
## 50014           1-Regular school     478  229    249           <NA>
## 50039           1-Regular school     151   87     64              7
## 50092           1-Regular school      90   49     41           <NA>
## 50097 4-Alternative/other school       0    0      0           <NA>
## 50099           1-Regular school     193  107     86           <NA>
## 50223           1-Regular school      72   41     31           <NA>
## 50289           1-Regular school     378  192    186           <NA>
## 50290           1-Regular school     474  252    222           <NA>
## 50295           1-Regular school     321  160    161           <NA>
## 50296           1-Regular school     237  110    127           <NA>
## 50303           1-Regular school       0    0      0           <NA>
## 50304           1-Regular school       2    1      1           <NA>
## 50305 4-Alternative/other school      38   38      0           <NA>
## 50315           1-Regular school    1917 1012    905         133.24
## 50355           1-Regular school     178   96     82           <NA>
## 50366           1-Regular school     456  199    257           16.5
## 50368           1-Regular school     648  315    333           <NA>
## 50370           1-Regular school      10    5      5           <NA>
## 50400 4-Alternative/other school      90   54     36           <NA>
## 50403 4-Alternative/other school       4    3      1           <NA>
## 50465        3-Vocational school    <NA>  n/a    n/a           <NA>
## 50478           1-Regular school     101   57     44           <NA>
## 50479           1-Regular school      62   29     33           <NA>
## 50493           1-Regular school     852  448    404           <NA>
## 50495 4-Alternative/other school       0  n/a    n/a           <NA>
## 50522 4-Alternative/other school       0  n/a    n/a           <NA>
## 50561           1-Regular school     214  104    110           13.8
## 50830           1-Regular school     314  169    145          22.98
## 50899           1-Regular school     757  383    374           <NA>
## 50901           1-Regular school     518  274    244           <NA>
## 50911           1-Regular school     631  328    303           <NA>
## 50916           1-Regular school     558  290    268           <NA>
## 50951           1-Regular school     n/a  n/a    n/a           <NA>
## 50952           1-Regular school       7    4      3           <NA>
## 50965           1-Regular school     335  170    165           <NA>
## 50966           1-Regular school     748  322    426           <NA>
## 51003           1-Regular school     n/a  n/a    n/a           <NA>
## 51022           1-Regular school     785  399    386           <NA>
## 51083           1-Regular school     705  364    341           <NA>
## 51093           1-Regular school     412  221    191           31.5
## 51196 2-Special education school    <NA>  n/a    n/a           <NA>
## 51203           1-Regular school     112   52     60           11.6
## 51222 2-Special education school      32   20     12           <NA>
## 51237           1-Regular school     n/a  n/a    n/a           <NA>
## 51243           1-Regular school    1680  808    872          79.25
## 51284           1-Regular school     484  248    236             31
## 51321           1-Regular school      16    6     10              1
## 51326           1-Regular school     661  357    304           <NA>
## 51358           1-Regular school     294  152    142             12
## 51374           1-Regular school     734  387    347             32
## 51419           1-Regular school     n/a  n/a    n/a           <NA>
## 51459 4-Alternative/other school       6    5      1           <NA>
## 51461           1-Regular school     199   99    100           <NA>
## 51476           1-Regular school     499  226    273           <NA>
## 51502 4-Alternative/other school       1    1      0           <NA>
## 51573           1-Regular school      35   15     20           <NA>
## 51590           1-Regular school    1584  798    786           <NA>
## 51594           1-Regular school     464  236    228          28.66
## 51613 2-Special education school       0    0      0           <NA>
## 51637 2-Special education school      46   34     12           <NA>
## 51686           1-Regular school     636  322    314           <NA>
## 51712           1-Regular school     524  287    237           26.2
## 51720           1-Regular school    2563 1292   1271           <NA>
## 51722           1-Regular school     687  339    348           <NA>
## 51728           1-Regular school     318  167    151           <NA>
## 51735           1-Regular school     144  144      0           <NA>
## 51736           1-Regular school     100  100      0           <NA>
## 51737           1-Regular school     229  229      0           <NA>
## 51738           1-Regular school     127  127      0           <NA>
## 51739           1-Regular school     236  236      0           <NA>
## 51740           1-Regular school     172   70    102           <NA>
## 51741 4-Alternative/other school     168   93     75           <NA>
## 51765        3-Vocational school       0    0      0           <NA>
## 51809 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 51811           1-Regular school     131   66     65            6.6
## 51910           1-Regular school     421  216    205           <NA>
## 51936 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 51963 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52033 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 52055        3-Vocational school       0    0      0           <NA>
## 52063        3-Vocational school       0  n/a    n/a           <NA>
## 52069           1-Regular school     n/a  n/a    n/a           <NA>
## 52092 4-Alternative/other school       1    1      0           <NA>
## 52129        3-Vocational school       0    0      0           <NA>
## 52139 4-Alternative/other school       5    4      1           <NA>
## 52154 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52155 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52204 2-Special education school    <NA>  n/a    n/a           <NA>
## 52210           1-Regular school     578  301    277             25
## 52219 2-Special education school     349  138    211             37
## 52222 2-Special education school      34   19     15              0
## 52285           1-Regular school     183   85     98           <NA>
## 52375        3-Vocational school     n/a  n/a    n/a           <NA>
## 52420           1-Regular school    1441  717    724          83.64
## 52433 4-Alternative/other school       1    0      1           <NA>
## 52434 4-Alternative/other school       1    1      0           <NA>
## 52462 4-Alternative/other school       0    0      0           <NA>
## 52512           1-Regular school     n/a  n/a    n/a           <NA>
## 52544           1-Regular school     774  415    359          34.25
## 52568           1-Regular school     520  260    260           <NA>
## 52677           1-Regular school     128   73     55           4.99
## 52705           1-Regular school    1848  944    904          79.28
## 52711 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52713 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52714        3-Vocational school     n/a  n/a    n/a           <NA>
## 52752           1-Regular school     270  160    110          20.05
## 52763           1-Regular school     657  324    333           41.3
## 52785 4-Alternative/other school       0  n/a    n/a           <NA>
## 52794           1-Regular school     495  280    215           29.5
## 52828           1-Regular school     572  281    291           32.2
## 52837 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52847           1-Regular school     244  119    125           <NA>
## 52875           1-Regular school     395  214    181             32
## 52988        3-Vocational school    <NA>  n/a    n/a           <NA>
## 52998 4-Alternative/other school       8    8      0           <NA>
## 53039 4-Alternative/other school       8    7      1           <NA>
## 53054 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 53072           1-Regular school     n/a  n/a    n/a           <NA>
## 53073 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 53075        3-Vocational school    <NA>  n/a    n/a             13
## 53176           1-Regular school     445  261    184           <NA>
## 53239 4-Alternative/other school       1    1      0           <NA>
## 53242           1-Regular school       0    0      0           <NA>
## 53243           1-Regular school       1    1      0           <NA>
## 53244           1-Regular school       5    3      2           <NA>
## 53297           1-Regular school     581  304    277           <NA>
## 53314           1-Regular school     n/a  n/a    n/a           <NA>
## 53319           1-Regular school     579  301    278           <NA>
## 53341           1-Regular school     142   82     60           <NA>
## 53392           1-Regular school       2    1      1           <NA>
## 53407 2-Special education school      38   23     15           <NA>
## 53461           1-Regular school      62   40     22              7
## 53472           1-Regular school     660  333    327           <NA>
## 53473           1-Regular school     264  143    121           <NA>
## 53474           1-Regular school     953  518    435           <NA>
## 53589           1-Regular school     320  153    167           <NA>
## 53620           1-Regular school      64   30     34           <NA>
## 53705           1-Regular school     n/a  n/a    n/a           <NA>
## 53730           1-Regular school      86   57     29           <NA>
## 53733           1-Regular school      85   44     41           <NA>
## 53734           1-Regular school     709  352    357           <NA>
## 53846           1-Regular school      39   21     18              2
## 53862           1-Regular school     652  345    307           <NA>
## 53863           1-Regular school     478  249    229           <NA>
## 53922           1-Regular school       9    3      6           1.45
## 53978           1-Regular school    1531  797    734           <NA>
## 53985           1-Regular school     620  331    289           <NA>
## 54026           1-Regular school    1231  617    614           <NA>
## 54028           1-Regular school     658  349    309           <NA>
## 54138           1-Regular school     330  174    156           <NA>
## 54154           1-Regular school     685  371    314          48.33
## 54186           1-Regular school     228  105    123           <NA>
## 54231           1-Regular school     640  329    311           <NA>
## 54252           1-Regular school      93   63     30           <NA>
## 54264 2-Special education school      12    7      5           <NA>
## 54265 2-Special education school      75   47     28           <NA>
## 54288 4-Alternative/other school       8    6      2           <NA>
## 54296        3-Vocational school       0    0      0           <NA>
## 54301           1-Regular school     n/a  n/a    n/a           <NA>
## 54336 4-Alternative/other school       4    3      1           <NA>
## 54347        3-Vocational school    <NA>  n/a    n/a              3
## 54357        3-Vocational school    <NA>  n/a    n/a             16
## 54405 4-Alternative/other school      52   47      5           <NA>
## 54414           1-Regular school       0    0      0           <NA>
## 54416 4-Alternative/other school      48   48      0           <NA>
## 54426           1-Regular school     214   91    123           <NA>
## 54637 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 54646           1-Regular school      72   42     30           <NA>
## 54683        3-Vocational school     n/a  n/a    n/a           <NA>
## 54691 2-Special education school       1    1      0           <NA>
## 54721        3-Vocational school    <NA>  n/a    n/a              3
## 54743 4-Alternative/other school       2    2      0           <NA>
## 54765 4-Alternative/other school      12   12      0           <NA>
## 54791 4-Alternative/other school       5    3      2           <NA>
## 54907           1-Regular school     n/a  n/a    n/a           <NA>
## 54946 2-Special education school       0    0      0           <NA>
## 54972 4-Alternative/other school      76   69      7          32.95
## 54976           1-Regular school       0    0      0           <NA>
## 55018           1-Regular school     463  238    225          25.78
## 55110           1-Regular school     457  230    227           <NA>
## 55121           1-Regular school     342  213    129             21
## 55164 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 55166           1-Regular school     511  237    274           <NA>
## 55187        3-Vocational school    <NA>  n/a    n/a             16
## 55203           1-Regular school     379  200    179           <NA>
## 55238           1-Regular school     n/a  n/a    n/a           <NA>
## 55239        3-Vocational school     n/a  n/a    n/a           <NA>
## 55291           1-Regular school     167   74     93           <NA>
## 55298           1-Regular school     502  255    247           <NA>
## 55299           1-Regular school     249  106    143           <NA>
## 55300           1-Regular school      25   12     13           <NA>
## 55306           1-Regular school     536  247    289           <NA>
## 55307           1-Regular school     170   88     82           <NA>
## 55309           1-Regular school     167   85     82           <NA>
## 55312           1-Regular school     707  358    349           <NA>
## 55314           1-Regular school     169   70     99           <NA>
## 55317           1-Regular school      18    4     14           <NA>
## 55323           1-Regular school     639  314    325           <NA>
## 55331           1-Regular school     250  121    129          24.26
## 55369           1-Regular school     290  179    111           <NA>
## 55412           1-Regular school      35   21     14            3.5
## 55413           1-Regular school      14    6      8              3
## 55414           1-Regular school     727  363    364             39
## 55530           1-Regular school     140   63     77           <NA>
## 55677 2-Special education school       0    0      0           <NA>
## 55748           1-Regular school      56   29     27            6.5
## 55754           1-Regular school     246  125    121           19.6
## 55901 4-Alternative/other school       1    1      0           <NA>
## 55902 4-Alternative/other school       3    3      0           <NA>
## 55903 4-Alternative/other school      77   77      0           <NA>
## 56099           1-Regular school      36   20     16           <NA>
## 56102           1-Regular school     517  265    252           <NA>
## 56123           1-Regular school      77   49     28              5
## 56133           1-Regular school     n/a  n/a    n/a           <NA>
## 56183           1-Regular school     497  257    240           <NA>
## 56184           1-Regular school     140   73     67           <NA>
## 56213 4-Alternative/other school       0    0      0           <NA>
## 56232           1-Regular school     407  191    216           <NA>
## 56233 2-Special education school      56   35     21           <NA>
## 56243 4-Alternative/other school       8    8      0           <NA>
## 56295           1-Regular school     690  350    340           <NA>
## 56337           1-Regular school     771  401    370           <NA>
## 56358           1-Regular school     298  146    152           <NA>
## 56361 4-Alternative/other school       0    0      0           <NA>
## 56384           1-Regular school     430  221    209           <NA>
## 56419           1-Regular school     485  244    241           <NA>
## 56428           1-Regular school     396  205    191          16.08
## 56619 4-Alternative/other school       2    1      1           <NA>
## 56678           1-Regular school     367  209    158           <NA>
## 56739           1-Regular school     214  108    106           <NA>
## 56817        3-Vocational school       0    0      0           <NA>
## 56838           1-Regular school     n/a  n/a    n/a           <NA>
## 56863 2-Special education school    <NA>  n/a    n/a           <NA>
## 56873           1-Regular school      45   21     24           <NA>
## 56880        3-Vocational school       0    0      0           <NA>
## 56904        3-Vocational school    <NA>  n/a    n/a             22
## 56918 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 56931           1-Regular school     112   59     53          10.65
## 56932           1-Regular school      53   27     26            9.5
## 56933           1-Regular school      36   16     20           2.35
## 56982           1-Regular school     400  205    195           <NA>
## 57060           1-Regular school     232  118    114           <NA>
## 57140           1-Regular school      13   11      2           0.49
## 57141           1-Regular school      19   12      7              1
## 57144           1-Regular school     114   67     47            3.4
## 57152 2-Special education school      97   55     42           <NA>
## 57160 4-Alternative/other school      33   29      4           <NA>
## 57161 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 57167 4-Alternative/other school       3    3      0           <NA>
## 57171           1-Regular school     225   57    168           <NA>
## 57198           1-Regular school      88   56     32           <NA>
## 57199           1-Regular school     161   65     96           <NA>
## 57226           1-Regular school    1761  474   1287           <NA>
## 57228           1-Regular school     n/a  n/a    n/a           <NA>
## 57230 4-Alternative/other school       7    4      3           <NA>
## 57231 4-Alternative/other school       6    2      4           <NA>
## 57234           1-Regular school     294  138    156           <NA>
## 57238           1-Regular school     n/a  n/a    n/a           <NA>
## 57252           1-Regular school     n/a  n/a    n/a           <NA>
## 57264           1-Regular school     n/a  n/a    n/a           <NA>
## 57270           1-Regular school     n/a  n/a    n/a           <NA>
## 57276           1-Regular school     n/a  n/a    n/a           <NA>
## 57278           1-Regular school     n/a  n/a    n/a           <NA>
## 57287 4-Alternative/other school      27   27      0           <NA>
## 57288           1-Regular school     292  124    168           <NA>
## 57289           1-Regular school       0    0      0           <NA>
## 57297           1-Regular school      65   36     29           <NA>
## 57298           1-Regular school     212  105    107           <NA>
## 57354        3-Vocational school    <NA>  n/a    n/a             14
## 57379           1-Regular school     898  493    405           <NA>
## 57385           1-Regular school     639  346    293           <NA>
## 57420 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 57472 4-Alternative/other school      20   12      8           <NA>
## 57478 4-Alternative/other school      50   45      5           <NA>
## 57533        3-Vocational school    <NA>  n/a    n/a           <NA>
## 57571           1-Regular school     619  335    284           <NA>
## 57595           1-Regular school      23   11     12           <NA>
## 57596           1-Regular school     116   40     76           <NA>
## 57603           1-Regular school     914  485    429           <NA>
## 57604           1-Regular school     782  380    402           <NA>
## 57609           1-Regular school     416  222    194           <NA>
## 57656           1-Regular school     624  333    291           <NA>
## 57665 2-Special education school      20   12      8           <NA>
## 57685           1-Regular school     830  437    393             55
## 57688        3-Vocational school       0    0      0           <NA>
## 57689        3-Vocational school       0    0      0           <NA>
## 57690        3-Vocational school       0    0      0           <NA>
## 57691        3-Vocational school       0    0      0           <NA>
## 57692        3-Vocational school       0    0      0           <NA>
## 57694        3-Vocational school       0    0      0           <NA>
## 57695        3-Vocational school       0    0      0           <NA>
## 57696           1-Regular school     n/a  n/a    n/a           <NA>
## 57778           1-Regular school     248  143    105           <NA>
## 57780 2-Special education school      30   24      6           <NA>
## 57788           1-Regular school    <NA>  n/a    n/a           <NA>
## 57791           1-Regular school     232  127    105           <NA>
## 57800           1-Regular school     231  116    115           <NA>
## 57848           1-Regular school     548  279    269           <NA>
## 57882           1-Regular school     332  171    161           <NA>
## 57904           1-Regular school     733  390    343          51.24
## 57907           1-Regular school     452  223    229          33.75
## 57912 4-Alternative/other school     225  117    107           <NA>
## 57913           1-Regular school     661  337    324           <NA>
## 57925           1-Regular school     535  256    279           21.4
## 57927           1-Regular school     147   81     66           <NA>
## 57966 4-Alternative/other school       0    0      0           <NA>
## 57984           1-Regular school       0    0      0           <NA>
## 57993           1-Regular school       0    0      0           <NA>
## 58065           1-Regular school     406  219    187           <NA>
## 58141 4-Alternative/other school       3    3    n/a           <NA>
## 58185        3-Vocational school    <NA>  n/a    n/a          13.76
## 58204           1-Regular school      33   14     19           <NA>
## 58205           1-Regular school      98   45     53           <NA>
## 58219 4-Alternative/other school    <NA>  n/a    n/a              1
## 58222           1-Regular school     150   80     70           <NA>
## 58355 4-Alternative/other school      15   12      3           <NA>
## 58359 4-Alternative/other school     102   45     57           <NA>
## 58363           1-Regular school     131   57     74            5.5
## 58371           1-Regular school     297  134    163           <NA>
## 58373 4-Alternative/other school      15    5     10           <NA>
## 58383           1-Regular school     242    0      0           <NA>
## 58393        3-Vocational school       0    0      0           <NA>
## 58400        3-Vocational school       0    0      0           <NA>
## 58405           1-Regular school     329  166    163          28.85
## 58420 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 58432           1-Regular school     n/a  n/a    n/a           <NA>
## 58489           1-Regular school       1    0      1           <NA>
## 58492 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 58502 4-Alternative/other school       3    3      0           <NA>
## 58505 4-Alternative/other school      15   15    n/a           <NA>
## 58506 4-Alternative/other school       4    4      0           <NA>
## 58520           1-Regular school     112   55     57           <NA>
## 58530 2-Special education school      46   42      4           <NA>
## 58536 4-Alternative/other school       2    1      1           <NA>
## 58537 4-Alternative/other school      45   18     27           <NA>
## 58554 4-Alternative/other school      11    6      5            0.5
## 58555        3-Vocational school       0    0      0           <NA>
## 58571           1-Regular school     402  196    206           <NA>
## 58572           1-Regular school     123   57     66           <NA>
## 58573           1-Regular school     475  218    257           <NA>
## 58600           1-Regular school    1405  607    798          71.15
## 58635           1-Regular school     429  226    203           <NA>
## 58658           1-Regular school      65   34     31              3
## 58701 4-Alternative/other school       1    0      1           <NA>
## 58702 4-Alternative/other school       7    4      3           <NA>
## 58707        3-Vocational school       0    0      0           <NA>
## 58741        3-Vocational school    <NA>  n/a    n/a              1
## 58747        3-Vocational school    <NA>  n/a    n/a          13.01
## 58800 4-Alternative/other school       0    0      0           <NA>
## 58813           1-Regular school     593  289    304           <NA>
## 58814           1-Regular school     727  358    369           <NA>
## 58817        3-Vocational school     n/a  n/a    n/a           <NA>
## 58821           1-Regular school       0    0      0           <NA>
## 58822           1-Regular school       0    0      0           <NA>
## 58823           1-Regular school       0    0      0           <NA>
## 58824           1-Regular school       0    0      0           <NA>
## 58843           1-Regular school     601  291    310           <NA>
## 58848           1-Regular school    2370 1204   1166          94.51
## 58930           1-Regular school     888  459    429           <NA>
## 58953           1-Regular school    <NA>  n/a    n/a              0
## 58954           1-Regular school     422  203    219             16
## 58981           1-Regular school     158   80     78           <NA>
## 58985           1-Regular school     189  102     87           <NA>
## 58987           1-Regular school     187   95     92           <NA>
## 58988           1-Regular school     107   44     63           <NA>
## 58989           1-Regular school      52   29     23           <NA>
## 58991           1-Regular school     251  127    124           <NA>
## 58992           1-Regular school     225  124    101           <NA>
## 58995           1-Regular school      56   31     25           <NA>
## 59000           1-Regular school     307  153    154           <NA>
## 59006           1-Regular school      13    5      8           <NA>
## 59007           1-Regular school      80   34     46           <NA>
## 59016           1-Regular school     287  162    125           <NA>
## 59031 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 59035        3-Vocational school     n/a  n/a    n/a           <NA>
## 59038 4-Alternative/other school       6    1      5           <NA>
## 59076        3-Vocational school    <NA>  n/a    n/a             15
## 59081           1-Regular school     769  386    383           <NA>
## 59091           1-Regular school     269  138    131           <NA>
## 59108           1-Regular school     276  152    124           <NA>
## 59129           1-Regular school     127   81     46           <NA>
## 59158           1-Regular school     217  105    112           <NA>
## 59205           1-Regular school     n/a  n/a    n/a           <NA>
## 59331 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 59335        3-Vocational school    <NA>  n/a    n/a           <NA>
## 59346           1-Regular school     903  473    430           <NA>
## 59351           1-Regular school     727  382    345           <NA>
## 59355 2-Special education school      37   21     16           <NA>
## 59359           1-Regular school     754  383    371           <NA>
## 59360           1-Regular school     765  406    359           <NA>
## 59416           1-Regular school     616  330    286           <NA>
## 59421           1-Regular school     364  190    174           <NA>
## 59447 4-Alternative/other school       8    7      1           <NA>
## 59472 4-Alternative/other school       4    1      3           <NA>
## 59477 4-Alternative/other school      48   16     32           <NA>
## 59478 4-Alternative/other school      18    9      9           <NA>
## 59482 4-Alternative/other school       2    1      1           <NA>
## 59489           1-Regular school     260  130    130           23.5
## 59491           1-Regular school     272  141    131          18.38
## 59534 4-Alternative/other school      28   20      8           <NA>
## 59564           1-Regular school       0    0      0           <NA>
## 59677           1-Regular school     728  409    319           <NA>
## 59716           1-Regular school     347  146    201           <NA>
## 59758           1-Regular school    1250  643    607           <NA>
## 59759           1-Regular school     877  425    452           <NA>
## 59770           1-Regular school     876  476    400           <NA>
## 59848 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 59861           1-Regular school    1380  731    649           <NA>
## 59864           1-Regular school    <NA>  n/a    n/a              3
## 59865           1-Regular school     127   65     62              6
## 59868           1-Regular school     n/a  n/a    n/a           <NA>
## 59870           1-Regular school     671  359    312           <NA>
## 59875           1-Regular school     696  275    421           <NA>
## 59877 4-Alternative/other school     147   71     76           <NA>
## 59881           1-Regular school     351  190    161             11
## 59886           1-Regular school      20    9     11              1
## 59901           1-Regular school     181   86     95           <NA>
## 59917           1-Regular school    1310  672    638           <NA>
## 59922 4-Alternative/other school     249  154     95           <NA>
## 59924           1-Regular school     197  102     95           <NA>
## 59928           1-Regular school     682  347    335           <NA>
## 59933           1-Regular school     676  351    325           <NA>
## 59967           1-Regular school     482  254    228             17
## 60008           1-Regular school    1268  645    623           <NA>
## 60040           1-Regular school     848  448    400           <NA>
## 60041           1-Regular school     620  304    316           <NA>
## 60043           1-Regular school     377  189    188           <NA>
## 60058 2-Special education school      21   15      6           <NA>
## 60068           1-Regular school     489  258    231           <NA>
## 60081           1-Regular school     438  225    213           <NA>
## 60084 4-Alternative/other school      48   48    n/a           <NA>
## 60089           1-Regular school     758  396    362           <NA>
## 60098           1-Regular school     362  180    182           <NA>
## 60099 2-Special education school       7    2      5           <NA>
## 60113 2-Special education school      42   24     18           <NA>
## 60118           1-Regular school     n/a  n/a    n/a           <NA>
## 60162 2-Special education school      17    9      8           <NA>
## 60254           1-Regular school      94   60     34              5
## 60255 2-Special education school       0    0      0           <NA>
## 60276           1-Regular school     938  479    459           <NA>
## 60285           1-Regular school     686  368    318           <NA>
## 60289           1-Regular school     704  365    339           <NA>
## 60300           1-Regular school     517  276    241           <NA>
## 60329           1-Regular school     n/a  n/a    n/a           <NA>
## 60346           1-Regular school     943  468    475           <NA>
## 60368           1-Regular school     743  365    378           <NA>
## 60375           1-Regular school      81   36     45              4
## 60464           1-Regular school     371  180    191           <NA>
## 60517 2-Special education school       0    0      0           <NA>
## 60528           1-Regular school    1490  766    724           <NA>
## 60558        3-Vocational school    <NA>  n/a    n/a             11
## 60606           1-Regular school       0    0      0           <NA>
## 60658           1-Regular school     139   71     68           <NA>
## 60662           1-Regular school     425  228    197           30.8
## 60679 4-Alternative/other school      98   98    n/a             26
## 60682           1-Regular school       0    0      0           <NA>
## 60683 4-Alternative/other school       2    2      0           <NA>
## 60689 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 60721           1-Regular school     491  237    254           <NA>
## 60755           1-Regular school     375  198    177           <NA>
## 60764 4-Alternative/other school       0    0      0           <NA>
## 60765        3-Vocational school       0    0      0           <NA>
## 60768           1-Regular school     n/a  n/a    n/a           <NA>
## 60787           1-Regular school     544  274    270           <NA>
## 60859 4-Alternative/other school       0    0      0           <NA>
## 60860           1-Regular school     n/a  n/a    n/a           <NA>
## 60862           1-Regular school      14    4     10           <NA>
## 60863           1-Regular school       0    0      0           <NA>
## 60864           1-Regular school       9    4      5           <NA>
## 60865           1-Regular school       7    4      3           <NA>
## 60932           1-Regular school     n/a  n/a    n/a           <NA>
## 60938           1-Regular school     257  105    152          10.05
## 60940        3-Vocational school       0    0      0           <NA>
## 60941        3-Vocational school       0    0      0           <NA>
## 60942        3-Vocational school       0    0      0           <NA>
## 60943        3-Vocational school       0    0      0           <NA>
## 60944        3-Vocational school       0    0      0           <NA>
## 60945        3-Vocational school       0    0      0           <NA>
## 60946        3-Vocational school       0    0      0           <NA>
## 60947        3-Vocational school       0    0      0           <NA>
## 60948        3-Vocational school       0    0      0           <NA>
## 60956           1-Regular school    1822  769   1053           <NA>
## 60994           1-Regular school      29   15     14           <NA>
## 61018           1-Regular school     494  257    237           <NA>
## 61021        3-Vocational school       0    0      0           <NA>
## 61022        3-Vocational school       0    0      0           <NA>
## 61023        3-Vocational school       0    0      0           <NA>
## 61024        3-Vocational school       0    0      0           <NA>
## 61025        3-Vocational school       0    0      0           <NA>
## 61027        3-Vocational school       0    0      0           <NA>
## 61028        3-Vocational school       0    0      0           <NA>
## 61029        3-Vocational school       0    0      0           <NA>
## 61030        3-Vocational school       0    0      0           <NA>
## 61031        3-Vocational school       0    0      0           <NA>
## 61032        3-Vocational school       0    0      0           <NA>
## 61051           1-Regular school    <NA>  n/a    n/a           <NA>
## 61054 4-Alternative/other school       3    2      1           <NA>
## 61055 4-Alternative/other school       2    2      0           <NA>
## 61065           1-Regular school     576  285    291             43
## 61070 4-Alternative/other school    <NA>  n/a    n/a            0.2
## 61073        3-Vocational school       3    1      2           <NA>
## 61077           1-Regular school     349  174    175           <NA>
## 61140           1-Regular school     765  418    347           <NA>
## 61161           1-Regular school     260  135    125           <NA>
## 61222           1-Regular school      36   14     22           <NA>
## 61225           1-Regular school     182   90     92           <NA>
## 61229           1-Regular school     123   61     62           9.73
## 61270           1-Regular school      86   47     39           10.1
## 61284           1-Regular school     n/a  n/a    n/a           <NA>
## 61296           1-Regular school      46   19     27           <NA>
## 61298           1-Regular school     150   42    108           <NA>
## 61356 4-Alternative/other school      52   31     21           <NA>
## 61357           1-Regular school     468  257    211           32.5
## 61359           1-Regular school     249  122    127           16.5
## 61360           1-Regular school     206  106    100           12.5
## 61369 4-Alternative/other school       4    4      0           <NA>
## 61376           1-Regular school    <NA>  n/a    n/a              4
## 61378           1-Regular school    1813  953    860           <NA>
## 61379           1-Regular school     687  338    349           <NA>
## 61380           1-Regular school    1151  609    542           <NA>
## 61384 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61386           1-Regular school     657  375    282           <NA>
## 61438 4-Alternative/other school       1    0      1           <NA>
## 61450 4-Alternative/other school    <NA>  n/a    n/a              6
## 61453 4-Alternative/other school      13    6      7           <NA>
## 61455 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61456 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61457 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61459 4-Alternative/other school      80   56     24           <NA>
## 61463 4-Alternative/other school      93   46     47           <NA>
## 61464 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61563 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61586 4-Alternative/other school    <NA>  n/a    n/a              2
## 61588 4-Alternative/other school      73   44     29           <NA>
## 61591           1-Regular school     157   65     92           <NA>
## 61600           1-Regular school     n/a  n/a    n/a           <NA>
## 61611 4-Alternative/other school      87   87    n/a           <NA>
## 61612 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61637 4-Alternative/other school       4    4      0           <NA>
## 61697           1-Regular school     447  298    149             14
## 61699 2-Special education school     228   68    160          16.51
## 61754 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61766           1-Regular school     173   50    123           <NA>
## 61767           1-Regular school      76   19     57           <NA>
## 61781 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 61802           1-Regular school     991  500    491           85.7
## 61803           1-Regular school    2934 1477   1457          258.3
## 61843           1-Regular school     825  422    403           41.1
## 61845           1-Regular school     194   98     96           <NA>
## 61866 2-Special education school    <NA>  n/a    n/a              1
## 61868 2-Special education school    <NA>  n/a    n/a           <NA>
## 61876 4-Alternative/other school      17    7     10           <NA>
## 62013           1-Regular school     471  240    231           <NA>
## 62051 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62125           1-Regular school     357  187    170           <NA>
## 62139           1-Regular school     417  215    202           <NA>
## 62140           1-Regular school     445  229    216           <NA>
## 62141           1-Regular school      43   20     23              3
## 62144           1-Regular school     665  322    343           41.6
## 62147        3-Vocational school    <NA>  n/a    n/a          11.73
## 62185 4-Alternative/other school       3    0      3           <NA>
## 62192           1-Regular school     970  483    487           <NA>
## 62266           1-Regular school     433  210    223             34
## 62267 4-Alternative/other school      24   19      5           <NA>
## 62269           1-Regular school     563  270    293           <NA>
## 62305           1-Regular school     178   83     95           <NA>
## 62309 2-Special education school      30   18     12           <NA>
## 62310 2-Special education school     123   65     58           <NA>
## 62312           1-Regular school     754  397    357           <NA>
## 62315           1-Regular school     559  290    269           <NA>
## 62316           1-Regular school    1028  489    539           <NA>
## 62317           1-Regular school     435  220    215           <NA>
## 62339           1-Regular school     525  273    252           <NA>
## 62340           1-Regular school     633  317    316           <NA>
## 62341           1-Regular school     365  177    188           <NA>
## 62342           1-Regular school     647  303    344           <NA>
## 62343           1-Regular school    1136  581    555           <NA>
## 62344           1-Regular school    1096  451    645           <NA>
## 62345           1-Regular school     508  237    271           <NA>
## 62346           1-Regular school     662  311    351           <NA>
## 62347           1-Regular school     628  277    351           <NA>
## 62348           1-Regular school    1014  539    475           <NA>
## 62349           1-Regular school     780  389    391           <NA>
## 62350           1-Regular school     956  461    495           <NA>
## 62351           1-Regular school     652  315    337           <NA>
## 62352           1-Regular school     985  491    494           <NA>
## 62353           1-Regular school     461  204    257           <NA>
## 62354           1-Regular school     489  267    222           <NA>
## 62355           1-Regular school     939  442    497           <NA>
## 62373 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62408 4-Alternative/other school      18   11      7           <NA>
## 62409 2-Special education school       6    4      2           <NA>
## 62410           1-Regular school     n/a  n/a    n/a           <NA>
## 62414           1-Regular school     n/a  n/a    n/a           <NA>
## 62415 2-Special education school      14    9      5           <NA>
## 62445 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62446 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62450 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62453        3-Vocational school     n/a  n/a    n/a           <NA>
## 62456           1-Regular school     n/a  n/a    n/a           <NA>
## 62523           1-Regular school    1003  504    499             35
## 62531           1-Regular school     956  489    467          33.44
## 62557           1-Regular school     n/a  n/a    n/a           <NA>
## 62574        3-Vocational school    <NA>  n/a    n/a            8.5
## 62644           1-Regular school    1049  558    491           <NA>
## 62678 2-Special education school      62   34     28           <NA>
## 62679 4-Alternative/other school       0    0      0           <NA>
## 62687           1-Regular school     741  396    345             47
## 62693           1-Regular school     817  420    397           <NA>
## 62731        3-Vocational school       0    0      0           <NA>
## 62755           1-Regular school     966  509    457           <NA>
## 62756           1-Regular school    1021  511    510           <NA>
## 62788 4-Alternative/other school      25   15     10           <NA>
## 62803           1-Regular school     613  287    326             29
## 62866           1-Regular school       0    0      0           <NA>
## 62978           1-Regular school     316  167    149             16
## 63014        3-Vocational school       0    0      0           <NA>
## 63041           1-Regular school     353  130    223           <NA>
## 63042           1-Regular school     348  157    191           <NA>
## 63044           1-Regular school    1038  514    524           <NA>
## 63058           1-Regular school     563  284    279             30
## 63094           1-Regular school     n/a  n/a    n/a           <NA>
## 63111           1-Regular school    1151  556    595           <NA>
## 63144           1-Regular school     800  398    402           <NA>
## 63145           1-Regular school     616  294    322           <NA>
## 63151        3-Vocational school       0    0      0           <NA>
## 63152 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 63169 4-Alternative/other school     375  263    112           <NA>
## 63173           1-Regular school     547  280    267           <NA>
## 63174           1-Regular school     423  219    204           <NA>
## 63175           1-Regular school     504  262    242           <NA>
## 63206           1-Regular school     781  400    381           <NA>
## 63211           1-Regular school     753  336    417           <NA>
## 63239 2-Special education school      24   12     12           <NA>
## 63240           1-Regular school     119   61     58           <NA>
## 63279           1-Regular school     657  347    310           <NA>
## 63280           1-Regular school     391  202    189           <NA>
## 63291           1-Regular school     294  144    150           <NA>
## 63292           1-Regular school     233  113    120           <NA>
## 63344           1-Regular school     523  269    254           <NA>
## 63363 4-Alternative/other school     175   73    102           <NA>
## 63365           1-Regular school     588  317    271           <NA>
## 63379           1-Regular school     335  176    159           <NA>
## 63380           1-Regular school     322  170    152           <NA>
## 63381 2-Special education school      35   19     16           <NA>
## 63382           1-Regular school     393  199    194           <NA>
## 63397           1-Regular school     n/a  n/a    n/a           <NA>
## 63509 4-Alternative/other school       1    1    n/a           <NA>
## 63511 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 63519           1-Regular school     n/a  n/a    n/a           <NA>
## 63615           1-Regular school      34    8     26           <NA>
## 63616 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 63622           1-Regular school      23    9     14              0
## 63623           1-Regular school      45   22     23           <NA>
## 63672 2-Special education school      13   10      3           <NA>
## 63674 2-Special education school       3    3      0           <NA>
## 63685        3-Vocational school     n/a  n/a    n/a           <NA>
## 63686 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 63687        3-Vocational school     n/a  n/a    n/a           <NA>
## 63698 2-Special education school       0    0      0           <NA>
## 63703 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 63711           1-Regular school    <NA>  n/a    n/a           <NA>
## 63741           1-Regular school     633  349    284           <NA>
## 63749 4-Alternative/other school       2    2      0           <NA>
## 63756           1-Regular school     644  293    351           <NA>
## 63780           1-Regular school     161   91     70           <NA>
## 63802           1-Regular school    1956  945   1011           <NA>
## 63818           1-Regular school     742  395    347           <NA>
## 63821           1-Regular school       8    3      5           <NA>
## 63822           1-Regular school     617  323    294             34
## 63834           1-Regular school     183   87     96           <NA>
## 63903           1-Regular school     231  125    106           18.6
## 64038           1-Regular school     740  380    360           <NA>
## 64095 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 64146           1-Regular school     661  356    305          37.54
## 64246           1-Regular school     251  135    116           <NA>
## 64284           1-Regular school     268  134    134             10
## 64285           1-Regular school     n/a  n/a    n/a           <NA>
## 64321 4-Alternative/other school       3    3      0           <NA>
## 64322 4-Alternative/other school       8    6      2           <NA>
## 64323 4-Alternative/other school       2    2      0           <NA>
## 64327           1-Regular school     161   63     98              9
## 64334 2-Special education school       0    0      0           <NA>
## 64368 2-Special education school       0    0      0           <NA>
## 64381           1-Regular school    <NA>  n/a    n/a           7.28
## 64460           1-Regular school    1409  715    694           <NA>
## 64502           1-Regular school     916  463    453          67.64
## 64599           1-Regular school     500  265    235           <NA>
## 64601           1-Regular school     688  342    346           <NA>
## 64612 4-Alternative/other school       0    0      0           <NA>
## 64629           1-Regular school     573  306    267             32
## 64646           1-Regular school     n/a  n/a    n/a           <NA>
## 64679 4-Alternative/other school      44   33     11           <NA>
## 64684 2-Special education school      52   29     23           <NA>
## 64733           1-Regular school     892  434    458           <NA>
## 64739           1-Regular school     533  260    273             27
## 64753           1-Regular school      74   40     34            6.8
## 64766           1-Regular school     430  212    218           <NA>
## 64783 4-Alternative/other school       3    3    n/a           <NA>
## 64796           1-Regular school     233  128    105           <NA>
## 64797           1-Regular school     412  221    191           <NA>
## 64911           1-Regular school     435  202    233           <NA>
## 64913           1-Regular school     928  462    466           <NA>
## 64984           1-Regular school     550  272    278           <NA>
## 65028           1-Regular school      26   14     12           <NA>
## 65030           1-Regular school     693  339    354           27.7
## 65046 4-Alternative/other school      12   11      1           <NA>
## 65056           1-Regular school    2394 1216   1178          96.64
## 65063 4-Alternative/other school       7    7    n/a           <NA>
## 65064 4-Alternative/other school      21   11     10           <NA>
## 65072           1-Regular school     109   55     54           <NA>
## 65075 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 65076           1-Regular school     n/a  n/a    n/a           <NA>
## 65129           1-Regular school     638  339    299           <NA>
## 65134           1-Regular school       0    0      0           <NA>
## 65136           1-Regular school       0    0      0           <NA>
## 65172           1-Regular school     483  255    228           <NA>
## 65175           1-Regular school     459  232    227           <NA>
## 65186           1-Regular school    1297  644    653           <NA>
## 65193           1-Regular school     692  357    335           <NA>
## 65194           1-Regular school     539  288    251           <NA>
## 65211           1-Regular school     810  407    403           <NA>
## 65214           1-Regular school    1234  626    608           <NA>
## 65219           1-Regular school    1087  522    565           <NA>
## 65220 2-Special education school     120   84     36           <NA>
## 65281           1-Regular school     218  118    100           <NA>
## 65282 4-Alternative/other school      10    8      2           <NA>
## 65285           1-Regular school       0    0      0           <NA>
## 65286           1-Regular school       0    0      0           <NA>
## 65287           1-Regular school      50   25     25           <NA>
## 65288 4-Alternative/other school      71   71      0           <NA>
## 65309           1-Regular school      26    7     19           <NA>
## 65310           1-Regular school       0    0      0           <NA>
## 65311           1-Regular school       7    4      3           <NA>
## 65323           1-Regular school     787  412    375           <NA>
## 65324           1-Regular school     862  338    524           <NA>
## 65325           1-Regular school     585  270    315           <NA>
## 65329           1-Regular school     710  302    408           <NA>
## 65330           1-Regular school     346  181    165           <NA>
## 65333 2-Special education school      49   30     19           <NA>
## 65334 2-Special education school      36   18     18           <NA>
## 65335 2-Special education school      77   40     37           <NA>
## 65336 2-Special education school      38   19     19           <NA>
## 65389           1-Regular school     n/a  n/a    n/a           <NA>
## 65404           1-Regular school     775  378    397           <NA>
## 65405           1-Regular school     519  260    259           <NA>
## 65429           1-Regular school     160   86     74           <NA>
## 65430           1-Regular school     265  129    136          12.25
## 65485           1-Regular school     621  334    287             21
## 65559           1-Regular school     738  371    367          45.05
## 65575           1-Regular school     432  221    211           26.2
## 65602           1-Regular school     n/a  n/a    n/a           <NA>
## 65622           1-Regular school    1585  783    802           <NA>
## 65623           1-Regular school     919  471    448           <NA>
## 65636           1-Regular school      93   58     35           <NA>
## 65637           1-Regular school     155   92     63           <NA>
## 65638           1-Regular school     267  151    116           <NA>
## 65639           1-Regular school      76   34     42           <NA>
## 65640           1-Regular school     183  101     82           <NA>
## 65641           1-Regular school     433  228    205           <NA>
## 65642           1-Regular school     199  127     72           <NA>
## 65643           1-Regular school    1066  630    436           <NA>
## 65644           1-Regular school     254  133    121           <NA>
## 65687 4-Alternative/other school     286  137    149           13.8
## 65711           1-Regular school      24    7     17           <NA>
## 65712           1-Regular school      30   16     14           <NA>
## 65755 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 65761           1-Regular school     371  195    176           <NA>
## 65768           1-Regular school     151   80     71           <NA>
## 65793           1-Regular school    1770  748   1022         115.98
## 65794           1-Regular school    1934  826   1108          91.52
## 65795           1-Regular school     125   53     72            5.5
## 65796           1-Regular school     359  162    197             19
## 65797           1-Regular school    1180  553    627          76.32
## 65799 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 65800 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 65821           1-Regular school    2069  924   1145          95.94
## 65822           1-Regular school     394  189    205          21.52
## 65823           1-Regular school     840  372    468          36.99
## 65824           1-Regular school    1108  533    575          45.91
## 65825           1-Regular school     835  405    430          52.99
## 65833           1-Regular school    1077  536    541           <NA>
## 65834           1-Regular school     398  229    169           <NA>
## 65835           1-Regular school     657  343    314           <NA>
## 65837           1-Regular school       0    0      0           <NA>
## 65859           1-Regular school     230  107    123           11.5
## 65861           1-Regular school     173   94     79           <NA>
## 65899           1-Regular school       0    0      0           <NA>
## 65905           1-Regular school      13   12      1              0
## 65919           1-Regular school     970  490    480          49.75
## 65956           1-Regular school     798  429    369           <NA>
## 65980           1-Regular school     782  436    346           <NA>
## 65981           1-Regular school     802  397    405           <NA>
## 66018 4-Alternative/other school       0    0      0           <NA>
## 66035           1-Regular school    1206  628    578           <NA>
## 66036           1-Regular school     912  466    446           <NA>
## 66037           1-Regular school     619  338    281           <NA>
## 66044           1-Regular school      19    8     11           1.79
## 66049           1-Regular school     870  465    405          42.72
## 66059           1-Regular school    1085  548    537           <NA>
## 66083           1-Regular school     264  153    111             14
## 66089 2-Special education school      16   15      1           <NA>
## 66186 2-Special education school       7    3      4           <NA>
## 66187           1-Regular school      28   10     18           <NA>
## 66188           1-Regular school       0    0      0           <NA>
## 66220           1-Regular school      56   20     36           <NA>
## 66221           1-Regular school       0    0      0           <NA>
## 66222           1-Regular school      69   18     51           <NA>
## 66228 4-Alternative/other school      12   12    n/a           <NA>
## 66242 4-Alternative/other school      11    6      5           <NA>
## 66267 4-Alternative/other school      55   36     19           <NA>
## 66370           1-Regular school       0    0      0           <NA>
## 66397           1-Regular school     633  328    305           <NA>
## 66455           1-Regular school     291  161    130          19.58
## 66470           1-Regular school      62   30     32           3.25
## 66471           1-Regular school      30   17     13           3.15
## 66496           1-Regular school      44   21     23           <NA>
## 66509        3-Vocational school    <NA>  n/a    n/a           <NA>
## 66543           1-Regular school     593  306    287           20.5
## 66544           1-Regular school     786  397    389           30.5
## 66558 4-Alternative/other school       0    0      0           <NA>
## 66560 4-Alternative/other school       0    0      0           <NA>
## 66569 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 66592 4-Alternative/other school       9    7      2           <NA>
## 66593 4-Alternative/other school       5    4      1           <NA>
## 66594 4-Alternative/other school       7    7      0           <NA>
## 66595 4-Alternative/other school      11    4      7           <NA>
## 66601 4-Alternative/other school      15   10      5           <NA>
## 66602 4-Alternative/other school       1    0      1           <NA>
## 66620           1-Regular school       0    0      0           <NA>
## 66631 4-Alternative/other school      43    0     43           <NA>
## 66632 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 66640 4-Alternative/other school      58    0     58           <NA>
## 66641 4-Alternative/other school      55    0     55           <NA>
## 66643 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 66648 4-Alternative/other school      39    0     39           <NA>
## 66651 4-Alternative/other school      93    0     93           <NA>
## 66653 4-Alternative/other school      61    0     61           <NA>
## 66660           1-Regular school      87   52     35           <NA>
## 66669           1-Regular school     n/a  n/a    n/a           <NA>
## 66681           1-Regular school      78   37     41            6.5
## 66687           1-Regular school     120   67     53            5.3
## 66691           1-Regular school     402  206    196           <NA>
## 66698 4-Alternative/other school       0    0      0           <NA>
## 66705           1-Regular school      11    6      5           5.91
## 66706           1-Regular school     490  236    254          21.47
## 66747        3-Vocational school     n/a  n/a    n/a           <NA>
## 66758           1-Regular school     645  325    320           <NA>
## 66775           1-Regular school     549  293    256           <NA>
## 66794           1-Regular school     351  181    170           <NA>
## 66822           1-Regular school     n/a  n/a    n/a           <NA>
## 66844           1-Regular school     668  349    319           <NA>
## 66852           1-Regular school     n/a  n/a    n/a           <NA>
## 66855           1-Regular school     n/a  n/a    n/a           <NA>
## 66859           1-Regular school     n/a  n/a    n/a           <NA>
## 66871           1-Regular school       0    0      0           <NA>
## 66876           1-Regular school     654  350    304          28.18
## 66902           1-Regular school     n/a  n/a    n/a           <NA>
## 66908           1-Regular school     n/a  n/a    n/a           <NA>
## 66966 4-Alternative/other school      46   45      1           <NA>
## 66967           1-Regular school      97   50     47           <NA>
## 67008           1-Regular school     911  461    450           <NA>
## 67038           1-Regular school     658  359    299           <NA>
## 67043 4-Alternative/other school      71   42     29           <NA>
## 67056           1-Regular school     135   67     68           <NA>
## 67057           1-Regular school      83   47     36           <NA>
## 67058           1-Regular school     260  138    122           <NA>
## 67063           1-Regular school       3    1      2              1
## 67078           1-Regular school     505  245    260           <NA>
## 67110 2-Special education school     n/a  n/a    n/a           <NA>
## 67116           1-Regular school     532  258    274           <NA>
## 67117           1-Regular school     752  378    374          31.01
## 67119           1-Regular school     158   73     85            6.2
## 67121           1-Regular school    1799  874    925           <NA>
## 67132           1-Regular school     650  303    347           <NA>
## 67138           1-Regular school     n/a  n/a    n/a           <NA>
## 67151           1-Regular school     506  256    250           <NA>
## 67155           1-Regular school     340  163    177           <NA>
## 67158           1-Regular school      76   38     38           1.25
## 67230           1-Regular school    1228  636    592           <NA>
## 67295           1-Regular school     373  204    169           <NA>
## 67326           1-Regular school     472  245    227           <NA>
## 67339           1-Regular school      23   14      9           <NA>
## 67340           1-Regular school      14    2     12           <NA>
## 67360           1-Regular school      87   44     43           <NA>
## 67361           1-Regular school     514  270    244           <NA>
## 67366           1-Regular school     n/a  n/a    n/a           <NA>
## 67487           1-Regular school     608  339    269           <NA>
## 67488           1-Regular school     598  317    281           <NA>
## 67558           1-Regular school     369  191    178           <NA>
## 67620 2-Special education school      38   14     24           <NA>
## 67621           1-Regular school     555  287    268           <NA>
## 67642           1-Regular school     356  189    167           <NA>
## 67643           1-Regular school     370  186    184           <NA>
## 67681           1-Regular school     562  294    268          70.92
## 67693           1-Regular school     174   99     75              9
## 67703           1-Regular school     n/a  n/a    n/a           <NA>
## 67709           1-Regular school       0    0      0           <NA>
## 67715           1-Regular school     185   90     95           5.05
## 67733 4-Alternative/other school       6    6      0           <NA>
## 67743 4-Alternative/other school      13    8      5           <NA>
## 67756           1-Regular school      26   18      8           <NA>
## 67773 4-Alternative/other school      36   30      6           <NA>
## 67774           1-Regular school     394  180    214           <NA>
## 67802           1-Regular school     384  180    204          23.58
## 67803           1-Regular school      50   19     31           22.4
## 67806           1-Regular school     396  173    223           22.7
## 67812 4-Alternative/other school       1    1      0           <NA>
## 67818           1-Regular school      66   33     33           <NA>
## 67822           1-Regular school     885  498    387           <NA>
## 67831 4-Alternative/other school      18   13      5           <NA>
## 67861           1-Regular school     678  362    316             26
## 68022           1-Regular school     119   63     56           <NA>
## 68038           1-Regular school      73   41     32           <NA>
## 68039           1-Regular school      72   44     28           <NA>
## 68053           1-Regular school      98   40     58           9.66
## 68057           1-Regular school      95   46     49           9.74
## 68079 4-Alternative/other school       3    1      2           <NA>
## 68080 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 68113           1-Regular school    1394  720    674           <NA>
## 68115           1-Regular school    1114  578    536           <NA>
## 68118        3-Vocational school       0    0      0           <NA>
## 68119        3-Vocational school       0    0      0           <NA>
## 68120        3-Vocational school       0    0      0           <NA>
## 68121        3-Vocational school       0    0      0           <NA>
## 68122        3-Vocational school       0    0      0           <NA>
## 68123        3-Vocational school       0    0      0           <NA>
## 68124        3-Vocational school       0    0      0           <NA>
## 68125        3-Vocational school       0    0      0           <NA>
## 68126        3-Vocational school       0    0      0           <NA>
## 68127        3-Vocational school       0    0      0           <NA>
## 68128        3-Vocational school       0    0      0           <NA>
## 68130        3-Vocational school       0    0      0           <NA>
## 68131        3-Vocational school       0    0      0           <NA>
## 68132        3-Vocational school       0    0      0           <NA>
## 68133        3-Vocational school       0    0      0           <NA>
## 68134        3-Vocational school       0    0      0           <NA>
## 68135        3-Vocational school       0    0      0           <NA>
## 68136        3-Vocational school       0    0      0           <NA>
## 68137        3-Vocational school       0    0      0           <NA>
## 68138        3-Vocational school       0    0      0           <NA>
## 68139        3-Vocational school       0    0      0           <NA>
## 68140        3-Vocational school       0    0      0           <NA>
## 68141        3-Vocational school       0    0      0           <NA>
## 68142        3-Vocational school       0    0      0           <NA>
## 68143        3-Vocational school       0    0      0           <NA>
## 68144        3-Vocational school       0    0      0           <NA>
## 68145        3-Vocational school       0    0      0           <NA>
## 68146        3-Vocational school       0    0      0           <NA>
## 68147        3-Vocational school       0    0      0           <NA>
## 68148        3-Vocational school       0    0      0           <NA>
## 68149        3-Vocational school       0    0      0           <NA>
## 68150        3-Vocational school       0    0      0           <NA>
## 68151        3-Vocational school       0    0      0           <NA>
## 68152        3-Vocational school       0    0      0           <NA>
## 68153        3-Vocational school       0    0      0           <NA>
## 68154        3-Vocational school       0    0      0           <NA>
## 68155        3-Vocational school       0    0      0           <NA>
## 68156        3-Vocational school       0    0      0           <NA>
## 68157        3-Vocational school       0    0      0           <NA>
## 68158        3-Vocational school       0    0      0           <NA>
## 68209           1-Regular school      77   32     45              4
## 68303           1-Regular school     277  136    141           18.9
## 68304           1-Regular school     335  186    149           24.7
## 68307           1-Regular school     256  125    131           20.9
## 68338 2-Special education school       2    0      2           <NA>
## 68449           1-Regular school       0    0      0           <NA>
## 68464           1-Regular school     107   68     39             10
## 68468 4-Alternative/other school    <NA>  n/a    n/a            5.7
## 68474 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 68501           1-Regular school     n/a  n/a    n/a           <NA>
## 68568           1-Regular school      92   47     45           <NA>
## 68579           1-Regular school     470  269    201           <NA>
## 68580           1-Regular school       7    6      1           <NA>
## 68597 2-Special education school      76   56     20           <NA>
## 68598 4-Alternative/other school       4    2      2           <NA>
## 68698 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 68774 4-Alternative/other school       0  n/a    n/a           <NA>
## 68782           1-Regular school     588  289    299           30.6
## 68801           1-Regular school     462  231    231           <NA>
## 68802           1-Regular school     333  180    153           <NA>
## 68803           1-Regular school     386  203    183           <NA>
## 68804           1-Regular school     436  209    227           <NA>
## 68811           1-Regular school     544  291    253           <NA>
## 68839        3-Vocational school    <NA>  n/a    n/a           0.58
## 68870 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 68940           1-Regular school       0    0      0           <NA>
## 69031           1-Regular school     602  332    270           <NA>
## 69060           1-Regular school     313  143    170           <NA>
## 69064 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 69066           1-Regular school     295  127    168             12
## 69068 2-Special education school      22   10     12           <NA>
## 69070           1-Regular school     170   73     97           <NA>
## 69071           1-Regular school     163   99     64           <NA>
## 69072           1-Regular school     197   90    107           <NA>
## 69073           1-Regular school     144   84     60           <NA>
## 69096 4-Alternative/other school      12    6      6           <NA>
## 69099 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 69100 4-Alternative/other school       6    4      2           <NA>
## 69117 4-Alternative/other school       0    0      0           <NA>
## 69153           1-Regular school     224  115    109           <NA>
## 69157           1-Regular school     584  302    282           <NA>
## 69161 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 69170           1-Regular school     n/a  n/a    n/a           <NA>
## 69184           1-Regular school     n/a  n/a    n/a           <NA>
## 69186 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 69232 4-Alternative/other school       1    1      0           <NA>
## 69244 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 69289           1-Regular school      11    5      6           <NA>
## 69290           1-Regular school      29    8     21           <NA>
## 69314        3-Vocational school       0    0      0           <NA>
## 69324        3-Vocational school       0    0      0           <NA>
## 69330           1-Regular school      77   50     27           <NA>
## 69331           1-Regular school     141   68     73           <NA>
## 69332           1-Regular school     106   52     54           <NA>
## 69333 4-Alternative/other school     346  164    182           <NA>
## 69334           1-Regular school      97   57     40           <NA>
## 69394           1-Regular school     302  137    165           <NA>
## 69420 4-Alternative/other school      19   19      0           5.25
## 69518           1-Regular school    1194  597    597           <NA>
## 69519           1-Regular school     904  463    441           <NA>
## 69533           1-Regular school     516  243    273           <NA>
## 69551           1-Regular school     586  292    294           <NA>
## 69552           1-Regular school     319  153    166           <NA>
## 69576 4-Alternative/other school      23   21      2           <NA>
## 69581 4-Alternative/other school       9    8      1           <NA>
## 69583 4-Alternative/other school      94   81     13           <NA>
## 69594           1-Regular school     183   71    112           <NA>
## 69595           1-Regular school       0    0      0           <NA>
## 69596           1-Regular school       0    0      0           <NA>
## 69688           1-Regular school     476  254    222           <NA>
## 69689           1-Regular school      40   24     16           <NA>
## 69690           1-Regular school     144   78     66           <NA>
## 69695           1-Regular school      67   31     36           <NA>
## 69696           1-Regular school     113   57     56           <NA>
## 69698           1-Regular school      22   13      9           <NA>
## 69699           1-Regular school     460  198    262           <NA>
## 69701           1-Regular school     126   60     66           <NA>
## 69766           1-Regular school     n/a  n/a    n/a           <NA>
## 69774           1-Regular school     115   35     80           <NA>
## 69792           1-Regular school     278  144    134          19.69
## 69794           1-Regular school     587  270    317           <NA>
## 69802           1-Regular school     628  322    306           <NA>
## 69803           1-Regular school     488  256    232           <NA>
## 69957        3-Vocational school     n/a  n/a    n/a           <NA>
## 69958           1-Regular school     155   84     71           <NA>
## 69963           1-Regular school     236  134    102          37.16
## 69964           1-Regular school     124   63     61          35.55
## 69965           1-Regular school     381  198    183          36.69
## 69970           1-Regular school     166   87     79           <NA>
## 69971           1-Regular school       0    0      0           <NA>
## 69973 4-Alternative/other school       6    6      0           <NA>
## 69986           1-Regular school     792  387    405           <NA>
## 70053 2-Special education school    <NA>  n/a    n/a           <NA>
## 70059 4-Alternative/other school       4    3      1           <NA>
## 70115 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 70143           1-Regular school     122   58     64           <NA>
## 70148 4-Alternative/other school      88   65     23           <NA>
## 70157           1-Regular school     692  372    320           <NA>
## 70173           1-Regular school    2120 1117   1003           <NA>
## 70177           1-Regular school    1426  741    685           <NA>
## 70240           1-Regular school     n/a  n/a    n/a           <NA>
## 70286           1-Regular school     n/a  n/a    n/a           <NA>
## 70351 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 70365 4-Alternative/other school       3    3      0              1
## 70366 4-Alternative/other school       8    6      2           2.82
## 70367        3-Vocational school       0    0      0           <NA>
## 70397           1-Regular school     765  388    377           <NA>
## 70469 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 70504           1-Regular school       0    0      0           <NA>
## 70505 4-Alternative/other school     133   77     56           <NA>
## 70524           1-Regular school      92   33     59           <NA>
## 70528           1-Regular school     122   49     73           <NA>
## 70529           1-Regular school     308  177    131           <NA>
## 70535           1-Regular school       0    0      0           <NA>
## 70536           1-Regular school      75   31     44           <NA>
## 70586 4-Alternative/other school      23   23      0           <NA>
## 70658           1-Regular school     959  479    480           <NA>
## 70674           1-Regular school      57   30     27              4
## 70755           1-Regular school     200   91    109           <NA>
## 70769 2-Special education school      18   13      5           <NA>
## 70808        3-Vocational school       0    0      0           <NA>
## 70809 2-Special education school     134   90     44           <NA>
## 70851 4-Alternative/other school      11   10      1              2
## 70883 2-Special education school      62   31     31           <NA>
## 70889 4-Alternative/other school      37   23     14           <NA>
## 70895 2-Special education school       3    2      1           <NA>
## 71038        3-Vocational school     n/a  n/a    n/a           <NA>
## 71047           1-Regular school     100   53     47           <NA>
## 71048           1-Regular school     149   76     73           <NA>
## 71049           1-Regular school     125   61     64           <NA>
## 71050           1-Regular school      75   43     32           <NA>
## 71051           1-Regular school      89   48     41           <NA>
## 71053           1-Regular school     142   77     65           <NA>
## 71064 4-Alternative/other school      10    6      4           <NA>
## 71161           1-Regular school    1436  730    706          89.57
## 71180           1-Regular school       0    0      0           <NA>
## 71182           1-Regular school     192  102     90             12
## 71226 4-Alternative/other school      20    8     12           <NA>
## 71238           1-Regular school     431  223    208          28.04
## 71260           1-Regular school       0    0      0           <NA>
## 71263 2-Special education school     n/a  n/a    n/a           <NA>
## 71264           1-Regular school      68   41     27           <NA>
## 71267           1-Regular school      94   46     48           <NA>
## 71271 2-Special education school       9    4      5           <NA>
## 71272 2-Special education school      13    9      4           <NA>
## 71273 2-Special education school     318  195    123           <NA>
## 71278           1-Regular school       8    5      3           <NA>
## 71279           1-Regular school      16   12      4           <NA>
## 71280           1-Regular school      34   20     14           <NA>
## 71281           1-Regular school       2    1      1           <NA>
## 71285           1-Regular school     234  116    118           <NA>
## 71337           1-Regular school     n/a  n/a    n/a           <NA>
## 71338           1-Regular school     n/a  n/a    n/a           <NA>
## 71339 2-Special education school    1073  674    399           <NA>
## 71344           1-Regular school     n/a  n/a    n/a           <NA>
## 71345           1-Regular school     n/a  n/a    n/a           <NA>
## 71368           1-Regular school     254  122    132           <NA>
## 71380           1-Regular school     n/a  n/a    n/a           <NA>
## 71384           1-Regular school     388  180    208           <NA>
## 71389 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 71390 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 71468           1-Regular school     363  175    188             22
## 71473           1-Regular school    4220 1821   2399           <NA>
## 71482        3-Vocational school     n/a  n/a    n/a           <NA>
## 71491 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 71499 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 71500 4-Alternative/other school       6    5      1           <NA>
## 71507 4-Alternative/other school       9    7      2           <NA>
## 71527           1-Regular school      80   39     41           <NA>
## 71577 2-Special education school       7    4      3           <NA>
## 71586 4-Alternative/other school    <NA>  n/a    n/a              1
## 71588 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 71595 4-Alternative/other school      25   19      6           <NA>
## 71598 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 71599 4-Alternative/other school      11    9      2           <NA>
## 71600 4-Alternative/other school       1    1      0           <NA>
## 71602 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 71603 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 71608 2-Special education school      12    7      5           <NA>
## 71609 2-Special education school      10    4      6           <NA>
## 71611 4-Alternative/other school       7    4      3           <NA>
## 71613 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 71614 4-Alternative/other school      25    2     23           <NA>
## 71615 4-Alternative/other school      30    4     26           <NA>
## 71616 4-Alternative/other school       6  n/a      6           <NA>
## 71617 4-Alternative/other school      34  n/a     34           <NA>
## 71618 4-Alternative/other school      27  n/a     27           <NA>
## 71619 4-Alternative/other school       3  n/a      3           <NA>
## 71627           1-Regular school     460  231    229           <NA>
## 71669 4-Alternative/other school       0    0      0           <NA>
## 71696           1-Regular school    2107 1123    984           <NA>
## 71700           1-Regular school     667  325    342           <NA>
## 71715 4-Alternative/other school       0    0      0           <NA>
## 71716           1-Regular school    2051 1016   1035           <NA>
## 71717           1-Regular school    1864  960    904           <NA>
## 71718           1-Regular school     582  327    255           <NA>
## 71719           1-Regular school     445  232    213           <NA>
## 72527        3-Vocational school     n/a  n/a    n/a           <NA>
## 72555 2-Special education school     n/a  n/a    n/a           <NA>
## 72606        3-Vocational school    <NA>  n/a    n/a           23.5
## 72618 2-Special education school       0    0      0           <NA>
## 72637           1-Regular school      30   17     13           <NA>
## 72638           1-Regular school       0    0      0           <NA>
## 72639           1-Regular school      10    4      6           <NA>
## 72651           1-Regular school       0    0      0           <NA>
## 72671           1-Regular school     523  269    254           <NA>
## 72684           1-Regular school     373  179    194           <NA>
## 72695 2-Special education school     n/a  n/a    n/a           <NA>
## 72756           1-Regular school     980  522    458           <NA>
## 72762 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 72814 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 72922           1-Regular school     394  205    189             23
## 72923           1-Regular school     245  133    112          23.75
## 72959 4-Alternative/other school      17   17      0           <NA>
## 72980 4-Alternative/other school       4    3      1           <NA>
## 72981 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 72983 4-Alternative/other school       9    5      4           <NA>
## 72986           1-Regular school      44   27     17           <NA>
## 72991           1-Regular school     n/a  n/a    n/a           <NA>
## 73021           1-Regular school     n/a  n/a    n/a           <NA>
## 73095        3-Vocational school    <NA>  n/a    n/a             13
## 73146           1-Regular school     n/a  n/a    n/a           <NA>
## 73180           1-Regular school     607  326    281             22
## 73185           1-Regular school     364  187    177           <NA>
## 73220           1-Regular school     n/a  n/a    n/a           <NA>
## 73300        3-Vocational school    <NA>  n/a    n/a             16
## 73303        3-Vocational school    <NA>  n/a    n/a           <NA>
## 73304        3-Vocational school    <NA>  n/a    n/a              8
## 73355 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73356 2-Special education school     n/a  n/a    n/a           <NA>
## 73395           1-Regular school     n/a  n/a    n/a           <NA>
## 73437           1-Regular school     209  119     90           8.01
## 73473           1-Regular school     412  212    200          28.53
## 73489           1-Regular school    1288  659    629             60
## 73527           1-Regular school       6    3      3           <NA>
## 73528           1-Regular school     151   86     65           <NA>
## 73537           1-Regular school     122   67     55            7.5
## 73551           1-Regular school       0    0      0           <NA>
## 73554 2-Special education school      25   18      7           <NA>
## 73573           1-Regular school     537  282    255           <NA>
## 73582           1-Regular school     676  321    355           <NA>
## 73601           1-Regular school      12    6      6            0.5
## 73603           1-Regular school     163  121     42           <NA>
## 73604 2-Special education school     n/a  n/a    n/a           <NA>
## 73643 4-Alternative/other school       0    0      0           <NA>
## 73656           1-Regular school     638  370    268           <NA>
## 73676           1-Regular school     519  282    237           <NA>
## 73688 2-Special education school      14    9      5           <NA>
## 73712           1-Regular school     502  270    232           <NA>
## 73781           1-Regular school     587  251    336          22.52
## 73782           1-Regular school     228  155     73           10.6
## 73790 4-Alternative/other school       0    0      0           <NA>
## 73792 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73816 4-Alternative/other school       1    1      0           <NA>
## 73846           1-Regular school     696  372    324           <NA>
## 73862           1-Regular school     371  173    198           <NA>
## 73901 4-Alternative/other school       0    0      0           <NA>
## 73908           1-Regular school     573  292    281           <NA>
## 73927 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73928 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73931 4-Alternative/other school      12    6      6           <NA>
## 73933 4-Alternative/other school       4    2      2           <NA>
## 73954 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73955 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73956 4-Alternative/other school     135   81     54           <NA>
## 73957 4-Alternative/other school      27   20      7           <NA>
## 73958 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73959 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73965 2-Special education school       1    1      0           <NA>
## 73968 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73971 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 73988           1-Regular school     597  275    322           <NA>
## 73989           1-Regular school     767  394    373           <NA>
## 74028           1-Regular school     755  385    370           <NA>
## 74032 4-Alternative/other school     431  277    154           <NA>
## 74068 4-Alternative/other school       0    0      0           <NA>
## 74094 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 74122           1-Regular school     n/a  n/a    n/a           <NA>
## 74159 2-Special education school       8    8      0           <NA>
## 74161 4-Alternative/other school     182   92     90           <NA>
## 74198           1-Regular school     566  268    298           <NA>
## 74199 2-Special education school     n/a  n/a    n/a           <NA>
## 74294           1-Regular school     138   62     76           <NA>
## 74298           1-Regular school     126   63     63           <NA>
## 74300 2-Special education school       6    3      3           <NA>
## 74369 4-Alternative/other school     312  153    159           <NA>
## 74414           1-Regular school    1214  625    589           <NA>
## 74432 4-Alternative/other school      56   38     18           <NA>
## 74444           1-Regular school     709  338    371           <NA>
## 74447 2-Special education school     140   81     59           <NA>
## 74462           1-Regular school     582  202    380           <NA>
## 74476           1-Regular school     767  387    380           <NA>
## 74511 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 74515           1-Regular school     218  100    118           <NA>
## 74516           1-Regular school     417  220    197           <NA>
## 74522 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 74529           1-Regular school     212  101    111              9
## 74531           1-Regular school     431  219    212          29.35
## 74538           1-Regular school     418  209    209          33.45
## 74552 2-Special education school       0    0      0           <NA>
## 74554 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 74558 4-Alternative/other school      52   35     17           <NA>
## 74562        3-Vocational school     n/a  n/a    n/a           <NA>
## 74563           1-Regular school     663  346    317             47
## 74634 4-Alternative/other school      43   16     27           <NA>
## 74659           1-Regular school     621  335    286           <NA>
## 74676           1-Regular school     555  261    294           <NA>
## 74677           1-Regular school    1494  744    750           <NA>
## 74680           1-Regular school    1054  545    509           <NA>
## 74681           1-Regular school     328  174    154           22.5
## 74751           1-Regular school     n/a  n/a    n/a           <NA>
## 74784           1-Regular school     291  135    156          24.72
## 74800           1-Regular school     319  159    160           <NA>
## 74805 2-Special education school      76   50     26           <NA>
## 74809           1-Regular school       0    0      0           <NA>
## 74912           1-Regular school     183   74    109           <NA>
## 74940 2-Special education school       0    0      0           <NA>
## 74993           1-Regular school     108   57     51            4.5
## 75052           1-Regular school     572  327    245           <NA>
## 75053           1-Regular school     542  300    242           <NA>
## 75078           1-Regular school     525  264    261           <NA>
## 75084           1-Regular school     166   93     73              8
## 75087           1-Regular school     263  139    124             13
## 75109           1-Regular school     n/a  n/a    n/a           <NA>
## 75122           1-Regular school     917  476    441           <NA>
## 75141           1-Regular school     314  159    155          14.94
## 75194           1-Regular school     340  174    166           <NA>
## 75213           1-Regular school     572  310    262             34
## 75237           1-Regular school     267  151    116             14
## 75241           1-Regular school     521  275    246           <NA>
## 75244           1-Regular school     329  187    142             25
## 75268 2-Special education school      15   11      4           <NA>
## 75272 4-Alternative/other school       6    3      3           <NA>
## 75283 4-Alternative/other school      82   82      0             13
## 75295        3-Vocational school       0    0      0           <NA>
## 75400 2-Special education school     103   63     40           <NA>
## 75407           1-Regular school     767  382    385           <NA>
## 75408           1-Regular school     593  321    272           <NA>
## 75421 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 75422 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 75429           1-Regular school    2207 1088   1119           <NA>
## 75439           1-Regular school     762  381    381           <NA>
## 75483           1-Regular school     651  324    327           <NA>
## 75499           1-Regular school     908  494    414           <NA>
## 75500           1-Regular school     916  474    442           <NA>
## 75530           1-Regular school       2    1      1           <NA>
## 75536 4-Alternative/other school      21   21      0           <NA>
## 75545        3-Vocational school    <NA>  n/a    n/a             17
## 75554           1-Regular school     n/a  n/a    n/a           <NA>
## 75555 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 75563           1-Regular school     n/a  n/a    n/a           <NA>
## 75581 2-Special education school       2    1      1           <NA>
## 75637           1-Regular school     776  390    386           47.5
## 75694           1-Regular school     438  230    208           <NA>
## 75725 4-Alternative/other school       0    0      0           <NA>
## 75745 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 75922           1-Regular school     n/a  n/a    n/a           <NA>
## 75976           1-Regular school     591  302    289           <NA>
## 76028 4-Alternative/other school      12    9      3           <NA>
## 76076 2-Special education school       8    8      0           <NA>
## 76137           1-Regular school     370  181    189           14.7
## 76138           1-Regular school     181  107     74           7.76
## 76139           1-Regular school    1252  634    618          52.99
## 76174           1-Regular school     444  233    211           <NA>
## 76226           1-Regular school    1066  533    533           <NA>
## 76227           1-Regular school     721  391    330           <NA>
## 76235           1-Regular school     672  348    324           <NA>
## 76239           1-Regular school     178   90     88              9
## 76257 4-Alternative/other school      21   17      4           <NA>
## 76286 4-Alternative/other school    <NA>  n/a    n/a            1.1
## 76287 4-Alternative/other school    <NA>  n/a    n/a           0.77
## 76288 4-Alternative/other school      31   20     11           <NA>
## 76291 4-Alternative/other school       7    5      2           <NA>
## 76405        3-Vocational school       0    0      0           <NA>
## 76435           1-Regular school     703  355    348           <NA>
## 76488 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 76530           1-Regular school     130   78     52          17.17
## 76670           1-Regular school     805  369    436           <NA>
## 76683           1-Regular school     n/a  n/a    n/a           <NA>
## 76703           1-Regular school     472  239    233           <NA>
## 76704           1-Regular school     485  260    225           <NA>
## 76721           1-Regular school     182  106     76           <NA>
## 76728        3-Vocational school       0  n/a    n/a           <NA>
## 76771           1-Regular school     638  321    317           <NA>
## 76793           1-Regular school     821  426    395           <NA>
## 76795           1-Regular school     297  143    154          20.18
## 76820           1-Regular school     410  205    205           <NA>
## 76824           1-Regular school     396  197    199           <NA>
## 76849           1-Regular school     468  233    235           <NA>
## 76996           1-Regular school     127   64     63              6
## 77018 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 77091        3-Vocational school     n/a  n/a    n/a           <NA>
## 77094           1-Regular school    1012  499    513           <NA>
## 77111 4-Alternative/other school       0    0      0           <NA>
## 77151           1-Regular school    1755  934    821           <NA>
## 77156           1-Regular school     921  444    477           <NA>
## 77167           1-Regular school     522  265    257           <NA>
## 77194           1-Regular school     n/a  n/a    n/a           <NA>
## 77218 4-Alternative/other school       3    2      1           <NA>
## 77242           1-Regular school     152   77     75           <NA>
## 77264 4-Alternative/other school    <NA>  n/a    n/a              1
## 77417        3-Vocational school     n/a  n/a    n/a           <NA>
## 77448        3-Vocational school    <NA>  n/a    n/a           <NA>
## 77612 4-Alternative/other school      20   17      3              1
## 77625           1-Regular school       0    0      0           <NA>
## 77651           1-Regular school     700  n/a    n/a           <NA>
## 77656           1-Regular school      17    7     10           <NA>
## 77683        3-Vocational school       0    0      0           <NA>
## 77686           1-Regular school     229  116    113             14
## 77696           1-Regular school     577  327    250           37.6
## 77698           1-Regular school       0    0      0           <NA>
## 77731           1-Regular school     120   57     63           <NA>
## 77733           1-Regular school     728  350    378             32
## 77738           1-Regular school     750  362    388           <NA>
## 77745           1-Regular school    1004  543    461           <NA>
## 77831 4-Alternative/other school      16   10      6           <NA>
## 77833           1-Regular school     335  181    154           <NA>
## 77892           1-Regular school    1301  653    648           <NA>
## 77894           1-Regular school    1076  572    504           <NA>
## 77903           1-Regular school     537  279    258           <NA>
## 77928           1-Regular school     437  222    215           <NA>
## 77972           1-Regular school     318  152    166           <NA>
## 78005           1-Regular school     392  181    211           <NA>
## 78006           1-Regular school     409  216    193           <NA>
## 78008           1-Regular school     325  158    167           <NA>
## 78009           1-Regular school     263   91    172           <NA>
## 78010           1-Regular school      66   31     35           <NA>
## 78011           1-Regular school     225  116    109           <NA>
## 78066 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 78095           1-Regular school     226  111    115           <NA>
## 78160        3-Vocational school       0    0      0           <NA>
## 78168           1-Regular school       1    1    n/a           <NA>
## 78176        3-Vocational school       0    0      0           <NA>
## 78179           1-Regular school     380  173    207           14.7
## 78183 2-Special education school     n/a  n/a    n/a           <NA>
## 78193        3-Vocational school       0    0      0           <NA>
## 78198           1-Regular school     134   67     67           4.44
## 78202           1-Regular school     458  216    242           24.4
## 78203           1-Regular school    2021 1021   1000          77.77
## 78217        3-Vocational school       0    0      0           <NA>
## 78228           1-Regular school     n/a  n/a    n/a           <NA>
## 78243 4-Alternative/other school     146   74     72              5
## 78245        3-Vocational school       0    0      0           <NA>
## 78255           1-Regular school     121   67     54           <NA>
## 78263           1-Regular school     181   93     88           <NA>
## 78265 4-Alternative/other school       0    0      0           <NA>
## 78272           1-Regular school     420  213    207           <NA>
## 78279           1-Regular school     n/a  n/a    n/a           <NA>
## 78296           1-Regular school     785  390    395           <NA>
## 78306        3-Vocational school       0    0      0           <NA>
## 78311           1-Regular school     n/a  n/a    n/a           <NA>
## 78312           1-Regular school     n/a  n/a    n/a           <NA>
## 78313           1-Regular school     n/a  n/a    n/a           <NA>
## 78332           1-Regular school      16    6     10              1
## 78340           1-Regular school     255  132    123           <NA>
## 78346           1-Regular school     n/a  n/a    n/a           <NA>
## 78348           1-Regular school     793  390    403           <NA>
## 78351           1-Regular school     637  350    287           39.2
## 78399           1-Regular school     883  447    436           <NA>
## 78400 4-Alternative/other school       0    0      0           <NA>
## 78405           1-Regular school    1046  552    494           <NA>
## 78408           1-Regular school     275  141    134          16.35
## 78436 4-Alternative/other school       3    3      0           <NA>
## 78482           1-Regular school     577  311    266           <NA>
## 78492           1-Regular school     689  347    342             43
## 78494           1-Regular school     456  255    201             32
## 78522           1-Regular school     597  279    318           <NA>
## 78570 4-Alternative/other school      54   33     21           <NA>
## 78584 4-Alternative/other school      24   13     11              3
## 78585 4-Alternative/other school     100   82     18              6
## 78586        3-Vocational school       0  n/a    n/a           <NA>
## 78587        3-Vocational school       0    0      0           <NA>
## 78588 2-Special education school     140   86     54           23.6
## 78591           1-Regular school     n/a  n/a    n/a           <NA>
## 78595        3-Vocational school       0    0      0           <NA>
## 78597           1-Regular school      58   22     36            2.5
## 78601           1-Regular school     493  263    230           <NA>
## 78603           1-Regular school     910  484    426          37.59
## 78606           1-Regular school      48   35     13              3
## 78609        3-Vocational school       0    0      0           <NA>
## 78652 4-Alternative/other school       1    1      0           <NA>
## 78663           1-Regular school     n/a  n/a    n/a           <NA>
## 78670           1-Regular school     n/a  n/a    n/a           <NA>
## 78671           1-Regular school    1558  771    787          70.92
## 78685           1-Regular school      35   15     20           <NA>
## 78686           1-Regular school       0    0      0           <NA>
## 78689           1-Regular school      57   17     40           <NA>
## 78690           1-Regular school       0    0      0           <NA>
## 78699           1-Regular school     196  102     94             10
## 78702           1-Regular school     n/a  n/a    n/a           <NA>
## 78708           1-Regular school     857  461    396           <NA>
## 78744           1-Regular school       0    0      0           <NA>
## 78787           1-Regular school       0    0      0           <NA>
## 78788           1-Regular school      36   13     23           <NA>
## 78797           1-Regular school     876  446    430           <NA>
## 78841           1-Regular school     784  392    392           55.2
## 78842           1-Regular school     151   77     74           <NA>
## 78908 4-Alternative/other school      12   11      1           <NA>
## 78926 4-Alternative/other school       1    1      0              1
## 78955           1-Regular school     235   90    145           <NA>
## 78956           1-Regular school     273  136    137           <NA>
## 78963           1-Regular school     180  104     76           17.9
## 79001           1-Regular school     466  226    240           <NA>
## 79055           1-Regular school     537  285    252           <NA>
## 79162           1-Regular school       9    6      3           <NA>
## 79249           1-Regular school     175   91     84           <NA>
## 79257           1-Regular school      41   20     21              4
## 79413        3-Vocational school     n/a  n/a    n/a           <NA>
## 79443           1-Regular school    1105  559    546           <NA>
## 79478           1-Regular school     168   72     96           <NA>
## 79484 4-Alternative/other school      21   18      3           <NA>
## 79485           1-Regular school      64   36     28           <NA>
## 79544           1-Regular school     461  212    249           <NA>
## 79545           1-Regular school     299  134    165           <NA>
## 79573 2-Special education school    <NA>  n/a    n/a           <NA>
## 79582           1-Regular school     168   79     89           <NA>
## 79583           1-Regular school     268  124    144           <NA>
## 79610           1-Regular school     292  123    169          11.62
## 79634           1-Regular school     n/a  n/a    n/a           <NA>
## 79638 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 79644 4-Alternative/other school      37   21     16           <NA>
## 79645 4-Alternative/other school      31   21     10           <NA>
## 79646 4-Alternative/other school      35   21     14           <NA>
## 79647 4-Alternative/other school      16   11      5           <NA>
## 79672           1-Regular school     151   65     86           <NA>
## 79673           1-Regular school       0    0      0           <NA>
## 79681           1-Regular school     294  154    140           <NA>
## 79689           1-Regular school     802  408    394           <NA>
## 79698           1-Regular school      17    9      8              1
## 79700 4-Alternative/other school       9    0      9           <NA>
## 79722 4-Alternative/other school       0    0      0           <NA>
## 79723           1-Regular school     316  154    162           <NA>
## 79724           1-Regular school     461  224    237           <NA>
## 79770 4-Alternative/other school      37   27     10           <NA>
## 79789           1-Regular school     n/a  n/a    n/a           <NA>
## 79795           1-Regular school       0    0      0           <NA>
## 79817           1-Regular school     145   79     66             11
## 79825           1-Regular school      92   48     44              9
## 79834           1-Regular school      65   32     33              4
## 79850 2-Special education school       4    3      1           <NA>
## 79864           1-Regular school     581  281    300           <NA>
## 79875           1-Regular school     541  280    261           <NA>
## 79887           1-Regular school    1034  533    501           <NA>
## 79889           1-Regular school     306  142    164           <NA>
## 79891           1-Regular school      87   41     46           <NA>
## 79892           1-Regular school     273  138    135           <NA>
## 79894 4-Alternative/other school      23   23    n/a           <NA>
## 79942           1-Regular school     224  145     79           <NA>
## 79945 2-Special education school    <NA>  n/a    n/a           <NA>
## 79946           1-Regular school     n/a  n/a    n/a           <NA>
## 79959           1-Regular school     548  288    260           <NA>
## 79974           1-Regular school     121   53     68           <NA>
## 80014           1-Regular school     n/a  n/a    n/a           <NA>
## 80015        3-Vocational school       0    0      0           <NA>
## 80073           1-Regular school     430  217    213           35.4
## 80104           1-Regular school     615  307    308           <NA>
## 80225           1-Regular school      50   29     21           <NA>
## 80241           1-Regular school     467  248    219           <NA>
## 80273           1-Regular school     241  110    131           12.9
## 80286        3-Vocational school       0    0      0           <NA>
## 80443           1-Regular school     952  464    488           <NA>
## 80474           1-Regular school      47   25     22            2.5
## 80477           1-Regular school     n/a  n/a    n/a           <NA>
## 80479 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 80480 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 80569 4-Alternative/other school       5    5      0           <NA>
## 80570 4-Alternative/other school       0    0      0           <NA>
## 80603           1-Regular school     217  115    102            9.6
## 80604           1-Regular school      57   22     35           4.01
## 80605           1-Regular school      74   48     26            2.5
## 80615           1-Regular school      61   36     25           <NA>
## 80653           1-Regular school     161   92     69            6.6
## 80752           1-Regular school      73   34     39           <NA>
## 80789 4-Alternative/other school       0    0      0           <NA>
## 80834           1-Regular school     136   52     84           <NA>
## 80835 4-Alternative/other school     127   71     56           <NA>
## 80885           1-Regular school     194  116     78          12.49
## 80889           1-Regular school     856  434    422           <NA>
## 80891 2-Special education school       0    0      0           <NA>
## 80892           1-Regular school     n/a  n/a    n/a           <NA>
## 80893           1-Regular school     n/a  n/a    n/a           <NA>
## 80900           1-Regular school     212  108    104           8.41
## 80920 4-Alternative/other school       5    4      1           <NA>
## 80928           1-Regular school     156   84     72            9.1
## 80929           1-Regular school     358  185    173           <NA>
## 80944           1-Regular school     n/a  n/a    n/a           <NA>
## 80969           1-Regular school      12    8      4              0
## 80990           1-Regular school     507  243    264           <NA>
## 80991           1-Regular school    <NA>  n/a    n/a            2.6
## 81005        3-Vocational school       0    0      0           <NA>
## 81039           1-Regular school     940  465    475           <NA>
## 81041           1-Regular school       6    3      3              2
## 81048           1-Regular school     526  296    230           <NA>
## 81067           1-Regular school     634  323    311           <NA>
## 81093           1-Regular school      63   37     26           <NA>
## 81094           1-Regular school      33   20     13           <NA>
## 81149           1-Regular school       0    0      0           <NA>
## 81217        3-Vocational school       0    0      0           <NA>
## 81306           1-Regular school      75   39     36           <NA>
## 81307           1-Regular school    1757  870    887          72.38
## 81314           1-Regular school    1320  645    675           <NA>
## 81328           1-Regular school     155   76     79           <NA>
## 81346           1-Regular school    2018  997   1021           <NA>
## 81359           1-Regular school     147   75     72           <NA>
## 81364           1-Regular school    2604 1320   1284           <NA>
## 81376           1-Regular school     162  109     53           <NA>
## 81384           1-Regular school     219   90    129           <NA>
## 81401 4-Alternative/other school       8    8      0           <NA>
## 81411           1-Regular school     n/a  n/a    n/a           <NA>
## 81434           1-Regular school     375  189    186             18
## 81621        3-Vocational school     n/a  n/a    n/a           <NA>
## 81653           1-Regular school    1132  624    508           <NA>
## 81654           1-Regular school     888  464    424           <NA>
## 81665           1-Regular school     683  363    320           <NA>
## 81669           1-Regular school     873  453    420           <NA>
## 81670           1-Regular school     308  158    150           <NA>
## 81681           1-Regular school      19   11      8           <NA>
## 81702 2-Special education school       2    1      1           <NA>
## 81709 2-Special education school     237  161     76           <NA>
## 81761           1-Regular school     317  180    137           <NA>
## 81771           1-Regular school     n/a  n/a    n/a           <NA>
## 81772 2-Special education school       0  n/a    n/a           <NA>
## 81778 4-Alternative/other school       8    3      5           <NA>
## 81817           1-Regular school     275  142    133           <NA>
## 81818           1-Regular school      71   36     35           <NA>
## 81848           1-Regular school      24   12     12           <NA>
## 81854           1-Regular school      99   63     36           <NA>
## 81855           1-Regular school     146   92     54           <NA>
## 81857           1-Regular school     407  196    211           <NA>
## 81882           1-Regular school     581  297    284           <NA>
## 81894           1-Regular school       3    1      2           <NA>
## 81917 4-Alternative/other school      73   43     30              5
## 81918 4-Alternative/other school      49   41      8           4.07
## 81919        3-Vocational school       0    0      0           <NA>
## 81920 2-Special education school     403  292    111           40.5
## 81938           1-Regular school      29   15     14           <NA>
## 81941           1-Regular school     292  139    153           <NA>
## 81942           1-Regular school     159   91     68           <NA>
## 81943           1-Regular school     350  179    171           <NA>
## 81944           1-Regular school     664  350    314           <NA>
## 81945           1-Regular school     279  134    145           <NA>
## 81978           1-Regular school    1018  544    474           46.4
## 82019           1-Regular school     n/a  n/a    n/a           <NA>
## 82029        3-Vocational school    <NA>  n/a    n/a           11.5
## 82053        3-Vocational school    <NA>  n/a    n/a             12
## 82064           1-Regular school     335  204    131             36
## 82078           1-Regular school    1027  483    544           <NA>
## 82096 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 82123           1-Regular school     599  304    295           <NA>
## 82125 4-Alternative/other school       0    0      0           <NA>
## 82138 4-Alternative/other school       0    0      0           <NA>
## 82159           1-Regular school    1114  567    547           <NA>
## 82186           1-Regular school    <NA>  n/a    n/a              0
## 82297           1-Regular school     738  347    391           <NA>
## 82353           1-Regular school    1107  562    545           <NA>
## 82355           1-Regular school     207  121     86             11
## 82372           1-Regular school    <NA>  n/a    n/a              0
## 82376           1-Regular school    1322  662    660           <NA>
## 82377           1-Regular school    1045  543    502           <NA>
## 82381           1-Regular school     390  196    194           <NA>
## 82472           1-Regular school      50   26     24           <NA>
## 82487           1-Regular school     829  387    442           <NA>
## 82497 2-Special education school       6    6      0           <NA>
## 82525           1-Regular school     275  121    154           <NA>
## 82548           1-Regular school     498  269    229           <NA>
## 82549           1-Regular school     160   77     83           <NA>
## 82575 2-Special education school      19   13      6           <NA>
## 82576           1-Regular school     111   56     55           <NA>
## 82581           1-Regular school     396  184    212           <NA>
## 82606           1-Regular school      48   16     32           <NA>
## 82618           1-Regular school     441  231    210           <NA>
## 82619           1-Regular school     321  169    152           <NA>
## 82677           1-Regular school     462  266    196           <NA>
## 82678           1-Regular school     497  253    244           <NA>
## 82679 2-Special education school       0    0      0           <NA>
## 82680           1-Regular school     644  347    297           <NA>
## 82683           1-Regular school    2128 1022   1106          86.53
## 82694        3-Vocational school     n/a  n/a    n/a           <NA>
## 82717           1-Regular school     228  114    114           <NA>
## 82718 2-Special education school     129   77     52           <NA>
## 82742           1-Regular school     817  455    362           <NA>
## 82752           1-Regular school      87   41     46              8
## 82787 2-Special education school     n/a  n/a    n/a           <NA>
## 82788           1-Regular school     517  262    255           <NA>
## 82793 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 82848 2-Special education school      80   48     32           <NA>
## 82877 2-Special education school       0    0      0           <NA>
## 82880           1-Regular school     145   81     64           <NA>
## 82888        3-Vocational school       0    0      0           <NA>
## 82928 4-Alternative/other school      13    6      7           <NA>
## 82949 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 82958 4-Alternative/other school      11   11    n/a           <NA>
## 82967           1-Regular school     190  111     79           14.5
## 82975           1-Regular school     547  286    261           <NA>
## 82996           1-Regular school     749  412    337           <NA>
## 83016 4-Alternative/other school       0    0      0           <NA>
## 83040 4-Alternative/other school       6    3      3           <NA>
## 83041 4-Alternative/other school     148  148      0             24
## 83045           1-Regular school     241  124    117           <NA>
## 83058           1-Regular school     229  103    126           9.64
## 83096 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 83107           1-Regular school     234  119    115          16.68
## 83111 2-Special education school       0    0      0           <NA>
## 83142 4-Alternative/other school     137  109     28           <NA>
## 83179 4-Alternative/other school       0    0      0           <NA>
## 83189 4-Alternative/other school       1    1      0           <NA>
## 83192           1-Regular school     321  183    138           <NA>
## 83199           1-Regular school     n/a  n/a    n/a           <NA>
## 83223 2-Special education school      47   26     21           <NA>
## 83233           1-Regular school     n/a  n/a    n/a           <NA>
## 83254 2-Special education school       0    0      0           <NA>
## 83255 2-Special education school       0    0      0           <NA>
## 83288 4-Alternative/other school       6    4      2           <NA>
## 83297 2-Special education school    <NA>  n/a    n/a           <NA>
## 83305           1-Regular school    1372  694    678           <NA>
## 83306           1-Regular school    1250  646    604           <NA>
## 83313           1-Regular school     483  267    216           <NA>
## 83315           1-Regular school     n/a  n/a    n/a           <NA>
## 83322           1-Regular school     247  133    114             11
## 83337           1-Regular school      14    8      6           <NA>
## 83387 2-Special education school       0    0      0           <NA>
## 83389 2-Special education school     323  225     98           <NA>
## 83393 2-Special education school       3    3      0           <NA>
## 83395 2-Special education school       2    2      0           <NA>
## 83398 2-Special education school       5    5      0           <NA>
## 83408           1-Regular school     n/a  n/a    n/a           <NA>
## 83409           1-Regular school     n/a  n/a    n/a           <NA>
## 83410           1-Regular school     n/a  n/a    n/a           <NA>
## 83411           1-Regular school     n/a  n/a    n/a           <NA>
## 83412           1-Regular school     n/a  n/a    n/a           <NA>
## 83416           1-Regular school     n/a  n/a    n/a           <NA>
## 83417           1-Regular school     n/a  n/a    n/a           <NA>
## 83419 4-Alternative/other school       2    1      1           <NA>
## 83425 2-Special education school     163   98     65           <NA>
## 83430 4-Alternative/other school      13    9      4           <NA>
## 83436           1-Regular school     604  459    144           <NA>
## 83437           1-Regular school     550  425    125           <NA>
## 83446 2-Special education school      32   18     14           <NA>
## 83485           1-Regular school      40   25     15              4
## 83527           1-Regular school       0    0      0           <NA>
## 83549           1-Regular school     606  359    247           <NA>
## 83550           1-Regular school     148   68     80           <NA>
## 83555           1-Regular school     605  361    244           <NA>
## 83562        3-Vocational school     n/a  n/a    n/a           <NA>
## 83589           1-Regular school     146   74     72           <NA>
## 83615           1-Regular school     772  383    389           <NA>
## 83617           1-Regular school     452  246    206           <NA>
## 83621 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 83644           1-Regular school     306  156    150          25.75
## 83675 4-Alternative/other school       0    0      0           <NA>
## 83693           1-Regular school     743  360    383           <NA>
## 83694 4-Alternative/other school       0    0      0           <NA>
## 83695           1-Regular school     527  262    265           <NA>
## 83774           1-Regular school      55   27     28           <NA>
## 83775 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 83781           1-Regular school     398  182    216          24.69
## 83783 4-Alternative/other school       0    0      0           <NA>
## 83805           1-Regular school    1415  721    694           80.3
## 83816           1-Regular school     122   71     51             10
## 83835           1-Regular school    1233  609    624          82.74
## 83841 2-Special education school      92   56     36           <NA>
## 83867           1-Regular school    1056  527    529           <NA>
## 83886           1-Regular school    1455  738    717           <NA>
## 83888           1-Regular school    1125  603    522           <NA>
## 83912           1-Regular school     448  237    211           <NA>
## 83927           1-Regular school      39   22     17           3.11
## 83947           1-Regular school    <NA>  n/a    n/a           <NA>
## 83957 4-Alternative/other school      17    6     11           <NA>
## 83958 4-Alternative/other school       8    8      0           <NA>
## 83995 4-Alternative/other school      65   65      0           <NA>
## 84024 4-Alternative/other school    <NA>  n/a    n/a              2
## 84061           1-Regular school     121   59     62           <NA>
## 84094           1-Regular school     202   94    108           <NA>
## 84100           1-Regular school     325  156    169          18.88
## 84121 2-Special education school      33   21     12           <NA>
## 84122 4-Alternative/other school       6    6      0           <NA>
## 84128           1-Regular school     119   45     74           <NA>
## 84129           1-Regular school       2    0      2           <NA>
## 84130           1-Regular school      31   12     19           <NA>
## 84132 4-Alternative/other school      25   16      9           <NA>
## 84135           1-Regular school    1025  525    500           <NA>
## 84138 4-Alternative/other school      17   17      0           <NA>
## 84141           1-Regular school      27   11     16           <NA>
## 84289 4-Alternative/other school      19   19      0           <NA>
## 84314           1-Regular school    1663  865    798           <NA>
## 84315           1-Regular school     517  249    268           <NA>
## 84316           1-Regular school     993  494    499           <NA>
## 84364           1-Regular school     112   48     64           <NA>
## 84381 2-Special education school       0    0      0           <NA>
## 84414           1-Regular school     142   73     69           <NA>
## 84442           1-Regular school      93   53     40           <NA>
## 84521        3-Vocational school       0    0      0           <NA>
## 84524        3-Vocational school       0    0      0           <NA>
## 84525        3-Vocational school       0    0      0           <NA>
## 84526        3-Vocational school       0    0      0           <NA>
## 84527        3-Vocational school       0    0      0           <NA>
## 84528        3-Vocational school       0    0      0           <NA>
## 84529        3-Vocational school       0    0      0           <NA>
## 84530        3-Vocational school     n/a  n/a    n/a           <NA>
## 84535           1-Regular school     296  146    150           <NA>
## 84591        3-Vocational school     n/a  n/a    n/a           <NA>
## 84599        3-Vocational school     n/a  n/a    n/a           <NA>
## 84624           1-Regular school      85   42     43           <NA>
## 84679           1-Regular school     211  113     98           <NA>
## 84684 4-Alternative/other school       0  n/a    n/a           <NA>
## 84717           1-Regular school     749  390    359           <NA>
## 84791           1-Regular school      64   31     33            5.2
## 84822           1-Regular school     716  328    388           <NA>
## 84857 2-Special education school       2    1      1           <NA>
## 84910           1-Regular school     n/a  n/a    n/a           <NA>
## 84912           1-Regular school     423  199    224          19.25
## 84913           1-Regular school     542  247    295             24
## 84940           1-Regular school     274  150    124              9
## 85144 2-Special education school     n/a  n/a    n/a           <NA>
## 85152 4-Alternative/other school       0    0      0           <NA>
## 85280 4-Alternative/other school      29   11     18           <NA>
## 85282 4-Alternative/other school       7    4      3           <NA>
## 85283 4-Alternative/other school       6    4      2           <NA>
## 85289           1-Regular school     228  141     87           <NA>
## 85292 4-Alternative/other school       1    1      0           <NA>
## 85295           1-Regular school     131   62     69           <NA>
## 85296           1-Regular school     922  493    429           <NA>
## 85301 4-Alternative/other school       4    3      1           <NA>
## 85305 2-Special education school      29   14     15           <NA>
## 85353 4-Alternative/other school     101   63     38           <NA>
## 85356 4-Alternative/other school      11    6      5           <NA>
## 85357 4-Alternative/other school      24   17      7           <NA>
## 85362 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 85365 4-Alternative/other school      35   18     17           <NA>
## 85398 4-Alternative/other school      85   55     30           <NA>
## 85399 4-Alternative/other school      18   18      0           <NA>
## 85400 4-Alternative/other school       9    0      9           <NA>
## 85402 4-Alternative/other school      51   51      0           <NA>
## 85403 4-Alternative/other school      22   22      0           <NA>
## 85404           1-Regular school     237  123    114           <NA>
## 85412 2-Special education school       9    9      0           <NA>
## 85413           1-Regular school     212   93    119           <NA>
## 85435           1-Regular school      35   24     11           15.9
## 85534 2-Special education school       0    0      0           <NA>
## 85589           1-Regular school     547  288    259           <NA>
## 85590           1-Regular school     992  491    501           <NA>
## 85591           1-Regular school     945  472    473           <NA>
## 85606           1-Regular school     606  346    260           <NA>
## 85630 2-Special education school       0    0      0           <NA>
## 85642 4-Alternative/other school     119   78     41           <NA>
## 85660           1-Regular school    <NA>  n/a    n/a              8
## 85688           1-Regular school     681  330    351           <NA>
## 85689 2-Special education school       0    0      0           <NA>
## 85692 2-Special education school       1    1      0           <NA>
## 85697 4-Alternative/other school       3    3      0           <NA>
## 85733           1-Regular school     n/a  n/a    n/a           <NA>
## 85738           1-Regular school      11    3      8           <NA>
## 85741           1-Regular school       7    4      3           <NA>
## 85757           1-Regular school     288  134    154           <NA>
## 85768           1-Regular school     491  272    219           <NA>
## 85785           1-Regular school     n/a  n/a    n/a           <NA>
## 85790           1-Regular school     n/a  n/a    n/a           <NA>
## 85791           1-Regular school     n/a  n/a    n/a           <NA>
## 85795           1-Regular school     451  230    221           <NA>
## 85831           1-Regular school     n/a  n/a    n/a           <NA>
## 85969           1-Regular school       1    1    n/a           <NA>
## 85970 2-Special education school     208  142     66           <NA>
## 85971           1-Regular school    1095  586    509           <NA>
## 85973           1-Regular school     637  343    294           <NA>
## 85974           1-Regular school     699  342    357           <NA>
## 86024           1-Regular school     926  477    449           <NA>
## 86049           1-Regular school    1664  809    855           <NA>
## 86051           1-Regular school     403  206    197           <NA>
## 86052           1-Regular school     525  275    250           <NA>
## 86065           1-Regular school     603  309    294           <NA>
## 86067           1-Regular school     196   98     98           <NA>
## 86081 4-Alternative/other school      10    4      6           <NA>
## 86096           1-Regular school       0    0      0           <NA>
## 86101        3-Vocational school     n/a  n/a    n/a           <NA>
## 86180 2-Special education school     n/a  n/a    n/a           <NA>
## 86205           1-Regular school     438  210    228           13.1
## 86233           1-Regular school      14    7      7           <NA>
## 86234           1-Regular school       4    0      4           <NA>
## 86235           1-Regular school      93   35     58           <NA>
## 86254           1-Regular school       5    0      5           <NA>
## 86342           1-Regular school     166  110     56             13
## 86438           1-Regular school     584  289    295             25
## 86494           1-Regular school     162   74     88           <NA>
## 86498           1-Regular school    1036  491    545           <NA>
## 86499           1-Regular school     745  381    364           <NA>
## 86503           1-Regular school    2222 1161   1061           <NA>
## 86504           1-Regular school    1219  602    617           <NA>
## 86506           1-Regular school     988  488    500           <NA>
## 86511           1-Regular school     112   61     51           <NA>
## 86522           1-Regular school     344  166    178             21
## 86533 4-Alternative/other school       4    4      0           <NA>
## 86570           1-Regular school     631  331    300           <NA>
## 86584           1-Regular school      81   40     41           <NA>
## 86585           1-Regular school      77   33     44           <NA>
## 86593 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 86616           1-Regular school     429  227    202           28.2
## 86640           1-Regular school     954  486    468          65.82
## 86691        3-Vocational school    <NA>  n/a    n/a           <NA>
## 86693 4-Alternative/other school    <NA>  n/a    n/a              2
## 86781 4-Alternative/other school      18   11      7           <NA>
## 86782           1-Regular school       0    0      0           <NA>
## 86788           1-Regular school       3    1      2           <NA>
## 86827 4-Alternative/other school       2    2      0           <NA>
## 86828 4-Alternative/other school       1    1      0           <NA>
## 86829 4-Alternative/other school       1    1      0           <NA>
## 86831 4-Alternative/other school       4    3      1           <NA>
## 86832 4-Alternative/other school      11   11      0           <NA>
## 86834 4-Alternative/other school       1    1      0           <NA>
## 86835 4-Alternative/other school       1    1      0           <NA>
## 86839 4-Alternative/other school       1    1      0           <NA>
## 86892           1-Regular school     333  149    184           7.73
## 86893           1-Regular school     153   65     88           7.66
## 86898           1-Regular school     382  190    192           <NA>
## 86906 4-Alternative/other school       4    2      2           <NA>
## 86917        3-Vocational school    <NA>  n/a    n/a              7
## 86966           1-Regular school     527  268    259           <NA>
## 86967           1-Regular school     435  236    199           <NA>
## 86970           1-Regular school       0    0      0           <NA>
## 86971           1-Regular school       0    0      0           <NA>
## 86984           1-Regular school    1805  912    893           <NA>
## 86985           1-Regular school     494  243    251           <NA>
## 86991        3-Vocational school     n/a  n/a    n/a           <NA>
## 87055        3-Vocational school     n/a  n/a    n/a           <NA>
## 87058        3-Vocational school     n/a  n/a    n/a           <NA>
## 87061        3-Vocational school    <NA>  n/a    n/a             28
## 87097           1-Regular school      20   11      9           <NA>
## 87099 4-Alternative/other school       6    2      4           <NA>
## 87101           1-Regular school     137   67     70           <NA>
## 87107        3-Vocational school       0    0      0           <NA>
## 87125           1-Regular school     336  164    172           <NA>
## 87126           1-Regular school      76   38     38           <NA>
## 87127           1-Regular school      20   15      5           <NA>
## 87148           1-Regular school     120   64     56           <NA>
## 87151           1-Regular school    1053  536    517          48.35
## 87152           1-Regular school     534  269    265             21
## 87158           1-Regular school     438  202    236           <NA>
## 87243           1-Regular school     621  319    302           <NA>
## 87251           1-Regular school     580  289    291           <NA>
## 87284 2-Special education school       8    7      1           <NA>
## 87331 4-Alternative/other school       2    2      0           <NA>
## 87332           1-Regular school    5683 2238   3445           <NA>
## 87341           1-Regular school     454  209    245           <NA>
## 87342           1-Regular school     853  236    617           <NA>
## 87343           1-Regular school     764  321    443           <NA>
## 87346 2-Special education school     127   67     60           <NA>
## 87347 2-Special education school     524  277    247           <NA>
## 87401 4-Alternative/other school      17   17      0           <NA>
## 87407 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87430 2-Special education school      16    9      7           <NA>
## 87447           1-Regular school     348  201    147           <NA>
## 87456 4-Alternative/other school     154   31    123           <NA>
## 87457           1-Regular school     351  178    173           16.4
## 87465        3-Vocational school     n/a  n/a    n/a           <NA>
## 87487 4-Alternative/other school      31    0     31           <NA>
## 87501 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 87505 4-Alternative/other school     196   39    157           <NA>
## 87511           1-Regular school      30   17     13           <NA>
## 87519 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87521 4-Alternative/other school       0    0      0           <NA>
## 87523           1-Regular school     n/a  n/a    n/a           <NA>
## 87525           1-Regular school     525  263    262           <NA>
## 87532        3-Vocational school     n/a  n/a    n/a           <NA>
## 87535           1-Regular school     243  125    118           14.7
## 87542           1-Regular school     316  182    134           16.9
## 87555 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 87570 2-Special education school     136  114     22           <NA>
## 87590 4-Alternative/other school      48   21     27           <NA>
## 87603           1-Regular school     591  283    308           <NA>
## 87604           1-Regular school     485  212    273           <NA>
## 87605           1-Regular school     640  315    325           <NA>
## 87608 4-Alternative/other school       8    7      1           <NA>
## 87611           1-Regular school     592  294    298           <NA>
## 87617           1-Regular school     161   72     89           <NA>
## 87618           1-Regular school      48   31     17           <NA>
## 87623 4-Alternative/other school      42   32     10           <NA>
## 87636           1-Regular school     309  163    146           <NA>
## 87639 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87640 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87648           1-Regular school      78   35     43           <NA>
## 87662 4-Alternative/other school     221  112    109           <NA>
## 87663           1-Regular school      27   16     11           <NA>
## 87664           1-Regular school     367  166    201           45.6
## 87676 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87749 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 87752 2-Special education school      11    6      5           <NA>
## 87775 2-Special education school     n/a  n/a    n/a           <NA>
## 87828 4-Alternative/other school      36   26     10           2.79
## 87832           1-Regular school     535  265    270           <NA>
## 87833           1-Regular school     761  378    383           <NA>
## 87880           1-Regular school     456  227    229           29.4
## 87915           1-Regular school     706  346    360           <NA>
## 87931           1-Regular school     906  468    438           58.5
## 87963           1-Regular school     504  271    233           <NA>
## 87997           1-Regular school     442  238    204           <NA>
## 88027 4-Alternative/other school       0    0      0           <NA>
## 88044           1-Regular school      56   46     10           <NA>
## 88153           1-Regular school     700  373    327           <NA>
## 88164           1-Regular school     533  261    272           <NA>
## 88171           1-Regular school     582  311    271             40
## 88172 2-Special education school     163   99     64           <NA>
## 88173           1-Regular school     591  312    279           <NA>
## 88191           1-Regular school     315  165    150          22.27
## 88212           1-Regular school    1072  561    511           <NA>
## 88265           1-Regular school     108   55     53           <NA>
## 88266           1-Regular school     111   65     46           <NA>
## 88281 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 88283 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 88314           1-Regular school     217  108    109           <NA>
## 88394           1-Regular school    1349  713    636           <NA>
## 88418           1-Regular school     478  252    226           <NA>
## 88419           1-Regular school    1503  768    735           <NA>
## 88420           1-Regular school     923  503    420           <NA>
## 88421           1-Regular school     649  344    305           <NA>
## 88423           1-Regular school    2186 1130   1056           <NA>
## 88445           1-Regular school     122   65     57           <NA>
## 88446 2-Special education school      12    9      3           <NA>
## 88449 4-Alternative/other school       0    0      0           <NA>
## 88500           1-Regular school      21    7     14           <NA>
## 88509        3-Vocational school    <NA>  n/a    n/a             15
## 88586           1-Regular school       0    0      0           <NA>
## 88590           1-Regular school     419  223    196           <NA>
## 88595           1-Regular school     125   64     61           <NA>
## 88640 4-Alternative/other school       1    0      1           <NA>
## 88672           1-Regular school     737  382    355           <NA>
## 88706           1-Regular school       0    0      0           <NA>
## 88707           1-Regular school    1797  927    870           <NA>
## 88708           1-Regular school     852  431    421           <NA>
## 88709           1-Regular school       0    0      0           <NA>
## 88753           1-Regular school     n/a  n/a    n/a           <NA>
## 88760           1-Regular school     610  322    288             27
## 88893 2-Special education school      28   18     10           <NA>
## 88894           1-Regular school     499  268    231           <NA>
## 88918 2-Special education school      26   17      9           <NA>
## 88926 2-Special education school      44   29     15           <NA>
## 88928 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 88931 2-Special education school      69   46     23           <NA>
## 88932 2-Special education school      11    7      4           <NA>
## 88957           1-Regular school    1245  622    623           <NA>
## 88966 4-Alternative/other school       3    2      1           <NA>
## 88969 4-Alternative/other school       3    3      0           <NA>
## 89013           1-Regular school     809  408    401           <NA>
## 89016           1-Regular school     208  102    106           <NA>
## 89023           1-Regular school      87   42     45              5
## 89025           1-Regular school     431  225    206           <NA>
## 89065 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 89069           1-Regular school     125   64     61              6
## 89105        3-Vocational school       0    0      0           <NA>
## 89106           1-Regular school     221  104    117           <NA>
## 89107           1-Regular school     301  154    147             22
## 89108           1-Regular school     139   71     68             14
## 89109           1-Regular school     118   56     62              9
## 89130        3-Vocational school       0    0      0           <NA>
## 89153        3-Vocational school       0    0      0           <NA>
## 89210 4-Alternative/other school       0    0      0           <NA>
## 89211 4-Alternative/other school       0    0      0           <NA>
## 89212 2-Special education school       0    0      0           <NA>
## 89247        3-Vocational school     n/a  n/a    n/a           <NA>
## 89274           1-Regular school      86   40     46           <NA>
## 89353        3-Vocational school    <NA>  n/a    n/a              1
## 89406           1-Regular school     266  137    129           <NA>
## 89414           1-Regular school     122   60     62           <NA>
## 89417           1-Regular school     378  129    249           <NA>
## 89433        3-Vocational school       0    0      0           <NA>
## 89447 2-Special education school       9    4      5           <NA>
## 89448           1-Regular school      40   27     13           <NA>
## 89449           1-Regular school     685  350    335           <NA>
## 89450           1-Regular school     103   63     40           <NA>
## 89451           1-Regular school     182   86     96           <NA>
## 89453           1-Regular school     117   61     56           <NA>
## 89454 2-Special education school       0    0      0           <NA>
## 89480 4-Alternative/other school       0    0      0           <NA>
## 89481           1-Regular school     n/a  n/a    n/a           <NA>
## 89531           1-Regular school     n/a  n/a    n/a           <NA>
## 89533 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 89554 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 89569 4-Alternative/other school      13    7      6           <NA>
## 89601 4-Alternative/other school      40   40      0           <NA>
## 89604 4-Alternative/other school       0    0      0           <NA>
## 89609 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 89636        3-Vocational school    <NA>  n/a    n/a          10.79
## 89638 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 89744           1-Regular school      20    5     15           <NA>
## 89769           1-Regular school     670  351    319           <NA>
## 89778           1-Regular school     434  234    200           <NA>
## 89783           1-Regular school     n/a  n/a    n/a           <NA>
## 89788        3-Vocational school       0    0      0           <NA>
## 89826 4-Alternative/other school     194  102     92           <NA>
## 89890           1-Regular school     572  306    266          43.78
## 89900           1-Regular school      25   15     10           <NA>
## 89902 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 89919           1-Regular school    1725  888    837           <NA>
## 89920           1-Regular school     719  371    348           <NA>
## 89921           1-Regular school      19    7     12           <NA>
## 89922 4-Alternative/other school      72   28     44           <NA>
## 89923           1-Regular school     534  277    257           <NA>
## 89924           1-Regular school     747  363    384           <NA>
## 89925 2-Special education school     217  143     74           <NA>
## 89950 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 89973           1-Regular school     193   98     95            8.7
## 90028           1-Regular school     n/a  n/a    n/a           <NA>
## 90050           1-Regular school       0    0      0           <NA>
## 90102           1-Regular school     947  481    466           <NA>
## 90115           1-Regular school     582  293    289           25.4
## 90117           1-Regular school     124   58     66           5.69
## 90134           1-Regular school     823  405    418           <NA>
## 90154 4-Alternative/other school      19   11      8           <NA>
## 90167           1-Regular school     101   47     54              6
## 90175           1-Regular school       0    0      0           <NA>
## 90176           1-Regular school       0    0      0           <NA>
## 90177           1-Regular school       0    0      0           <NA>
## 90204           1-Regular school     112   65     47           <NA>
## 90207 4-Alternative/other school      19    8     11           <NA>
## 90221        3-Vocational school    <NA>  n/a    n/a           15.5
## 90249           1-Regular school      44   14     30            3.4
## 90255           1-Regular school     214  102    112           <NA>
## 90256           1-Regular school     534  258    276           <NA>
## 90257           1-Regular school     354  181    173           <NA>
## 90258           1-Regular school     641  300    341           <NA>
## 90281           1-Regular school     n/a  n/a    n/a           <NA>
## 90325 4-Alternative/other school     290  137    153           <NA>
## 90347           1-Regular school     975  468    507          45.15
## 90348           1-Regular school     656  305    351           32.2
## 90383           1-Regular school     452  231    221           <NA>
## 90385           1-Regular school      14    2     12              1
## 90386           1-Regular school     463  267    196              3
## 90387           1-Regular school      46   17     29              1
## 90405           1-Regular school     246  118    128           <NA>
## 90414           1-Regular school      70   42     28           <NA>
## 90520           1-Regular school     260  172     88           12.8
## 90531           1-Regular school     316  316    n/a           <NA>
## 90532           1-Regular school     260  260    n/a           <NA>
## 90533           1-Regular school     213  213    n/a           <NA>
## 90541           1-Regular school     n/a  n/a    n/a           <NA>
## 90569           1-Regular school     167   98     69           <NA>
## 90570           1-Regular school    1022  493    529           <NA>
## 90571           1-Regular school     405  216    189           <NA>
## 90572           1-Regular school     243  121    122           <NA>
## 90573           1-Regular school     519  363    156           <NA>
## 90574           1-Regular school     255  187     68           <NA>
## 90575           1-Regular school     695  282    413           <NA>
## 90576           1-Regular school     965  459    506           <NA>
## 90578           1-Regular school    2003  925   1078           <NA>
## 90615 2-Special education school     n/a  n/a    n/a           <NA>
## 90619        3-Vocational school       0    0      0           <NA>
## 90620        3-Vocational school       0    0      0           <NA>
## 90621        3-Vocational school       0    0      0           <NA>
## 90622        3-Vocational school       0    0      0           <NA>
## 90623        3-Vocational school       0    0      0           <NA>
## 90627           1-Regular school     423  205    218           <NA>
## 90689           1-Regular school      73   39     34           <NA>
## 90690           1-Regular school      64   24     40           <NA>
## 90694           1-Regular school      40   21     19              1
## 90720           1-Regular school     350  179    171           <NA>
## 90726        3-Vocational school     n/a  n/a    n/a           <NA>
## 90748           1-Regular school     653  329    324           <NA>
## 90787           1-Regular school     136   68     68           <NA>
## 90802 4-Alternative/other school     450  226    224           <NA>
## 90807           1-Regular school     627  327    300           <NA>
## 90810           1-Regular school     689  331    358          35.76
## 90825           1-Regular school      74   29     45            1.7
## 90831           1-Regular school       0    0      0           <NA>
## 90835 4-Alternative/other school       0    0      0           <NA>
## 90846           1-Regular school      24   19      5           <NA>
## 90855        3-Vocational school       0    0      0           <NA>
## 90856           1-Regular school     593  313    280           <NA>
## 90858           1-Regular school     141   67     74           <NA>
## 90879           1-Regular school     488  256    232           15.9
## 90951           1-Regular school     446  226    220           <NA>
## 90952           1-Regular school     490  271    219           <NA>
## 90953           1-Regular school     443  248    195           <NA>
## 90981           1-Regular school       1    1      0           <NA>
## 91064           1-Regular school     192  109     83           <NA>
## 91146           1-Regular school     440  241    199           <NA>
## 91180 2-Special education school     112   91     21           <NA>
## 91223           1-Regular school     197   96    101           <NA>
## 91266           1-Regular school     435  238    197          19.86
## 91274 4-Alternative/other school    1616  778    838          76.46
## 91277           1-Regular school     803  384    419           <NA>
## 91293           1-Regular school     726  368    358           34.1
## 91298           1-Regular school      64   30     34           <NA>
## 91322 4-Alternative/other school       3    3      0           <NA>
## 91345           1-Regular school     838  425    413           <NA>
## 91367           1-Regular school    1400  708    692          96.28
## 91377           1-Regular school      20   11      9           <NA>
## 91425           1-Regular school    1009  510    499             38
## 91468 4-Alternative/other school       0    0      0           <NA>
## 91481 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 91528           1-Regular school     201  100    101           <NA>
## 91537           1-Regular school      32   15     17           <NA>
## 91543           1-Regular school     252  132    120           <NA>
## 91544           1-Regular school     333  162    171           <NA>
## 91586           1-Regular school    1905  964    941           <NA>
## 91587           1-Regular school     455  247    208           <NA>
## 91607           1-Regular school     488  248    240           <NA>
## 91622           1-Regular school      98   45     53              6
## 91682           1-Regular school       2    1      1           <NA>
## 91709 4-Alternative/other school      17   17    n/a           <NA>
## 91724           1-Regular school    1213  631    582           <NA>
## 91761           1-Regular school     n/a  n/a    n/a           <NA>
## 91781 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 91813 2-Special education school       0    0      0           <NA>
## 91827           1-Regular school     n/a  n/a    n/a           <NA>
## 91841           1-Regular school      20   10     10           <NA>
## 91868           1-Regular school     908  388    520           <NA>
## 91872           1-Regular school      42   21     21           <NA>
## 91873           1-Regular school     299  149    150           <NA>
## 91898           1-Regular school      68   41     27           <NA>
## 91899           1-Regular school    2032 1038    994           <NA>
## 91923           1-Regular school    1056  497    559          49.57
## 91928           1-Regular school     723  346    377           <NA>
## 91950        3-Vocational school       0    0      0           <NA>
## 91975           1-Regular school     128   50     78           <NA>
## 91979           1-Regular school      33   20     13           <NA>
## 91988 4-Alternative/other school      27   27    n/a           <NA>
## 91998           1-Regular school     532  273    259           <NA>
## 92024        3-Vocational school    <NA>  n/a    n/a              1
## 92100           1-Regular school     249  118    131             15
## 92120           1-Regular school     183   89     94             10
## 92183 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 92189 2-Special education school       0    0      0           <NA>
## 92217 4-Alternative/other school       8    5      3           <NA>
## 92258           1-Regular school     395  211    184             18
## 92275           1-Regular school    1060  577    483           <NA>
## 92365           1-Regular school      16    5     11           <NA>
## 92369           1-Regular school       0    0      0           <NA>
## 92385           1-Regular school     448  226    222           <NA>
## 92422        3-Vocational school    <NA>  n/a    n/a              1
## 92423 4-Alternative/other school    <NA>  n/a    n/a              1
## 92489 4-Alternative/other school       2    1      1           <NA>
## 92490 4-Alternative/other school       5    3      2           <NA>
## 92493 4-Alternative/other school       1    1      0           <NA>
## 92494 4-Alternative/other school       5    4      1           <NA>
## 92495 4-Alternative/other school       5    3      2           <NA>
## 92519 4-Alternative/other school       6    0      6           <NA>
## 92526           1-Regular school     567  282    285           <NA>
## 92547 4-Alternative/other school       1    0      1           <NA>
## 92555           1-Regular school     481  234    247           <NA>
## 92632           1-Regular school     380  198    182           <NA>
## 92693           1-Regular school     328  139    189           <NA>
## 92700 4-Alternative/other school       0    0      0           <NA>
## 92754 4-Alternative/other school      14   14      0           <NA>
## 92763 4-Alternative/other school     141   81     60           <NA>
## 92771           1-Regular school       4    3      1           <NA>
## 92791 4-Alternative/other school       1    1    n/a           <NA>
## 92792 4-Alternative/other school      14    9      5           <NA>
## 92870           1-Regular school       7    5      2           <NA>
## 92972 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 92974 4-Alternative/other school      15    4     11           <NA>
## 93049           1-Regular school     848  430    418           70.6
## 93051           1-Regular school    2089 1091    998           <NA>
## 93052           1-Regular school     812  398    414           <NA>
## 93053           1-Regular school       1    1      0           <NA>
## 93054           1-Regular school     422  222    200           <NA>
## 93055           1-Regular school     496  258    238           <NA>
## 93056           1-Regular school     455  257    198           <NA>
## 93057           1-Regular school     883  462    421           <NA>
## 93058           1-Regular school     328  156    172           <NA>
## 93059           1-Regular school     555  253    302           <NA>
## 93068 4-Alternative/other school      11    6      5           <NA>
## 93116        3-Vocational school     n/a  n/a    n/a           <NA>
## 93117        3-Vocational school    <NA>  n/a    n/a              1
## 93120           1-Regular school       0    0      0           <NA>
## 93154           1-Regular school     574  296    278             36
## 93349           1-Regular school     829  438    391           52.2
## 93394           1-Regular school     645  341    304             56
## 93416 2-Special education school     487  311    176           <NA>
## 93433           1-Regular school     461  235    226           <NA>
## 93434           1-Regular school     349  171    178           <NA>
## 93438           1-Regular school     293  151    142           <NA>
## 93457           1-Regular school     506  270    236           <NA>
## 93459           1-Regular school       0    0      0           <NA>
## 93466           1-Regular school       1    0      1           <NA>
## 93490 4-Alternative/other school     157  106     51           <NA>
## 93519           1-Regular school     263  117    146           <NA>
## 93520           1-Regular school     295  152    143           <NA>
## 93521           1-Regular school       2    1      1           <NA>
## 93680 4-Alternative/other school      16   15      1           <NA>
## 93685 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 93696           1-Regular school    4609 2334   2275          279.9
## 93722 4-Alternative/other school       7    7    n/a           <NA>
## 93746        3-Vocational school       0    0      0           <NA>
## 93747        3-Vocational school       0    0      0           <NA>
## 93748        3-Vocational school       0    0      0           <NA>
## 93749        3-Vocational school       0    0      0           <NA>
## 93750        3-Vocational school       0    0      0           <NA>
## 93752        3-Vocational school       0    0      0           <NA>
## 93757           1-Regular school     117    0    117           <NA>
## 93816 4-Alternative/other school       5    5      0           <NA>
## 93861           1-Regular school     147   73     74           <NA>
## 93873           1-Regular school     105   56     49           <NA>
## 93967           1-Regular school     n/a  n/a    n/a           <NA>
## 93976 4-Alternative/other school      18   16      2           <NA>
## 94003           1-Regular school    1997 1008    989           <NA>
## 94004           1-Regular school     303  156    147           <NA>
## 94006           1-Regular school       7    5      2           <NA>
## 94007           1-Regular school      32   10     22           <NA>
## 94113           1-Regular school     597  312    285           <NA>
## 94114           1-Regular school     n/a  n/a    n/a           <NA>
## 94142           1-Regular school     939  467    472           <NA>
## 94191           1-Regular school     n/a  n/a    n/a           <NA>
## 94200           1-Regular school     277  164    113           <NA>
## 94227           1-Regular school      54   25     29           <NA>
## 94241           1-Regular school      13    0     13           <NA>
## 94249 4-Alternative/other school      15    8      7           <NA>
## 94257           1-Regular school     540  293    247           <NA>
## 94289           1-Regular school     188   96     92           <NA>
## 94324           1-Regular school     n/a  n/a    n/a           <NA>
## 94349 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 94362 2-Special education school     n/a  n/a    n/a           <NA>
## 94369 4-Alternative/other school      16   10      6           <NA>
## 94396           1-Regular school     n/a  n/a    n/a           <NA>
## 94403           1-Regular school     614  316    298           <NA>
## 94460 4-Alternative/other school       9    6      3           <NA>
## 94467           1-Regular school      60   30     30           <NA>
## 94468 2-Special education school      31   21     10           <NA>
## 94501           1-Regular school     737  367    370           <NA>
## 94534           1-Regular school      14    6      8           <NA>
## 94535           1-Regular school      11    7      4           <NA>
## 94696           1-Regular school     680  355    325           <NA>
## 94701 4-Alternative/other school       2    1      1           <NA>
## 94719           1-Regular school    2750 1427   1323           <NA>
## 94738           1-Regular school    1105  552    553           <NA>
## 94742           1-Regular school     373  200    173             17
## 94782           1-Regular school    1757  862    895           <NA>
## 94783           1-Regular school     860  423    437           <NA>
## 94784           1-Regular school     488  254    234           <NA>
## 94790           1-Regular school     777  400    377           <NA>
## 94798           1-Regular school     868  487    381           <NA>
## 94800 2-Special education school       0    0      0           <NA>
## 94948 4-Alternative/other school       1    1      0           <NA>
## 94976           1-Regular school     438  216    222           <NA>
## 94997           1-Regular school    1306  690    616           <NA>
## 95001           1-Regular school     914  484    430           <NA>
## 95007        3-Vocational school     n/a  n/a    n/a           <NA>
## 95064           1-Regular school     477  229    248           <NA>
## 95100           1-Regular school     n/a  n/a    n/a           <NA>
## 95109 4-Alternative/other school      20   14      6           <NA>
## 95116 2-Special education school      38   22     16           <NA>
## 95141           1-Regular school     n/a  n/a    n/a           <NA>
## 95151 2-Special education school       6    5      1           <NA>
## 95176           1-Regular school     646  356    290           <NA>
## 95198 2-Special education school    <NA>  n/a    n/a           <NA>
## 95199 2-Special education school    <NA>  n/a    n/a           <NA>
## 95200 2-Special education school    <NA>  n/a    n/a           <NA>
## 95206           1-Regular school     522  265    257           <NA>
## 95232        3-Vocational school       0    0      0           <NA>
## 95233        3-Vocational school       0    0      0           <NA>
## 95234        3-Vocational school       0    0      0           <NA>
## 95235        3-Vocational school       0    0      0           <NA>
## 95236        3-Vocational school       0    0      0           <NA>
## 95237        3-Vocational school       0    0      0           <NA>
## 95238        3-Vocational school       0    0      0           <NA>
## 95240        3-Vocational school       0    0      0           <NA>
## 95241        3-Vocational school       0    0      0           <NA>
## 95242        3-Vocational school       0    0      0           <NA>
## 95243        3-Vocational school       0    0      0           <NA>
## 95244        3-Vocational school       0    0      0           <NA>
## 95245        3-Vocational school       0    0      0           <NA>
## 95246        3-Vocational school       0    0      0           <NA>
## 95247        3-Vocational school       0    0      0           <NA>
## 95248        3-Vocational school       0    0      0           <NA>
## 95249        3-Vocational school       0    0      0           <NA>
## 95250        3-Vocational school       0    0      0           <NA>
## 95251        3-Vocational school       0    0      0           <NA>
## 95252        3-Vocational school       0    0      0           <NA>
## 95254        3-Vocational school       0    0      0           <NA>
## 95255        3-Vocational school       0    0      0           <NA>
## 95256        3-Vocational school       0    0      0           <NA>
## 95257        3-Vocational school       0    0      0           <NA>
## 95258        3-Vocational school       0    0      0           <NA>
## 95259        3-Vocational school       0    0      0           <NA>
## 95261        3-Vocational school       0    0      0           <NA>
## 95262        3-Vocational school       0    0      0           <NA>
## 95263        3-Vocational school       0    0      0           <NA>
## 95264        3-Vocational school       0    0      0           <NA>
## 95265        3-Vocational school       0    0      0           <NA>
## 95266        3-Vocational school       0    0      0           <NA>
## 95267        3-Vocational school       0    0      0           <NA>
## 95268        3-Vocational school       0    0      0           <NA>
## 95269        3-Vocational school       0    0      0           <NA>
## 95270        3-Vocational school       0    0      0           <NA>
## 95271        3-Vocational school       0    0      0           <NA>
## 95272        3-Vocational school       0    0      0           <NA>
## 95273        3-Vocational school       0    0      0           <NA>
## 95275        3-Vocational school       0    0      0           <NA>
## 95276        3-Vocational school       0    0      0           <NA>
## 95277        3-Vocational school       0    0      0           <NA>
## 95278        3-Vocational school       0    0      0           <NA>
## 95279        3-Vocational school       0    0      0           <NA>
## 95303           1-Regular school     592  298    294           <NA>
## 95335           1-Regular school     443  228    215             27
## 95343           1-Regular school      90   51     39           5.85
## 95401           1-Regular school     423  209    214           <NA>
## 95413 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 95417 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 95429 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 95430 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 95442           1-Regular school     527  262    265           <NA>
## 95444           1-Regular school     770  363    407          36.12
## 95446 2-Special education school       0    0      0           <NA>
## 95486           1-Regular school     725  362    363           <NA>
## 95534           1-Regular school    3070 1572   1498           <NA>
## 95549           1-Regular school     525  253    272           <NA>
## 95550           1-Regular school     252  125    127           <NA>
## 95551           1-Regular school     258  126    132           <NA>
## 95593           1-Regular school     396  196    200           <NA>
## 95670           1-Regular school     769  381    388           <NA>
## 95748           1-Regular school     743  369    374           <NA>
## 95752           1-Regular school     573  287    286           <NA>
## 95806           1-Regular school     326  164    162           20.3
## 95886           1-Regular school      16    7      9           <NA>
## 95930 4-Alternative/other school       0    0      0           <NA>
## 96039           1-Regular school       0    0      0           <NA>
## 96120           1-Regular school     397  190    207           <NA>
## 96180           1-Regular school     n/a  n/a    n/a           <NA>
## 96209           1-Regular school     262  130    132           <NA>
## 96241           1-Regular school     470  256    214           <NA>
## 96369           1-Regular school     586  289    297             40
## 96399 4-Alternative/other school       0    0      0           <NA>
## 96408           1-Regular school     658  351    307           <NA>
## 96409           1-Regular school     665  354    311           <NA>
## 96426 4-Alternative/other school       1    1      0           <NA>
## 96450 4-Alternative/other school      72   47     25           <NA>
## 96498 4-Alternative/other school    <NA>  n/a    n/a              1
## 96502           1-Regular school     288  142    146           18.3
## 96541           1-Regular school     166   86     80           8.75
## 96544           1-Regular school     627  348    279           <NA>
## 96572           1-Regular school      91   48     43           <NA>
## 96689           1-Regular school     262  137    125           <NA>
## 96726           1-Regular school     608  325    283             23
## 96834           1-Regular school     n/a  n/a    n/a           <NA>
## 96927           1-Regular school     655  321    334           <NA>
## 96945        3-Vocational school       0    0      0           <NA>
## 97010 2-Special education school     n/a  n/a    n/a           <NA>
## 97070           1-Regular school     103   53     50            6.8
## 97071           1-Regular school      79   47     32          11.64
## 97072           1-Regular school      76   43     33           5.71
## 97073 4-Alternative/other school       2    2      0           <NA>
## 97074 4-Alternative/other school       5    4      1           <NA>
## 97075 2-Special education school    <NA>  n/a    n/a           <NA>
## 97078 4-Alternative/other school       1    1      0           <NA>
## 97080 4-Alternative/other school       4    4      0           <NA>
## 97084 4-Alternative/other school       4    2      2           <NA>
## 97085 4-Alternative/other school       6    6      0           <NA>
## 97087 4-Alternative/other school       2    2      0           <NA>
## 97091 4-Alternative/other school       4    3      1           <NA>
## 97159           1-Regular school     438  228    210           <NA>
## 97166           1-Regular school     101   52     49           <NA>
## 97181           1-Regular school     398  215    183           <NA>
## 97187           1-Regular school      96   48     48           <NA>
## 97220           1-Regular school      14    7      7              2
## 97244           1-Regular school     678  346    332           <NA>
## 97255           1-Regular school     690  349    341           <NA>
## 97258           1-Regular school    <NA>  n/a    n/a           <NA>
## 97267           1-Regular school    1682  843    839           <NA>
## 97335 4-Alternative/other school       4    4      0           <NA>
## 97338 4-Alternative/other school       3    1      2           <NA>
## 97339 4-Alternative/other school       2    2      0           <NA>
## 97452           1-Regular school     444  229    215           <NA>
## 97453           1-Regular school     401  215    186           <NA>
## 97541           1-Regular school     918  501    417           <NA>
## 97546           1-Regular school       0    0      0           <NA>
## 97564           1-Regular school     637  320    317           <NA>
## 97614           1-Regular school     562  294    268           <NA>
## 97769           1-Regular school    <NA>  n/a    n/a            2.7
## 97803        3-Vocational school    <NA>  n/a    n/a              1
## 97824           1-Regular school     114   62     52           <NA>
## 97879           1-Regular school     n/a  n/a    n/a           <NA>
## 97908 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 97909        3-Vocational school     n/a  n/a    n/a           <NA>
## 97960           1-Regular school     434  235    199           <NA>
## 98030 2-Special education school       8    6      2           <NA>
## 98031 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 98032 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 98034 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 98051        3-Vocational school    <NA>  n/a    n/a             19
## 98063           1-Regular school     429  250    179          40.03
## 98197           1-Regular school     431  209    222           26.6
## 98206           1-Regular school    1687  872    815         123.24
## 98261           1-Regular school    1230  617    613          80.39
## 98267           1-Regular school    1991  988   1003         140.16
## 98288           1-Regular school     658  355    303          42.45
## 98299           1-Regular school     249  139    110             11
## 98309           1-Regular school     351  182    169          21.25
## 98310           1-Regular school     282  143    139          17.13
## 98359           1-Regular school     247  155     92           <NA>
## 98435        3-Vocational school       0    0      0           <NA>
## 98437           1-Regular school     850  439    411           <NA>
## 98450           1-Regular school     657  339    318           <NA>
## 98454           1-Regular school    1453  771    682           <NA>
## 98455           1-Regular school     594  297    297           <NA>
## 98471        3-Vocational school     n/a  n/a    n/a           <NA>
## 98485 4-Alternative/other school      14   14      0           <NA>
## 98506           1-Regular school     991  526    465          66.09
## 98511           1-Regular school     929  473    456          59.26
## 98512           1-Regular school     543  281    262           <NA>
## 98617           1-Regular school     422  237    185             28
## 98619           1-Regular school     387  174    213             26
## 98627           1-Regular school     362  198    164           <NA>
## 98628 4-Alternative/other school      30   12     18           <NA>
## 98644           1-Regular school      52   31     21              1
## 98645           1-Regular school     303  153    150             17
## 98693 4-Alternative/other school       1    0      1           <NA>
## 98711 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 98787        3-Vocational school    <NA>  n/a    n/a             18
## 98807        3-Vocational school     n/a  n/a    n/a           <NA>
## 98885           1-Regular school     164   89     75           <NA>
## 98886           1-Regular school     200  100    100           <NA>
## 98887           1-Regular school     180  104     76           <NA>
## 98888           1-Regular school     143   76     67           <NA>
## 98889           1-Regular school     143   65     78           <NA>
## 98890           1-Regular school     163   77     86           <NA>
## 98891           1-Regular school     156   76     80           <NA>
## 98892           1-Regular school     409  249    160           <NA>
## 98893           1-Regular school     209  100    109           <NA>
## 98894           1-Regular school     231   98    133           <NA>
## 98895           1-Regular school     151   77     74           <NA>
## 98897           1-Regular school     164   81     83           <NA>
## 98898           1-Regular school     154   67     87           <NA>
## 98899           1-Regular school     344  171    173           <NA>
## 98901           1-Regular school    <NA>  n/a    n/a           <NA>
## 98902           1-Regular school     129   69     60           <NA>
## 98903           1-Regular school      95   48     47           <NA>
## 98904           1-Regular school     231  110    121           <NA>
## 98905 4-Alternative/other school      10    8      2           <NA>
## 98965        3-Vocational school       0    0      0           <NA>
## 99046        3-Vocational school       0    0      0           <NA>
## 99047           1-Regular school      26   15     11              1
## 99056           1-Regular school      37   18     19           <NA>
## 99070           1-Regular school    1026  517    509           <NA>
## 99073           1-Regular school    1267  642    625           <NA>
## 99074 4-Alternative/other school     379  194    185           <NA>
## 99085           1-Regular school     398  199    199           <NA>
## 99086           1-Regular school     173   94     79           <NA>
## 99129 4-Alternative/other school     131   85     46           <NA>
## 99148           1-Regular school      86   45     41           <NA>
## 99149 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 99170           1-Regular school     387  189    198          20.15
## 99174           1-Regular school     n/a  n/a    n/a           <NA>
## 99175           1-Regular school     287  155    132           9.35
## 99176 2-Special education school     160  113     47             17
## 99181           1-Regular school     n/a  n/a    n/a           <NA>
## 99203           1-Regular school       5    5      0              0
## 99265 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 99294           1-Regular school     n/a  n/a    n/a           <NA>
## 99333 2-Special education school      59   36     23           <NA>
##       Pupil.Teacher.Ratio
## 3                     n/a
## 4                     n/a
## 108                 15.57
## 129                 16.72
## 133                   n/a
## 163                 18.05
## 177                   n/a
## 209                   n/a
## 210                   n/a
## 212                   n/a
## 263                   n/a
## 283                   n/a
## 397                   n/a
## 398                   n/a
## 399                   n/a
## 400                   n/a
## 404                   n/a
## 406                   n/a
## 407                   n/a
## 413                   n/a
## 421                   n/a
## 422                   n/a
## 427                 22.67
## 432                   n/a
## 446                   n/a
## 455                   n/a
## 457                   n/a
## 458                   n/a
## 496                   n/a
## 497                   n/a
## 499                   n/a
## 506                   n/a
## 508                   n/a
## 516                   n/a
## 517                   n/a
## 518                   n/a
## 535                   n/a
## 536                   n/a
## 537                   n/a
## 544                   n/a
## 545                   n/a
## 546                   n/a
## 552                   n/a
## 574                   n/a
## 575                   n/a
## 579                    35
## 584                   n/a
## 591                   n/a
## 637                 24.84
## 661                   n/a
## 680                   n/a
## 681                   n/a
## 688                   n/a
## 717                    21
## 803                   n/a
## 805                   n/a
## 807                   n/a
## 849                   n/a
## 875                  15.3
## 898                   n/a
## 899                   n/a
## 915                   n/a
## 919                   n/a
## 924                   n/a
## 925                   n/a
## 929                   n/a
## 930                   n/a
## 932                   n/a
## 933                   n/a
## 936                   n/a
## 937                   n/a
## 938                   n/a
## 942                   n/a
## 943                   n/a
## 950                   n/a
## 951                   n/a
## 952                   n/a
## 959                   n/a
## 969                   n/a
## 1028                  n/a
## 1072                  n/a
## 1105                  n/a
## 1106                  n/a
## 1139                  n/a
## 1140                  n/a
## 1141                  n/a
## 1144                  n/a
## 1145                  n/a
## 1150                  n/a
## 1151                  n/a
## 1160                26.23
## 1163                  n/a
## 1247                15.65
## 1252                  n/a
## 1290                  n/a
## 1318                  n/a
## 1335                  n/a
## 1336                  n/a
## 1337                  n/a
## 1338                  n/a
## 1345                  n/a
## 1347                  n/a
## 1358                  n/a
## 1431                  n/a
## 1470                  n/a
## 1506                  n/a
## 1557                  n/a
## 1633                  n/a
## 1656                  n/a
## 1660                11.33
## 1661                 8.44
## 1692                  n/a
## 1693                  n/a
## 1738                  n/a
## 1766                  n/a
## 1837                  n/a
## 1844                  n/a
## 1853                20.27
## 1857                  n/a
## 1877                  n/a
## 1902                  n/a
## 1906                  n/a
## 1907                  n/a
## 1921                  n/a
## 1922                  n/a
## 1932                  n/a
## 1940                  n/a
## 1952                  n/a
## 1971                  n/a
## 1972                26.42
## 1974                22.81
## 1987                  n/a
## 1989                  n/a
## 1992                  n/a
## 2008                  n/a
## 2014                  n/a
## 2016                  n/a
## 2017                  n/a
## 2020                  n/a
## 2027                  n/a
## 2034                  n/a
## 2036                  n/a
## 2038                  n/a
## 2054                  n/a
## 2057                  n/a
## 2060                  n/a
## 2061                  n/a
## 2067                21.79
## 2160                  n/a
## 2162                  n/a
## 2163                 5.82
## 2194                26.39
## 2195                  n/a
## 2210                13.74
## 2212                11.37
## 2213                10.89
## 2219                  n/a
## 2230                  n/a
## 2236                  n/a
## 2242                  n/a
## 2251                  n/a
## 2252                  n/a
## 2253                  n/a
## 2254                  n/a
## 2266                  n/a
## 2268                  n/a
## 2269                  n/a
## 2270                  n/a
## 2271                  n/a
## 2272                  n/a
## 2273                  n/a
## 2274                  n/a
## 2275                  n/a
## 2279                  n/a
## 2280                  n/a
## 2281                  n/a
## 2282                  n/a
## 2283                  n/a
## 2284                  n/a
## 2288                  n/a
## 2297                  n/a
## 2298                  n/a
## 2299                  n/a
## 2300                  n/a
## 2310                  n/a
## 2334                  n/a
## 2335                  n/a
## 2342                  n/a
## 2343                  n/a
## 2348                  n/a
## 2350                  n/a
## 2351                  n/a
## 2352                  n/a
## 2355                  n/a
## 2440                  n/a
## 2442                  n/a
## 2552                17.89
## 2669                  n/a
## 2682                  n/a
## 2704                  n/a
## 2720                  n/a
## 2724                  n/a
## 2743                  n/a
## 2786                  n/a
## 2832                  n/a
## 2842                  n/a
## 2846                25.88
## 2847                  n/a
## 2857                  n/a
## 2886                  n/a
## 2887                21.89
## 2888                21.26
## 2926                  n/a
## 2927                  n/a
## 2928                  n/a
## 2929                  n/a
## 2930                  n/a
## 2931                  n/a
## 2932                  n/a
## 2941                  n/a
## 2943                  n/a
## 3000                  n/a
## 3009                  n/a
## 3049                  n/a
## 3129                  n/a
## 3130                  n/a
## 3155                  n/a
## 3274                  n/a
## 3275                  n/a
## 3276                  n/a
## 3277                  n/a
## 3278                  n/a
## 3279                  n/a
## 3280                  n/a
## 3281                  n/a
## 3282                  n/a
## 3284                  n/a
## 3287                  n/a
## 3288                  n/a
## 3289                  n/a
## 3290                  n/a
## 3291                  n/a
## 3295                  n/a
## 3296                  n/a
## 3297                  n/a
## 3299                  n/a
## 3300                  n/a
## 3301                  n/a
## 3330                16.56
## 3512                  n/a
## 3544                  n/a
## 3613                  n/a
## 3646                14.69
## 3666                  n/a
## 3667                  n/a
## 3668                  n/a
## 3673                  n/a
## 3674                  n/a
## 3675                  n/a
## 3763                21.52
## 3770                  n/a
## 3771                  n/a
## 3772                  n/a
## 3780                13.18
## 3781                16.85
## 3782                  n/a
## 3791                  n/a
## 3796                  n/a
## 3797                  n/a
## 3798                  n/a
## 3799                  n/a
## 3800                  n/a
## 3801                  n/a
## 3802                  n/a
## 3803                  n/a
## 3804                  n/a
## 3825                  n/a
## 3834                  n/a
## 3835                  n/a
## 3837                  n/a
## 3841                  n/a
## 3898                 21.4
## 3914                  n/a
## 3915                  n/a
## 3916                  n/a
## 3917                  n/a
## 3918                  n/a
## 3919                  n/a
## 3920                  n/a
## 3921                  n/a
## 3922                  n/a
## 3931                  n/a
## 3934                  n/a
## 3953                  n/a
## 3986                  n/a
## 3987                  n/a
## 4006                 14.8
## 4034                  n/a
## 4042                  n/a
## 4051                  n/a
## 4053                  n/a
## 4196                  n/a
## 4204                  n/a
## 4283                  n/a
## 4308                  n/a
## 4309                  n/a
## 4332                  n/a
## 4384                22.32
## 4472                  n/a
## 4497                  n/a
## 4513                  n/a
## 4514                  n/a
## 4534                  n/a
## 4547                  n/a
## 4557                13.67
## 4576                  n/a
## 4592                  n/a
## 4622                  n/a
## 4623                  n/a
## 4626                  n/a
## 4635                  n/a
## 4644                  n/a
## 4690                  n/a
## 4695                  n/a
## 4727                  n/a
## 4728                  n/a
## 4800                  n/a
## 4807                  n/a
## 4948                  n/a
## 4949                  n/a
## 4950                  n/a
## 4952                  n/a
## 5054                  n/a
## 5128                  n/a
## 5137                  n/a
## 5164                 14.8
## 5174                  n/a
## 5189                  n/a
## 5305                  n/a
## 5306                  n/a
## 5307                  n/a
## 5308                  n/a
## 5310                  n/a
## 5311                  n/a
## 5312                  n/a
## 5313                  n/a
## 5314                  n/a
## 5315                  n/a
## 5316                  n/a
## 5317                  n/a
## 5318                  n/a
## 5319                  n/a
## 5320                  n/a
## 5321                  n/a
## 5322                  n/a
## 5323                  n/a
## 5324                  n/a
## 5325                  n/a
## 5326                  n/a
## 5327                  n/a
## 5328                  n/a
## 5329                  n/a
## 5347                  n/a
## 5348                  n/a
## 5375                  n/a
## 5457                  n/a
## 5532                  n/a
## 5533                  n/a
## 5534                  n/a
## 5588                23.75
## 5623                  n/a
## 5670                  n/a
## 5672                  n/a
## 5735                  n/a
## 5737                  n/a
## 5738                  n/a
## 5803                  n/a
## 5809                  n/a
## 5825                  n/a
## 5829                  n/a
## 5834                  n/a
## 5873                  n/a
## 5885                  n/a
## 5908                  n/a
## 5937                  n/a
## 5967                  n/a
## 5968                  n/a
## 5989                  6.5
## 6059                  n/a
## 6075                  n/a
## 6114                  n/a
## 6122                  n/a
## 6131                  n/a
## 6152                  n/a
## 6156                13.29
## 6184                  n/a
## 6263                22.86
## 6397                  n/a
## 6416                  n/a
## 6426                  n/a
## 6428                  n/a
## 6441                  n/a
## 6456                17.46
## 6463                  n/a
## 6506                24.23
## 6508                  n/a
## 6509                  n/a
## 6510                  n/a
## 6531                  n/a
## 6541                15.89
## 6574                  n/a
## 6575                  n/a
## 6616                  n/a
## 6617                  n/a
## 6684                  n/a
## 6685                  n/a
## 6687                  n/a
## 6710                  n/a
## 6723                  n/a
## 6729                  n/a
## 6753                  n/a
## 6872                  n/a
## 6933                  n/a
## 6965                  n/a
## 7127                  n/a
## 7128                  n/a
## 7129                  n/a
## 7130                  n/a
## 7135                  n/a
## 7146                  n/a
## 7166                  n/a
## 7200                   17
## 7211                  n/a
## 7213                  n/a
## 7214                  n/a
## 7252                27.47
## 7263                  n/a
## 7264                  n/a
## 7280                  n/a
## 7296                  n/a
## 7338                  n/a
## 7351                  n/a
## 7424                  n/a
## 7430                  n/a
## 7470                   17
## 7498                13.62
## 7522                  n/a
## 7523                  n/a
## 7576                  n/a
## 7588                  n/a
## 7659                   13
## 7709                  n/a
## 7752                  n/a
## 7753                  n/a
## 7769                18.47
## 7770                17.15
## 7816                  n/a
## 7825                  n/a
## 7828                  n/a
## 7829                  n/a
## 7836                  n/a
## 7839                 25.1
## 7843                  n/a
## 7844                  n/a
## 7900                  n/a
## 7922                  n/a
## 7931                  n/a
## 7963                  n/a
## 7976                  n/a
## 7995                  n/a
## 7996                  n/a
## 8003                  n/a
## 8030                  n/a
## 8046                  n/a
## 8068                  n/a
## 8084                  n/a
## 8108                   13
## 8136                  n/a
## 8173                16.79
## 8252                  n/a
## 8255                  n/a
## 8257                  n/a
## 8260                  n/a
## 8261                  n/a
## 8262                  n/a
## 8284                  n/a
## 8313                  n/a
## 8319                  n/a
## 8352                  n/a
## 8358                  n/a
## 8441                  n/a
## 8470                  n/a
## 8480                  n/a
## 8481                  n/a
## 8485                  n/a
## 8486                  n/a
## 8487                  n/a
## 8604                  n/a
## 8606                  n/a
## 8663                  n/a
## 8677                  n/a
## 8679                  n/a
## 8728                  n/a
## 8729                  n/a
## 8730                  n/a
## 8735                  n/a
## 8748                17.11
## 8768                  n/a
## 8808                  n/a
## 8859                  n/a
## 8902                  n/a
## 8905                  n/a
## 8910                  n/a
## 8928                  n/a
## 8942                  n/a
## 9056                  n/a
## 9063                  n/a
## 9065                  n/a
## 9066                  n/a
## 9073                  n/a
## 9107                 16.1
## 9201                  n/a
## 9218                  n/a
## 9227                  n/a
## 9228                21.08
## 9239                  n/a
## 9271                  n/a
## 9272                  n/a
## 9305                  n/a
## 9327                  n/a
## 9406                  n/a
## 9491                  n/a
## 9694                  n/a
## 9787                  n/a
## 9814                  n/a
## 9863                  n/a
## 9878                  n/a
## 9879                  n/a
## 9880                  n/a
## 9885                  n/a
## 9886                  n/a
## 9887                  n/a
## 10043                 n/a
## 10044                 n/a
## 10095                8.73
## 10096                7.33
## 10145                 n/a
## 10159                 n/a
## 10160                 n/a
## 10174                 n/a
## 10177                 n/a
## 10178                 n/a
## 10314                 n/a
## 10330               10.88
## 10373                 n/a
## 10402                 n/a
## 10426               18.47
## 10432                 n/a
## 10487                 n/a
## 10491                 n/a
## 10525                 n/a
## 10538                 n/a
## 10565                 n/a
## 10567                 n/a
## 10569                 n/a
## 10591                 n/a
## 10597                 n/a
## 10621                 n/a
## 10644                 n/a
## 10650                 n/a
## 10655                 n/a
## 10702                 n/a
## 10767                 n/a
## 10776               17.53
## 10782                 n/a
## 10789                 n/a
## 10793                 n/a
## 10805                 n/a
## 10816                 n/a
## 10817                 n/a
## 10823                 n/a
## 10928               14.55
## 10937                13.2
## 10938                 n/a
## 10948               17.66
## 10957                 n/a
## 10962                 n/a
## 11016                 n/a
## 11017                 n/a
## 11021                 n/a
## 11030                 n/a
## 11033                 n/a
## 11059                 n/a
## 11065                 n/a
## 11125                 n/a
## 11156                 n/a
## 11192                 n/a
## 11230                 n/a
## 11231                 n/a
## 11255                 n/a
## 11256                 n/a
## 11257                 n/a
## 11258                 n/a
## 11259                 n/a
## 11263                 n/a
## 11272                 120
## 11273                  36
## 11299               19.62
## 11300               21.21
## 11301               21.67
## 11302               19.66
## 11303               13.18
## 11307                3.08
## 11308                5.07
## 11309                5.59
## 11310               24.91
## 11312                25.5
## 11313              158.86
## 11314                5.33
## 11351                 n/a
## 11405                 n/a
## 11422               25.98
## 11439                 n/a
## 11440                 n/a
## 11483                 n/a
## 11484                 n/a
## 11512                 n/a
## 11513                 n/a
## 11514                 n/a
## 11522                 n/a
## 11534                 n/a
## 11535                 n/a
## 11539                 n/a
## 11541                 n/a
## 11543                 n/a
## 11544                 n/a
## 11546                 n/a
## 11547                 n/a
## 11551                 n/a
## 11582                 n/a
## 11589                 n/a
## 11591               16.26
## 11612               20.94
## 11621                 n/a
## 11683                 n/a
## 11685                 n/a
## 11728                 n/a
## 11869                 n/a
## 11872                 n/a
## 11876                 n/a
## 11877                  18
## 11881                 n/a
## 11900                 n/a
## 11908                 n/a
## 11911                 n/a
## 11912                 n/a
## 11913                 n/a
## 11914                 n/a
## 11925                 n/a
## 11926                 n/a
## 11927                 n/a
## 11928                 n/a
## 11929                 n/a
## 11930                 n/a
## 11931                 n/a
## 11932                 n/a
## 11935                 n/a
## 11936                 n/a
## 11937                 n/a
## 11967                 n/a
## 11968                 n/a
## 11975                 n/a
## 12070                 n/a
## 12083                 n/a
## 12088               19.89
## 12114                 n/a
## 12123                 n/a
## 12131                 n/a
## 12138                 n/a
## 12149                 n/a
## 12163                 n/a
## 12164                 n/a
## 12165                 n/a
## 12166                 n/a
## 12167                 n/a
## 12168                 n/a
## 12190                 n/a
## 12221               19.08
## 12227                 n/a
## 12228                 n/a
## 12243                10.3
## 12249                 n/a
## 12307                 n/a
## 12310               13.93
## 12316               23.95
## 12348                 n/a
## 12427                 n/a
## 12480                 n/a
## 12501                 n/a
## 12523                 n/a
## 12540                 n/a
## 12567                 n/a
## 12591                 n/a
## 12677                 n/a
## 12746               15.55
## 12749               18.05
## 12756                 n/a
## 12764               14.78
## 12783                 n/a
## 12806                 n/a
## 12905                 n/a
## 12912                 n/a
## 12934                 n/a
## 12965                 n/a
## 12974                 n/a
## 12976                 n/a
## 12979                 n/a
## 13071                 n/a
## 13072                 n/a
## 13073                 n/a
## 13075                 n/a
## 13076                 n/a
## 13077                 n/a
## 13079                 n/a
## 13080                 n/a
## 13081                 n/a
## 13082                 n/a
## 13085                 n/a
## 13086                 n/a
## 13087                 n/a
## 13088                 n/a
## 13089                 n/a
## 13090                 n/a
## 13091                 n/a
## 13111                 n/a
## 13117                 n/a
## 13156                 n/a
## 13176                 n/a
## 13230                 n/a
## 13233                 n/a
## 13240                 n/a
## 13262                 n/a
## 13269                 n/a
## 13270                 n/a
## 13275                 n/a
## 13290                 n/a
## 13335               30.75
## 13338                 n/a
## 13340                 n/a
## 13424                 n/a
## 13428                 n/a
## 13442                 n/a
## 13448                 n/a
## 13467                 n/a
## 13468                 n/a
## 13469                 n/a
## 13470                 n/a
## 13471                 n/a
## 13483                 n/a
## 13487                 n/a
## 13588                 n/a
## 13595                 n/a
## 13602                 n/a
## 13623                 n/a
## 13625                 n/a
## 13677                 n/a
## 13704               15.28
## 13755                 n/a
## 13816                 n/a
## 13964               14.99
## 14045                 n/a
## 14047                 n/a
## 14061                 n/a
## 14062                 n/a
## 14068                 n/a
## 14102                 n/a
## 14112                 n/a
## 14118                 n/a
## 14124                 n/a
## 14129                 n/a
## 14136                 n/a
## 14142                 n/a
## 14161                 n/a
## 14205                 n/a
## 14221                5.02
## 14226                 n/a
## 14229                 n/a
## 14237                 n/a
## 14371                 n/a
## 14373                 n/a
## 14375                 n/a
## 14377                 n/a
## 14379                 n/a
## 14387                 n/a
## 14436                 n/a
## 14458                 n/a
## 14464                 n/a
## 14465                 n/a
## 14516                 n/a
## 14520               15.11
## 14526                 n/a
## 14531                 n/a
## 14618                 n/a
## 14671                 n/a
## 14768                 n/a
## 14876                 n/a
## 14877                 n/a
## 14880                 n/a
## 14882                 n/a
## 14883                 n/a
## 14899                 n/a
## 14912               20.53
## 15111                 n/a
## 15116               17.06
## 15161                 n/a
## 15172                 n/a
## 15173                 n/a
## 15175                 n/a
## 15212                 n/a
## 15213                 n/a
## 15215                 n/a
## 15297                 n/a
## 15298                 n/a
## 15304                 n/a
## 15365                 n/a
## 15370                 n/a
## 15371                 n/a
## 15373                 n/a
## 15376               21.58
## 15377               21.73
## 15395               23.04
## 15442               17.14
## 15448                 n/a
## 15451                 n/a
## 15452                 n/a
## 15454                 n/a
## 15458                  22
## 15473                 n/a
## 15508                 n/a
## 15587                 n/a
## 15666                 n/a
## 15778                 n/a
## 15789                 n/a
## 15809                 n/a
## 15822                 n/a
## 15823                 n/a
## 15824                 n/a
## 15825                 n/a
## 15826                 n/a
## 15828                 n/a
## 15829                 n/a
## 15830                 n/a
## 15831                 n/a
## 15832                 n/a
## 15833                 n/a
## 15834                 n/a
## 15835                 n/a
## 15843               15.71
## 15898                 n/a
## 15899                 n/a
## 15943                 n/a
## 15950                 n/a
## 15957                 n/a
## 15958                 n/a
## 15960                 n/a
## 15966                 n/a
## 15970                 n/a
## 15981                 n/a
## 16010               22.19
## 16141                 n/a
## 16190                 n/a
## 16218                 n/a
## 16247               22.75
## 16271               31.48
## 16273               24.54
## 16307                 n/a
## 16308                5.47
## 16332                 n/a
## 16357                 n/a
## 16359                 n/a
## 16360                 n/a
## 16403                 n/a
## 16411               28.18
## 16483                 n/a
## 16498               13.81
## 16525                 n/a
## 16526                 n/a
## 16623                 n/a
## 16633                 n/a
## 16767                 n/a
## 16805                 n/a
## 16811                 n/a
## 16816                 n/a
## 16828                 n/a
## 16913                 n/a
## 16918                 n/a
## 16926                 n/a
## 16948               29.61
## 16950                 n/a
## 16952                 n/a
## 16953                 n/a
## 16963                 n/a
## 17019                 n/a
## 17046                   5
## 17116                 n/a
## 17160                 n/a
## 17231                 n/a
## 17232                 n/a
## 17282               19.18
## 17334                 n/a
## 17335                 n/a
## 17344                 n/a
## 17345                 n/a
## 17347                 n/a
## 17447                 n/a
## 17510                 n/a
## 17538                 n/a
## 17599                 n/a
## 17600                 n/a
## 17611                 n/a
## 17612                 n/a
## 17613                 n/a
## 17639                 n/a
## 17641                 n/a
## 17651                 n/a
## 17775                 n/a
## 17787                 n/a
## 17793                 n/a
## 17800               16.26
## 17802                5.17
## 17803                4.82
## 17805                2.86
## 17815                 n/a
## 17823                 n/a
## 17845               33.47
## 17850                 n/a
## 17856               21.76
## 17895                9.72
## 17896               22.68
## 17897               21.94
## 17901                 n/a
## 17907                 n/a
## 17925                 n/a
## 17936                 n/a
## 17977                 n/a
## 17978                 n/a
## 18066               21.97
## 18067                3.81
## 18074                 n/a
## 18168                 n/a
## 18169               31.11
## 18170                 n/a
## 18171                 n/a
## 18173                 n/a
## 18174                 n/a
## 18176                 n/a
## 18177                 n/a
## 18178                 n/a
## 18216                 n/a
## 18232                 n/a
## 18254               20.39
## 18273                 n/a
## 18285                 n/a
## 18338                 n/a
## 18375                 n/a
## 18378                 n/a
## 18379                 n/a
## 18386                 n/a
## 18387                 n/a
## 18392                 n/a
## 18393                 n/a
## 18408                 n/a
## 18423                 n/a
## 18424                 n/a
## 18425                 n/a
## 18431                 n/a
## 18432                 n/a
## 18468                 n/a
## 18490                 n/a
## 18508                 n/a
## 18553                 n/a
## 18557                 n/a
## 18567                 n/a
## 18574                 n/a
## 18614                 n/a
## 18642                 n/a
## 18677               13.45
## 18719                 n/a
## 18726                 n/a
## 18762               22.84
## 18787                 n/a
## 18792                 n/a
## 18795                 n/a
## 18796                 n/a
## 18840                 n/a
## 18861                 n/a
## 18877                  16
## 18878                 n/a
## 18879                   5
## 18881                 n/a
## 18890                 n/a
## 18891                 n/a
## 18900                 n/a
## 18932                 n/a
## 18973                 n/a
## 18994                 n/a
## 19047                 n/a
## 19102                   7
## 19111                3.73
## 19115                 n/a
## 19147                 n/a
## 19169               23.27
## 19183               27.26
## 19190               17.04
## 19232                  15
## 19238                 n/a
## 19246                 n/a
## 19257                 n/a
## 19258                 n/a
## 19288                 n/a
## 19292                8.42
## 19293               34.97
## 19294                 n/a
## 19295               34.99
## 19296               24.41
## 19354                 n/a
## 19388                 n/a
## 19389                 n/a
## 19451                 n/a
## 19461                 n/a
## 19474                 n/a
## 19486               13.96
## 19492                 n/a
## 19568                 n/a
## 19612                 n/a
## 19626                 n/a
## 19649                 n/a
## 19659                 n/a
## 19664                 n/a
## 19690                9.82
## 19712                 n/a
## 19719                 n/a
## 19748               18.76
## 19756                17.7
## 19776                 n/a
## 19777                 n/a
## 19778                 n/a
## 19779                 n/a
## 19781                 n/a
## 19782                 n/a
## 19783                 n/a
## 19784                 n/a
## 19785                 n/a
## 19786                 n/a
## 19788                 n/a
## 19832                 n/a
## 19833                 n/a
## 19835                 n/a
## 19837                 n/a
## 19860                 n/a
## 19892                 n/a
## 19900                 n/a
## 19928               24.15
## 20031                 n/a
## 20032                 n/a
## 20033                 n/a
## 20034                 n/a
## 20035                 n/a
## 20036                 n/a
## 20061                 n/a
## 20099                 n/a
## 20101                 n/a
## 20161               31.62
## 20167                 n/a
## 20175                 n/a
## 20182                 n/a
## 20196                 n/a
## 20223                 n/a
## 20247                 n/a
## 20266                 n/a
## 20268                 n/a
## 20272                 n/a
## 20273                 n/a
## 20335                 n/a
## 20413               15.65
## 20424                 n/a
## 20545               23.39
## 20590                 n/a
## 20654                 n/a
## 20662                 n/a
## 20695                 n/a
## 20712                 n/a
## 20715                 n/a
## 20719                 n/a
## 20764                 n/a
## 20770                 n/a
## 20774                 n/a
## 20775                 n/a
## 20826                 n/a
## 20887               16.41
## 20927                 n/a
## 21008                8.91
## 21027               15.43
## 21040                 n/a
## 21073                 n/a
## 21095               17.81
## 21101                 n/a
## 21115                 n/a
## 21117                 n/a
## 21137               23.14
## 21140               23.77
## 21143                 n/a
## 21161                21.1
## 21251                 n/a
## 21283               20.33
## 21287                 n/a
## 21309                 n/a
## 21325                 n/a
## 21329                 n/a
## 21331                 n/a
## 21374                 n/a
## 21440                 n/a
## 21446                 n/a
## 21451                 n/a
## 21479                 n/a
## 21480                 n/a
## 21490                 n/a
## 21549                 n/a
## 21551                 n/a
## 21554                 n/a
## 21555                 n/a
## 21556                 n/a
## 21563                 n/a
## 21569                 n/a
## 21580                 n/a
## 21585                 n/a
## 21591               23.05
## 21596                 n/a
## 21602                 n/a
## 21607                 n/a
## 21608                 n/a
## 21610               20.66
## 21618                 n/a
## 21619                 n/a
## 21633                 n/a
## 21638                22.2
## 21641                 n/a
## 21646                 n/a
## 21647                 n/a
## 21656               31.78
## 21680                 n/a
## 21681                 n/a
## 21693                 n/a
## 21698                 n/a
## 21827                 n/a
## 21837                 n/a
## 21849                 n/a
## 21850                 n/a
## 21855                 n/a
## 21859                 n/a
## 21913                20.2
## 21914                 n/a
## 21916                   4
## 21917               21.09
## 21975                 n/a
## 22012               16.69
## 22028               21.32
## 22029                37.2
## 22033               24.27
## 22041                 n/a
## 22049                 n/a
## 22088                 n/a
## 22096                 n/a
## 22097                 n/a
## 22101                 n/a
## 22109                 n/a
## 22113                10.5
## 22114                 n/a
## 22115                 n/a
## 22117                 n/a
## 22125                 n/a
## 22133                 n/a
## 22134                 n/a
## 22135                 n/a
## 22136                 n/a
## 22137                 n/a
## 22138                 n/a
## 22139                 n/a
## 22157                 n/a
## 22168                 n/a
## 22172                 n/a
## 22174                 n/a
## 22175                 n/a
## 22176                 n/a
## 22177                 n/a
## 22178                 n/a
## 22179                 n/a
## 22180                 n/a
## 22199                 n/a
## 22202                21.3
## 22218                 n/a
## 22386                 n/a
## 22450                 n/a
## 22538                 n/a
## 22554                 n/a
## 22573                 n/a
## 22583                 n/a
## 22596               18.15
## 22626                1.23
## 22627                 n/a
## 22646                 n/a
## 22699                 n/a
## 22736                 n/a
## 22752                 n/a
## 22913                 n/a
## 22991                 n/a
## 22992                 n/a
## 23002                 n/a
## 23004                 n/a
## 23059                 n/a
## 23060                9.91
## 23087                 n/a
## 23115                 n/a
## 23144               14.53
## 23161                 n/a
## 23162                 n/a
## 23167                 n/a
## 23195                 n/a
## 23204                 n/a
## 23228                 n/a
## 23337                 n/a
## 23364                 n/a
## 23444                 n/a
## 23446                 n/a
## 23447                 n/a
## 23448                 n/a
## 23449                 n/a
## 23450                 n/a
## 23452                 n/a
## 23455                 n/a
## 23456                 n/a
## 23458                 n/a
## 23578                 n/a
## 23579                 n/a
## 23580                 n/a
## 23581                 n/a
## 23582                 n/a
## 23583                 n/a
## 23584                 n/a
## 23656                 n/a
## 23667                 n/a
## 23668                 n/a
## 23669                 n/a
## 23670                 n/a
## 23673                 n/a
## 23737                 n/a
## 23762                 n/a
## 23768                 n/a
## 23773                 n/a
## 23858                 n/a
## 23861                 n/a
## 23872                 n/a
## 23891                 n/a
## 23895                 n/a
## 23932                19.2
## 23935                 n/a
## 23938                 n/a
## 23939                 n/a
## 23949                 n/a
## 23951                 n/a
## 23952                 n/a
## 23953                 n/a
## 23959                 n/a
## 23964                 n/a
## 23965                 n/a
## 23971                 n/a
## 23972                 n/a
## 23974                 n/a
## 23975                 n/a
## 23979                 n/a
## 23980                 n/a
## 23985                 n/a
## 23988                 n/a
## 23991                 n/a
## 24066               21.97
## 24073               12.14
## 24074                 n/a
## 24088                 n/a
## 24093                 n/a
## 24101                 n/a
## 24122                 n/a
## 24128                 n/a
## 24186                 n/a
## 24379                 n/a
## 24396               17.67
## 24412                 n/a
## 24467                 n/a
## 24500                 n/a
## 24521                 n/a
## 24546                 n/a
## 24564               14.82
## 24599                 n/a
## 24600                 n/a
## 24634                 n/a
## 24636                 n/a
## 24639                 n/a
## 24642                 n/a
## 24701                 n/a
## 24706                 n/a
## 24756                 n/a
## 24757                 n/a
## 24794                 n/a
## 24819                 n/a
## 24852                 n/a
## 24866                 n/a
## 24871                 n/a
## 24899                 n/a
## 24994                 n/a
## 25047               21.71
## 25049                 n/a
## 25075                 n/a
## 25090                 n/a
## 25107                 n/a
## 25125                 n/a
## 25126                 n/a
## 25167                 n/a
## 25168                 n/a
## 25191                 n/a
## 25192                 n/a
## 25335                 n/a
## 25364                 n/a
## 25372                 n/a
## 25375                 n/a
## 25389                 n/a
## 25390                 n/a
## 25391                 n/a
## 25392                 n/a
## 25440               14.96
## 25444                 n/a
## 25445               15.28
## 25458                 n/a
## 25459                 n/a
## 25465                 n/a
## 25475                 n/a
## 25478                 n/a
## 25482                 n/a
## 25483                 n/a
## 25486                 n/a
## 25487                 n/a
## 25488                 n/a
## 25498                 n/a
## 25520               17.04
## 25578               10.39
## 25653               19.35
## 25693                 n/a
## 25748                 n/a
## 25797                 n/a
## 25808                 n/a
## 25842                 n/a
## 25858                 n/a
## 25867                 n/a
## 25868                 n/a
## 25877                 n/a
## 25917               22.25
## 25932                 n/a
## 25958               23.68
## 26038                10.5
## 26092               23.38
## 26097                 n/a
## 26112                 n/a
## 26114                 n/a
## 26118                 n/a
## 26166                  15
## 26172                 n/a
## 26286                 n/a
## 26289                 n/a
## 26327               17.02
## 26389                 n/a
## 26433                2.86
## 26530                 n/a
## 26532                 n/a
## 26590                 n/a
## 26602                 n/a
## 26606                 n/a
## 26632                 n/a
## 26677               11.19
## 26701                 n/a
## 26702                 n/a
## 26703                  22
## 26707                 n/a
## 26728                 n/a
## 26748                 n/a
## 26753                 n/a
## 26761                 n/a
## 26774                 n/a
## 26776                 n/a
## 26777                 n/a
## 26778                 n/a
## 26780                 n/a
## 26797                 n/a
## 26838                 n/a
## 26844               10.63
## 26851                 n/a
## 26852                 n/a
## 26856                 n/a
## 26860                 n/a
## 26875                 n/a
## 26886                 n/a
## 26888                 n/a
## 26889                 n/a
## 26890                 n/a
## 26892                 n/a
## 26907                 n/a
## 26915                 n/a
## 26916                 n/a
## 26924                 n/a
## 26930               42.63
## 26947                 n/a
## 27064                 n/a
## 27066                 n/a
## 27069                 n/a
## 27070                 n/a
## 27071                 n/a
## 27073                28.7
## 27076                 n/a
## 27078                 n/a
## 27082                 n/a
## 27083                 n/a
## 27085                 n/a
## 27086                 n/a
## 27087                 n/a
## 27089                 n/a
## 27098               18.03
## 27106               75.76
## 27111                 n/a
## 27115                 n/a
## 27121                 n/a
## 27151                 n/a
## 27157                 n/a
## 27175                 n/a
## 27176                 n/a
## 27188                 n/a
## 27229                 n/a
## 27238                 n/a
## 27266                 n/a
## 27283                 n/a
## 27390                 n/a
## 27478               12.53
## 27487                 n/a
## 27489                 n/a
## 27524                 n/a
## 27577                 n/a
## 27606                 n/a
## 27607                 n/a
## 27608                 n/a
## 27609                 n/a
## 27610                 n/a
## 27611                 n/a
## 27612                 n/a
## 27613                 n/a
## 27614                 n/a
## 27615                 n/a
## 27616                 n/a
## 27617                 n/a
## 27618                 n/a
## 27619                 n/a
## 27620                 n/a
## 27621                 n/a
## 27622                 n/a
## 27623                 n/a
## 27625                 n/a
## 27627                 n/a
## 27628                 n/a
## 27629                 n/a
## 27630                 n/a
## 27631                 n/a
## 27632                 n/a
## 27633                 n/a
## 27634                 n/a
## 27635                 n/a
## 27636                 n/a
## 27637                 n/a
## 27638                 n/a
## 27639                 n/a
## 27640                 n/a
## 27641                 n/a
## 27642                 n/a
## 27643                 n/a
## 27644                 n/a
## 27645                 n/a
## 27646                 n/a
## 27647                 n/a
## 27648                 n/a
## 27650                 n/a
## 27651                 n/a
## 27652                 n/a
## 27653                 n/a
## 27654                 n/a
## 27656                 n/a
## 27657                 n/a
## 27658                 n/a
## 27671                 n/a
## 27689                 n/a
## 27690                 n/a
## 27691                 n/a
## 27692                 n/a
## 27693                 n/a
## 27697                 n/a
## 27728                 n/a
## 27730                 n/a
## 27737                 n/a
## 27749                 n/a
## 27756                 n/a
## 27804                 n/a
## 27805                 n/a
## 27851                 n/a
## 27896               18.91
## 27913                 n/a
## 27935                 n/a
## 27937                 n/a
## 27942                 n/a
## 27946                 n/a
## 27977                 n/a
## 27998                 n/a
## 28085                 n/a
## 28086                 n/a
## 28087                 n/a
## 28089                 n/a
## 28090                 n/a
## 28091                 n/a
## 28093                 n/a
## 28095                 n/a
## 28101                 n/a
## 28107                 n/a
## 28120               13.75
## 28198                 n/a
## 28202                 n/a
## 28204                 n/a
## 28205                 n/a
## 28209                 n/a
## 28211                 n/a
## 28213                 n/a
## 28230                 n/a
## 28248                 n/a
## 28304                 n/a
## 28335                 n/a
## 28336                 n/a
## 28338                 n/a
## 28339                 n/a
## 28340               54.56
## 28341                 n/a
## 28346                 n/a
## 28348               16.76
## 28354                 n/a
## 28400                 n/a
## 28432                 n/a
## 28445                 n/a
## 28450                 n/a
## 28454                 n/a
## 28472                 n/a
## 28475               18.19
## 28508                 n/a
## 28547                 n/a
## 28574                 n/a
## 28579                 n/a
## 28585                 n/a
## 28606               11.03
## 28628                 n/a
## 28659                 n/a
## 28660                 n/a
## 28661                 n/a
## 28730                 n/a
## 28754                 n/a
## 28781                 n/a
## 28791                 n/a
## 28830                 n/a
## 28842                 n/a
## 28843                 n/a
## 28921                 n/a
## 28922                 n/a
## 28932                 n/a
## 28933                 n/a
## 28989                 n/a
## 28991                 n/a
## 28994               25.18
## 28995               32.63
## 28996               32.55
## 29010                 n/a
## 29013                 n/a
## 29016                 n/a
## 29022                 n/a
## 29026                 n/a
## 29100                 n/a
## 29101                 n/a
## 29105                 n/a
## 29128                 n/a
## 29178                 n/a
## 29195                 n/a
## 29207                 n/a
## 29208                 n/a
## 29216                 n/a
## 29218                 n/a
## 29230                 n/a
## 29251                32.5
## 29300                 n/a
## 29311                 n/a
## 29318                 n/a
## 29395                 n/a
## 29398                  23
## 29406                 n/a
## 29407                 n/a
## 29410                 n/a
## 29411                 n/a
## 29422                 n/a
## 29423                 n/a
## 29428                 n/a
## 29527                 n/a
## 29546                 n/a
## 29569                 n/a
## 29587               21.34
## 29596               18.19
## 29652                   9
## 29669                14.5
## 29702                 n/a
## 29757                 n/a
## 29795               16.35
## 29818                7.92
## 29871                 n/a
## 29882                 n/a
## 29937                 n/a
## 29939                 n/a
## 29953                 n/a
## 29977                 n/a
## 30024                 n/a
## 30028                 n/a
## 30029                 n/a
## 30031                 n/a
## 30058                 n/a
## 30153                 n/a
## 30256                 n/a
## 30260                 n/a
## 30325                 n/a
## 30333                 n/a
## 30347                 n/a
## 30349                 n/a
## 30489                 n/a
## 30490                 n/a
## 30502                 n/a
## 30505                 n/a
## 30521                 n/a
## 30590                 n/a
## 30609               17.45
## 30616                 n/a
## 30721                 n/a
## 30723                 n/a
## 30781                 n/a
## 30783                 n/a
## 30784                 n/a
## 30787                 n/a
## 30788                 n/a
## 30849               17.97
## 30870                 n/a
## 30872               22.65
## 30875               16.61
## 30876                17.5
## 30886                 n/a
## 30900               12.08
## 30920                 n/a
## 30928                 n/a
## 30929                 n/a
## 30933                 n/a
## 30957                 n/a
## 31043                 n/a
## 31107                 n/a
## 31115                 n/a
## 31168                 n/a
## 31197                 n/a
## 31223                 n/a
## 31250                17.3
## 31252                 n/a
## 31298                 n/a
## 31299                 n/a
## 31314                 n/a
## 31327                 n/a
## 31328                 n/a
## 31357                 n/a
## 31388               12.08
## 31390               10.77
## 31395               15.29
## 31463                 n/a
## 31464                 n/a
## 31465                 n/a
## 31467                 n/a
## 31559                 n/a
## 31645               20.67
## 31699                 n/a
## 31709                 n/a
## 31733                 n/a
## 31740                 n/a
## 31751                 n/a
## 31829                 n/a
## 31831                 n/a
## 31845                34.8
## 31850                 n/a
## 31852                 n/a
## 31883                 n/a
## 31888                 n/a
## 31910                 n/a
## 31941               16.46
## 31942               13.42
## 31957               14.44
## 31968                 n/a
## 31973                 n/a
## 31989                 n/a
## 32006                 n/a
## 32010                 n/a
## 32014                 n/a
## 32036                 n/a
## 32054                 n/a
## 32060                 n/a
## 32081                 n/a
## 32082                 n/a
## 32142                 n/a
## 32176                 n/a
## 32179                 n/a
## 32273                 n/a
## 32297                 n/a
## 32298                 n/a
## 32349                 n/a
## 32366                 n/a
## 32474                14.8
## 32573                 n/a
## 32574                 n/a
## 32576                 n/a
## 32577                 n/a
## 32578                 n/a
## 32579                 n/a
## 32580                 n/a
## 32581                 n/a
## 32639                 n/a
## 32640                 n/a
## 32641                 n/a
## 32642                 n/a
## 32651                 n/a
## 32710                 n/a
## 32733                 n/a
## 32738                 n/a
## 32753               21.82
## 32768               18.23
## 32779                 n/a
## 32784                 n/a
## 32785                 n/a
## 32786                 n/a
## 32787                 n/a
## 32805                 n/a
## 32822                 n/a
## 32879                  19
## 32984                 n/a
## 33021                 n/a
## 33083                 n/a
## 33104                 n/a
## 33122                19.1
## 33198                23.7
## 33228                 n/a
## 33263               18.22
## 33281                  22
## 33292                 n/a
## 33293                  12
## 33317                24.9
## 33337               28.77
## 33343               26.95
## 33344               25.58
## 33360                 n/a
## 33388               14.25
## 33416                 n/a
## 33473                 n/a
## 33496                 n/a
## 33499                 n/a
## 33536               21.25
## 33562                 n/a
## 33591                 n/a
## 33592                 n/a
## 33614                 n/a
## 33620               27.13
## 33666               23.65
## 33701               26.64
## 33758                 n/a
## 33804                 n/a
## 33805                 n/a
## 33829                 n/a
## 33945                 n/a
## 33950                 n/a
## 33956                 n/a
## 33971                 n/a
## 33973                 n/a
## 33976                 n/a
## 33979                 n/a
## 33994                 n/a
## 34050                 n/a
## 34077                 n/a
## 34078                 n/a
## 34079                 n/a
## 34124                 n/a
## 34145                 n/a
## 34152                  20
## 34183                7.05
## 34190                14.5
## 34193               14.85
## 34197                 n/a
## 34227                 n/a
## 34235                 n/a
## 34236                 n/a
## 34237                 n/a
## 34238                 n/a
## 34239                 n/a
## 34240                 n/a
## 34241                 n/a
## 34242                 n/a
## 34243                 n/a
## 34244                 n/a
## 34245                 n/a
## 34246                 n/a
## 34247                 n/a
## 34248                 n/a
## 34249                 n/a
## 34250                 n/a
## 34251                 n/a
## 34252                 n/a
## 34253                 n/a
## 34254                 n/a
## 34255                 n/a
## 34256                 n/a
## 34302               24.93
## 34303               25.14
## 34323                 n/a
## 34329                 n/a
## 34331               22.79
## 34336                 n/a
## 34341                9.86
## 34359                 n/a
## 34365               16.07
## 34369                 n/a
## 34436                9.33
## 34439                 n/a
## 34445                 n/a
## 34525                 n/a
## 34559                 n/a
## 34560                 n/a
## 34583                 n/a
## 34719                 n/a
## 34743                 n/a
## 34752               12.07
## 34754               15.36
## 34797                 n/a
## 34855                24.2
## 34870                 n/a
## 34968                 n/a
## 34969                 n/a
## 34971               12.17
## 35001                 n/a
## 35040                  28
## 35065                 n/a
## 35069                 n/a
## 35075                 n/a
## 35076                 n/a
## 35077               16.88
## 35096               30.37
## 35134                 n/a
## 35143                 n/a
## 35152                 n/a
## 35167                 n/a
## 35168                 n/a
## 35169                 n/a
## 35252                 n/a
## 35261                 n/a
## 35271                 n/a
## 35289               15.66
## 35294                 n/a
## 35338                 n/a
## 35339                 n/a
## 35428                 n/a
## 35457                 n/a
## 35479                 n/a
## 35494                 n/a
## 35595                 n/a
## 35694                 n/a
## 35695                 n/a
## 35696                 n/a
## 35697                 n/a
## 35875                 n/a
## 35962               19.35
## 35972                 n/a
## 35973                 n/a
## 36024                 n/a
## 36025                 n/a
## 36026                 n/a
## 36038                 n/a
## 36065                 n/a
## 36116                 n/a
## 36316                 n/a
## 36382                 n/a
## 36383                 n/a
## 36384                 n/a
## 36385                 n/a
## 36402                 n/a
## 36449                 n/a
## 36458                 n/a
## 36510                 n/a
## 36557                9.85
## 36571                 n/a
## 36588                 n/a
## 36661                 n/a
## 36680               13.38
## 36691                 n/a
## 36692                 n/a
## 36693                 n/a
## 36694                 n/a
## 36696               33.76
## 36699                 n/a
## 36752                 n/a
## 36807                 n/a
## 36808                 n/a
## 36809                 n/a
## 36821                 n/a
## 36893                 n/a
## 36894                 n/a
## 36966                 n/a
## 36988                 n/a
## 37076                12.5
## 37138                 n/a
## 37158                 n/a
## 37197                 n/a
## 37227                 n/a
## 37243                 n/a
## 37265                 n/a
## 37373                 n/a
## 37421                 n/a
## 37447                 n/a
## 37458                 n/a
## 37522                 n/a
## 37523                 n/a
## 37542                 n/a
## 37575                 n/a
## 37581                 n/a
## 37638                 n/a
## 37668               14.53
## 37731                 n/a
## 37751                 n/a
## 37754                 n/a
## 37759                 n/a
## 37790                 n/a
## 37795                 n/a
## 37841               21.82
## 37866                 n/a
## 37869                 n/a
## 37871                 n/a
## 37872                 n/a
## 37877                 n/a
## 37892               11.26
## 37932                 n/a
## 37933               23.12
## 37934               23.79
## 37940                 n/a
## 37941                 n/a
## 37947                 n/a
## 37950                 n/a
## 37951                 n/a
## 37952                 n/a
## 37981                 n/a
## 37982                 n/a
## 38055                 n/a
## 38057                 n/a
## 38127               12.69
## 38149                 n/a
## 38151                 n/a
## 38153                 n/a
## 38154                 n/a
## 38160                 n/a
## 38169                 n/a
## 38212                 n/a
## 38214                 n/a
## 38238                 n/a
## 38251                 n/a
## 38340                 n/a
## 38349               29.56
## 38427                 n/a
## 38433                 n/a
## 38453                 n/a
## 38522                 n/a
## 38526                 n/a
## 38541                 n/a
## 38560                46.4
## 38561                 n/a
## 38562                 n/a
## 38596                 n/a
## 38607                 n/a
## 38608                 n/a
## 38609                 n/a
## 38622                 n/a
## 38626                 n/a
## 38627                 n/a
## 38628                 n/a
## 38629                 n/a
## 38631                 n/a
## 38632                 n/a
## 38688                 n/a
## 38690                 n/a
## 38711                 n/a
## 38736                 n/a
## 38787                 n/a
## 38799                 n/a
## 38809                 n/a
## 38810                 n/a
## 38815                 n/a
## 38895                 n/a
## 38916                 n/a
## 38933                 n/a
## 38962                 n/a
## 38970                 n/a
## 39085                 n/a
## 39089                 n/a
## 39124                 n/a
## 39138                 n/a
## 39173                 n/a
## 39213                 n/a
## 39289                 n/a
## 39457                 n/a
## 39458                 n/a
## 39459                 n/a
## 39466                 n/a
## 39480                 n/a
## 39511                 n/a
## 39525                 n/a
## 39526                 n/a
## 39534                 n/a
## 39535                 n/a
## 39536                 n/a
## 39585               24.18
## 39592               23.48
## 39600               14.99
## 39636                 n/a
## 39638                   3
## 39672                 n/a
## 39677                 n/a
## 39739                 n/a
## 39743                 n/a
## 39772                 n/a
## 39775                 n/a
## 39777                 n/a
## 39778               11.67
## 39780                 n/a
## 39781                 n/a
## 39795                 n/a
## 39874                 n/a
## 39915                 n/a
## 39933               21.19
## 39959                 n/a
## 39961                 n/a
## 39962                 n/a
## 39976                 n/a
## 39978                 n/a
## 39979                 n/a
## 39980                 n/a
## 40009                 n/a
## 40025                 n/a
## 40044               22.29
## 40065                 n/a
## 40068                 n/a
## 40070                 n/a
## 40071                 n/a
## 40073                 n/a
## 40074                 n/a
## 40075                 n/a
## 40077                 n/a
## 40078                 n/a
## 40079                 n/a
## 40081                 n/a
## 40138                 n/a
## 40145                 n/a
## 40146                 n/a
## 40243                 n/a
## 40253                 n/a
## 40255                6.92
## 40354               10.41
## 40383                 n/a
## 40402                 n/a
## 40421                 n/a
## 40449               16.32
## 40520                 n/a
## 40521                 n/a
## 40522                 n/a
## 40534                 n/a
## 40537                 n/a
## 40561               22.13
## 40592                 n/a
## 40595                 n/a
## 40598                 n/a
## 40657                 n/a
## 40730                 n/a
## 40732                 n/a
## 40733                 n/a
## 40735                 n/a
## 40762                 n/a
## 40763                 n/a
## 40789                 n/a
## 40808                14.5
## 40832                 n/a
## 40851                 n/a
## 40918                 n/a
## 41002                 n/a
## 41005                 n/a
## 41020                 n/a
## 41021                 n/a
## 41034               29.14
## 41035               27.15
## 41036                5.83
## 41038               16.38
## 41053                 n/a
## 41054                 n/a
## 41097                 n/a
## 41098                 n/a
## 41099                 n/a
## 41100                 n/a
## 41101                 n/a
## 41109                 n/a
## 41110                 n/a
## 41111                 n/a
## 41112                 n/a
## 41113                 n/a
## 41114                 n/a
## 41115                 n/a
## 41123                 n/a
## 41124                 n/a
## 41125                 n/a
## 41126                 n/a
## 41139                 n/a
## 41140                 n/a
## 41141                 n/a
## 41142                 n/a
## 41143                 n/a
## 41146                 n/a
## 41186                 n/a
## 41198                 n/a
## 41241                 n/a
## 41257                 n/a
## 41277                 n/a
## 41301               11.26
## 41307               11.19
## 41310                9.88
## 41316               23.75
## 41331                 n/a
## 41342                 n/a
## 41344                 n/a
## 41395                 n/a
## 41402                 3.5
## 41486                 n/a
## 41488                 n/a
## 41542               20.96
## 41545                 n/a
## 41574                 n/a
## 41577                 n/a
## 41599                 n/a
## 41600                 n/a
## 41607               23.53
## 41608               28.12
## 41609               29.35
## 41611               24.53
## 41612               23.14
## 41616                 n/a
## 41626                 n/a
## 41629                 n/a
## 41633                 n/a
## 41637                 n/a
## 41640                 n/a
## 41641                 n/a
## 41642                 n/a
## 41643                 n/a
## 41644                 n/a
## 41652                 n/a
## 41685                 n/a
## 41686                 n/a
## 41704                 n/a
## 41716               19.62
## 41719                 n/a
## 41720                 n/a
## 41725                 n/a
## 41735                 n/a
## 41753                 n/a
## 41792                  15
## 41847                 n/a
## 41854                 n/a
## 41907               18.25
## 42016                 n/a
## 42029               16.61
## 42040                 n/a
## 42054                 n/a
## 42062                 n/a
## 42121               17.26
## 42142                 n/a
## 42154                 n/a
## 42157                 n/a
## 42173                 n/a
## 42180               31.19
## 42183                 n/a
## 42252                 n/a
## 42338               13.67
## 42388                 n/a
## 42409               18.52
## 42424                 n/a
## 42429                 n/a
## 42448                13.8
## 42485                 n/a
## 42490                 n/a
## 42495                 n/a
## 42523                 n/a
## 42525                 n/a
## 42526                 n/a
## 42636                 n/a
## 42637                 n/a
## 42644                 n/a
## 42652                 n/a
## 42653                 n/a
## 42654                 n/a
## 42661                 n/a
## 42704                 n/a
## 42705                 n/a
## 42706                 n/a
## 42707                 n/a
## 42708                 n/a
## 42803                 n/a
## 42845                 n/a
## 42911                 n/a
## 42913                 n/a
## 42961                 n/a
## 42992                 n/a
## 43046                  12
## 43053               12.54
## 43163                 n/a
## 43164                 n/a
## 43165                 n/a
## 43181                 n/a
## 43220                 n/a
## 43239                 n/a
## 43244                 n/a
## 43245                 n/a
## 43248                 n/a
## 43249                 n/a
## 43250                 n/a
## 43251                 n/a
## 43253                 n/a
## 43302               12.11
## 43366                   9
## 43500               13.06
## 43509                 n/a
## 43531                 n/a
## 43532                 n/a
## 43533                 n/a
## 43564                 n/a
## 43637                 n/a
## 43638                 n/a
## 43667                19.9
## 43668               18.54
## 43673               18.28
## 43674               17.73
## 43786                 n/a
## 43794                  13
## 43800                 n/a
## 43833                 n/a
## 43839                 n/a
## 43840                 n/a
## 43841                 n/a
## 43843                 n/a
## 43858                 n/a
## 43909                 n/a
## 43914                3.87
## 43941               22.64
## 43942               25.22
## 43943               22.13
## 43945                 n/a
## 44002                 n/a
## 44016                 n/a
## 44041                 n/a
## 44043                 n/a
## 44151                 n/a
## 44166                 n/a
## 44189               15.82
## 44227                 n/a
## 44236                 n/a
## 44246                 n/a
## 44271                 n/a
## 44319                 n/a
## 44347               17.64
## 44393                 n/a
## 44425                11.8
## 44435                 n/a
## 44557                 n/a
## 44649                 n/a
## 44763                 n/a
## 44764                 n/a
## 44766                8.27
## 44768                 n/a
## 44778                 n/a
## 44781                 n/a
## 44786                 n/a
## 44791                 n/a
## 44829                 n/a
## 44955                 n/a
## 44961               25.14
## 44993                 n/a
## 44994                 n/a
## 44995                12.5
## 45101               22.15
## 45145                  14
## 45174                   7
## 45183                 n/a
## 45188                 n/a
## 45207                 n/a
## 45226                 n/a
## 45241                 n/a
## 45243                 n/a
## 45244                 n/a
## 45245                 n/a
## 45247                 n/a
## 45249                 n/a
## 45252                 n/a
## 45255                 n/a
## 45256                 n/a
## 45259                 n/a
## 45260                 n/a
## 45266               15.41
## 45314                 n/a
## 45316               23.08
## 45322                 n/a
## 45323                 n/a
## 45324                 n/a
## 45325                 n/a
## 45326                 n/a
## 45327                 n/a
## 45328                 n/a
## 45351                 n/a
## 45383                 n/a
## 45384                 n/a
## 45385                 n/a
## 45389                 n/a
## 45393                 n/a
## 45401                 n/a
## 45449                 n/a
## 45467                  12
## 45549                 n/a
## 45550               15.39
## 45558                 n/a
## 45562                 n/a
## 45563                 n/a
## 45566                 n/a
## 45568                 n/a
## 45591                 n/a
## 45592                 n/a
## 45646                 n/a
## 45706                 n/a
## 45803                 n/a
## 45907                 n/a
## 45918                 n/a
## 45946                 n/a
## 46044               20.58
## 46105                 n/a
## 46107                 n/a
## 46166               16.97
## 46187                 n/a
## 46203                 n/a
## 46226                 n/a
## 46233                 n/a
## 46234                 n/a
## 46289                 n/a
## 46375               23.08
## 46430                 n/a
## 46455                 n/a
## 46456                 n/a
## 46457                 n/a
## 46458                 n/a
## 46468                 n/a
## 46471                 n/a
## 46472                 n/a
## 46473                  11
## 46475                 n/a
## 46476                6.96
## 46492                 n/a
## 46500                8.62
## 46501                28.3
## 46641                 n/a
## 46672                 n/a
## 46673                 n/a
## 46752                 n/a
## 46925                 n/a
## 46926                 n/a
## 46956               12.15
## 46970                  24
## 46978                 n/a
## 47007                 n/a
## 47096                 n/a
## 47101                 n/a
## 47254                 n/a
## 47256               17.35
## 47270                 n/a
## 47303                 n/a
## 47324               23.64
## 47326               25.04
## 47344                 n/a
## 47427                 n/a
## 47433                 n/a
## 47434                 n/a
## 47435                 n/a
## 47459                 n/a
## 47466                 n/a
## 47477                 n/a
## 47478                 n/a
## 47498               10.48
## 47515                 n/a
## 47568               13.19
## 47580                 n/a
## 47581                 n/a
## 47583                 n/a
## 47603                 n/a
## 47659                 n/a
## 47660                 n/a
## 47661                 n/a
## 47662                 n/a
## 47682                7.43
## 47693                19.6
## 47730                13.2
## 47732                9.57
## 47761                 n/a
## 47770                 n/a
## 47775                 n/a
## 47820               12.45
## 47924                 n/a
## 47937                 n/a
## 47938                 n/a
## 47959                 n/a
## 48017                 n/a
## 48020                 n/a
## 48021                 n/a
## 48022                 n/a
## 48034                 n/a
## 48096                 n/a
## 48136                 n/a
## 48187                 n/a
## 48189                 n/a
## 48192               10.91
## 48195                 n/a
## 48200                 n/a
## 48275                 n/a
## 48277                 n/a
## 48279                 n/a
## 48315                13.4
## 48389                 n/a
## 48400                 n/a
## 48509                 n/a
## 48515                 n/a
## 48534                 n/a
## 48594                 n/a
## 48634               15.66
## 48661                 n/a
## 48677                 n/a
## 48737                 n/a
## 48748                 n/a
## 48779                 n/a
## 48786                 n/a
## 48802                 n/a
## 48813                 n/a
## 48835                 n/a
## 48863                 n/a
## 48945               26.71
## 48956                 n/a
## 48987                 n/a
## 49000                 n/a
## 49040                 n/a
## 49052                 n/a
## 49123                 n/a
## 49124                 n/a
## 49126                 n/a
## 49177                 n/a
## 49179                 n/a
## 49180                 n/a
## 49192                 n/a
## 49193                 n/a
## 49194                 n/a
## 49195                 n/a
## 49196                 n/a
## 49197                 n/a
## 49232                15.9
## 49240                13.5
## 49247                 n/a
## 49255               26.67
## 49256                 n/a
## 49257                 n/a
## 49258                 n/a
## 49259                 n/a
## 49262                 n/a
## 49263               21.23
## 49269                 n/a
## 49353                 n/a
## 49355                 n/a
## 49429                 n/a
## 49430                 n/a
## 49480                 n/a
## 49511                 n/a
## 49519                 n/a
## 49523                 n/a
## 49524                 n/a
## 49526                 n/a
## 49527                 n/a
## 49529                 n/a
## 49530                 n/a
## 49531                 n/a
## 49533                 n/a
## 49534                 n/a
## 49535                 n/a
## 49536                 n/a
## 49537                 n/a
## 49538                 n/a
## 49539                 n/a
## 49540                 n/a
## 49557                 n/a
## 49558                 n/a
## 49559                 n/a
## 49591                 n/a
## 49618                 n/a
## 49620                 n/a
## 49621                 n/a
## 49623                 n/a
## 49645               18.95
## 49646                 n/a
## 49682               21.58
## 49726                 n/a
## 49742                 n/a
## 49743                 n/a
## 49890                 n/a
## 49892                 n/a
## 49893                 n/a
## 49894                 n/a
## 49895                 n/a
## 49982                 n/a
## 50014                 n/a
## 50039               21.57
## 50092                 n/a
## 50097                 n/a
## 50099                 n/a
## 50223                 n/a
## 50289                 n/a
## 50290                 n/a
## 50295                 n/a
## 50296                 n/a
## 50303                 n/a
## 50304                 n/a
## 50305                 n/a
## 50315               14.39
## 50355                 n/a
## 50366               27.64
## 50368                 n/a
## 50370                 n/a
## 50400                 n/a
## 50403                 n/a
## 50465                 n/a
## 50478                 n/a
## 50479                 n/a
## 50493                 n/a
## 50495                 n/a
## 50522                 n/a
## 50561               15.51
## 50830               13.66
## 50899                 n/a
## 50901                 n/a
## 50911                 n/a
## 50916                 n/a
## 50951                 n/a
## 50952                 n/a
## 50965                 n/a
## 50966                 n/a
## 51003                 n/a
## 51022                 n/a
## 51083                 n/a
## 51093               13.08
## 51196                 n/a
## 51203                9.66
## 51222                 n/a
## 51237                 n/a
## 51243                21.2
## 51284               15.61
## 51321                  16
## 51326                 n/a
## 51358                24.5
## 51374               22.94
## 51419                 n/a
## 51459                 n/a
## 51461                 n/a
## 51476                 n/a
## 51502                 n/a
## 51573                 n/a
## 51590                 n/a
## 51594               16.19
## 51613                 n/a
## 51637                 n/a
## 51686                 n/a
## 51712                  20
## 51720                 n/a
## 51722                 n/a
## 51728                 n/a
## 51735                 n/a
## 51736                 n/a
## 51737                 n/a
## 51738                 n/a
## 51739                 n/a
## 51740                 n/a
## 51741                 n/a
## 51765                 n/a
## 51809                 n/a
## 51811               19.85
## 51910                 n/a
## 51936                 n/a
## 51963                 n/a
## 52033                 n/a
## 52055                 n/a
## 52063                 n/a
## 52069                 n/a
## 52092                 n/a
## 52129                 n/a
## 52139                 n/a
## 52154                 n/a
## 52155                 n/a
## 52204                 n/a
## 52210               23.12
## 52219                9.43
## 52222                 n/a
## 52285                 n/a
## 52375                 n/a
## 52420               17.23
## 52433                 n/a
## 52434                 n/a
## 52462                 n/a
## 52512                 n/a
## 52544                22.6
## 52568                 n/a
## 52677               25.65
## 52705               23.31
## 52711                 n/a
## 52713                 n/a
## 52714                 n/a
## 52752               13.47
## 52763               15.91
## 52785                 n/a
## 52794               16.78
## 52828               17.76
## 52837                 n/a
## 52847                 n/a
## 52875               12.34
## 52988                 n/a
## 52998                 n/a
## 53039                 n/a
## 53054                 n/a
## 53072                 n/a
## 53073                 n/a
## 53075                 n/a
## 53176                 n/a
## 53239                 n/a
## 53242                 n/a
## 53243                 n/a
## 53244                 n/a
## 53297                 n/a
## 53314                 n/a
## 53319                 n/a
## 53341                 n/a
## 53392                 n/a
## 53407                 n/a
## 53461                8.86
## 53472                 n/a
## 53473                 n/a
## 53474                 n/a
## 53589                 n/a
## 53620                 n/a
## 53705                 n/a
## 53730                 n/a
## 53733                 n/a
## 53734                 n/a
## 53846                19.5
## 53862                 n/a
## 53863                 n/a
## 53922                6.21
## 53978                 n/a
## 53985                 n/a
## 54026                 n/a
## 54028                 n/a
## 54138                 n/a
## 54154               14.17
## 54186                 n/a
## 54231                 n/a
## 54252                 n/a
## 54264                 n/a
## 54265                 n/a
## 54288                 n/a
## 54296                 n/a
## 54301                 n/a
## 54336                 n/a
## 54347                 n/a
## 54357                 n/a
## 54405                 n/a
## 54414                 n/a
## 54416                 n/a
## 54426                 n/a
## 54637                 n/a
## 54646                 n/a
## 54683                 n/a
## 54691                 n/a
## 54721                 n/a
## 54743                 n/a
## 54765                 n/a
## 54791                 n/a
## 54907                 n/a
## 54946                 n/a
## 54972                2.31
## 54976                 n/a
## 55018               17.96
## 55110                 n/a
## 55121               16.29
## 55164                 n/a
## 55166                 n/a
## 55187                 n/a
## 55203                 n/a
## 55238                 n/a
## 55239                 n/a
## 55291                 n/a
## 55298                 n/a
## 55299                 n/a
## 55300                 n/a
## 55306                 n/a
## 55307                 n/a
## 55309                 n/a
## 55312                 n/a
## 55314                 n/a
## 55317                 n/a
## 55323                 n/a
## 55331               10.31
## 55369                 n/a
## 55412                  10
## 55413                4.67
## 55414               18.64
## 55530                 n/a
## 55677                 n/a
## 55748                8.62
## 55754               12.55
## 55901                 n/a
## 55902                 n/a
## 55903                 n/a
## 56099                 n/a
## 56102                 n/a
## 56123                15.4
## 56133                 n/a
## 56183                 n/a
## 56184                 n/a
## 56213                 n/a
## 56232                 n/a
## 56233                 n/a
## 56243                 n/a
## 56295                 n/a
## 56337                 n/a
## 56358                 n/a
## 56361                 n/a
## 56384                 n/a
## 56419                 n/a
## 56428               24.63
## 56619                 n/a
## 56678                 n/a
## 56739                 n/a
## 56817                 n/a
## 56838                 n/a
## 56863                 n/a
## 56873                 n/a
## 56880                 n/a
## 56904                 n/a
## 56918                 n/a
## 56931               10.52
## 56932                5.58
## 56933               15.32
## 56982                 n/a
## 57060                 n/a
## 57140               26.53
## 57141                  19
## 57144               33.53
## 57152                 n/a
## 57160                 n/a
## 57161                 n/a
## 57167                 n/a
## 57171                 n/a
## 57198                 n/a
## 57199                 n/a
## 57226                 n/a
## 57228                 n/a
## 57230                 n/a
## 57231                 n/a
## 57234                 n/a
## 57238                 n/a
## 57252                 n/a
## 57264                 n/a
## 57270                 n/a
## 57276                 n/a
## 57278                 n/a
## 57287                 n/a
## 57288                 n/a
## 57289                 n/a
## 57297                 n/a
## 57298                 n/a
## 57354                 n/a
## 57379                 n/a
## 57385                 n/a
## 57420                 n/a
## 57472                 n/a
## 57478                 n/a
## 57533                 n/a
## 57571                 n/a
## 57595                 n/a
## 57596                 n/a
## 57603                 n/a
## 57604                 n/a
## 57609                 n/a
## 57656                 n/a
## 57665                 n/a
## 57685               15.09
## 57688                 n/a
## 57689                 n/a
## 57690                 n/a
## 57691                 n/a
## 57692                 n/a
## 57694                 n/a
## 57695                 n/a
## 57696                 n/a
## 57778                 n/a
## 57780                 n/a
## 57788                 n/a
## 57791                 n/a
## 57800                 n/a
## 57848                 n/a
## 57882                 n/a
## 57904               14.31
## 57907               13.39
## 57912                 n/a
## 57913                 n/a
## 57925                  25
## 57927                 n/a
## 57966                 n/a
## 57984                 n/a
## 57993                 n/a
## 58065                 n/a
## 58141                 n/a
## 58185                 n/a
## 58204                 n/a
## 58205                 n/a
## 58219                 n/a
## 58222                 n/a
## 58355                 n/a
## 58359                 n/a
## 58363               23.82
## 58371                 n/a
## 58373                 n/a
## 58383                 n/a
## 58393                 n/a
## 58400                 n/a
## 58405                11.4
## 58420                 n/a
## 58432                 n/a
## 58489                 n/a
## 58492                 n/a
## 58502                 n/a
## 58505                 n/a
## 58506                 n/a
## 58520                 n/a
## 58530                 n/a
## 58536                 n/a
## 58537                 n/a
## 58554                  22
## 58555                 n/a
## 58571                 n/a
## 58572                 n/a
## 58573                 n/a
## 58600               19.75
## 58635                 n/a
## 58658               21.67
## 58701                 n/a
## 58702                 n/a
## 58707                 n/a
## 58741                 n/a
## 58747                 n/a
## 58800                 n/a
## 58813                 n/a
## 58814                 n/a
## 58817                 n/a
## 58821                 n/a
## 58822                 n/a
## 58823                 n/a
## 58824                 n/a
## 58843                 n/a
## 58848               25.08
## 58930                 n/a
## 58953                 n/a
## 58954               26.38
## 58981                 n/a
## 58985                 n/a
## 58987                 n/a
## 58988                 n/a
## 58989                 n/a
## 58991                 n/a
## 58992                 n/a
## 58995                 n/a
## 59000                 n/a
## 59006                 n/a
## 59007                 n/a
## 59016                 n/a
## 59031                 n/a
## 59035                 n/a
## 59038                 n/a
## 59076                 n/a
## 59081                 n/a
## 59091                 n/a
## 59108                 n/a
## 59129                 n/a
## 59158                 n/a
## 59205                 n/a
## 59331                 n/a
## 59335                 n/a
## 59346                 n/a
## 59351                 n/a
## 59355                 n/a
## 59359                 n/a
## 59360                 n/a
## 59416                 n/a
## 59421                 n/a
## 59447                 n/a
## 59472                 n/a
## 59477                 n/a
## 59478                 n/a
## 59482                 n/a
## 59489               11.06
## 59491                14.8
## 59534                 n/a
## 59564                 n/a
## 59677                 n/a
## 59716                 n/a
## 59758                 n/a
## 59759                 n/a
## 59770                 n/a
## 59848                 n/a
## 59861                 n/a
## 59864                 n/a
## 59865               21.17
## 59868                 n/a
## 59870                 n/a
## 59875                 n/a
## 59877                 n/a
## 59881               31.91
## 59886                  20
## 59901                 n/a
## 59917                 n/a
## 59922                 n/a
## 59924                 n/a
## 59928                 n/a
## 59933                 n/a
## 59967               28.35
## 60008                 n/a
## 60040                 n/a
## 60041                 n/a
## 60043                 n/a
## 60058                 n/a
## 60068                 n/a
## 60081                 n/a
## 60084                 n/a
## 60089                 n/a
## 60098                 n/a
## 60099                 n/a
## 60113                 n/a
## 60118                 n/a
## 60162                 n/a
## 60254                18.8
## 60255                 n/a
## 60276                 n/a
## 60285                 n/a
## 60289                 n/a
## 60300                 n/a
## 60329                 n/a
## 60346                 n/a
## 60368                 n/a
## 60375               20.25
## 60464                 n/a
## 60517                 n/a
## 60528                 n/a
## 60558                 n/a
## 60606                 n/a
## 60658                 n/a
## 60662                13.8
## 60679                3.77
## 60682                 n/a
## 60683                 n/a
## 60689                 n/a
## 60721                 n/a
## 60755                 n/a
## 60764                 n/a
## 60765                 n/a
## 60768                 n/a
## 60787                 n/a
## 60859                 n/a
## 60860                 n/a
## 60862                 n/a
## 60863                 n/a
## 60864                 n/a
## 60865                 n/a
## 60932                 n/a
## 60938               25.57
## 60940                 n/a
## 60941                 n/a
## 60942                 n/a
## 60943                 n/a
## 60944                 n/a
## 60945                 n/a
## 60946                 n/a
## 60947                 n/a
## 60948                 n/a
## 60956                 n/a
## 60994                 n/a
## 61018                 n/a
## 61021                 n/a
## 61022                 n/a
## 61023                 n/a
## 61024                 n/a
## 61025                 n/a
## 61027                 n/a
## 61028                 n/a
## 61029                 n/a
## 61030                 n/a
## 61031                 n/a
## 61032                 n/a
## 61051                 n/a
## 61054                 n/a
## 61055                 n/a
## 61065                13.4
## 61070                 n/a
## 61073                 n/a
## 61077                 n/a
## 61140                 n/a
## 61161                 n/a
## 61222                 n/a
## 61225                 n/a
## 61229               12.64
## 61270                8.51
## 61284                 n/a
## 61296                 n/a
## 61298                 n/a
## 61356                 n/a
## 61357                14.4
## 61359               15.09
## 61360               16.48
## 61369                 n/a
## 61376                 n/a
## 61378                 n/a
## 61379                 n/a
## 61380                 n/a
## 61384                 n/a
## 61386                 n/a
## 61438                 n/a
## 61450                 n/a
## 61453                 n/a
## 61455                 n/a
## 61456                 n/a
## 61457                 n/a
## 61459                 n/a
## 61463                 n/a
## 61464                 n/a
## 61563                 n/a
## 61586                 n/a
## 61588                 n/a
## 61591                 n/a
## 61600                 n/a
## 61611                 n/a
## 61612                 n/a
## 61637                 n/a
## 61697               31.93
## 61699               13.81
## 61754                 n/a
## 61766                 n/a
## 61767                 n/a
## 61781                 n/a
## 61802               11.56
## 61803               11.36
## 61843               20.07
## 61845                 n/a
## 61866                 n/a
## 61868                 n/a
## 61876                 n/a
## 62013                 n/a
## 62051                 n/a
## 62125                 n/a
## 62139                 n/a
## 62140                 n/a
## 62141               14.33
## 62144               15.99
## 62147                 n/a
## 62185                 n/a
## 62192                 n/a
## 62266               12.74
## 62267                 n/a
## 62269                 n/a
## 62305                 n/a
## 62309                 n/a
## 62310                 n/a
## 62312                 n/a
## 62315                 n/a
## 62316                 n/a
## 62317                 n/a
## 62339                 n/a
## 62340                 n/a
## 62341                 n/a
## 62342                 n/a
## 62343                 n/a
## 62344                 n/a
## 62345                 n/a
## 62346                 n/a
## 62347                 n/a
## 62348                 n/a
## 62349                 n/a
## 62350                 n/a
## 62351                 n/a
## 62352                 n/a
## 62353                 n/a
## 62354                 n/a
## 62355                 n/a
## 62373                 n/a
## 62408                 n/a
## 62409                 n/a
## 62410                 n/a
## 62414                 n/a
## 62415                 n/a
## 62445                 n/a
## 62446                 n/a
## 62450                 n/a
## 62453                 n/a
## 62456                 n/a
## 62523               28.66
## 62531               28.59
## 62557                 n/a
## 62574                 n/a
## 62644                 n/a
## 62678                 n/a
## 62679                 n/a
## 62687               15.77
## 62693                 n/a
## 62731                 n/a
## 62755                 n/a
## 62756                 n/a
## 62788                 n/a
## 62803               21.14
## 62866                 n/a
## 62978               19.75
## 63014                 n/a
## 63041                 n/a
## 63042                 n/a
## 63044                 n/a
## 63058               18.77
## 63094                 n/a
## 63111                 n/a
## 63144                 n/a
## 63145                 n/a
## 63151                 n/a
## 63152                 n/a
## 63169                 n/a
## 63173                 n/a
## 63174                 n/a
## 63175                 n/a
## 63206                 n/a
## 63211                 n/a
## 63239                 n/a
## 63240                 n/a
## 63279                 n/a
## 63280                 n/a
## 63291                 n/a
## 63292                 n/a
## 63344                 n/a
## 63363                 n/a
## 63365                 n/a
## 63379                 n/a
## 63380                 n/a
## 63381                 n/a
## 63382                 n/a
## 63397                 n/a
## 63509                 n/a
## 63511                 n/a
## 63519                 n/a
## 63615                 n/a
## 63616                 n/a
## 63622                 n/a
## 63623                 n/a
## 63672                 n/a
## 63674                 n/a
## 63685                 n/a
## 63686                 n/a
## 63687                 n/a
## 63698                 n/a
## 63703                 n/a
## 63711                 n/a
## 63741                 n/a
## 63749                 n/a
## 63756                 n/a
## 63780                 n/a
## 63802                 n/a
## 63818                 n/a
## 63821                 n/a
## 63822               18.15
## 63834                 n/a
## 63903               12.42
## 64038                 n/a
## 64095                 n/a
## 64146               17.61
## 64246                 n/a
## 64284                26.8
## 64285                 n/a
## 64321                 n/a
## 64322                 n/a
## 64323                 n/a
## 64327               17.89
## 64334                 n/a
## 64368                 n/a
## 64381                 n/a
## 64460                 n/a
## 64502               13.54
## 64599                 n/a
## 64601                 n/a
## 64612                 n/a
## 64629               17.91
## 64646                 n/a
## 64679                 n/a
## 64684                 n/a
## 64733                 n/a
## 64739               19.74
## 64753               10.88
## 64766                 n/a
## 64783                 n/a
## 64796                 n/a
## 64797                 n/a
## 64911                 n/a
## 64913                 n/a
## 64984                 n/a
## 65028                 n/a
## 65030               25.02
## 65046                 n/a
## 65056               24.77
## 65063                 n/a
## 65064                 n/a
## 65072                 n/a
## 65075                 n/a
## 65076                 n/a
## 65129                 n/a
## 65134                 n/a
## 65136                 n/a
## 65172                 n/a
## 65175                 n/a
## 65186                 n/a
## 65193                 n/a
## 65194                 n/a
## 65211                 n/a
## 65214                 n/a
## 65219                 n/a
## 65220                 n/a
## 65281                 n/a
## 65282                 n/a
## 65285                 n/a
## 65286                 n/a
## 65287                 n/a
## 65288                 n/a
## 65309                 n/a
## 65310                 n/a
## 65311                 n/a
## 65323                 n/a
## 65324                 n/a
## 65325                 n/a
## 65329                 n/a
## 65330                 n/a
## 65333                 n/a
## 65334                 n/a
## 65335                 n/a
## 65336                 n/a
## 65389                 n/a
## 65404                 n/a
## 65405                 n/a
## 65429                 n/a
## 65430               21.63
## 65485               29.57
## 65559               16.38
## 65575               16.49
## 65602                 n/a
## 65622                 n/a
## 65623                 n/a
## 65636                 n/a
## 65637                 n/a
## 65638                 n/a
## 65639                 n/a
## 65640                 n/a
## 65641                 n/a
## 65642                 n/a
## 65643                 n/a
## 65644                 n/a
## 65687               20.72
## 65711                 n/a
## 65712                 n/a
## 65755                 n/a
## 65761                 n/a
## 65768                 n/a
## 65793               15.26
## 65794               21.13
## 65795               22.73
## 65796               18.89
## 65797               15.46
## 65799                 n/a
## 65800                 n/a
## 65821               21.57
## 65822               18.31
## 65823               22.71
## 65824               24.13
## 65825               15.76
## 65833                 n/a
## 65834                 n/a
## 65835                 n/a
## 65837                 n/a
## 65859                  20
## 65861                 n/a
## 65899                 n/a
## 65905                 n/a
## 65919                19.5
## 65956                 n/a
## 65980                 n/a
## 65981                 n/a
## 66018                 n/a
## 66035                 n/a
## 66036                 n/a
## 66037                 n/a
## 66044               10.61
## 66049               20.37
## 66059                 n/a
## 66083               18.86
## 66089                 n/a
## 66186                 n/a
## 66187                 n/a
## 66188                 n/a
## 66220                 n/a
## 66221                 n/a
## 66222                 n/a
## 66228                 n/a
## 66242                 n/a
## 66267                 n/a
## 66370                 n/a
## 66397                 n/a
## 66455               14.86
## 66470               19.08
## 66471                9.52
## 66496                 n/a
## 66509                 n/a
## 66543               28.93
## 66544               25.77
## 66558                 n/a
## 66560                 n/a
## 66569                 n/a
## 66592                 n/a
## 66593                 n/a
## 66594                 n/a
## 66595                 n/a
## 66601                 n/a
## 66602                 n/a
## 66620                 n/a
## 66631                 n/a
## 66632                 n/a
## 66640                 n/a
## 66641                 n/a
## 66643                 n/a
## 66648                 n/a
## 66651                 n/a
## 66653                 n/a
## 66660                 n/a
## 66669                 n/a
## 66681                  12
## 66687               22.64
## 66691                 n/a
## 66698                 n/a
## 66705                1.86
## 66706               22.82
## 66747                 n/a
## 66758                 n/a
## 66775                 n/a
## 66794                 n/a
## 66822                 n/a
## 66844                 n/a
## 66852                 n/a
## 66855                 n/a
## 66859                 n/a
## 66871                 n/a
## 66876               23.21
## 66902                 n/a
## 66908                 n/a
## 66966                 n/a
## 66967                 n/a
## 67008                 n/a
## 67038                 n/a
## 67043                 n/a
## 67056                 n/a
## 67057                 n/a
## 67058                 n/a
## 67063                   3
## 67078                 n/a
## 67110                 n/a
## 67116                 n/a
## 67117               24.25
## 67119               25.48
## 67121                 n/a
## 67132                 n/a
## 67138                 n/a
## 67151                 n/a
## 67155                 n/a
## 67158                60.8
## 67230                 n/a
## 67295                 n/a
## 67326                 n/a
## 67339                 n/a
## 67340                 n/a
## 67360                 n/a
## 67361                 n/a
## 67366                 n/a
## 67487                 n/a
## 67488                 n/a
## 67558                 n/a
## 67620                 n/a
## 67621                 n/a
## 67642                 n/a
## 67643                 n/a
## 67681                7.92
## 67693               19.33
## 67703                 n/a
## 67709                 n/a
## 67715               36.63
## 67733                 n/a
## 67743                 n/a
## 67756                 n/a
## 67773                 n/a
## 67774                 n/a
## 67802               16.28
## 67803                2.23
## 67806               17.44
## 67812                 n/a
## 67818                 n/a
## 67822                 n/a
## 67831                 n/a
## 67861               26.08
## 68022                 n/a
## 68038                 n/a
## 68039                 n/a
## 68053               10.14
## 68057                9.75
## 68079                 n/a
## 68080                 n/a
## 68113                 n/a
## 68115                 n/a
## 68118                 n/a
## 68119                 n/a
## 68120                 n/a
## 68121                 n/a
## 68122                 n/a
## 68123                 n/a
## 68124                 n/a
## 68125                 n/a
## 68126                 n/a
## 68127                 n/a
## 68128                 n/a
## 68130                 n/a
## 68131                 n/a
## 68132                 n/a
## 68133                 n/a
## 68134                 n/a
## 68135                 n/a
## 68136                 n/a
## 68137                 n/a
## 68138                 n/a
## 68139                 n/a
## 68140                 n/a
## 68141                 n/a
## 68142                 n/a
## 68143                 n/a
## 68144                 n/a
## 68145                 n/a
## 68146                 n/a
## 68147                 n/a
## 68148                 n/a
## 68149                 n/a
## 68150                 n/a
## 68151                 n/a
## 68152                 n/a
## 68153                 n/a
## 68154                 n/a
## 68155                 n/a
## 68156                 n/a
## 68157                 n/a
## 68158                 n/a
## 68209               19.25
## 68303               14.66
## 68304               13.56
## 68307               12.25
## 68338                 n/a
## 68449                 n/a
## 68464                10.7
## 68468                 n/a
## 68474                 n/a
## 68501                 n/a
## 68568                 n/a
## 68579                 n/a
## 68580                 n/a
## 68597                 n/a
## 68598                 n/a
## 68698                 n/a
## 68774                 n/a
## 68782               19.22
## 68801                 n/a
## 68802                 n/a
## 68803                 n/a
## 68804                 n/a
## 68811                 n/a
## 68839                 n/a
## 68870                 n/a
## 68940                 n/a
## 69031                 n/a
## 69060                 n/a
## 69064                 n/a
## 69066               24.58
## 69068                 n/a
## 69070                 n/a
## 69071                 n/a
## 69072                 n/a
## 69073                 n/a
## 69096                 n/a
## 69099                 n/a
## 69100                 n/a
## 69117                 n/a
## 69153                 n/a
## 69157                 n/a
## 69161                 n/a
## 69170                 n/a
## 69184                 n/a
## 69186                 n/a
## 69232                 n/a
## 69244                 n/a
## 69289                 n/a
## 69290                 n/a
## 69314                 n/a
## 69324                 n/a
## 69330                 n/a
## 69331                 n/a
## 69332                 n/a
## 69333                 n/a
## 69334                 n/a
## 69394                 n/a
## 69420                3.62
## 69518                 n/a
## 69519                 n/a
## 69533                 n/a
## 69551                 n/a
## 69552                 n/a
## 69576                 n/a
## 69581                 n/a
## 69583                 n/a
## 69594                 n/a
## 69595                 n/a
## 69596                 n/a
## 69688                 n/a
## 69689                 n/a
## 69690                 n/a
## 69695                 n/a
## 69696                 n/a
## 69698                 n/a
## 69699                 n/a
## 69701                 n/a
## 69766                 n/a
## 69774                 n/a
## 69792               14.12
## 69794                 n/a
## 69802                 n/a
## 69803                 n/a
## 69957                 n/a
## 69958                 n/a
## 69963                6.35
## 69964                3.49
## 69965               10.38
## 69970                 n/a
## 69971                 n/a
## 69973                 n/a
## 69986                 n/a
## 70053                 n/a
## 70059                 n/a
## 70115                 n/a
## 70143                 n/a
## 70148                 n/a
## 70157                 n/a
## 70173                 n/a
## 70177                 n/a
## 70240                 n/a
## 70286                 n/a
## 70351                 n/a
## 70365                   3
## 70366                2.84
## 70367                 n/a
## 70397                 n/a
## 70469                 n/a
## 70504                 n/a
## 70505                 n/a
## 70524                 n/a
## 70528                 n/a
## 70529                 n/a
## 70535                 n/a
## 70536                 n/a
## 70586                 n/a
## 70658                 n/a
## 70674               14.25
## 70755                 n/a
## 70769                 n/a
## 70808                 n/a
## 70809                 n/a
## 70851                 5.5
## 70883                 n/a
## 70889                 n/a
## 70895                 n/a
## 71038                 n/a
## 71047                 n/a
## 71048                 n/a
## 71049                 n/a
## 71050                 n/a
## 71051                 n/a
## 71053                 n/a
## 71064                 n/a
## 71161               16.03
## 71180                 n/a
## 71182                  16
## 71226                 n/a
## 71238               15.37
## 71260                 n/a
## 71263                 n/a
## 71264                 n/a
## 71267                 n/a
## 71271                 n/a
## 71272                 n/a
## 71273                 n/a
## 71278                 n/a
## 71279                 n/a
## 71280                 n/a
## 71281                 n/a
## 71285                 n/a
## 71337                 n/a
## 71338                 n/a
## 71339                 n/a
## 71344                 n/a
## 71345                 n/a
## 71368                 n/a
## 71380                 n/a
## 71384                 n/a
## 71389                 n/a
## 71390                 n/a
## 71468                16.5
## 71473                 n/a
## 71482                 n/a
## 71491                 n/a
## 71499                 n/a
## 71500                 n/a
## 71507                 n/a
## 71527                 n/a
## 71577                 n/a
## 71586                 n/a
## 71588                 n/a
## 71595                 n/a
## 71598                 n/a
## 71599                 n/a
## 71600                 n/a
## 71602                 n/a
## 71603                 n/a
## 71608                 n/a
## 71609                 n/a
## 71611                 n/a
## 71613                 n/a
## 71614                 n/a
## 71615                 n/a
## 71616                 n/a
## 71617                 n/a
## 71618                 n/a
## 71619                 n/a
## 71627                 n/a
## 71669                 n/a
## 71696                 n/a
## 71700                 n/a
## 71715                 n/a
## 71716                 n/a
## 71717                 n/a
## 71718                 n/a
## 71719                 n/a
## 72527                 n/a
## 72555                 n/a
## 72606                 n/a
## 72618                 n/a
## 72637                 n/a
## 72638                 n/a
## 72639                 n/a
## 72651                 n/a
## 72671                 n/a
## 72684                 n/a
## 72695                 n/a
## 72756                 n/a
## 72762                 n/a
## 72814                 n/a
## 72922               17.13
## 72923               10.32
## 72959                 n/a
## 72980                 n/a
## 72981                 n/a
## 72983                 n/a
## 72986                 n/a
## 72991                 n/a
## 73021                 n/a
## 73095                 n/a
## 73146                 n/a
## 73180               27.59
## 73185                 n/a
## 73220                 n/a
## 73300                 n/a
## 73303                 n/a
## 73304                 n/a
## 73355                 n/a
## 73356                 n/a
## 73395                 n/a
## 73437               26.09
## 73473               14.44
## 73489               21.47
## 73527                 n/a
## 73528                 n/a
## 73537               16.27
## 73551                 n/a
## 73554                 n/a
## 73573                 n/a
## 73582                 n/a
## 73601                  24
## 73603                 n/a
## 73604                 n/a
## 73643                 n/a
## 73656                 n/a
## 73676                 n/a
## 73688                 n/a
## 73712                 n/a
## 73781               26.07
## 73782               21.51
## 73790                 n/a
## 73792                 n/a
## 73816                 n/a
## 73846                 n/a
## 73862                 n/a
## 73901                 n/a
## 73908                 n/a
## 73927                 n/a
## 73928                 n/a
## 73931                 n/a
## 73933                 n/a
## 73954                 n/a
## 73955                 n/a
## 73956                 n/a
## 73957                 n/a
## 73958                 n/a
## 73959                 n/a
## 73965                 n/a
## 73968                 n/a
## 73971                 n/a
## 73988                 n/a
## 73989                 n/a
## 74028                 n/a
## 74032                 n/a
## 74068                 n/a
## 74094                 n/a
## 74122                 n/a
## 74159                 n/a
## 74161                 n/a
## 74198                 n/a
## 74199                 n/a
## 74294                 n/a
## 74298                 n/a
## 74300                 n/a
## 74369                 n/a
## 74414                 n/a
## 74432                 n/a
## 74444                 n/a
## 74447                 n/a
## 74462                 n/a
## 74476                 n/a
## 74511                 n/a
## 74515                 n/a
## 74516                 n/a
## 74522                 n/a
## 74529               23.56
## 74531               14.68
## 74538                12.5
## 74552                 n/a
## 74554                 n/a
## 74558                 n/a
## 74562                 n/a
## 74563               14.11
## 74634                 n/a
## 74659                 n/a
## 74676                 n/a
## 74677                 n/a
## 74680                 n/a
## 74681               14.58
## 74751                 n/a
## 74784               11.77
## 74800                 n/a
## 74805                 n/a
## 74809                 n/a
## 74912                 n/a
## 74940                 n/a
## 74993                  24
## 75052                 n/a
## 75053                 n/a
## 75078                 n/a
## 75084               20.75
## 75087               20.23
## 75109                 n/a
## 75122                 n/a
## 75141               21.02
## 75194                 n/a
## 75213               16.82
## 75237               19.07
## 75241                 n/a
## 75244               13.16
## 75268                 n/a
## 75272                 n/a
## 75283                6.31
## 75295                 n/a
## 75400                 n/a
## 75407                 n/a
## 75408                 n/a
## 75421                 n/a
## 75422                 n/a
## 75429                 n/a
## 75439                 n/a
## 75483                 n/a
## 75499                 n/a
## 75500                 n/a
## 75530                 n/a
## 75536                 n/a
## 75545                 n/a
## 75554                 n/a
## 75555                 n/a
## 75563                 n/a
## 75581                 n/a
## 75637               16.34
## 75694                 n/a
## 75725                 n/a
## 75745                 n/a
## 75922                 n/a
## 75976                 n/a
## 76028                 n/a
## 76076                 n/a
## 76137               25.17
## 76138               23.32
## 76139               23.63
## 76174                 n/a
## 76226                 n/a
## 76227                 n/a
## 76235                 n/a
## 76239               19.78
## 76257                 n/a
## 76286                 n/a
## 76287                 n/a
## 76288                 n/a
## 76291                 n/a
## 76405                 n/a
## 76435                 n/a
## 76488                 n/a
## 76530                7.57
## 76670                 n/a
## 76683                 n/a
## 76703                 n/a
## 76704                 n/a
## 76721                 n/a
## 76728                 n/a
## 76771                 n/a
## 76793                 n/a
## 76795               14.72
## 76820                 n/a
## 76824                 n/a
## 76849                 n/a
## 76996               21.17
## 77018                 n/a
## 77091                 n/a
## 77094                 n/a
## 77111                 n/a
## 77151                 n/a
## 77156                 n/a
## 77167                 n/a
## 77194                 n/a
## 77218                 n/a
## 77242                 n/a
## 77264                 n/a
## 77417                 n/a
## 77448                 n/a
## 77612                  20
## 77625                 n/a
## 77651                 n/a
## 77656                 n/a
## 77683                 n/a
## 77686               16.36
## 77696               15.35
## 77698                 n/a
## 77731                 n/a
## 77733               22.75
## 77738                 n/a
## 77745                 n/a
## 77831                 n/a
## 77833                 n/a
## 77892                 n/a
## 77894                 n/a
## 77903                 n/a
## 77928                 n/a
## 77972                 n/a
## 78005                 n/a
## 78006                 n/a
## 78008                 n/a
## 78009                 n/a
## 78010                 n/a
## 78011                 n/a
## 78066                 n/a
## 78095                 n/a
## 78160                 n/a
## 78168                 n/a
## 78176                 n/a
## 78179               25.85
## 78183                 n/a
## 78193                 n/a
## 78198               30.18
## 78202               18.77
## 78203               25.99
## 78217                 n/a
## 78228                 n/a
## 78243                29.2
## 78245                 n/a
## 78255                 n/a
## 78263                 n/a
## 78265                 n/a
## 78272                 n/a
## 78279                 n/a
## 78296                 n/a
## 78306                 n/a
## 78311                 n/a
## 78312                 n/a
## 78313                 n/a
## 78332                  16
## 78340                 n/a
## 78346                 n/a
## 78348                 n/a
## 78351               16.25
## 78399                 n/a
## 78400                 n/a
## 78405                 n/a
## 78408               16.82
## 78436                 n/a
## 78482                 n/a
## 78492               16.02
## 78494               14.25
## 78522                 n/a
## 78570                 n/a
## 78584                   8
## 78585               16.67
## 78586                 n/a
## 78587                 n/a
## 78588                5.93
## 78591                 n/a
## 78595                 n/a
## 78597                23.2
## 78601                 n/a
## 78603               24.21
## 78606                  16
## 78609                 n/a
## 78652                 n/a
## 78663                 n/a
## 78670                 n/a
## 78671               21.97
## 78685                 n/a
## 78686                 n/a
## 78689                 n/a
## 78690                 n/a
## 78699                19.6
## 78702                 n/a
## 78708                 n/a
## 78744                 n/a
## 78787                 n/a
## 78788                 n/a
## 78797                 n/a
## 78841                14.2
## 78842                 n/a
## 78908                 n/a
## 78926                   1
## 78955                 n/a
## 78956                 n/a
## 78963               10.06
## 79001                 n/a
## 79055                 n/a
## 79162                 n/a
## 79249                 n/a
## 79257               10.25
## 79413                 n/a
## 79443                 n/a
## 79478                 n/a
## 79484                 n/a
## 79485                 n/a
## 79544                 n/a
## 79545                 n/a
## 79573                 n/a
## 79582                 n/a
## 79583                 n/a
## 79610               25.13
## 79634                 n/a
## 79638                 n/a
## 79644                 n/a
## 79645                 n/a
## 79646                 n/a
## 79647                 n/a
## 79672                 n/a
## 79673                 n/a
## 79681                 n/a
## 79689                 n/a
## 79698                  17
## 79700                 n/a
## 79722                 n/a
## 79723                 n/a
## 79724                 n/a
## 79770                 n/a
## 79789                 n/a
## 79795                 n/a
## 79817               13.18
## 79825               10.22
## 79834               16.25
## 79850                 n/a
## 79864                 n/a
## 79875                 n/a
## 79887                 n/a
## 79889                 n/a
## 79891                 n/a
## 79892                 n/a
## 79894                 n/a
## 79942                 n/a
## 79945                 n/a
## 79946                 n/a
## 79959                 n/a
## 79974                 n/a
## 80014                 n/a
## 80015                 n/a
## 80073               12.15
## 80104                 n/a
## 80225                 n/a
## 80241                 n/a
## 80273               18.68
## 80286                 n/a
## 80443                 n/a
## 80474                18.8
## 80477                 n/a
## 80479                 n/a
## 80480                 n/a
## 80569                 n/a
## 80570                 n/a
## 80603                22.6
## 80604               14.21
## 80605                29.6
## 80615                 n/a
## 80653               24.39
## 80752                 n/a
## 80789                 n/a
## 80834                 n/a
## 80835                 n/a
## 80885               15.53
## 80889                 n/a
## 80891                 n/a
## 80892                 n/a
## 80893                 n/a
## 80900               25.21
## 80920                 n/a
## 80928               17.14
## 80929                 n/a
## 80944                 n/a
## 80969                 n/a
## 80990                 n/a
## 80991                 n/a
## 81005                 n/a
## 81039                 n/a
## 81041                   3
## 81048                 n/a
## 81067                 n/a
## 81093                 n/a
## 81094                 n/a
## 81149                 n/a
## 81217                 n/a
## 81306                 n/a
## 81307               24.27
## 81314                 n/a
## 81328                 n/a
## 81346                 n/a
## 81359                 n/a
## 81364                 n/a
## 81376                 n/a
## 81384                 n/a
## 81401                 n/a
## 81411                 n/a
## 81434               20.83
## 81621                 n/a
## 81653                 n/a
## 81654                 n/a
## 81665                 n/a
## 81669                 n/a
## 81670                 n/a
## 81681                 n/a
## 81702                 n/a
## 81709                 n/a
## 81761                 n/a
## 81771                 n/a
## 81772                 n/a
## 81778                 n/a
## 81817                 n/a
## 81818                 n/a
## 81848                 n/a
## 81854                 n/a
## 81855                 n/a
## 81857                 n/a
## 81882                 n/a
## 81894                 n/a
## 81917                14.6
## 81918               12.04
## 81919                 n/a
## 81920                9.95
## 81938                 n/a
## 81941                 n/a
## 81942                 n/a
## 81943                 n/a
## 81944                 n/a
## 81945                 n/a
## 81978               21.94
## 82019                 n/a
## 82029                 n/a
## 82053                 n/a
## 82064                9.31
## 82078                 n/a
## 82096                 n/a
## 82123                 n/a
## 82125                 n/a
## 82138                 n/a
## 82159                 n/a
## 82186                 n/a
## 82297                 n/a
## 82353                 n/a
## 82355               18.82
## 82372                 n/a
## 82376                 n/a
## 82377                 n/a
## 82381                 n/a
## 82472                 n/a
## 82487                 n/a
## 82497                 n/a
## 82525                 n/a
## 82548                 n/a
## 82549                 n/a
## 82575                 n/a
## 82576                 n/a
## 82581                 n/a
## 82606                 n/a
## 82618                 n/a
## 82619                 n/a
## 82677                 n/a
## 82678                 n/a
## 82679                 n/a
## 82680                 n/a
## 82683               24.59
## 82694                 n/a
## 82717                 n/a
## 82718                 n/a
## 82742                 n/a
## 82752               10.88
## 82787                 n/a
## 82788                 n/a
## 82793                 n/a
## 82848                 n/a
## 82877                 n/a
## 82880                 n/a
## 82888                 n/a
## 82928                 n/a
## 82949                 n/a
## 82958                 n/a
## 82967                13.1
## 82975                 n/a
## 82996                 n/a
## 83016                 n/a
## 83040                 n/a
## 83041                6.17
## 83045                 n/a
## 83058               23.76
## 83096                 n/a
## 83107               14.03
## 83111                 n/a
## 83142                 n/a
## 83179                 n/a
## 83189                 n/a
## 83192                 n/a
## 83199                 n/a
## 83223                 n/a
## 83233                 n/a
## 83254                 n/a
## 83255                 n/a
## 83288                 n/a
## 83297                 n/a
## 83305                 n/a
## 83306                 n/a
## 83313                 n/a
## 83315                 n/a
## 83322               22.45
## 83337                 n/a
## 83387                 n/a
## 83389                 n/a
## 83393                 n/a
## 83395                 n/a
## 83398                 n/a
## 83408                 n/a
## 83409                 n/a
## 83410                 n/a
## 83411                 n/a
## 83412                 n/a
## 83416                 n/a
## 83417                 n/a
## 83419                 n/a
## 83425                 n/a
## 83430                 n/a
## 83436                 n/a
## 83437                 n/a
## 83446                 n/a
## 83485                  10
## 83527                 n/a
## 83549                 n/a
## 83550                 n/a
## 83555                 n/a
## 83562                 n/a
## 83589                 n/a
## 83615                 n/a
## 83617                 n/a
## 83621                 n/a
## 83644               11.88
## 83675                 n/a
## 83693                 n/a
## 83694                 n/a
## 83695                 n/a
## 83774                 n/a
## 83775                 n/a
## 83781               16.12
## 83783                 n/a
## 83805               17.62
## 83816                12.2
## 83835                14.9
## 83841                 n/a
## 83867                 n/a
## 83886                 n/a
## 83888                 n/a
## 83912                 n/a
## 83927               12.54
## 83947                 n/a
## 83957                 n/a
## 83958                 n/a
## 83995                 n/a
## 84024                 n/a
## 84061                 n/a
## 84094                 n/a
## 84100               17.21
## 84121                 n/a
## 84122                 n/a
## 84128                 n/a
## 84129                 n/a
## 84130                 n/a
## 84132                 n/a
## 84135                 n/a
## 84138                 n/a
## 84141                 n/a
## 84289                 n/a
## 84314                 n/a
## 84315                 n/a
## 84316                 n/a
## 84364                 n/a
## 84381                 n/a
## 84414                 n/a
## 84442                 n/a
## 84521                 n/a
## 84524                 n/a
## 84525                 n/a
## 84526                 n/a
## 84527                 n/a
## 84528                 n/a
## 84529                 n/a
## 84530                 n/a
## 84535                 n/a
## 84591                 n/a
## 84599                 n/a
## 84624                 n/a
## 84679                 n/a
## 84684                 n/a
## 84717                 n/a
## 84791               12.31
## 84822                 n/a
## 84857                 n/a
## 84910                 n/a
## 84912               21.97
## 84913               22.58
## 84940               30.44
## 85144                 n/a
## 85152                 n/a
## 85280                 n/a
## 85282                 n/a
## 85283                 n/a
## 85289                 n/a
## 85292                 n/a
## 85295                 n/a
## 85296                 n/a
## 85301                 n/a
## 85305                 n/a
## 85353                 n/a
## 85356                 n/a
## 85357                 n/a
## 85362                 n/a
## 85365                 n/a
## 85398                 n/a
## 85399                 n/a
## 85400                 n/a
## 85402                 n/a
## 85403                 n/a
## 85404                 n/a
## 85412                 n/a
## 85413                 n/a
## 85435                 2.2
## 85534                 n/a
## 85589                 n/a
## 85590                 n/a
## 85591                 n/a
## 85606                 n/a
## 85630                 n/a
## 85642                 n/a
## 85660                 n/a
## 85688                 n/a
## 85689                 n/a
## 85692                 n/a
## 85697                 n/a
## 85733                 n/a
## 85738                 n/a
## 85741                 n/a
## 85757                 n/a
## 85768                 n/a
## 85785                 n/a
## 85790                 n/a
## 85791                 n/a
## 85795                 n/a
## 85831                 n/a
## 85969                 n/a
## 85970                 n/a
## 85971                 n/a
## 85973                 n/a
## 85974                 n/a
## 86024                 n/a
## 86049                 n/a
## 86051                 n/a
## 86052                 n/a
## 86065                 n/a
## 86067                 n/a
## 86081                 n/a
## 86096                 n/a
## 86101                 n/a
## 86180                 n/a
## 86205               33.44
## 86233                 n/a
## 86234                 n/a
## 86235                 n/a
## 86254                 n/a
## 86342               12.77
## 86438               23.36
## 86494                 n/a
## 86498                 n/a
## 86499                 n/a
## 86503                 n/a
## 86504                 n/a
## 86506                 n/a
## 86511                 n/a
## 86522               16.38
## 86533                 n/a
## 86570                 n/a
## 86584                 n/a
## 86585                 n/a
## 86593                 n/a
## 86616               15.21
## 86640               14.49
## 86691                 n/a
## 86693                 n/a
## 86781                 n/a
## 86782                 n/a
## 86788                 n/a
## 86827                 n/a
## 86828                 n/a
## 86829                 n/a
## 86831                 n/a
## 86832                 n/a
## 86834                 n/a
## 86835                 n/a
## 86839                 n/a
## 86892               43.08
## 86893               19.97
## 86898                 n/a
## 86906                 n/a
## 86917                 n/a
## 86966                 n/a
## 86967                 n/a
## 86970                 n/a
## 86971                 n/a
## 86984                 n/a
## 86985                 n/a
## 86991                 n/a
## 87055                 n/a
## 87058                 n/a
## 87061                 n/a
## 87097                 n/a
## 87099                 n/a
## 87101                 n/a
## 87107                 n/a
## 87125                 n/a
## 87126                 n/a
## 87127                 n/a
## 87148                 n/a
## 87151               21.78
## 87152               25.43
## 87158                 n/a
## 87243                 n/a
## 87251                 n/a
## 87284                 n/a
## 87331                 n/a
## 87332                 n/a
## 87341                 n/a
## 87342                 n/a
## 87343                 n/a
## 87346                 n/a
## 87347                 n/a
## 87401                 n/a
## 87407                 n/a
## 87430                 n/a
## 87447                 n/a
## 87456                 n/a
## 87457                21.4
## 87465                 n/a
## 87487                 n/a
## 87501                 n/a
## 87505                 n/a
## 87511                 n/a
## 87519                 n/a
## 87521                 n/a
## 87523                 n/a
## 87525                 n/a
## 87532                 n/a
## 87535               16.53
## 87542                18.7
## 87555                 n/a
## 87570                 n/a
## 87590                 n/a
## 87603                 n/a
## 87604                 n/a
## 87605                 n/a
## 87608                 n/a
## 87611                 n/a
## 87617                 n/a
## 87618                 n/a
## 87623                 n/a
## 87636                 n/a
## 87639                 n/a
## 87640                 n/a
## 87648                 n/a
## 87662                 n/a
## 87663                 n/a
## 87664                8.05
## 87676                 n/a
## 87749                 n/a
## 87752                 n/a
## 87775                 n/a
## 87828                12.9
## 87832                 n/a
## 87833                 n/a
## 87880               15.51
## 87915                 n/a
## 87931               15.49
## 87963                 n/a
## 87997                 n/a
## 88027                 n/a
## 88044                 n/a
## 88153                 n/a
## 88164                 n/a
## 88171               14.55
## 88172                 n/a
## 88173                 n/a
## 88191               14.14
## 88212                 n/a
## 88265                 n/a
## 88266                 n/a
## 88281                 n/a
## 88283                 n/a
## 88314                 n/a
## 88394                 n/a
## 88418                 n/a
## 88419                 n/a
## 88420                 n/a
## 88421                 n/a
## 88423                 n/a
## 88445                 n/a
## 88446                 n/a
## 88449                 n/a
## 88500                 n/a
## 88509                 n/a
## 88586                 n/a
## 88590                 n/a
## 88595                 n/a
## 88640                 n/a
## 88672                 n/a
## 88706                 n/a
## 88707                 n/a
## 88708                 n/a
## 88709                 n/a
## 88753                 n/a
## 88760               22.59
## 88893                 n/a
## 88894                 n/a
## 88918                 n/a
## 88926                 n/a
## 88928                 n/a
## 88931                 n/a
## 88932                 n/a
## 88957                 n/a
## 88966                 n/a
## 88969                 n/a
## 89013                 n/a
## 89016                 n/a
## 89023                17.4
## 89025                 n/a
## 89065                 n/a
## 89069               20.83
## 89105                 n/a
## 89106                 n/a
## 89107               13.68
## 89108                9.93
## 89109               13.11
## 89130                 n/a
## 89153                 n/a
## 89210                 n/a
## 89211                 n/a
## 89212                 n/a
## 89247                 n/a
## 89274                 n/a
## 89353                 n/a
## 89406                 n/a
## 89414                 n/a
## 89417                 n/a
## 89433                 n/a
## 89447                 n/a
## 89448                 n/a
## 89449                 n/a
## 89450                 n/a
## 89451                 n/a
## 89453                 n/a
## 89454                 n/a
## 89480                 n/a
## 89481                 n/a
## 89531                 n/a
## 89533                 n/a
## 89554                 n/a
## 89569                 n/a
## 89601                 n/a
## 89604                 n/a
## 89609                 n/a
## 89636                 n/a
## 89638                 n/a
## 89744                 n/a
## 89769                 n/a
## 89778                 n/a
## 89783                 n/a
## 89788                 n/a
## 89826                 n/a
## 89890               13.07
## 89900                 n/a
## 89902                 n/a
## 89919                 n/a
## 89920                 n/a
## 89921                 n/a
## 89922                 n/a
## 89923                 n/a
## 89924                 n/a
## 89925                 n/a
## 89950                 n/a
## 89973               22.18
## 90028                 n/a
## 90050                 n/a
## 90102                 n/a
## 90115               22.91
## 90117               21.79
## 90134                 n/a
## 90154                 n/a
## 90167               16.83
## 90175                 n/a
## 90176                 n/a
## 90177                 n/a
## 90204                 n/a
## 90207                 n/a
## 90221                 n/a
## 90249               12.94
## 90255                 n/a
## 90256                 n/a
## 90257                 n/a
## 90258                 n/a
## 90281                 n/a
## 90325                 n/a
## 90347               21.59
## 90348               20.37
## 90383                 n/a
## 90385                  14
## 90386              154.33
## 90387                  46
## 90405                 n/a
## 90414                 n/a
## 90520               20.31
## 90531                 n/a
## 90532                 n/a
## 90533                 n/a
## 90541                 n/a
## 90569                 n/a
## 90570                 n/a
## 90571                 n/a
## 90572                 n/a
## 90573                 n/a
## 90574                 n/a
## 90575                 n/a
## 90576                 n/a
## 90578                 n/a
## 90615                 n/a
## 90619                 n/a
## 90620                 n/a
## 90621                 n/a
## 90622                 n/a
## 90623                 n/a
## 90627                 n/a
## 90689                 n/a
## 90690                 n/a
## 90694                  40
## 90720                 n/a
## 90726                 n/a
## 90748                 n/a
## 90787                 n/a
## 90802                 n/a
## 90807                 n/a
## 90810               19.27
## 90825               43.53
## 90831                 n/a
## 90835                 n/a
## 90846                 n/a
## 90855                 n/a
## 90856                 n/a
## 90858                 n/a
## 90879               30.69
## 90951                 n/a
## 90952                 n/a
## 90953                 n/a
## 90981                 n/a
## 91064                 n/a
## 91146                 n/a
## 91180                 n/a
## 91223                 n/a
## 91266                21.9
## 91274               21.14
## 91277                 n/a
## 91293               21.29
## 91298                 n/a
## 91322                 n/a
## 91345                 n/a
## 91367               14.54
## 91377                 n/a
## 91425               26.55
## 91468                 n/a
## 91481                 n/a
## 91528                 n/a
## 91537                 n/a
## 91543                 n/a
## 91544                 n/a
## 91586                 n/a
## 91587                 n/a
## 91607                 n/a
## 91622               16.33
## 91682                 n/a
## 91709                 n/a
## 91724                 n/a
## 91761                 n/a
## 91781                 n/a
## 91813                 n/a
## 91827                 n/a
## 91841                 n/a
## 91868                 n/a
## 91872                 n/a
## 91873                 n/a
## 91898                 n/a
## 91899                 n/a
## 91923                21.3
## 91928                 n/a
## 91950                 n/a
## 91975                 n/a
## 91979                 n/a
## 91988                 n/a
## 91998                 n/a
## 92024                 n/a
## 92100                16.6
## 92120                18.3
## 92183                 n/a
## 92189                 n/a
## 92217                 n/a
## 92258               21.94
## 92275                 n/a
## 92365                 n/a
## 92369                 n/a
## 92385                 n/a
## 92422                 n/a
## 92423                 n/a
## 92489                 n/a
## 92490                 n/a
## 92493                 n/a
## 92494                 n/a
## 92495                 n/a
## 92519                 n/a
## 92526                 n/a
## 92547                 n/a
## 92555                 n/a
## 92632                 n/a
## 92693                 n/a
## 92700                 n/a
## 92754                 n/a
## 92763                 n/a
## 92771                 n/a
## 92791                 n/a
## 92792                 n/a
## 92870                 n/a
## 92972                 n/a
## 92974                 n/a
## 93049               12.01
## 93051                 n/a
## 93052                 n/a
## 93053                 n/a
## 93054                 n/a
## 93055                 n/a
## 93056                 n/a
## 93057                 n/a
## 93058                 n/a
## 93059                 n/a
## 93068                 n/a
## 93116                 n/a
## 93117                 n/a
## 93120                 n/a
## 93154               15.94
## 93349               15.88
## 93394               11.52
## 93416                 n/a
## 93433                 n/a
## 93434                 n/a
## 93438                 n/a
## 93457                 n/a
## 93459                 n/a
## 93466                 n/a
## 93490                 n/a
## 93519                 n/a
## 93520                 n/a
## 93521                 n/a
## 93680                 n/a
## 93685                 n/a
## 93696               16.47
## 93722                 n/a
## 93746                 n/a
## 93747                 n/a
## 93748                 n/a
## 93749                 n/a
## 93750                 n/a
## 93752                 n/a
## 93757                 n/a
## 93816                 n/a
## 93861                 n/a
## 93873                 n/a
## 93967                 n/a
## 93976                 n/a
## 94003                 n/a
## 94004                 n/a
## 94006                 n/a
## 94007                 n/a
## 94113                 n/a
## 94114                 n/a
## 94142                 n/a
## 94191                 n/a
## 94200                 n/a
## 94227                 n/a
## 94241                 n/a
## 94249                 n/a
## 94257                 n/a
## 94289                 n/a
## 94324                 n/a
## 94349                 n/a
## 94362                 n/a
## 94369                 n/a
## 94396                 n/a
## 94403                 n/a
## 94460                 n/a
## 94467                 n/a
## 94468                 n/a
## 94501                 n/a
## 94534                 n/a
## 94535                 n/a
## 94696                 n/a
## 94701                 n/a
## 94719                 n/a
## 94738                 n/a
## 94742               21.94
## 94782                 n/a
## 94783                 n/a
## 94784                 n/a
## 94790                 n/a
## 94798                 n/a
## 94800                 n/a
## 94948                 n/a
## 94976                 n/a
## 94997                 n/a
## 95001                 n/a
## 95007                 n/a
## 95064                 n/a
## 95100                 n/a
## 95109                 n/a
## 95116                 n/a
## 95141                 n/a
## 95151                 n/a
## 95176                 n/a
## 95198                 n/a
## 95199                 n/a
## 95200                 n/a
## 95206                 n/a
## 95232                 n/a
## 95233                 n/a
## 95234                 n/a
## 95235                 n/a
## 95236                 n/a
## 95237                 n/a
## 95238                 n/a
## 95240                 n/a
## 95241                 n/a
## 95242                 n/a
## 95243                 n/a
## 95244                 n/a
## 95245                 n/a
## 95246                 n/a
## 95247                 n/a
## 95248                 n/a
## 95249                 n/a
## 95250                 n/a
## 95251                 n/a
## 95252                 n/a
## 95254                 n/a
## 95255                 n/a
## 95256                 n/a
## 95257                 n/a
## 95258                 n/a
## 95259                 n/a
## 95261                 n/a
## 95262                 n/a
## 95263                 n/a
## 95264                 n/a
## 95265                 n/a
## 95266                 n/a
## 95267                 n/a
## 95268                 n/a
## 95269                 n/a
## 95270                 n/a
## 95271                 n/a
## 95272                 n/a
## 95273                 n/a
## 95275                 n/a
## 95276                 n/a
## 95277                 n/a
## 95278                 n/a
## 95279                 n/a
## 95303                 n/a
## 95335               16.41
## 95343               15.38
## 95401                 n/a
## 95413                 n/a
## 95417                 n/a
## 95429                 n/a
## 95430                 n/a
## 95442                 n/a
## 95444               21.32
## 95446                 n/a
## 95486                 n/a
## 95534                 n/a
## 95549                 n/a
## 95550                 n/a
## 95551                 n/a
## 95593                 n/a
## 95670                 n/a
## 95748                 n/a
## 95752                 n/a
## 95806               16.06
## 95886                 n/a
## 95930                 n/a
## 96039                 n/a
## 96120                 n/a
## 96180                 n/a
## 96209                 n/a
## 96241                 n/a
## 96369               14.65
## 96399                 n/a
## 96408                 n/a
## 96409                 n/a
## 96426                 n/a
## 96450                 n/a
## 96498                 n/a
## 96502               15.74
## 96541               18.97
## 96544                 n/a
## 96572                 n/a
## 96689                 n/a
## 96726               26.43
## 96834                 n/a
## 96927                 n/a
## 96945                 n/a
## 97010                 n/a
## 97070               15.15
## 97071                6.79
## 97072               13.31
## 97073                 n/a
## 97074                 n/a
## 97075                 n/a
## 97078                 n/a
## 97080                 n/a
## 97084                 n/a
## 97085                 n/a
## 97087                 n/a
## 97091                 n/a
## 97159                 n/a
## 97166                 n/a
## 97181                 n/a
## 97187                 n/a
## 97220                   7
## 97244                 n/a
## 97255                 n/a
## 97258                 n/a
## 97267                 n/a
## 97335                 n/a
## 97338                 n/a
## 97339                 n/a
## 97452                 n/a
## 97453                 n/a
## 97541                 n/a
## 97546                 n/a
## 97564                 n/a
## 97614                 n/a
## 97769                 n/a
## 97803                 n/a
## 97824                 n/a
## 97879                 n/a
## 97908                 n/a
## 97909                 n/a
## 97960                 n/a
## 98030                 n/a
## 98031                 n/a
## 98032                 n/a
## 98034                 n/a
## 98051                 n/a
## 98063               10.72
## 98197                16.2
## 98206               13.69
## 98261                15.3
## 98267               14.21
## 98288                15.5
## 98299               22.64
## 98309               16.52
## 98310               16.46
## 98359                 n/a
## 98435                 n/a
## 98437                 n/a
## 98450                 n/a
## 98454                 n/a
## 98455                 n/a
## 98471                 n/a
## 98485                 n/a
## 98506               14.99
## 98511               15.68
## 98512                 n/a
## 98617               15.07
## 98619               14.88
## 98627                 n/a
## 98628                 n/a
## 98644                  52
## 98645               17.82
## 98693                 n/a
## 98711                 n/a
## 98787                 n/a
## 98807                 n/a
## 98885                 n/a
## 98886                 n/a
## 98887                 n/a
## 98888                 n/a
## 98889                 n/a
## 98890                 n/a
## 98891                 n/a
## 98892                 n/a
## 98893                 n/a
## 98894                 n/a
## 98895                 n/a
## 98897                 n/a
## 98898                 n/a
## 98899                 n/a
## 98901                 n/a
## 98902                 n/a
## 98903                 n/a
## 98904                 n/a
## 98905                 n/a
## 98965                 n/a
## 99046                 n/a
## 99047                  26
## 99056                 n/a
## 99070                 n/a
## 99073                 n/a
## 99074                 n/a
## 99085                 n/a
## 99086                 n/a
## 99129                 n/a
## 99148                 n/a
## 99149                 n/a
## 99170               19.21
## 99174                 n/a
## 99175                30.7
## 99176                9.41
## 99181                 n/a
## 99203                 n/a
## 99265                 n/a
## 99294                 n/a
## 99333                 n/a
# There are 5049 incomplete cases in the public school data

The missing values come from Title I School Status, FTE Equivalent, Pupil.Teacher.Ratio

table(public_school$School.Type)
## 
##           1-Regular school 2-Special education school 
##                      90407                       1931 
##        3-Vocational school 4-Alternative/other school 
##                       1480                       5530
#What falls in the alternative/other school category in School.Type?
public_school %>% filter(School.Type == "4-Alternative/other school")
##                State.Name ST
## 1               Minnesota MN
## 2               Minnesota MN
## 3               MINNESOTA MN
## 4              CALIFORNIA CA
## 5               Minnesota MN
## 6               Minnesota MN
## 7               Minnesota MN
## 8               Minnesota MN
## 9               Minnesota MN
## 10              Minnesota MN
## 11              Minnesota MN
## 12              Minnesota MN
## 13              Minnesota MN
## 14              Minnesota MN
## 15              Minnesota MN
## 16              Minnesota MN
## 17              Minnesota MN
## 18              Minnesota MN
## 19                  Idaho ID
## 20                  Texas TX
## 21              MINNESOTA MN
## 22              MINNESOTA MN
## 23              Minnesota MN
## 24               MICHIGAN MI
## 25              Minnesota MN
## 26               Colorado CO
## 27              MINNESOTA MN
## 28              MINNESOTA MN
## 29              Minnesota MN
## 30              Minnesota MN
## 31                Florida FL
## 32                Georgia GA
## 33             California CA
## 34              Minnesota MN
## 35           South Dakota SD
## 36                  Texas TX
## 37                  Texas TX
## 38                  Texas TX
## 39             California CA
## 40             California CA
## 41             California CA
## 42               Michigan MI
## 43                  Texas TX
## 44                  Texas TX
## 45               Illinois IL
## 46               Arkansas AR
## 47                FLORIDA FL
## 48                Florida FL
## 49             California CA
## 50               Michigan MI
## 51               VIRGINIA VA
## 52             New Mexico NM
## 53               Virginia VA
## 54             New Mexico NM
## 55             California CA
## 56                  Texas TX
## 57                  Texas TX
## 58                  Texas TX
## 59                  Texas TX
## 60                  Texas TX
## 61               VIRGINIA VA
## 62             California CA
## 63          West Virginia WV
## 64               New York NY
## 65               Michigan MI
## 66             California CA
## 67               MICHIGAN MI
## 68               Michigan MI
## 69                  Texas TX
## 70                FLORIDA FL
## 71             WASHINGTON WA
## 72                FLORIDA FL
## 73                Florida FL
## 74                FLORIDA FL
## 75                Florida FL
## 76               Nebraska NE
## 77              Minnesota MN
## 78             California CA
## 79             California CA
## 80               Michigan MI
## 81               Colorado CO
## 82             Washington WA
## 83                  Texas TX
## 84                Florida FL
## 85               Maryland MD
## 86               MICHIGAN MI
## 87               Virginia VA
## 88               Kentucky KY
## 89               Michigan MI
## 90                Florida FL
## 91                  Idaho ID
## 92              Minnesota MN
## 93               Kentucky KY
## 94               Illinois IL
## 95               Colorado CO
## 96             California CA
## 97             CALIFORNIA CA
## 98             California CA
## 99             California CA
## 100            California CA
## 101               Florida FL
## 102                 Texas TX
## 103               Arizona AZ
## 104              Michigan MI
## 105              Virginia VA
## 106             Minnesota MN
## 107              Michigan MI
## 108                 Texas TX
## 109            New Jersey NJ
## 110                 Texas TX
## 111                 Texas TX
## 112                NEVADA NV
## 113              Virginia VA
## 114                 Texas TX
## 115              Virginia VA
## 116                 TEXAS TX
## 117                 Texas TX
## 118        North Carolina NC
## 119              Michigan MI
## 120                 Texas TX
## 121            California CA
## 122              Maryland MD
## 123             Minnesota MN
## 124            California CA
## 125              Kentucky KY
## 126            California CA
## 127              Michigan MI
## 128                 Texas TX
## 129                 Texas TX
## 130            Washington WA
## 131              Michigan MI
## 132             Minnesota MN
## 133                Oregon OR
## 134               Florida FL
## 135               Florida FL
## 136               Florida FL
## 137            California CA
## 138            California CA
## 139            California CA
## 140              Colorado CO
## 141            California CA
## 142                Oregon OR
## 143            New Jersey NJ
## 144            California CA
## 145             Minnesota MN
## 146            California CA
## 147             Minnesota MN
## 148             MINNESOTA MN
## 149             MINNESOTA MN
## 150             MINNESOTA MN
## 151             MINNESOTA MN
## 152              Virginia VA
## 153              Virginia VA
## 154              Virginia VA
## 155              Virginia VA
## 156             MINNESOTA MN
## 157             Minnesota MN
## 158             Minnesota MN
## 159             Minnesota MN
## 160             Minnesota MN
## 161             Minnesota MN
## 162             Minnesota MN
## 163             MINNESOTA MN
## 164             Minnesota MN
## 165             MINNESOTA MN
## 166             MINNESOTA MN
## 167             MINNESOTA MN
## 168             MINNESOTA MN
## 169             Minnesota MN
## 170             Minnesota MN
## 171             Minnesota MN
## 172             Minnesota MN
## 173             Minnesota MN
## 174             Minnesota MN
## 175             Minnesota MN
## 176             Minnesota MN
## 177             Minnesota MN
## 178             Minnesota MN
## 179           Mississippi MS
## 180                 Texas TX
## 181                 Texas TX
## 182               Florida FL
## 183              Nebraska NE
## 184            California CA
## 185             Minnesota MN
## 186              Kentucky KY
## 187        North Carolina NC
## 188              Michigan MI
## 189              Missouri MO
## 190              MICHIGAN MI
## 191                 Texas TX
## 192            California CA
## 193                 Texas TX
## 194                 Texas TX
## 195                 Texas TX
## 196                 Texas TX
## 197                 Texas TX
## 198              Michigan MI
## 199              NEW YORK NY
## 200               Indiana IN
## 201              Michigan MI
## 202               Alabama AL
## 203                Oregon OR
## 204              COLORADO CO
## 205             MINNESOTA MN
## 206                 TEXAS TX
## 207            California CA
## 208               Florida FL
## 209              Illinois IL
## 210             MINNESOTA MN
## 211                 Texas TX
## 212            California CA
## 213            California CA
## 214            California CA
## 215            California CA
## 216            California CA
## 217            California CA
## 218            California CA
## 219            California CA
## 220                 Texas TX
## 221                 Texas TX
## 222                 Texas TX
## 223                 Texas TX
## 224                 Texas TX
## 225                 Texas TX
## 226                 Texas TX
## 227                 Texas TX
## 228                 Texas TX
## 229                 Texas TX
## 230                 Texas TX
## 231                 Texas TX
## 232              Virginia VA
## 233              Arkansas AR
## 234                 Texas TX
## 235               Florida FL
## 236              Michigan MI
## 237           Connecticut CT
## 238               Arizona AZ
## 239              Virginia VA
## 240              Virginia VA
## 241              Virginia VA
## 242            Washington WA
## 243                 Texas TX
## 244                 Texas TX
## 245            California CA
## 246              Michigan MI
## 247              MICHIGAN MI
## 248               Florida FL
## 249                 Texas TX
## 250            California CA
## 251                 Texas TX
## 252            New Jersey NJ
## 253               Florida FL
## 254            California CA
## 255               Alabama AL
## 256                 Texas TX
## 257               Alabama AL
## 258                 Texas TX
## 259            California CA
## 260           Mississippi MS
## 261                 Texas TX
## 262                 Texas TX
## 263              Michigan MI
## 264           Mississippi MS
## 265                Alaska AK
## 266                 Texas TX
## 267            New Jersey NJ
## 268                 Texas TX
## 269               Florida FL
## 270               Florida FL
## 271              Maryland MD
## 272              Missouri MO
## 273                 Texas TX
## 274                 Texas TX
## 275                  Iowa IA
## 276                 Texas TX
## 277               Georgia GA
## 278               Alabama AL
## 279            Washington WA
## 280            NEW JERSEY NJ
## 281              Nebraska NE
## 282                  Iowa IA
## 283                 TEXAS TX
## 284            California CA
## 285            California CA
## 286                 Texas TX
## 287                 Texas TX
## 288            California CA
## 289                 Idaho ID
## 290             Minnesota MN
## 291             MINNESOTA MN
## 292            California CA
## 293               FLORIDA FL
## 294               Florida FL
## 295                 Texas TX
## 296               Florida FL
## 297               Florida FL
## 298               Florida FL
## 299               FLORIDA FL
## 300               Florida FL
## 301               FLORIDA FL
## 302               Florida FL
## 303               Florida FL
## 304               Florida FL
## 305               Florida FL
## 306               Florida FL
## 307               Florida FL
## 308            California CA
## 309             MINNESOTA MN
## 310            New Jersey NJ
## 311                 TEXAS TX
## 312            California CA
## 313                 Texas TX
## 314               Florida FL
## 315            California CA
## 316            New Jersey NJ
## 317             Minnesota MN
## 318              Maryland MD
## 319              Maryland MD
## 320               Alabama AL
## 321                 Texas TX
## 322             Minnesota MN
## 323             Minnesota MN
## 324             Minnesota MN
## 325             Minnesota MN
## 326             Minnesota MN
## 327         Massachusetts MA
## 328        North Carolina NC
## 329            California CA
## 330         West Virginia WV
## 331             Minnesota MN
## 332             Minnesota MN
## 333             Minnesota MN
## 334                 Texas TX
## 335               Arizona AZ
## 336               Arizona AZ
## 337               Arizona AZ
## 338               Arizona AZ
## 339               Arizona AZ
## 340               Arizona AZ
## 341               Arizona AZ
## 342               Florida FL
## 343              Kentucky KY
## 344            California CA
## 345            California CA
## 346             Wisconsin WI
## 347              Maryland MD
## 348               Georgia GA
## 349                 Texas TX
## 350              Colorado CO
## 351            California CA
## 352              ILLINOIS IL
## 353              ILLINOIS IL
## 354             Minnesota MN
## 355             Minnesota MN
## 356            California CA
## 357            California CA
## 358             Minnesota MN
## 359          SOUTH DAKOTA SD
## 360            California CA
## 361                 Texas TX
## 362            WASHINGTON WA
## 363              Michigan MI
## 364             Minnesota MN
## 365            California CA
## 366             Minnesota MN
## 367            California CA
## 368                 Texas TX
## 369              Nebraska NE
## 370                Oregon OR
## 371            California CA
## 372        North Carolina NC
## 373               FLORIDA FL
## 374              Michigan MI
## 375                 Texas TX
## 376              Michigan MI
## 377              KENTUCKY KY
## 378        North Carolina NC
## 379                  Utah UT
## 380               Arizona AZ
## 381               Arizona AZ
## 382               Arizona AZ
## 383               Arizona AZ
## 384               Arizona AZ
## 385               Arizona AZ
## 386               Arizona AZ
## 387               Arizona AZ
## 388               Arizona AZ
## 389              Colorado CO
## 390              VIRGINIA VA
## 391               Florida FL
## 392                Nevada NV
## 393              Illinois IL
## 394            CALIFORNIA CA
## 395             Wisconsin WI
## 396                 Texas TX
## 397              Illinois IL
## 398              Illinois IL
## 399            California CA
## 400                 Texas TX
## 401                 Texas TX
## 402                 Texas TX
## 403                 Texas TX
## 404                 Texas TX
## 405                 Texas TX
## 406                 Texas TX
## 407              Michigan MI
## 408            New Jersey NJ
## 409            New Jersey NJ
## 410            New Jersey NJ
## 411            New Jersey NJ
## 412         MASSACHUSETTS MA
## 413            California CA
## 414              Kentucky KY
## 415               Georgia GA
## 416               Georgia GA
## 417            California CA
## 418          South Dakota SD
## 419          South Dakota SD
## 420             Minnesota MN
## 421             Minnesota MN
## 422                 Texas TX
## 423                 TEXAS TX
## 424                 Texas TX
## 425               Alabama AL
## 426                Alaska AK
## 427            California CA
## 428            Washington WA
## 429              Michigan MI
## 430                 Texas TX
## 431                 Texas TX
## 432                 Texas TX
## 433                 Texas TX
## 434                 TEXAS TX
## 435                 TEXAS TX
## 436                 TEXAS TX
## 437            New Mexico NM
## 438        North Carolina NC
## 439              ILLINOIS IL
## 440            California CA
## 441            California CA
## 442              Arkansas AR
## 443             Minnesota MN
## 444            California CA
## 445              Maryland MD
## 446              Michigan MI
## 447              MICHIGAN MI
## 448             Wisconsin WI
## 449            California CA
## 450                 Texas TX
## 451              Michigan MI
## 452                 Texas TX
## 453                 TEXAS TX
## 454                 Texas TX
## 455                 Texas TX
## 456         West Virginia WV
## 457              Michigan MI
## 458              Kentucky KY
## 459               Arizona AZ
## 460            WASHINGTON WA
## 461              KENTUCKY KY
## 462              Kentucky KY
## 463         West Virginia WV
## 464              Michigan MI
## 465              Kentucky KY
## 466               Florida FL
## 467             Minnesota MN
## 468                 Idaho ID
## 469                 Texas TX
## 470                 Texas TX
## 471            WASHINGTON WA
## 472              Michigan MI
## 473              Kentucky KY
## 474              Michigan MI
## 475              Michigan MI
## 476              Michigan MI
## 477               Florida FL
## 478             Wisconsin WI
## 479              Michigan MI
## 480               Florida FL
## 481            California CA
## 482               Florida FL
## 483             Minnesota MN
## 484              Maryland MD
## 485            California CA
## 486              KENTUCKY KY
## 487             Minnesota MN
## 488             Minnesota MN
## 489               Florida FL
## 490             Minnesota MN
## 491         West Virginia WV
## 492            California CA
## 493              MICHIGAN MI
## 494              Virginia VA
## 495              New York NY
## 496            New Mexico NM
## 497                 Texas TX
## 498                 Texas TX
## 499                 Texas TX
## 500                 Texas TX
## 501              Kentucky KY
## 502                 Texas TX
## 503                 Texas TX
## 504                 Texas TX
## 505                 Texas TX
## 506                 Texas TX
## 507                 Texas TX
## 508                 Texas TX
## 509              Michigan MI
## 510          South Dakota SD
## 511              Arkansas AR
## 512            Washington WA
## 513              KENTUCKY KY
## 514            California CA
## 515            WASHINGTON WA
## 516            WASHINGTON WA
## 517                  Iowa IA
## 518             Wisconsin WI
## 519             Minnesota MN
## 520             Minnesota MN
## 521             Minnesota MN
## 522              Michigan MI
## 523                 Idaho ID
## 524             Minnesota MN
## 525             Minnesota MN
## 526                Alaska AK
## 527              Michigan MI
## 528              Michigan MI
## 529            New Jersey NJ
## 530            New Jersey NJ
## 531            California CA
## 532              Michigan MI
## 533              MICHIGAN MI
## 534              Michigan MI
## 535              Michigan MI
## 536            California CA
## 537               Florida FL
## 538              Michigan MI
## 539             Minnesota MN
## 540                Alaska AK
## 541                 Texas TX
## 542                 Texas TX
## 543                 Texas TX
## 544                 Texas TX
## 545                 Texas TX
## 546                 Texas TX
## 547                 Texas TX
## 548                 Texas TX
## 549                 Texas TX
## 550                 Texas TX
## 551            California CA
## 552            California CA
## 553            Washington WA
## 554              Michigan MI
## 555                 Texas TX
## 556                 Texas TX
## 557            California CA
## 558               Florida FL
## 559                 Texas TX
## 560                 Texas TX
## 561            California CA
## 562                Nevada NV
## 563        South Carolina SC
## 564               Florida FL
## 565               Georgia GA
## 566            California CA
## 567            California CA
## 568            California CA
## 569                 Idaho ID
## 570            California CA
## 571          SOUTH DAKOTA SD
## 572          South Dakota SD
## 573          South Dakota SD
## 574             Wisconsin WI
## 575            California CA
## 576              Nebraska NE
## 577            Washington WA
## 578            WASHINGTON WA
## 579                 Texas TX
## 580                 TEXAS TX
## 581              MICHIGAN MI
## 582            California CA
## 583                  Utah UT
## 584            California CA
## 585        North Carolina NC
## 586              Virginia VA
## 587         WEST VIRGINIA WV
## 588              KENTUCKY KY
## 589              Kentucky KY
## 590              Kentucky KY
## 591         West Virginia WV
## 592               Georgia GA
## 593                 Texas TX
## 594                 TEXAS TX
## 595             Minnesota MN
## 596               Indiana IN
## 597              Kentucky KY
## 598              Missouri MO
## 599              Missouri MO
## 600         Massachusetts MA
## 601         Massachusetts MA
## 602         MASSACHUSETTS MA
## 603               Arizona AZ
## 604              Colorado CO
## 605                 Texas TX
## 606               Florida FL
## 607              Kentucky KY
## 608            California CA
## 609              Kentucky KY
## 610            California CA
## 611            California CA
## 612              Kentucky KY
## 613                 Texas TX
## 614            California CA
## 615             Minnesota MN
## 616               Florida FL
## 617              Nebraska NE
## 618               Florida FL
## 619               Florida FL
## 620              Colorado CO
## 621        North Carolina NC
## 622                 TEXAS TX
## 623              Kentucky KY
## 624               Florida FL
## 625              Michigan MI
## 626            California CA
## 627                 TEXAS TX
## 628                 Texas TX
## 629                 Texas TX
## 630                 Texas TX
## 631                 Texas TX
## 632                 Texas TX
## 633                 Texas TX
## 634                 Texas TX
## 635                 Texas TX
## 636                 Texas TX
## 637                 Texas TX
## 638                 Texas TX
## 639                 Texas TX
## 640                 Texas TX
## 641                 Texas TX
## 642            California CA
## 643              Virginia VA
## 644              Kentucky KY
## 645              Kentucky KY
## 646              Kentucky KY
## 647             MINNESOTA MN
## 648              Kentucky KY
## 649            Washington WA
## 650            California CA
## 651              NEW YORK NY
## 652            California CA
## 653               Florida FL
## 654               Florida FL
## 655               Florida FL
## 656                 Texas TX
## 657            Washington WA
## 658                 Idaho ID
## 659              Michigan MI
## 660                 Texas TX
## 661            California CA
## 662            Washington WA
## 663              Colorado CO
## 664            California CA
## 665            California CA
## 666            California CA
## 667            California CA
## 668                OREGON OR
## 669        North Carolina NC
## 670              Colorado CO
## 671            California CA
## 672             MINNESOTA MN
## 673            California CA
## 674              New York NY
## 675              KENTUCKY KY
## 676              New York NY
## 677             MINNESOTA MN
## 678             MINNESOTA MN
## 679             MINNESOTA MN
## 680             MINNESOTA MN
## 681              Michigan MI
## 682              NEW YORK NY
## 683               Florida FL
## 684               Florida FL
## 685              Michigan MI
## 686                 Texas TX
## 687                 Texas TX
## 688              New York NY
## 689                 Texas TX
## 690                 TEXAS TX
## 691                 Texas TX
## 692              Nebraska NE
## 693            Washington WA
## 694              Virginia VA
## 695              MICHIGAN MI
## 696              KENTUCKY KY
## 697              Kentucky KY
## 698                 Texas TX
## 699            California CA
## 700            California CA
## 701            California CA
## 702            California CA
## 703            California CA
## 704                 Texas TX
## 705              Kentucky KY
## 706              Michigan MI
## 707            CALIFORNIA CA
## 708            California CA
## 709                Alaska AK
## 710                Nevada NV
## 711         West Virginia WV
## 712            New Jersey NJ
## 713            NEW JERSEY NJ
## 714            New Jersey NJ
## 715            NEW JERSEY NJ
## 716            Washington WA
## 717                 Texas TX
## 718            California CA
## 719            California CA
## 720                Oregon OR
## 721             Minnesota MN
## 722             Minnesota MN
## 723             Minnesota MN
## 724              MICHIGAN MI
## 725            California CA
## 726            California CA
## 727              Kentucky KY
## 728            CALIFORNIA CA
## 729            California CA
## 730              Colorado CO
## 731               Florida FL
## 732               Alabama AL
## 733                Nevada NV
## 734               Alabama AL
## 735               Florida FL
## 736             Minnesota MN
## 737        North Carolina NC
## 738         West Virginia WV
## 739            California CA
## 740                  Utah UT
## 741                 Texas TX
## 742              Michigan MI
## 743            California CA
## 744            California CA
## 745            California CA
## 746            California CA
## 747            California CA
## 748                 Texas TX
## 749            California CA
## 750               Alabama AL
## 751            California CA
## 752            California CA
## 753            California CA
## 754              Delaware DE
## 755              Kentucky KY
## 756              Kentucky KY
## 757              Maryland MD
## 758                 Texas TX
## 759                 Texas TX
## 760            California CA
## 761            Washington WA
## 762            California CA
## 763            California CA
## 764            New Jersey NJ
## 765            California CA
## 766            New Jersey NJ
## 767            New Jersey NJ
## 768            New Jersey NJ
## 769               Florida FL
## 770             Wisconsin WI
## 771                 Texas TX
## 772                 Texas TX
## 773                 Texas TX
## 774                 Texas TX
## 775                 Texas TX
## 776                 Texas TX
## 777                 Texas TX
## 778                 Texas TX
## 779                 Texas TX
## 780            NEW MEXICO NM
## 781            California CA
## 782               Arizona AZ
## 783            California CA
## 784              Kentucky KY
## 785            California CA
## 786              VIRGINIA VA
## 787             Minnesota MN
## 788             MINNESOTA MN
## 789           Mississippi MS
## 790                 Texas TX
## 791            California CA
## 792            California CA
## 793            California CA
## 794               Arizona AZ
## 795                 Idaho ID
## 796              NEW YORK NY
## 797            Washington WA
## 798              Michigan MI
## 799            New Jersey NJ
## 800            New Jersey NJ
## 801            California CA
## 802           Mississippi MS
## 803            California CA
## 804             WISCONSIN WI
## 805               Arizona AZ
## 806            California CA
## 807              KENTUCKY KY
## 808             Minnesota MN
## 809             Minnesota MN
## 810             Wisconsin WI
## 811           Mississippi MS
## 812            Washington WA
## 813              Michigan MI
## 814            New Jersey NJ
## 815              Michigan MI
## 816              Nebraska NE
## 817              Michigan MI
## 818              Michigan MI
## 819            New Mexico NM
## 820            Washington WA
## 821              NEBRASKA NE
## 822            New Mexico NM
## 823              Michigan MI
## 824        North Carolina NC
## 825              Virginia VA
## 826            California CA
## 827            California CA
## 828            California CA
## 829            California CA
## 830              Michigan MI
## 831              KENTUCKY KY
## 832            California CA
## 833            California CA
## 834            California CA
## 835              Kentucky KY
## 836              Virginia VA
## 837              Virginia VA
## 838                Nevada NV
## 839                Nevada NV
## 840              Michigan MI
## 841              Michigan MI
## 842              Michigan MI
## 843              Kentucky KY
## 844               Florida FL
## 845              Kentucky KY
## 846              Delaware DE
## 847                 Texas TX
## 848              Virginia VA
## 849             Tennessee TN
## 850                 TEXAS TX
## 851            California CA
## 852            Washington WA
## 853                OREGON OR
## 854            Washington WA
## 855              New York NY
## 856              Michigan MI
## 857             Minnesota MN
## 858                 Idaho ID
## 859              Michigan MI
## 860             WISCONSIN WI
## 861               FLORIDA FL
## 862               Florida FL
## 863               FLORIDA FL
## 864               Wyoming WY
## 865              Maryland MD
## 866                 Texas TX
## 867                 Texas TX
## 868              Illinois IL
## 869                 Idaho ID
## 870            California CA
## 871            California CA
## 872                 TEXAS TX
## 873                 TEXAS TX
## 874                  Utah UT
## 875              Michigan MI
## 876             Minnesota MN
## 877              Colorado CO
## 878            California CA
## 879              Colorado CO
## 880            California CA
## 881                Oregon OR
## 882              Missouri MO
## 883           Mississippi MS
## 884           Mississippi MS
## 885            California CA
## 886                 Texas TX
## 887           Mississippi MS
## 888              Missouri MO
## 889              Virginia VA
## 890              Illinois IL
## 891              Maryland MD
## 892              Michigan MI
## 893             Minnesota MN
## 894             MINNESOTA MN
## 895            California CA
## 896            California CA
## 897                 Idaho ID
## 898             Minnesota MN
## 899            California CA
## 900            California CA
## 901        North Carolina NC
## 902             Minnesota MN
## 903        North Carolina NC
## 904            California CA
## 905             Minnesota MN
## 906            California CA
## 907            California CA
## 908              Michigan MI
## 909                 Idaho ID
## 910               FLORIDA FL
## 911            California CA
## 912                Oregon OR
## 913              Michigan MI
## 914             Minnesota MN
## 915              Michigan MI
## 916             Minnesota MN
## 917             Minnesota MN
## 918             Minnesota MN
## 919             Minnesota MN
## 920             Minnesota MN
## 921             Minnesota MN
## 922            New Mexico NM
## 923               Florida FL
## 924             TENNESSEE TN
## 925           Mississippi MS
## 926              Delaware DE
## 927            California CA
## 928            California CA
## 929             Wisconsin WI
## 930              Illinois IL
## 931            California CA
## 932            New Mexico NM
## 933            California CA
## 934             Minnesota MN
## 935                 Texas TX
## 936                 Texas TX
## 937            California CA
## 938            California CA
## 939                 Texas TX
## 940            California CA
## 941               Alabama AL
## 942              Colorado CO
## 943            California CA
## 944            California CA
## 945                 Texas TX
## 946                 Texas TX
## 947                 Texas TX
## 948                 Texas TX
## 949                 Texas TX
## 950                 Texas TX
## 951                 Texas TX
## 952                 Texas TX
## 953                 Texas TX
## 954                 Texas TX
## 955                 Texas TX
## 956                 Texas TX
## 957                 Texas TX
## 958                 Texas TX
## 959                 Texas TX
## 960            Washington WA
## 961                 Texas TX
## 962            Washington WA
## 963               Arizona AZ
## 964            California CA
## 965               Florida FL
## 966               Florida FL
## 967         West Virginia WV
## 968               Arizona AZ
## 969            California CA
## 970            California CA
## 971            California CA
## 972            California CA
## 973              Michigan MI
## 974               Florida FL
## 975             Wisconsin WI
## 976            New Mexico NM
## 977              Virginia VA
## 978            California CA
## 979            California CA
## 980               Georgia GA
## 981              NEW YORK NY
## 982            California CA
## 983                 Texas TX
## 984              Michigan MI
## 985            Washington WA
## 986            WASHINGTON WA
## 987            New Jersey NJ
## 988            NEW JERSEY NJ
## 989            NEW JERSEY NJ
## 990              MICHIGAN MI
## 991              Virginia VA
## 992            California CA
## 993             Minnesota MN
## 994              Virginia VA
## 995            California CA
## 996            Washington WA
## 997            Washington WA
## 998               Florida FL
## 999         Massachusetts MA
## 1000             Nebraska NE
## 1001               Nevada NV
## 1002              Florida FL
## 1003                Texas TX
## 1004                Texas TX
## 1005             Kentucky KY
## 1006           New Mexico NM
## 1007              Alabama AL
## 1008           California CA
## 1009                Texas TX
## 1010             Michigan MI
## 1011             Michigan MI
## 1012            Minnesota MN
## 1013            Minnesota MN
## 1014           Washington WA
## 1015            Minnesota MN
## 1016            Minnesota MN
## 1017           Washington WA
## 1018             Kentucky KY
## 1019             ILLINOIS IL
## 1020                Texas TX
## 1021             Kentucky KY
## 1022             Kentucky KY
## 1023                Texas TX
## 1024           New Mexico NM
## 1025           WASHINGTON WA
## 1026             Michigan MI
## 1027             Michigan MI
## 1028               NEVADA NV
## 1029           California CA
## 1030                Texas TX
## 1031              Florida FL
## 1032              Florida FL
## 1033           California CA
## 1034           California CA
## 1035              FLORIDA FL
## 1036              Alabama AL
## 1037           California CA
## 1038              Florida FL
## 1039             Michigan MI
## 1040             Michigan MI
## 1041               Nevada NV
## 1042               Nevada NV
## 1043              Indiana IN
## 1044             Michigan MI
## 1045             Michigan MI
## 1046              Georgia GA
## 1047            Minnesota MN
## 1048                Texas TX
## 1049              Florida FL
## 1050              ALABAMA AL
## 1051              Florida FL
## 1052             Michigan MI
## 1053                Texas TX
## 1054          Mississippi MS
## 1055             NEW YORK NY
## 1056             MICHIGAN MI
## 1057             Michigan MI
## 1058             MICHIGAN MI
## 1059           Washington WA
## 1060             Illinois IL
## 1061            Minnesota MN
## 1062                Idaho ID
## 1063           CALIFORNIA CA
## 1064             Colorado CO
## 1065           California CA
## 1066           California CA
## 1067                Texas TX
## 1068          Mississippi MS
## 1069           CALIFORNIA CA
## 1070               Nevada NV
## 1071           California CA
## 1072                Texas TX
## 1073                Texas TX
## 1074                Texas TX
## 1075                Texas TX
## 1076             VIRGINIA VA
## 1077           California CA
## 1078                Texas TX
## 1079           New Mexico NM
## 1080                Texas TX
## 1081                Texas TX
## 1082                Texas TX
## 1083             Kentucky KY
## 1084             KENTUCKY KY
## 1085                Texas TX
## 1086                Texas TX
## 1087              Florida FL
## 1088                Texas TX
## 1089                Texas TX
## 1090                Texas TX
## 1091                Texas TX
## 1092                Texas TX
## 1093                Texas TX
## 1094                Texas TX
## 1095                Texas TX
## 1096                Texas TX
## 1097           California CA
## 1098             Colorado CO
## 1099                Texas TX
## 1100             Colorado CO
## 1101           California CA
## 1102            MINNESOTA MN
## 1103             Michigan MI
## 1104           Washington WA
## 1105            Wisconsin WI
## 1106               Oregon OR
## 1107             NEW YORK NY
## 1108             MICHIGAN MI
## 1109           Washington WA
## 1110           Washington WA
## 1111           Washington WA
## 1112           Washington WA
## 1113           California CA
## 1114           California CA
## 1115                Texas TX
## 1116                Texas TX
## 1117              Florida FL
## 1118           California CA
## 1119           California CA
## 1120                Texas TX
## 1121                Texas TX
## 1122           California CA
## 1123             Kentucky KY
## 1124       North Carolina NC
## 1125             Maryland MD
## 1126           California CA
## 1127           California CA
## 1128           California CA
## 1129           California CA
## 1130           California CA
## 1131           California CA
## 1132           California CA
## 1133           California CA
## 1134                Texas TX
## 1135           California CA
## 1136           California CA
## 1137       North Carolina NC
## 1138             Michigan MI
## 1139          Mississippi MS
## 1140             Colorado CO
## 1141               Oregon OR
## 1142                Texas TX
## 1143           Washington WA
## 1144           California CA
## 1145                Texas TX
## 1146              INDIANA IN
## 1147                Texas TX
## 1148            Minnesota MN
## 1149              Florida FL
## 1150            Minnesota MN
## 1151           California CA
## 1152           California CA
## 1153           Washington WA
## 1154                Texas TX
## 1155             Michigan MI
## 1156             New York NY
## 1157           California CA
## 1158           California CA
## 1159           California CA
## 1160       NORTH CAROLINA NC
## 1161           WASHINGTON WA
## 1162             Colorado CO
## 1163             New York NY
## 1164             MICHIGAN MI
## 1165             Michigan MI
## 1166             Colorado CO
## 1167           New Mexico NM
## 1168             Michigan MI
## 1169              Alabama AL
## 1170           Washington WA
## 1171           Washington WA
## 1172            Minnesota MN
## 1173                Texas TX
## 1174             Illinois IL
## 1175                Texas TX
## 1176             Michigan MI
## 1177            Minnesota MN
## 1178            Minnesota MN
## 1179             Illinois IL
## 1180              Florida FL
## 1181                Texas TX
## 1182            Wisconsin WI
## 1183             Kentucky KY
## 1184             Kentucky KY
## 1185           California CA
## 1186           California CA
## 1187                Texas TX
## 1188            Minnesota MN
## 1189             Virginia VA
## 1190             New York NY
## 1191           California CA
## 1192           California CA
## 1193           California CA
## 1194              Florida FL
## 1195                Texas TX
## 1196             MICHIGAN MI
## 1197                Texas TX
## 1198               Oregon OR
## 1199                Idaho ID
## 1200           California CA
## 1201           New Jersey NJ
## 1202             Michigan MI
## 1203           California CA
## 1204           California CA
## 1205           California CA
## 1206           California CA
## 1207           California CA
## 1208             NEW YORK NY
## 1209                Texas TX
## 1210             Michigan MI
## 1211             Michigan MI
## 1212             Michigan MI
## 1213             Michigan MI
## 1214             Michigan MI
## 1215             Michigan MI
## 1216             Kentucky KY
## 1217          Mississippi MS
## 1218               Nevada NV
## 1219               Nevada NV
## 1220             Nebraska NE
## 1221           WASHINGTON WA
## 1222                Texas TX
## 1223         RHODE ISLAND RI
## 1224             Virginia VA
## 1225           WASHINGTON WA
## 1226             Michigan MI
## 1227             Michigan MI
## 1228             Michigan MI
## 1229            Minnesota MN
## 1230           California CA
## 1231           California CA
## 1232             Missouri MO
## 1233           California CA
## 1234              Florida FL
## 1235              Georgia GA
## 1236              Georgia GA
## 1237                Texas TX
## 1238             Maryland MD
## 1239                Texas TX
## 1240                Texas TX
## 1241             Maryland MD
## 1242                Texas TX
## 1243           California CA
## 1244              Florida FL
## 1245           California CA
## 1246             Michigan MI
## 1247             Virginia VA
## 1248            Minnesota MN
## 1249             Maryland MD
## 1250           California CA
## 1251           Washington WA
## 1252                Texas TX
## 1253                Texas TX
## 1254           California CA
## 1255           California CA
## 1256           Washington WA
## 1257              Florida FL
## 1258             Maryland MD
## 1259                Idaho ID
## 1260              ALABAMA AL
## 1261               Alaska AK
## 1262            Minnesota MN
## 1263            MINNESOTA MN
## 1264             Kentucky KY
## 1265                Texas TX
## 1266                Texas TX
## 1267             New York NY
## 1268            Minnesota MN
## 1269                Texas TX
## 1270             Missouri MO
## 1271              Alabama AL
## 1272              Alabama AL
## 1273           California CA
## 1274           California CA
## 1275                Texas TX
## 1276           New Jersey NJ
## 1277             Kentucky KY
## 1278           New Jersey NJ
## 1279           NEW JERSEY NJ
## 1280           Washington WA
## 1281           California CA
## 1282           Washington WA
## 1283           Washington WA
## 1284           Washington WA
## 1285              Florida FL
## 1286              Florida FL
## 1287              Florida FL
## 1288                Texas TX
## 1289                Texas TX
## 1290             Michigan MI
## 1291              Florida FL
## 1292                Texas TX
## 1293                Texas TX
## 1294                Texas TX
## 1295                Texas TX
## 1296                Texas TX
## 1297                Texas TX
## 1298                Texas TX
## 1299                Texas TX
## 1300                Texas TX
## 1301           California CA
## 1302            Minnesota MN
## 1303            Minnesota MN
## 1304              Florida FL
## 1305                Texas TX
## 1306                 Utah UT
## 1307                Texas TX
## 1308                Texas TX
## 1309                Texas TX
## 1310                Texas TX
## 1311                Texas TX
## 1312                Texas TX
## 1313                Texas TX
## 1314                Texas TX
## 1315                Texas TX
## 1316                Texas TX
## 1317                Texas TX
## 1318                Texas TX
## 1319           California CA
## 1320             Colorado CO
## 1321            Tennessee TN
## 1322         Pennsylvania PA
## 1323       North Carolina NC
## 1324           California CA
## 1325            Minnesota MN
## 1326              Florida FL
## 1327              Florida FL
## 1328              Florida FL
## 1329       North Carolina NC
## 1330       North Carolina NC
## 1331              Arizona AZ
## 1332           California CA
## 1333        West Virginia WV
## 1334             Michigan MI
## 1335                Texas TX
## 1336                Texas TX
## 1337           Washington WA
## 1338           Washington WA
## 1339           California CA
## 1340              Florida FL
## 1341         Rhode Island RI
## 1342             MICHIGAN MI
## 1343             Michigan MI
## 1344           California CA
## 1345           California CA
## 1346            Minnesota MN
## 1347           Washington WA
## 1348            MINNESOTA MN
## 1349              Georgia GA
## 1350              Georgia GA
## 1351           California CA
## 1352           California CA
## 1353           California CA
## 1354           California CA
## 1355           California CA
## 1356                Texas TX
## 1357                Texas TX
## 1358                Texas TX
## 1359             Colorado CO
## 1360           California CA
## 1361                 Iowa IA
## 1362                Texas TX
## 1363                Texas TX
## 1364                Texas TX
## 1365                Texas TX
## 1366                Texas TX
## 1367                Texas TX
## 1368                Texas TX
## 1369                Texas TX
## 1370                Texas TX
## 1371                Texas TX
## 1372                Texas TX
## 1373                Texas TX
## 1374                Texas TX
## 1375                Texas TX
## 1376             Colorado CO
## 1377                Texas TX
## 1378              Georgia GA
## 1379              Georgia GA
## 1380                Texas TX
## 1381              Florida FL
## 1382           CALIFORNIA CA
## 1383           California CA
## 1384           WASHINGTON WA
## 1385              Arizona AZ
## 1386               Nevada NV
## 1387           California CA
## 1388           California CA
## 1389           California CA
## 1390              Alabama AL
## 1391           California CA
## 1392                TEXAS TX
## 1393              Florida FL
## 1394          Mississippi MS
## 1395             Kentucky KY
## 1396               Oregon OR
## 1397             Colorado CO
## 1398                Texas TX
## 1399              Florida FL
## 1400              Florida FL
## 1401             Michigan MI
## 1402            Minnesota MN
## 1403            Minnesota MN
## 1404            Minnesota MN
## 1405             MICHIGAN MI
## 1406                Texas TX
## 1407              Florida FL
## 1408                Texas TX
## 1409                Texas TX
## 1410           California CA
## 1411           California CA
## 1412             MICHIGAN MI
## 1413           California CA
## 1414             Missouri MO
## 1415                 UTAH UT
## 1416             Michigan MI
## 1417           California CA
## 1418                Texas TX
## 1419               Oregon OR
## 1420             Michigan MI
## 1421                Texas TX
## 1422                TEXAS TX
## 1423                Texas TX
## 1424                Texas TX
## 1425                Texas TX
## 1426           Washington WA
## 1427           California CA
## 1428           California CA
## 1429             Colorado CO
## 1430           Washington WA
## 1431           WASHINGTON WA
## 1432                Texas TX
## 1433           Washington WA
## 1434           Washington WA
## 1435              Florida FL
## 1436                Texas TX
## 1437           Washington WA
## 1438            Minnesota MN
## 1439                Texas TX
## 1440           California CA
## 1441           California CA
## 1442              FLORIDA FL
## 1443           California CA
## 1444              Florida FL
## 1445              Florida FL
## 1446            Wisconsin WI
## 1447        West Virginia WV
## 1448                Texas TX
## 1449              Florida FL
## 1450              FLORIDA FL
## 1451           California CA
## 1452           California CA
## 1453               Nevada NV
## 1454             NEBRASKA NE
## 1455               NEVADA NV
## 1456             Nebraska NE
## 1457             Michigan MI
## 1458             Virginia VA
## 1459           New Jersey NJ
## 1460             Michigan MI
## 1461              Arizona AZ
## 1462           California CA
## 1463           California CA
## 1464           California CA
## 1465           CALIFORNIA CA
## 1466                Texas TX
## 1467                Texas TX
## 1468                Texas TX
## 1469            WISCONSIN WI
## 1470           California CA
## 1471              Florida FL
## 1472             MICHIGAN MI
## 1473                Texas TX
## 1474                Texas TX
## 1475             ILLINOIS IL
## 1476              Florida FL
## 1477             Colorado CO
## 1478            Minnesota MN
## 1479           California CA
## 1480             Michigan MI
## 1481           California CA
## 1482             Illinois IL
## 1483              Alabama AL
## 1484             Colorado CO
## 1485              Arizona AZ
## 1486               Oregon OR
## 1487       North Carolina NC
## 1488              Florida FL
## 1489              Florida FL
## 1490              Florida FL
## 1491                Texas TX
## 1492         South Dakota SD
## 1493         SOUTH DAKOTA SD
## 1494             Maryland MD
## 1495             Colorado CO
## 1496                Idaho ID
## 1497           California CA
## 1498               Oregon OR
## 1499           California CA
## 1500           Washington WA
## 1501           Washington WA
## 1502               Nevada NV
## 1503           California CA
## 1504           California CA
## 1505           California CA
## 1506           California CA
## 1507           California CA
## 1508            Minnesota MN
## 1509           New Mexico NM
## 1510           California CA
## 1511               Oregon OR
## 1512                Texas TX
## 1513                Texas TX
## 1514             Illinois IL
## 1515           California CA
## 1516          Mississippi MS
## 1517                Texas TX
## 1518           Washington WA
## 1519           WASHINGTON WA
## 1520           California CA
## 1521             MICHIGAN MI
## 1522             Michigan MI
## 1523           California CA
## 1524            Minnesota MN
## 1525             Missouri MO
## 1526             Missouri MO
## 1527           California CA
## 1528            Minnesota MN
## 1529           California CA
## 1530             Colorado CO
## 1531                Texas TX
## 1532              Georgia GA
## 1533              Georgia GA
## 1534           Washington WA
## 1535           California CA
## 1536           California CA
## 1537           California CA
## 1538             MICHIGAN MI
## 1539             Illinois IL
## 1540              FLORIDA FL
## 1541                TEXAS TX
## 1542           California CA
## 1543                Texas TX
## 1544            Minnesota MN
## 1545              Arizona AZ
## 1546                Texas TX
## 1547            MINNESOTA MN
## 1548           WASHINGTON WA
## 1549           Washington WA
## 1550           Washington WA
## 1551                TEXAS TX
## 1552           New Jersey NJ
## 1553                Texas TX
## 1554            Minnesota MN
## 1555             MISSOURI MO
## 1556           New Mexico NM
## 1557           Washington WA
## 1558           WASHINGTON WA
## 1559           California CA
## 1560             Nebraska NE
## 1561              Florida FL
## 1562              Florida FL
## 1563           California CA
## 1564             New York NY
## 1565           California CA
## 1566           California CA
## 1567             Michigan MI
## 1568            Minnesota MN
## 1569                Texas TX
## 1570           California CA
## 1571           California CA
## 1572           California CA
## 1573           California CA
## 1574           California CA
## 1575                TEXAS TX
## 1576                Texas TX
## 1577                Texas TX
## 1578                TEXAS TX
## 1579           California CA
## 1580                Texas TX
## 1581                Texas TX
## 1582           California CA
## 1583           California CA
## 1584           California CA
## 1585              Georgia GA
## 1586              Georgia GA
## 1587                Texas TX
## 1588                Texas TX
## 1589            Tennessee TN
## 1590                Texas TX
## 1591           California CA
## 1592                 Iowa IA
## 1593           California CA
## 1594            Minnesota MN
## 1595            MINNESOTA MN
## 1596                Texas TX
## 1597        West Virginia WV
## 1598           California CA
## 1599           California CA
## 1600           California CA
## 1601                Texas TX
## 1602                Texas TX
## 1603           California CA
## 1604              Florida FL
## 1605                Idaho ID
## 1606           Washington WA
## 1607           Washington WA
## 1608             Colorado CO
## 1609            MINNESOTA MN
## 1610            Minnesota MN
## 1611             Virginia VA
## 1612                Texas TX
## 1613              Arizona AZ
## 1614              Florida FL
## 1615           California CA
## 1616                Texas TX
## 1617            Wisconsin WI
## 1618             Virginia VA
## 1619           California CA
## 1620              Florida FL
## 1621           California CA
## 1622           California CA
## 1623           California CA
## 1624           California CA
## 1625           Washington WA
## 1626            Minnesota MN
## 1627           California CA
## 1628             NEW YORK NY
## 1629              Florida FL
## 1630              Florida FL
## 1631              Alabama AL
## 1632              Florida FL
## 1633              Florida FL
## 1634             MICHIGAN MI
## 1635           WASHINGTON WA
## 1636             Nebraska NE
## 1637           California CA
## 1638           California CA
## 1639           New Jersey NJ
## 1640           New Jersey NJ
## 1641           New Jersey NJ
## 1642           New Jersey NJ
## 1643           NEW JERSEY NJ
## 1644              Florida FL
## 1645             Colorado CO
## 1646             KENTUCKY KY
## 1647                Texas TX
## 1648           California CA
## 1649           California CA
## 1650               Oregon OR
## 1651           California CA
## 1652           WASHINGTON WA
## 1653           WASHINGTON WA
## 1654                TEXAS TX
## 1655       South Carolina SC
## 1656            MINNESOTA MN
## 1657              Alabama AL
## 1658             Maryland MD
## 1659             Virginia VA
## 1660           Washington WA
## 1661             Missouri MO
## 1662              Florida FL
## 1663             Illinois IL
## 1664           California CA
## 1665           California CA
## 1666           California CA
## 1667           California CA
## 1668           California CA
## 1669           California CA
## 1670                Texas TX
## 1671                Texas TX
## 1672                Texas TX
## 1673                Texas TX
## 1674              Florida FL
## 1675              Florida FL
## 1676             Colorado CO
## 1677                Texas TX
## 1678                Texas TX
## 1679                Texas TX
## 1680             Maryland MD
## 1681                TEXAS TX
## 1682                TEXAS TX
## 1683                Texas TX
## 1684                Texas TX
## 1685           California CA
## 1686           California CA
## 1687           Washington WA
## 1688           Washington WA
## 1689                 Iowa IA
## 1690             Maryland MD
## 1691                Texas TX
## 1692             Maryland MD
## 1693                Texas TX
## 1694           California CA
## 1695             Virginia VA
## 1696             Virginia VA
## 1697              Alabama AL
## 1698           California CA
## 1699           California CA
## 1700                Texas TX
## 1701                Texas TX
## 1702                TEXAS TX
## 1703                TEXAS TX
## 1704                Texas TX
## 1705                Texas TX
## 1706                Texas TX
## 1707                TEXAS TX
## 1708                Texas TX
## 1709                Texas TX
## 1710                Texas TX
## 1711                TEXAS TX
## 1712            Minnesota MN
## 1713                Texas TX
## 1714                Texas TX
## 1715                TEXAS TX
## 1716                Texas TX
## 1717                Texas TX
## 1718                Texas TX
## 1719                Texas TX
## 1720            Minnesota MN
## 1721            Minnesota MN
## 1722            Minnesota MN
## 1723                Texas TX
## 1724                Texas TX
## 1725                Texas TX
## 1726                Texas TX
## 1727                Texas TX
## 1728                Texas TX
## 1729                Texas TX
## 1730                Texas TX
## 1731              Florida FL
## 1732           California CA
## 1733           California CA
## 1734           California CA
## 1735         SOUTH DAKOTA SD
## 1736                Texas TX
## 1737             Kentucky KY
## 1738              Alabama AL
## 1739              Alabama AL
## 1740             Virginia VA
## 1741           Washington WA
## 1742             Missouri MO
## 1743               Oregon OR
## 1744           California CA
## 1745             MICHIGAN MI
## 1746            Minnesota MN
## 1747            Minnesota MN
## 1748             Michigan MI
## 1749             Missouri MO
## 1750             Missouri MO
## 1751           California CA
## 1752             Michigan MI
## 1753                 Utah UT
## 1754             Kentucky KY
## 1755             Kentucky KY
## 1756           California CA
## 1757            Wisconsin WI
## 1758                Texas TX
## 1759                Texas TX
## 1760        Massachusetts MA
## 1761            Minnesota MN
## 1762           California CA
## 1763           WASHINGTON WA
## 1764                Texas TX
## 1765            MINNESOTA MN
## 1766             NEW YORK NY
## 1767           California CA
## 1768            Minnesota MN
## 1769             Delaware DE
## 1770                Texas TX
## 1771                Texas TX
## 1772            MINNESOTA MN
## 1773             MICHIGAN MI
## 1774             ILLINOIS IL
## 1775                Idaho ID
## 1776              Florida FL
## 1777            Wisconsin WI
## 1778             Illinois IL
## 1779             Maryland MD
## 1780            Minnesota MN
## 1781             Colorado CO
## 1782              Alabama AL
## 1783               Nevada NV
## 1784                Texas TX
## 1785                Texas TX
## 1786                Texas TX
## 1787                Texas TX
## 1788                Texas TX
## 1789              FLORIDA FL
## 1790            LOUISIANA LA
## 1791              Florida FL
## 1792                Texas TX
## 1793            MINNESOTA MN
## 1794             Illinois IL
## 1795           California CA
## 1796           California CA
## 1797           California CA
## 1798           California CA
## 1799           New Mexico NM
## 1800           California CA
## 1801             Kentucky KY
## 1802       NORTH CAROLINA NC
## 1803           California CA
## 1804            Minnesota MN
## 1805             Virginia VA
## 1806           Washington WA
## 1807                Texas TX
## 1808                Texas TX
## 1809                Texas TX
## 1810                Texas TX
## 1811                Texas TX
## 1812                Texas TX
## 1813             Kentucky KY
## 1814                Texas TX
## 1815                Texas TX
## 1816             MICHIGAN MI
## 1817           California CA
## 1818           California CA
## 1819           California CA
## 1820           California CA
## 1821             Michigan MI
## 1822            Wisconsin WI
## 1823             Missouri MO
## 1824           California CA
## 1825                Idaho ID
## 1826                Texas TX
## 1827                Texas TX
## 1828              Florida FL
## 1829                Idaho ID
## 1830               Oregon OR
## 1831             Kentucky KY
## 1832                Texas TX
## 1833                Texas TX
## 1834                Texas TX
## 1835                Texas TX
## 1836             Maryland MD
## 1837             Missouri MO
## 1838            MINNESOTA MN
## 1839           California CA
## 1840           New Mexico NM
## 1841           California CA
## 1842           CALIFORNIA CA
## 1843             Illinois IL
## 1844             Nebraska NE
## 1845           Washington WA
## 1846             Virginia VA
## 1847            Minnesota MN
## 1848           California CA
## 1849           California CA
## 1850            Minnesota MN
## 1851            Minnesota MN
## 1852           California CA
## 1853           California CA
## 1854             Colorado CO
## 1855                Idaho ID
## 1856             Michigan MI
## 1857             Missouri MO
## 1858        Massachusetts MA
## 1859             Michigan MI
## 1860             Missouri MO
## 1861           California CA
## 1862           California CA
## 1863                 Iowa IA
## 1864           Washington WA
## 1865             Illinois IL
## 1866           WASHINGTON WA
## 1867                Texas TX
## 1868                Texas TX
## 1869                Texas TX
## 1870                Texas TX
## 1871                Texas TX
## 1872              Alabama AL
## 1873              Florida FL
## 1874              Georgia GA
## 1875             Michigan MI
## 1876           New Mexico NM
## 1877                Texas TX
## 1878                Texas TX
## 1879                Texas TX
## 1880                Texas TX
## 1881                Texas TX
## 1882                Texas TX
## 1883                Texas TX
## 1884           New Jersey NJ
## 1885        Massachusetts MA
## 1886           New Jersey NJ
## 1887           California CA
## 1888                Texas TX
## 1889                TEXAS TX
## 1890                Texas TX
## 1891                Texas TX
## 1892                Texas TX
## 1893       NORTH CAROLINA NC
## 1894           Washington WA
## 1895           Washington WA
## 1896                Texas TX
## 1897             Kentucky KY
## 1898             Kentucky KY
## 1899                Texas TX
## 1900                Texas TX
## 1901        West Virginia WV
## 1902           California CA
## 1903             Kentucky KY
## 1904           California CA
## 1905           California CA
## 1906              Florida FL
## 1907             Missouri MO
## 1908           California CA
## 1909                Texas TX
## 1910           California CA
## 1911           California CA
## 1912           California CA
## 1913                Texas TX
## 1914                Texas TX
## 1915             Maryland MD
## 1916       North Carolina NC
## 1917                Texas TX
## 1918                Texas TX
## 1919        MASSACHUSETTS MA
## 1920             Nebraska NE
## 1921           Washington WA
## 1922            MINNESOTA MN
## 1923           California CA
## 1924        Massachusetts MA
## 1925             Michigan MI
## 1926                Texas TX
## 1927             MICHIGAN MI
## 1928              Florida FL
## 1929             Michigan MI
## 1930                Texas TX
## 1931           California CA
## 1932        West Virginia WV
## 1933             Virginia VA
## 1934             Virginia VA
## 1935             MICHIGAN MI
## 1936             MICHIGAN MI
## 1937                Texas TX
## 1938              ALABAMA AL
## 1939             KENTUCKY KY
## 1940           California CA
## 1941          MISSISSIPPI MS
## 1942                Texas TX
## 1943                Texas TX
## 1944                TEXAS TX
## 1945                Texas TX
## 1946         SOUTH DAKOTA SD
## 1947         South Dakota SD
## 1948           California CA
## 1949           New Jersey NJ
## 1950              Georgia GA
## 1951                 Utah UT
## 1952                Texas TX
## 1953                TEXAS TX
## 1954             Kentucky KY
## 1955           California CA
## 1956           California CA
## 1957             Colorado CO
## 1958             Michigan MI
## 1959             Kentucky KY
## 1960           California CA
## 1961              Arizona AZ
## 1962             Michigan MI
## 1963               Nevada NV
## 1964             Colorado CO
## 1965              Georgia GA
## 1966                Texas TX
## 1967                Texas TX
## 1968                Texas TX
## 1969             Michigan MI
## 1970             Michigan MI
## 1971           CALIFORNIA CA
## 1972           California CA
## 1973           California CA
## 1974               Alaska AK
## 1975           California CA
## 1976           California CA
## 1977            MINNESOTA MN
## 1978           California CA
## 1979            Wisconsin WI
## 1980            Minnesota MN
## 1981             NEW YORK NY
## 1982           Washington WA
## 1983              Florida FL
## 1984                Texas TX
## 1985                Texas TX
## 1986        Massachusetts MA
## 1987                Texas TX
## 1988           California CA
## 1989             Michigan MI
## 1990             Nebraska NE
## 1991             Colorado CO
## 1992             COLORADO CO
## 1993             Colorado CO
## 1994              Florida FL
## 1995            Minnesota MN
## 1996             Michigan MI
## 1997             Missouri MO
## 1998            Wisconsin WI
## 1999                Texas TX
## 2000                 Utah UT
## 2001           WASHINGTON WA
## 2002             Michigan MI
## 2003             Michigan MI
## 2004              FLORIDA FL
## 2005           California CA
## 2006           Washington WA
## 2007                Texas TX
## 2008                Texas TX
## 2009             Kentucky KY
## 2010                Texas TX
## 2011             MICHIGAN MI
## 2012             Michigan MI
## 2013             MICHIGAN MI
## 2014             Illinois IL
## 2015            Wisconsin WI
## 2016           New Jersey NJ
## 2017             Kentucky KY
## 2018              Florida FL
## 2019             Maryland MD
## 2020           California CA
## 2021           California CA
## 2022            TENNESSEE TN
## 2023           California CA
## 2024                 Iowa IA
## 2025                Texas TX
## 2026             Michigan MI
## 2027           California CA
## 2028                TEXAS TX
## 2029          Mississippi MS
## 2030             Michigan MI
## 2031           New Jersey NJ
## 2032           Washington WA
## 2033                Texas TX
## 2034             MISSOURI MO
## 2035          CONNECTICUT CT
## 2036            Wisconsin WI
## 2037           California CA
## 2038          MISSISSIPPI MS
## 2039            WISCONSIN WI
## 2040            Minnesota MN
## 2041           New Mexico NM
## 2042             KENTUCKY KY
## 2043                Texas TX
## 2044             Michigan MI
## 2045             Michigan MI
## 2046             Michigan MI
## 2047              Georgia GA
## 2048       North Carolina NC
## 2049                Texas TX
## 2050                Texas TX
## 2051           Washington WA
## 2052           Washington WA
## 2053                Texas TX
## 2054                Texas TX
## 2055                Texas TX
## 2056                Texas TX
## 2057                Texas TX
## 2058                Texas TX
## 2059             Virginia VA
## 2060                Texas TX
## 2061                Texas TX
## 2062       North Carolina NC
## 2063            Tennessee TN
## 2064           California CA
## 2065             Michigan MI
## 2066             Michigan MI
## 2067           California CA
## 2068           California CA
## 2069           California CA
## 2070             Michigan MI
## 2071           California CA
## 2072             Kentucky KY
## 2073             Illinois IL
## 2074            Minnesota MN
## 2075             Michigan MI
## 2076           California CA
## 2077                Texas TX
## 2078                Texas TX
## 2079                Texas TX
## 2080                Texas TX
## 2081                Texas TX
## 2082                Texas TX
## 2083             Kentucky KY
## 2084                Texas TX
## 2085                Texas TX
## 2086             New York NY
## 2087             Nebraska NE
## 2088                Texas TX
## 2089             Colorado CO
## 2090           California CA
## 2091             Michigan MI
## 2092                Texas TX
## 2093             Michigan MI
## 2094                Texas TX
## 2095                Texas TX
## 2096                Texas TX
## 2097                Texas TX
## 2098                Texas TX
## 2099                Texas TX
## 2100                Texas TX
## 2101                Texas TX
## 2102                Texas TX
## 2103           California CA
## 2104             Michigan MI
## 2105             Michigan MI
## 2106        West Virginia WV
## 2107        WEST VIRGINIA WV
## 2108          Mississippi MS
## 2109             Kentucky KY
## 2110           California CA
## 2111             MICHIGAN MI
## 2112           California CA
## 2113            Minnesota MN
## 2114              Florida FL
## 2115                Texas TX
## 2116            Minnesota MN
## 2117               Oregon OR
## 2118                Texas TX
## 2119             Michigan MI
## 2120             Michigan MI
## 2121             MICHIGAN MI
## 2122             MICHIGAN MI
## 2123             MICHIGAN MI
## 2124             Virginia VA
## 2125                Texas TX
## 2126                Texas TX
## 2127            Minnesota MN
## 2128            Minnesota MN
## 2129            MINNESOTA MN
## 2130                Texas TX
## 2131            Minnesota MN
## 2132           California CA
## 2133                Idaho ID
## 2134             Maryland MD
## 2135             Maryland MD
## 2136           California CA
## 2137               Oregon OR
## 2138                Texas TX
## 2139             Michigan MI
## 2140                TEXAS TX
## 2141           California CA
## 2142           Washington WA
## 2143       North Carolina NC
## 2144       North Carolina NC
## 2145            MINNESOTA MN
## 2146            MINNESOTA MN
## 2147            Minnesota MN
## 2148             Virginia VA
## 2149              Alabama AL
## 2150              Florida FL
## 2151           California CA
## 2152            MINNESOTA MN
## 2153             Michigan MI
## 2154              Florida FL
## 2155                TEXAS TX
## 2156                Texas TX
## 2157            MINNESOTA MN
## 2158                Texas TX
## 2159                Texas TX
## 2160                Texas TX
## 2161           California CA
## 2162             Kentucky KY
## 2163           California CA
## 2164            Minnesota MN
## 2165              Florida FL
## 2166           California CA
## 2167                Texas TX
## 2168                Texas TX
## 2169                Texas TX
## 2170                Texas TX
## 2171                Texas TX
## 2172                Texas TX
## 2173                Texas TX
## 2174                Texas TX
## 2175                Texas TX
## 2176                Texas TX
## 2177                Texas TX
## 2178                Texas TX
## 2179                Idaho ID
## 2180           California CA
## 2181               Nevada NV
## 2182           California CA
## 2183               Nevada NV
## 2184         South Dakota SD
## 2185                Texas TX
## 2186                Texas TX
## 2187             New York NY
## 2188           Washington WA
## 2189             Nebraska NE
## 2190            Minnesota MN
## 2191              Florida FL
## 2192                Texas TX
## 2193           California CA
## 2194             NEW YORK NY
## 2195           California CA
## 2196              Florida FL
## 2197           Washington WA
## 2198             Virginia VA
## 2199              Florida FL
## 2200           WASHINGTON WA
## 2201           WASHINGTON WA
## 2202                Texas TX
## 2203                TEXAS TX
## 2204                TEXAS TX
## 2205                TEXAS TX
## 2206                Texas TX
## 2207                Texas TX
## 2208                Texas TX
## 2209                Texas TX
## 2210              Florida FL
## 2211            Minnesota MN
## 2212            Minnesota MN
## 2213                Texas TX
## 2214                Texas TX
## 2215                Texas TX
## 2216                Texas TX
## 2217                Texas TX
## 2218                Texas TX
## 2219                Texas TX
## 2220                Texas TX
## 2221                Texas TX
## 2222                Texas TX
## 2223                Texas TX
## 2224                Texas TX
## 2225                Texas TX
## 2226                TEXAS TX
## 2227           New Jersey NJ
## 2228           New Jersey NJ
## 2229           California CA
## 2230             Missouri MO
## 2231             Kentucky KY
## 2232            Wisconsin WI
## 2233              Florida FL
## 2234           California CA
## 2235           California CA
## 2236             Missouri MO
## 2237             Kentucky KY
## 2238           California CA
## 2239              Florida FL
## 2240            Minnesota MN
## 2241            Minnesota MN
## 2242             Michigan MI
## 2243          Mississippi MS
## 2244          Mississippi MS
## 2245                Texas TX
## 2246             COLORADO CO
## 2247             Maryland MD
## 2248             Maryland MD
## 2249           Washington WA
## 2250           Washington WA
## 2251             Michigan MI
## 2252             Kentucky KY
## 2253             Kentucky KY
## 2254           Washington WA
## 2255            Minnesota MN
## 2256                TEXAS TX
## 2257                Texas TX
## 2258                Texas TX
## 2259                Texas TX
## 2260                Texas TX
## 2261           Washington WA
## 2262           Washington WA
## 2263           Washington WA
## 2264           Washington WA
## 2265               Alaska AK
## 2266           California CA
## 2267             Maryland MD
## 2268           Washington WA
## 2269           California CA
## 2270           California CA
## 2271           California CA
## 2272              Alabama AL
## 2273           New Jersey NJ
## 2274              Florida FL
## 2275             Arkansas AR
## 2276                Texas TX
## 2277                Texas TX
## 2278              ALABAMA AL
## 2279             Kentucky KY
## 2280              Florida FL
## 2281              Arizona AZ
## 2282             Kentucky KY
## 2283             Kentucky KY
## 2284           California CA
## 2285           California CA
## 2286             Michigan MI
## 2287              Alabama AL
## 2288              Florida FL
## 2289       North Carolina NC
## 2290             Colorado CO
## 2291             Kentucky KY
## 2292             Colorado CO
## 2293           California CA
## 2294                 Utah UT
## 2295             Kentucky KY
## 2296                Texas TX
## 2297                Texas TX
## 2298                Texas TX
## 2299             Michigan MI
## 2300          MISSISSIPPI MS
## 2301                Texas TX
## 2302                Texas TX
## 2303                TEXAS TX
## 2304              Alabama AL
## 2305                Texas TX
## 2306             Maryland MD
## 2307       North Carolina NC
## 2308            Minnesota MN
## 2309            Minnesota MN
## 2310                Texas TX
## 2311           New Jersey NJ
## 2312           NEW JERSEY NJ
## 2313             Michigan MI
## 2314             Kentucky KY
## 2315                Texas TX
## 2316                Texas TX
## 2317               NEVADA NV
## 2318               NEVADA NV
## 2319           California CA
## 2320           California CA
## 2321        Massachusetts MA
## 2322             Michigan MI
## 2323             Michigan MI
## 2324                Texas TX
## 2325           Washington WA
## 2326            Minnesota MN
## 2327            Minnesota MN
## 2328             Illinois IL
## 2329           Washington WA
## 2330                Idaho ID
## 2331                Idaho ID
## 2332                Idaho ID
## 2333                Idaho ID
## 2334           CALIFORNIA CA
## 2335           Washington WA
## 2336           WASHINGTON WA
## 2337           California CA
## 2338             Illinois IL
## 2339             Illinois IL
## 2340             KENTUCKY KY
## 2341             Illinois IL
## 2342             Illinois IL
## 2343             Illinois IL
## 2344             KENTUCKY KY
## 2345             Michigan MI
## 2346              Florida FL
## 2347              Florida FL
## 2348           WASHINGTON WA
## 2349           California CA
## 2350           California CA
## 2351           California CA
## 2352             Missouri MO
## 2353                Idaho ID
## 2354           California CA
## 2355           California CA
## 2356           California CA
## 2357           California CA
## 2358           California CA
## 2359                 Utah UT
## 2360           California CA
## 2361           California CA
## 2362           California CA
## 2363           California CA
## 2364           California CA
## 2365             New York NY
## 2366              Georgia GA
## 2367               NEVADA NV
## 2368           New Mexico NM
## 2369           Washington WA
## 2370             Nebraska NE
## 2371           California CA
## 2372           California CA
## 2373                Idaho ID
## 2374          MISSISSIPPI MS
## 2375                 Iowa IA
## 2376             NEW YORK NY
## 2377             Michigan MI
## 2378             Michigan MI
## 2379             Michigan MI
## 2380           California CA
## 2381                Idaho ID
## 2382           CALIFORNIA CA
## 2383               NEVADA NV
## 2384              Florida FL
## 2385            Wisconsin WI
## 2386            Wisconsin WI
## 2387             MICHIGAN MI
## 2388           Washington WA
## 2389            WISCONSIN WI
## 2390                Texas TX
## 2391                Texas TX
## 2392                Texas TX
## 2393                Texas TX
## 2394                Texas TX
## 2395            Minnesota MN
## 2396             Virginia VA
## 2397           WASHINGTON WA
## 2398           Washington WA
## 2399           Washington WA
## 2400                Texas TX
## 2401                Texas TX
## 2402           California CA
## 2403           Washington WA
## 2404           Washington WA
## 2405           WASHINGTON WA
## 2406              Arizona AZ
## 2407             Michigan MI
## 2408             Michigan MI
## 2409             Michigan MI
## 2410                Texas TX
## 2411           California CA
## 2412            Minnesota MN
## 2413                TEXAS TX
## 2414            Minnesota MN
## 2415            Minnesota MN
## 2416            MINNESOTA MN
## 2417             Virginia VA
## 2418             MICHIGAN MI
## 2419           California CA
## 2420           California CA
## 2421              FLORIDA FL
## 2422            Minnesota MN
## 2423            Minnesota MN
## 2424          Mississippi MS
## 2425                Texas TX
## 2426            Minnesota MN
## 2427            Minnesota MN
## 2428            Minnesota MN
## 2429            Minnesota MN
## 2430           California CA
## 2431             Illinois IL
## 2432             Illinois IL
## 2433                Texas TX
## 2434                Texas TX
## 2435                Texas TX
## 2436                Texas TX
## 2437       North Carolina NC
## 2438           California CA
## 2439       North Carolina NC
## 2440           California CA
## 2441           California CA
## 2442        West Virginia WV
## 2443           California CA
## 2444           California CA
## 2445              Florida FL
## 2446             Kentucky KY
## 2447             Kentucky KY
## 2448              Florida FL
## 2449              Indiana IN
## 2450       North Carolina NC
## 2451            Wisconsin WI
## 2452              Alabama AL
## 2453             MICHIGAN MI
## 2454             MICHIGAN MI
## 2455              Florida FL
## 2456             ILLINOIS IL
## 2457               Nevada NV
## 2458              Arizona AZ
## 2459              Arizona AZ
## 2460              Arizona AZ
## 2461              Arizona AZ
## 2462              Arizona AZ
## 2463           Washington WA
## 2464            Wisconsin WI
## 2465        West Virginia WV
## 2466              Florida FL
## 2467                Texas TX
## 2468             Kentucky KY
## 2469           California CA
## 2470           California CA
## 2471           California CA
## 2472           California CA
## 2473              Florida FL
## 2474           California CA
## 2475                IDAHO ID
## 2476                Idaho ID
## 2477                Idaho ID
## 2478             Kentucky KY
## 2479                Texas TX
## 2480                Texas TX
## 2481                Texas TX
## 2482            WISCONSIN WI
## 2483             Michigan MI
## 2484                Texas TX
## 2485                Texas TX
## 2486                Texas TX
## 2487                Texas TX
## 2488                Texas TX
## 2489                Texas TX
## 2490          Mississippi MS
## 2491              Alabama AL
## 2492              Alabama AL
## 2493             Kentucky KY
## 2494           California CA
## 2495                Idaho ID
## 2496             Colorado CO
## 2497          Mississippi MS
## 2498               Nevada NV
## 2499             Michigan MI
## 2500           California CA
## 2501                Texas TX
## 2502                TEXAS TX
## 2503                TEXAS TX
## 2504                Texas TX
## 2505                Texas TX
## 2506                TEXAS TX
## 2507                TEXAS TX
## 2508                Texas TX
## 2509                TEXAS TX
## 2510           California CA
## 2511                Texas TX
## 2512                Texas TX
## 2513                Texas TX
## 2514                Texas TX
## 2515                TEXAS TX
## 2516                TEXAS TX
## 2517                Texas TX
## 2518                Texas TX
## 2519                Texas TX
## 2520                Texas TX
## 2521                Texas TX
## 2522                Texas TX
## 2523              Florida FL
## 2524                Texas TX
## 2525           California CA
## 2526           California CA
## 2527           California CA
## 2528            Wisconsin WI
## 2529           California CA
## 2530           California CA
## 2531           California CA
## 2532           California CA
## 2533           California CA
## 2534             Virginia VA
## 2535                Texas TX
## 2536              Florida FL
## 2537                Texas TX
## 2538           California CA
## 2539             New York NY
## 2540           California CA
## 2541            Louisiana LA
## 2542             Kentucky KY
## 2543                Texas TX
## 2544                Texas TX
## 2545               Alaska AK
## 2546          Mississippi MS
## 2547             Michigan MI
## 2548           California CA
## 2549             Virginia VA
## 2550                Texas TX
## 2551              Florida FL
## 2552                Texas TX
## 2553                Texas TX
## 2554                Texas TX
## 2555                Texas TX
## 2556                Texas TX
## 2557             Maryland MD
## 2558                Texas TX
## 2559                Texas TX
## 2560                TEXAS TX
## 2561              Florida FL
## 2562           California CA
## 2563              FLORIDA FL
## 2564              Florida FL
## 2565             Colorado CO
## 2566             Missouri MO
## 2567                Texas TX
## 2568                Texas TX
## 2569                Texas TX
## 2570                Texas TX
## 2571               Nevada NV
## 2572               Nevada NV
## 2573            Wisconsin WI
## 2574              Florida FL
## 2575               Nevada NV
## 2576             Illinois IL
## 2577              Florida FL
## 2578                Texas TX
## 2579             Michigan MI
## 2580              Florida FL
## 2581                Texas TX
## 2582                Texas TX
## 2583                Texas TX
## 2584                Texas TX
## 2585                Texas TX
## 2586             Missouri MO
## 2587             Missouri MO
## 2588             Missouri MO
## 2589           New Jersey NJ
## 2590           California CA
## 2591                Texas TX
## 2592                Texas TX
## 2593                Texas TX
## 2594                Texas TX
## 2595                Texas TX
## 2596                Texas TX
## 2597              Indiana IN
## 2598              Florida FL
## 2599             Missouri MO
## 2600             Missouri MO
## 2601             Missouri MO
## 2602             Missouri MO
## 2603           New Jersey NJ
## 2604           New Jersey NJ
## 2605              Florida FL
## 2606            Minnesota MN
## 2607              INDIANA IN
## 2608                Texas TX
## 2609                Texas TX
## 2610                TEXAS TX
## 2611           Washington WA
## 2612             Michigan MI
## 2613             MICHIGAN MI
## 2614               Oregon OR
## 2615             Michigan MI
## 2616                Texas TX
## 2617                Texas TX
## 2618                Texas TX
## 2619           California CA
## 2620                Texas TX
## 2621             Illinois IL
## 2622                Texas TX
## 2623           California CA
## 2624             Nebraska NE
## 2625           California CA
## 2626           California CA
## 2627                Texas TX
## 2628              Arizona AZ
## 2629               Alaska AK
## 2630                Texas TX
## 2631        West Virginia WV
## 2632             MICHIGAN MI
## 2633           Washington WA
## 2634           Washington WA
## 2635            Minnesota MN
## 2636            MINNESOTA MN
## 2637        Massachusetts MA
## 2638           California CA
## 2639           California CA
## 2640                Texas TX
## 2641            Wisconsin WI
## 2642                TEXAS TX
## 2643                Texas TX
## 2644              Florida FL
## 2645                Texas TX
## 2646                Texas TX
## 2647                TEXAS TX
## 2648               Alaska AK
## 2649                Texas TX
## 2650           California CA
## 2651        Massachusetts MA
## 2652           California CA
## 2653           California CA
## 2654           California CA
## 2655           California CA
## 2656           California CA
## 2657       North Carolina NC
## 2658           California CA
## 2659                Idaho ID
## 2660             Michigan MI
## 2661           California CA
## 2662               OREGON OR
## 2663                Texas TX
## 2664                Texas TX
## 2665                Texas TX
## 2666            Minnesota MN
## 2667            Minnesota MN
## 2668             Kentucky KY
## 2669             Kentucky KY
## 2670             Kentucky KY
## 2671             KENTUCKY KY
## 2672            Minnesota MN
## 2673           CALIFORNIA CA
## 2674                Idaho ID
## 2675          Mississippi MS
## 2676               Alaska AK
## 2677              Arizona AZ
## 2678                Texas TX
## 2679                Texas TX
## 2680           California CA
## 2681           Washington WA
## 2682           California CA
## 2683           California CA
## 2684           California CA
## 2685           California CA
## 2686                Texas TX
## 2687           California CA
## 2688           California CA
## 2689                Texas TX
## 2690           California CA
## 2691              Florida FL
## 2692            Wisconsin WI
## 2693            Louisiana LA
## 2694           California CA
## 2695              Florida FL
## 2696              Florida FL
## 2697              Florida FL
## 2698           California CA
## 2699             MICHIGAN MI
## 2700            MINNESOTA MN
## 2701             Illinois IL
## 2702              Florida FL
## 2703             Kentucky KY
## 2704       North Carolina NC
## 2705             Michigan MI
## 2706            Minnesota MN
## 2707                Idaho ID
## 2708           Washington WA
## 2709             Michigan MI
## 2710           California CA
## 2711           California CA
## 2712                TEXAS TX
## 2713            Minnesota MN
## 2714             MICHIGAN MI
## 2715            MINNESOTA MN
## 2716            Minnesota MN
## 2717             Michigan MI
## 2718             Oklahoma OK
## 2719              Florida FL
## 2720            Minnesota MN
## 2721       North Carolina NC
## 2722            Minnesota MN
## 2723           WASHINGTON WA
## 2724                Texas TX
## 2725                Texas TX
## 2726                Texas TX
## 2727                Texas TX
## 2728           California CA
## 2729               NEVADA NV
## 2730                 Utah UT
## 2731             Virginia VA
## 2732              Florida FL
## 2733             Michigan MI
## 2734             Michigan MI
## 2735                Texas TX
## 2736                Texas TX
## 2737           California CA
## 2738           California CA
## 2739             Illinois IL
## 2740           California CA
## 2741          MISSISSIPPI MS
## 2742              Florida FL
## 2743             Kentucky KY
## 2744             KENTUCKY KY
## 2745          Mississippi MS
## 2746                Texas TX
## 2747            Minnesota MN
## 2748             Michigan MI
## 2749           California CA
## 2750                Texas TX
## 2751             MISSOURI MO
## 2752         South Dakota SD
## 2753           Washington WA
## 2754                Texas TX
## 2755                Texas TX
## 2756              Florida FL
## 2757            Minnesota MN
## 2758            Minnesota MN
## 2759             KENTUCKY KY
## 2760          Connecticut CT
## 2761              Florida FL
## 2762                Texas TX
## 2763             MICHIGAN MI
## 2764           California CA
## 2765              Florida FL
## 2766          Mississippi MS
## 2767           New Mexico NM
## 2768              Florida FL
## 2769       South Carolina SC
## 2770           California CA
## 2771           California CA
## 2772          MISSISSIPPI MS
## 2773           California CA
## 2774             Michigan MI
## 2775           Washington WA
## 2776           Washington WA
## 2777             COLORADO CO
## 2778              FLORIDA FL
## 2779             New York NY
## 2780               Nevada NV
## 2781           CALIFORNIA CA
## 2782       North Carolina NC
## 2783              Florida FL
## 2784              Florida FL
## 2785             Illinois IL
## 2786              Florida FL
## 2787                Texas TX
## 2788             Colorado CO
## 2789             Kentucky KY
## 2790                Texas TX
## 2791              Florida FL
## 2792             Missouri MO
## 2793           WASHINGTON WA
## 2794           California CA
## 2795           Washington WA
## 2796             Missouri MO
## 2797                Texas TX
## 2798                Texas TX
## 2799             Kentucky KY
## 2800           California CA
## 2801           California CA
## 2802           California CA
## 2803           California CA
## 2804             New York NY
## 2805              Florida FL
## 2806              Florida FL
## 2807           Washington WA
## 2808            Minnesota MN
## 2809             Michigan MI
## 2810              FLORIDA FL
## 2811            Minnesota MN
## 2812             Kentucky KY
## 2813             MICHIGAN MI
## 2814             Michigan MI
## 2815             Michigan MI
## 2816             MICHIGAN MI
## 2817             Michigan MI
## 2818           California CA
## 2819                 Utah UT
## 2820                Texas TX
## 2821                Texas TX
## 2822                Texas TX
## 2823           Washington WA
## 2824               NEVADA NV
## 2825             Michigan MI
## 2826               NEVADA NV
## 2827           California CA
## 2828               NEVADA NV
## 2829            Minnesota MN
## 2830           California CA
## 2831             Colorado CO
## 2832                Idaho ID
## 2833           Washington WA
## 2834           Washington WA
## 2835           Washington WA
## 2836            Wisconsin WI
## 2837           New Mexico NM
## 2838                Texas TX
## 2839             Illinois IL
## 2840             Illinois IL
## 2841             Illinois IL
## 2842             Kentucky KY
## 2843                Texas TX
## 2844           California CA
## 2845            Minnesota MN
## 2846            Minnesota MN
## 2847            Minnesota MN
## 2848                Texas TX
## 2849           California CA
## 2850           California CA
## 2851             NEW YORK NY
## 2852                TEXAS TX
## 2853                Texas TX
## 2854           California CA
## 2855             Illinois IL
## 2856             ILLINOIS IL
## 2857                Texas TX
## 2858                Texas TX
## 2859           California CA
## 2860           California CA
## 2861             KENTUCKY KY
## 2862           California CA
## 2863              Florida FL
## 2864           California CA
## 2865              Alabama AL
## 2866            MINNESOTA MN
## 2867            Minnesota MN
## 2868              Arizona AZ
## 2869             Colorado CO
## 2870             COLORADO CO
## 2871           Washington WA
## 2872           Washington WA
## 2873           California CA
## 2874          Mississippi MS
## 2875           California CA
## 2876            MINNESOTA MN
## 2877            Minnesota MN
## 2878        West Virginia WV
## 2879           California CA
## 2880           California CA
## 2881           California CA
## 2882           California CA
## 2883           California CA
## 2884                Texas TX
## 2885                Texas TX
## 2886             Virginia VA
## 2887             Virginia VA
## 2888             Kentucky KY
## 2889             Kentucky KY
## 2890                Texas TX
## 2891           California CA
## 2892             New York NY
## 2893          MISSISSIPPI MS
## 2894         Pennsylvania PA
## 2895             NEBRASKA NE
## 2896           California CA
## 2897            MINNESOTA MN
## 2898            Minnesota MN
## 2899                Texas TX
## 2900                Texas TX
## 2901                Texas TX
## 2902                Texas TX
## 2903                Texas TX
## 2904                Texas TX
## 2905                Texas TX
## 2906                Texas TX
## 2907                TEXAS TX
## 2908           California CA
## 2909 District of Columbia DC
## 2910            MINNESOTA MN
## 2911             Virginia VA
## 2912             Virginia VA
## 2913           Washington WA
## 2914                Texas TX
## 2915           California CA
## 2916               NEVADA NV
## 2917                Texas TX
## 2918           New Jersey NJ
## 2919                Texas TX
## 2920           WASHINGTON WA
## 2921             NEW YORK NY
## 2922            Minnesota MN
## 2923       South Carolina SC
## 2924           California CA
## 2925             Michigan MI
## 2926             Michigan MI
## 2927              Georgia GA
## 2928              Georgia GA
## 2929           California CA
## 2930             Illinois IL
## 2931             Virginia VA
## 2932          Mississippi MS
## 2933           California CA
## 2934              Alabama AL
## 2935             Kentucky KY
## 2936              Florida FL
## 2937             Michigan MI
## 2938              Florida FL
## 2939           Washington WA
## 2940           California CA
## 2941                Idaho ID
## 2942            Minnesota MN
## 2943           California CA
## 2944           CALIFORNIA CA
## 2945       North Carolina NC
## 2946          Mississippi MS
## 2947              Florida FL
## 2948           California CA
## 2949           California CA
## 2950                Texas TX
## 2951             Michigan MI
## 2952             Michigan MI
## 2953                Texas TX
## 2954             Michigan MI
## 2955            Minnesota MN
## 2956            Minnesota MN
## 2957       South Carolina SC
## 2958                Texas TX
## 2959           California CA
## 2960           California CA
## 2961           California CA
## 2962             Michigan MI
## 2963           California CA
## 2964             Michigan MI
## 2965           Washington WA
## 2966               Alaska AK
## 2967           California CA
## 2968           California CA
## 2969           California CA
## 2970           California CA
## 2971           California CA
## 2972           California CA
## 2973              Georgia GA
## 2974           California CA
## 2975           California CA
## 2976           California CA
## 2977              Florida FL
## 2978                TEXAS TX
## 2979              Alabama AL
## 2980          Mississippi MS
## 2981              Florida FL
## 2982              Florida FL
## 2983              Florida FL
## 2984           California CA
## 2985                Texas TX
## 2986                Texas TX
## 2987             Michigan MI
## 2988              Alabama AL
## 2989               Oregon OR
## 2990             Michigan MI
## 2991             MICHIGAN MI
## 2992                Texas TX
## 2993              Georgia GA
## 2994              Florida FL
## 2995              Florida FL
## 2996             Kentucky KY
## 2997             Colorado CO
## 2998           California CA
## 2999          Mississippi MS
## 3000                Texas TX
## 3001             Kentucky KY
## 3002              Arizona AZ
## 3003             MARYLAND MD
## 3004           Washington WA
## 3005           WASHINGTON WA
## 3006           CALIFORNIA CA
## 3007           Washington WA
## 3008           WASHINGTON WA
## 3009             Missouri MO
## 3010            Minnesota MN
## 3011        WEST VIRGINIA WV
## 3012             MICHIGAN MI
## 3013               Alaska AK
## 3014            Minnesota MN
## 3015                Texas TX
## 3016              Florida FL
## 3017              Florida FL
## 3018 District of Columbia DC
## 3019                Texas TX
## 3020 District of Columbia DC
## 3021           California CA
## 3022             Kentucky KY
## 3023             Nebraska NE
## 3024             Colorado CO
## 3025             Michigan MI
## 3026              Georgia GA
## 3027           California CA
## 3028             Kentucky KY
## 3029             Kentucky KY
## 3030             Kentucky KY
## 3031             Kentucky KY
## 3032            Minnesota MN
## 3033            Minnesota MN
## 3034            Minnesota MN
## 3035           California CA
## 3036            Minnesota MN
## 3037              Alabama AL
## 3038              Arizona AZ
## 3039            Wisconsin WI
## 3040            Wisconsin WI
## 3041             Colorado CO
## 3042               Alaska AK
## 3043                Texas TX
## 3044                Texas TX
## 3045                Texas TX
## 3046                Texas TX
## 3047           California CA
## 3048            WISCONSIN WI
## 3049              Florida FL
## 3050              Florida FL
## 3051           Washington WA
## 3052           Washington WA
## 3053           WASHINGTON WA
## 3054       North Carolina NC
## 3055           California CA
## 3056              WYOMING WY
## 3057             Maryland MD
## 3058             Delaware DE
## 3059           Washington WA
## 3060                Texas TX
## 3061              Florida FL
## 3062            Minnesota MN
## 3063              Florida FL
## 3064                Texas TX
## 3065           California CA
## 3066           California CA
## 3067           California CA
## 3068           California CA
## 3069           California CA
## 3070           California CA
## 3071            Wisconsin WI
## 3072            Minnesota MN
## 3073            MINNESOTA MN
## 3074            Minnesota MN
## 3075            MINNESOTA MN
## 3076           California CA
## 3077           California CA
## 3078                Texas TX
## 3079                Texas TX
## 3080                Texas TX
## 3081                Texas TX
## 3082             Kentucky KY
## 3083             Kentucky KY
## 3084           NEW JERSEY NJ
## 3085                Idaho ID
## 3086           WASHINGTON WA
## 3087           Washington WA
## 3088            Wisconsin WI
## 3089            Minnesota MN
## 3090              Arizona AZ
## 3091            Minnesota MN
## 3092                TEXAS TX
## 3093           California CA
## 3094                Texas TX
## 3095            Minnesota MN
## 3096                 Iowa IA
## 3097                Texas TX
## 3098              Georgia GA
## 3099             Virginia VA
## 3100            Wisconsin WI
## 3101              FLORIDA FL
## 3102                Texas TX
## 3103           California CA
## 3104               Oregon OR
## 3105              Florida FL
## 3106              Florida FL
## 3107              Florida FL
## 3108              Florida FL
## 3109           Washington WA
## 3110             Michigan MI
## 3111             Michigan MI
## 3112             Michigan MI
## 3113             MICHIGAN MI
## 3114                 Iowa IA
## 3115           California CA
## 3116           California CA
## 3117           Washington WA
## 3118                Texas TX
## 3119            Minnesota MN
## 3120                TEXAS TX
## 3121                TEXAS TX
## 3122           California CA
## 3123           California CA
## 3124            Minnesota MN
## 3125            Minnesota MN
## 3126                Texas TX
## 3127             Virginia VA
## 3128            Minnesota MN
## 3129             Illinois IL
## 3130             Kentucky KY
## 3131           New Jersey NJ
## 3132                Idaho ID
## 3133                Texas TX
## 3134                Texas TX
## 3135                Idaho ID
## 3136                Texas TX
## 3137                Texas TX
## 3138                Texas TX
## 3139                Texas TX
## 3140             MISSOURI MO
## 3141            Minnesota MN
## 3142             MICHIGAN MI
## 3143           California CA
## 3144                 Utah UT
## 3145            Minnesota MN
## 3146           California CA
## 3147           California CA
## 3148             Illinois IL
## 3149           California CA
## 3150       North Carolina NC
## 3151            Wisconsin WI
## 3152            Wisconsin WI
## 3153            Wisconsin WI
## 3154               Nevada NV
## 3155               NEVADA NV
## 3156        West Virginia WV
## 3157                Texas TX
## 3158                Texas TX
## 3159        West Virginia WV
## 3160                Idaho ID
## 3161            Minnesota MN
## 3162            Minnesota MN
## 3163             KENTUCKY KY
## 3164           California CA
## 3165           California CA
## 3166           CALIFORNIA CA
## 3167               NEVADA NV
## 3168           California CA
## 3169           California CA
## 3170             Missouri MO
## 3171                Texas TX
## 3172                Texas TX
## 3173             Illinois IL
## 3174            Minnesota MN
## 3175            Minnesota MN
## 3176            Minnesota MN
## 3177            Minnesota MN
## 3178            Minnesota MN
## 3179            Minnesota MN
## 3180            MINNESOTA MN
## 3181            Minnesota MN
## 3182            Minnesota MN
## 3183            Minnesota MN
## 3184            Minnesota MN
## 3185            Minnesota MN
## 3186             Missouri MO
## 3187             Missouri MO
## 3188           California CA
## 3189           California CA
## 3190           California CA
## 3191           California CA
## 3192            Minnesota MN
## 3193                Texas TX
## 3194           California CA
## 3195           California CA
## 3196           New Jersey NJ
## 3197           New Jersey NJ
## 3198          Mississippi MS
## 3199             NEW YORK NY
## 3200           California CA
## 3201              Florida FL
## 3202             Illinois IL
## 3203             Colorado CO
## 3204           California CA
## 3205           California CA
## 3206             Colorado CO
## 3207           California CA
## 3208           California CA
## 3209           California CA
## 3210           California CA
## 3211           California CA
## 3212           California CA
## 3213             Virginia VA
## 3214                Texas TX
## 3215       North Carolina NC
## 3216            Minnesota MN
## 3217             Michigan MI
## 3218            Minnesota MN
## 3219            Minnesota MN
## 3220             Kentucky KY
## 3221           California CA
## 3222           California CA
## 3223              Alabama AL
## 3224             Michigan MI
## 3225               Nevada NV
## 3226           New Jersey NJ
## 3227           New Jersey NJ
## 3228               Nevada NV
## 3229           New Jersey NJ
## 3230          Mississippi MS
## 3231             ILLINOIS IL
## 3232             Illinois IL
## 3233             Nebraska NE
## 3234           Washington WA
## 3235             Michigan MI
## 3236          Mississippi MS
## 3237           WASHINGTON WA
## 3238            Minnesota MN
## 3239            Minnesota MN
## 3240           Washington WA
## 3241                Texas TX
## 3242           California CA
## 3243       North Carolina NC
## 3244           WASHINGTON WA
## 3245             COLORADO CO
## 3246                 Utah UT
## 3247           California CA
## 3248               Nevada NV
## 3249           California CA
## 3250              Arizona AZ
## 3251              Arizona AZ
## 3252           California CA
## 3253           California CA
## 3254             Virginia VA
## 3255           California CA
## 3256           California CA
## 3257           California CA
## 3258           California CA
## 3259           California CA
## 3260              Arizona AZ
## 3261                Idaho ID
## 3262           New Jersey NJ
## 3263             Colorado CO
## 3264            Minnesota MN
## 3265            Minnesota MN
## 3266            Minnesota MN
## 3267            Minnesota MN
## 3268                Idaho ID
## 3269             Michigan MI
## 3270             ILLINOIS IL
## 3271           California CA
## 3272           California CA
## 3273           California CA
## 3274           California CA
## 3275           California CA
## 3276           California CA
## 3277           Washington WA
## 3278           California CA
## 3279           California CA
## 3280           WASHINGTON WA
## 3281                Texas TX
## 3282          Mississippi MS
## 3283                TEXAS TX
## 3284        MASSACHUSETTS MA
## 3285           California CA
## 3286              Georgia GA
## 3287             Michigan MI
## 3288             MICHIGAN MI
## 3289             MICHIGAN MI
## 3290           California CA
## 3291            Minnesota MN
## 3292             Virginia VA
## 3293             Illinois IL
## 3294             Illinois IL
## 3295                Texas TX
## 3296                Texas TX
## 3297                Texas TX
## 3298                Texas TX
## 3299           California CA
## 3300           California CA
## 3301           California CA
## 3302           California CA
## 3303              Florida FL
## 3304            Minnesota MN
## 3305             NEW YORK NY
## 3306              Florida FL
## 3307           California CA
## 3308                Texas TX
## 3309                Texas TX
## 3310            MINNESOTA MN
## 3311            MINNESOTA MN
## 3312              Alabama AL
## 3313             Nebraska NE
## 3314            Minnesota MN
## 3315           CALIFORNIA CA
## 3316            Wisconsin WI
## 3317             New York NY
## 3318            Minnesota MN
## 3319            Minnesota MN
## 3320          Mississippi MS
## 3321             COLORADO CO
## 3322             Colorado CO
## 3323             Illinois IL
## 3324           Washington WA
## 3325         South Dakota SD
## 3326              Florida FL
## 3327             Michigan MI
## 3328              Florida FL
## 3329              Florida FL
## 3330              Florida FL
## 3331             Illinois IL
## 3332                Texas TX
## 3333                Texas TX
## 3334                Texas TX
## 3335                Texas TX
## 3336                Texas TX
## 3337             Virginia VA
## 3338            MINNESOTA MN
## 3339            Minnesota MN
## 3340            Minnesota MN
## 3341                Texas TX
## 3342              Alabama AL
## 3343                Texas TX
## 3344                Texas TX
## 3345             ILLINOIS IL
## 3346             Virginia VA
## 3347             Virginia VA
## 3348             Virginia VA
## 3349             Illinois IL
## 3350            Minnesota MN
## 3351             Virginia VA
## 3352           New Mexico NM
## 3353                TEXAS TX
## 3354             Virginia VA
## 3355           New Mexico NM
## 3356                Texas TX
## 3357              Alabama AL
## 3358                Texas TX
## 3359           California CA
## 3360                Idaho ID
## 3361                Texas TX
## 3362              Florida FL
## 3363             Missouri MO
## 3364            Wisconsin WI
## 3365           Washington WA
## 3366               Alaska AK
## 3367                Texas TX
## 3368                Texas TX
## 3369           New Jersey NJ
## 3370           New Jersey NJ
## 3371              Florida FL
## 3372            Wisconsin WI
## 3373            Minnesota MN
## 3374           Washington WA
## 3375        Massachusetts MA
## 3376             Michigan MI
## 3377            Wisconsin WI
## 3378            Minnesota MN
## 3379                Texas TX
## 3380            Minnesota MN
## 3381            Minnesota MN
## 3382             Virginia VA
## 3383           California CA
## 3384           Washington WA
## 3385             Virginia VA
## 3386           California CA
## 3387           California CA
## 3388           California CA
## 3389                Idaho ID
## 3390             NEW YORK NY
## 3391           New Jersey NJ
## 3392           New Jersey NJ
## 3393             Michigan MI
## 3394             New York NY
## 3395             Kentucky KY
## 3396                Texas TX
## 3397             Michigan MI
## 3398           WASHINGTON WA
## 3399           California CA
## 3400             Virginia VA
## 3401             KENTUCKY KY
## 3402              Georgia GA
## 3403        Massachusetts MA
## 3404           California CA
## 3405       North Carolina NC
## 3406             NEW YORK NY
## 3407              Florida FL
## 3408           California CA
## 3409                Texas TX
## 3410             Colorado CO
## 3411             Michigan MI
## 3412             Michigan MI
## 3413                Texas TX
## 3414                Texas TX
## 3415                Texas TX
## 3416                TEXAS TX
## 3417                Texas TX
## 3418            MINNESOTA MN
## 3419             Virginia VA
## 3420               Alaska AK
## 3421              Florida FL
## 3422             Virginia VA
## 3423             Virginia VA
## 3424             Virginia VA
## 3425              Wyoming WY
## 3426            WISCONSIN WI
## 3427           California CA
## 3428            Minnesota MN
## 3429              Florida FL
## 3430             Missouri MO
## 3431         Pennsylvania PA
## 3432             COLORADO CO
## 3433             Illinois IL
## 3434          Mississippi MS
## 3435                Texas TX
## 3436            Minnesota MN
## 3437           Washington WA
## 3438              Florida FL
## 3439                Texas TX
## 3440                Texas TX
## 3441             Colorado CO
## 3442             Michigan MI
## 3443           Washington WA
## 3444           California CA
## 3445              Florida FL
## 3446          Mississippi MS
## 3447           California CA
## 3448              Florida FL
## 3449                TEXAS TX
## 3450           California CA
## 3451             Michigan MI
## 3452            WISCONSIN WI
## 3453           California CA
## 3454               NEVADA NV
## 3455           California CA
## 3456           California CA
## 3457              Florida FL
## 3458                Texas TX
## 3459                Texas TX
## 3460                Texas TX
## 3461              Florida FL
## 3462           California CA
## 3463           California CA
## 3464       North Carolina NC
## 3465              Florida FL
## 3466             ILLINOIS IL
## 3467             ILLINOIS IL
## 3468          Mississippi MS
## 3469             Nebraska NE
## 3470            WISCONSIN WI
## 3471           New Mexico NM
## 3472             Kentucky KY
## 3473            Minnesota MN
## 3474             Virginia VA
## 3475              FLORIDA FL
## 3476             Virginia VA
## 3477            Wisconsin WI
## 3478            Minnesota MN
## 3479            Minnesota MN
## 3480            Minnesota MN
## 3481            Minnesota MN
## 3482            Minnesota MN
## 3483             Kentucky KY
## 3484           Washington WA
## 3485           Washington WA
## 3486           Washington WA
## 3487                Idaho ID
## 3488           Washington WA
## 3489             Michigan MI
## 3490             Michigan MI
## 3491            Minnesota MN
## 3492              WYOMING WY
## 3493             Maryland MD
## 3494           New Mexico NM
## 3495             Nebraska NE
## 3496             Michigan MI
## 3497           California CA
## 3498           Washington WA
## 3499            Wisconsin WI
## 3500           California CA
## 3501            Minnesota MN
## 3502           California CA
## 3503                Texas TX
## 3504                Texas TX
## 3505                Texas TX
## 3506                Texas TX
## 3507                Texas TX
## 3508                Texas TX
## 3509                Texas TX
## 3510           California CA
## 3511           California CA
## 3512           California CA
## 3513           Washington WA
## 3514               NEVADA NV
## 3515             NEW YORK NY
## 3516                Texas TX
## 3517                TEXAS TX
## 3518           California CA
## 3519            MINNESOTA MN
## 3520           California CA
## 3521           California CA
## 3522             Michigan MI
## 3523           California CA
## 3524             Michigan MI
## 3525             Illinois IL
## 3526           California CA
## 3527           California CA
## 3528           California CA
## 3529           California CA
## 3530           California CA
## 3531            Wisconsin WI
## 3532           Washington WA
## 3533           California CA
## 3534             Michigan MI
## 3535             Michigan MI
## 3536                Texas TX
## 3537             Michigan MI
## 3538           California CA
## 3539           California CA
## 3540           California CA
## 3541           Washington WA
## 3542              Florida FL
## 3543           California CA
## 3544           Washington WA
## 3545           WASHINGTON WA
## 3546           New Jersey NJ
## 3547           New Jersey NJ
## 3548           New Jersey NJ
## 3549           California CA
## 3550           NEW JERSEY NJ
## 3551           California CA
## 3552                Texas TX
## 3553           California CA
## 3554             Colorado CO
## 3555             Michigan MI
## 3556                Texas TX
## 3557         South Dakota SD
## 3558             Kentucky KY
## 3559             Kentucky KY
## 3560             Michigan MI
## 3561              Florida FL
## 3562              Florida FL
## 3563              Florida FL
## 3564              Florida FL
## 3565           Washington WA
## 3566           Washington WA
## 3567              Florida FL
## 3568              Florida FL
## 3569              FLORIDA FL
## 3570             Colorado CO
## 3571               Hawaii HI
## 3572           Washington WA
## 3573           California CA
## 3574           California CA
## 3575             NEBRASKA NE
## 3576            Minnesota MN
## 3577             Michigan MI
## 3578           California CA
## 3579                Idaho ID
## 3580           California CA
## 3581             NEW YORK NY
## 3582              Alabama AL
## 3583           WASHINGTON WA
## 3584           Washington WA
## 3585           Washington WA
## 3586           WASHINGTON WA
## 3587           Washington WA
## 3588           WASHINGTON WA
## 3589           WASHINGTON WA
## 3590           WASHINGTON WA
## 3591           WASHINGTON WA
## 3592           WASHINGTON WA
## 3593           WASHINGTON WA
## 3594           Washington WA
## 3595           CALIFORNIA CA
## 3596                Texas TX
## 3597           CALIFORNIA CA
## 3598              Alabama AL
## 3599              ALABAMA AL
## 3600             Kentucky KY
## 3601           California CA
## 3602           WASHINGTON WA
## 3603             NEBRASKA NE
## 3604             NEBRASKA NE
## 3605             NEBRASKA NE
## 3606            Minnesota MN
## 3607            Minnesota MN
## 3608                Texas TX
## 3609            Minnesota MN
## 3610                Texas TX
## 3611           Washington WA
## 3612             Colorado CO
## 3613           California CA
## 3614           California CA
## 3615              Florida FL
## 3616           California CA
## 3617           Washington WA
## 3618             Michigan MI
## 3619             New York NY
## 3620            WISCONSIN WI
## 3621           California CA
## 3622           California CA
## 3623           California CA
## 3624           California CA
## 3625           California CA
## 3626           California CA
## 3627              Arizona AZ
## 3628              Florida FL
## 3629            Minnesota MN
## 3630            Wisconsin WI
## 3631           California CA
## 3632           California CA
## 3633            Minnesota MN
## 3634            Minnesota MN
## 3635             Illinois IL
## 3636             Michigan MI
## 3637             Kentucky KY
## 3638         South Dakota SD
## 3639         South Dakota SD
## 3640         South Dakota SD
## 3641           California CA
## 3642           California CA
## 3643           WASHINGTON WA
## 3644              Florida FL
## 3645             Michigan MI
## 3646            Minnesota MN
## 3647            Minnesota MN
## 3648            Minnesota MN
## 3649             Kentucky KY
## 3650             KENTUCKY KY
## 3651           California CA
## 3652             Michigan MI
## 3653            Wisconsin WI
## 3654             Michigan MI
## 3655             MICHIGAN MI
## 3656          Mississippi MS
## 3657             Michigan MI
## 3658             OKLAHOMA OK
## 3659             OKLAHOMA OK
## 3660             OKLAHOMA OK
## 3661             OKLAHOMA OK
## 3662             Missouri MO
## 3663             Missouri MO
## 3664                Texas TX
## 3665                Texas TX
## 3666                Texas TX
## 3667                Texas TX
## 3668                Texas TX
## 3669                Texas TX
## 3670                Texas TX
## 3671                Texas TX
## 3672                Texas TX
## 3673                Texas TX
## 3674                Texas TX
## 3675                Texas TX
## 3676              Florida FL
## 3677             Virginia VA
## 3678           Washington WA
## 3679             Illinois IL
## 3680                Texas TX
## 3681              Florida FL
## 3682              Florida FL
## 3683              FLORIDA FL
## 3684              Florida FL
## 3685              Florida FL
## 3686              FLORIDA FL
## 3687              Florida FL
## 3688              Florida FL
## 3689              Florida FL
## 3690              Florida FL
## 3691              Florida FL
## 3692              FLORIDA FL
## 3693              Florida FL
## 3694              Florida FL
## 3695              Florida FL
## 3696              Florida FL
## 3697              Florida FL
## 3698              Florida FL
## 3699           California CA
## 3700           California CA
## 3701           California CA
## 3702           Washington WA
## 3703           California CA
## 3704               Alaska AK
## 3705           California CA
## 3706           Washington WA
## 3707           CALIFORNIA CA
## 3708           California CA
## 3709           Washington WA
## 3710           California CA
## 3711           California CA
## 3712           California CA
## 3713              FLORIDA FL
## 3714              Florida FL
## 3715              Florida FL
## 3716              Florida FL
## 3717              Florida FL
## 3718              Florida FL
## 3719           California CA
## 3720           California CA
## 3721           Washington WA
## 3722              Florida FL
## 3723                Texas TX
## 3724           Washington WA
## 3725           Washington WA
## 3726                Idaho ID
## 3727            MINNESOTA MN
## 3728           California CA
## 3729           WASHINGTON WA
## 3730           Washington WA
## 3731           Washington WA
## 3732             Illinois IL
## 3733             Illinois IL
## 3734           California CA
## 3735              Arizona AZ
## 3736            MINNESOTA MN
## 3737           California CA
## 3738            Tennessee TN
## 3739                TEXAS TX
## 3740                TEXAS TX
## 3741            Tennessee TN
## 3742             Michigan MI
## 3743             Nebraska NE
## 3744             Illinois IL
## 3745       North Carolina NC
## 3746          Mississippi MS
## 3747              FLORIDA FL
## 3748                Texas TX
## 3749           California CA
## 3750                Texas TX
## 3751           California CA
## 3752              Alabama AL
## 3753                Texas TX
## 3754           Washington WA
## 3755            MINNESOTA MN
## 3756           New Jersey NJ
## 3757                Texas TX
## 3758              FLORIDA FL
## 3759                Texas TX
## 3760                Texas TX
## 3761             Nebraska NE
## 3762           Washington WA
## 3763             Michigan MI
## 3764             Kentucky KY
## 3765           California CA
## 3766           California CA
## 3767           California CA
## 3768             Illinois IL
## 3769                Texas TX
## 3770                Texas TX
## 3771              Florida FL
## 3772           California CA
## 3773               NEVADA NV
## 3774             Colorado CO
## 3775                Texas TX
## 3776               Nevada NV
## 3777                Texas TX
## 3778                Idaho ID
## 3779               Nevada NV
## 3780            Minnesota MN
## 3781            MINNESOTA MN
## 3782             Michigan MI
## 3783           California CA
## 3784             Nebraska NE
## 3785             Colorado CO
## 3786                Texas TX
## 3787             ILLINOIS IL
## 3788             ILLINOIS IL
## 3789                Idaho ID
## 3790             Kentucky KY
## 3791           Washington WA
## 3792             Michigan MI
## 3793                Texas TX
## 3794                Texas TX
## 3795           California CA
## 3796                Texas TX
## 3797            Minnesota MN
## 3798            Minnesota MN
## 3799           Washington WA
## 3800           California CA
## 3801           California CA
## 3802           New Mexico NM
## 3803              Arizona AZ
## 3804             Illinois IL
## 3805                Texas TX
## 3806              Florida FL
## 3807       North Carolina NC
## 3808            Minnesota MN
## 3809                Texas TX
## 3810           California CA
## 3811          Mississippi MS
## 3812             Kentucky KY
## 3813               NEVADA NV
## 3814           California CA
## 3815                Texas TX
## 3816                Texas TX
## 3817             Virginia VA
## 3818           California CA
## 3819               Nevada NV
## 3820       North Carolina NC
## 3821       North Carolina NC
## 3822             Kentucky KY
## 3823            Minnesota MN
## 3824           California CA
## 3825                Texas TX
## 3826           CALIFORNIA CA
## 3827       North Carolina NC
## 3828        Massachusetts MA
## 3829           California CA
## 3830             MICHIGAN MI
## 3831             Michigan MI
## 3832             Michigan MI
## 3833             VIRGINIA VA
## 3834           California CA
## 3835           California CA
## 3836                Texas TX
## 3837           California CA
## 3838           California CA
## 3839           California CA
## 3840              Georgia GA
## 3841           Washington WA
## 3842            Minnesota MN
## 3843              Arizona AZ
## 3844            Wisconsin WI
## 3845            MINNESOTA MN
## 3846           CALIFORNIA CA
## 3847              Alabama AL
## 3848            Minnesota MN
## 3849                Texas TX
## 3850           California CA
## 3851           Washington WA
## 3852           California CA
## 3853             Virginia VA
## 3854             Virginia VA
## 3855            Minnesota MN
## 3856              Alabama AL
## 3857             KENTUCKY KY
## 3858           California CA
## 3859              Arizona AZ
## 3860            Minnesota MN
## 3861           California CA
## 3862             New York NY
## 3863              Montana MT
## 3864              Montana MT
## 3865            MINNESOTA MN
## 3866              Florida FL
## 3867             Michigan MI
## 3868            Minnesota MN
## 3869            Minnesota MN
## 3870                Texas TX
## 3871           New Jersey NJ
## 3872              Florida FL
## 3873              FLORIDA FL
## 3874              Florida FL
## 3875              Florida FL
## 3876              Florida FL
## 3877              Florida FL
## 3878            Minnesota MN
## 3879            Minnesota MN
## 3880            Minnesota MN
## 3881            Minnesota MN
## 3882                Texas TX
## 3883            Minnesota MN
## 3884           CALIFORNIA CA
## 3885           California CA
## 3886               Nevada NV
## 3887              Florida FL
## 3888           California CA
## 3889           California CA
## 3890           California CA
## 3891             MICHIGAN MI
## 3892               Oregon OR
## 3893             Michigan MI
## 3894           California CA
## 3895            Minnesota MN
## 3896            Minnesota MN
## 3897           California CA
## 3898           California CA
## 3899           California CA
## 3900                Texas TX
## 3901                Texas TX
## 3902                Texas TX
## 3903                Texas TX
## 3904             Colorado CO
## 3905             COLORADO CO
## 3906           California CA
## 3907                 Utah UT
## 3908                Texas TX
## 3909             Virginia VA
## 3910           California CA
## 3911           California CA
## 3912          Connecticut CT
## 3913            Minnesota MN
## 3914            MINNESOTA MN
## 3915                 Iowa IA
## 3916                Idaho ID
## 3917                Texas TX
## 3918                Texas TX
## 3919             Virginia VA
## 3920               Kansas KS
## 3921             Colorado CO
## 3922           California CA
## 3923                 Utah UT
## 3924              FLORIDA FL
## 3925              Florida FL
## 3926              Florida FL
## 3927              Florida FL
## 3928              Florida FL
## 3929           California CA
## 3930              Florida FL
## 3931          MISSISSIPPI MS
## 3932                Texas TX
## 3933                Texas TX
## 3934           Washington WA
## 3935            Wisconsin WI
## 3936             Michigan MI
## 3937           California CA
## 3938           California CA
## 3939              Florida FL
## 3940                Texas TX
## 3941                Texas TX
## 3942             Maryland MD
## 3943             Colorado CO
## 3944             Kentucky KY
## 3945              Arizona AZ
## 3946            Minnesota MN
## 3947            Minnesota MN
## 3948            Minnesota MN
## 3949            MINNESOTA MN
## 3950             Colorado CO
## 3951            Wisconsin WI
## 3952                Texas TX
## 3953            Minnesota MN
## 3954            Minnesota MN
## 3955            Wisconsin WI
## 3956            MINNESOTA MN
## 3957            Minnesota MN
## 3958            MINNESOTA MN
## 3959            Minnesota MN
## 3960             Illinois IL
## 3961             Illinois IL
## 3962                Texas TX
## 3963                Texas TX
## 3964                Texas TX
## 3965                Texas TX
## 3966                Texas TX
## 3967                Texas TX
## 3968                Texas TX
## 3969                Texas TX
## 3970                Texas TX
## 3971                TEXAS TX
## 3972                Texas TX
## 3973                Texas TX
## 3974                Texas TX
## 3975                Texas TX
## 3976                Texas TX
## 3977                Texas TX
## 3978                Texas TX
## 3979                Texas TX
## 3980                Texas TX
## 3981                Texas TX
## 3982                Texas TX
## 3983                TEXAS TX
## 3984                Texas TX
## 3985                TEXAS TX
## 3986                Texas TX
## 3987                Texas TX
## 3988                Texas TX
## 3989                TEXAS TX
## 3990                Texas TX
## 3991                Texas TX
## 3992                TEXAS TX
## 3993                Texas TX
## 3994                TEXAS TX
## 3995             Missouri MO
## 3996             Colorado CO
## 3997             Michigan MI
## 3998        West Virginia WV
## 3999        WEST VIRGINIA WV
## 4000       North Carolina NC
## 4001              Florida FL
## 4002              FLORIDA FL
## 4003                Texas TX
## 4004                Texas TX
## 4005           California CA
## 4006             Maryland MD
## 4007                Idaho ID
## 4008             Virginia VA
## 4009        WEST VIRGINIA WV
## 4010            MINNESOTA MN
## 4011            MINNESOTA MN
## 4012                Texas TX
## 4013                Texas TX
## 4014            Minnesota MN
## 4015                Texas TX
## 4016                Texas TX
## 4017              Alabama AL
## 4018             Virginia VA
## 4019              Florida FL
## 4020             Illinois IL
## 4021             Illinois IL
## 4022              Arizona AZ
## 4023             Virginia VA
## 4024                Texas TX
## 4025                Texas TX
## 4026             Virginia VA
## 4027             Virginia VA
## 4028             ILLINOIS IL
## 4029            Wisconsin WI
## 4030              Alabama AL
## 4031           New Jersey NJ
## 4032           New Jersey NJ
## 4033           New Jersey NJ
## 4034           New Jersey NJ
## 4035           New Jersey NJ
## 4036           New Jersey NJ
## 4037           California CA
## 4038           California CA
## 4039           California CA
## 4040           California CA
## 4041              Arizona AZ
## 4042           California CA
## 4043              Florida FL
## 4044           Washington WA
## 4045           California CA
## 4046           California CA
## 4047             New York NY
## 4048             ILLINOIS IL
## 4049                 Utah UT
## 4050       North Carolina NC
## 4051                Texas TX
## 4052           California CA
## 4053           California CA
## 4054             Colorado CO
## 4055           California CA
## 4056           Washington WA
## 4057             Michigan MI
## 4058             Kentucky KY
## 4059                Texas TX
## 4060             KENTUCKY KY
## 4061             NEW YORK NY
## 4062           Washington WA
## 4063           Washington WA
## 4064           Washington WA
## 4065             Delaware DE
## 4066              Florida FL
## 4067             New York NY
## 4068           Washington WA
## 4069           California CA
## 4070             Virginia VA
## 4071                Texas TX
## 4072             Michigan MI
## 4073             Michigan MI
## 4074           Washington WA
## 4075          Mississippi MS
## 4076             Illinois IL
## 4077            Tennessee TN
## 4078             Colorado CO
## 4079              Florida FL
## 4080           California CA
## 4081           California CA
## 4082             Kentucky KY
## 4083             Kentucky KY
## 4084            WISCONSIN WI
## 4085            Wisconsin WI
## 4086            Wisconsin WI
## 4087             ILLINOIS IL
## 4088             Illinois IL
## 4089             Illinois IL
## 4090             ILLINOIS IL
## 4091             ILLINOIS IL
## 4092            Minnesota MN
## 4093           California CA
## 4094                Texas TX
## 4095           Washington WA
## 4096           California CA
## 4097             Kentucky KY
## 4098           CALIFORNIA CA
## 4099           California CA
## 4100       North Carolina NC
## 4101                Texas TX
## 4102           California CA
## 4103           California CA
## 4104           California CA
## 4105           California CA
## 4106        West Virginia WV
## 4107          Mississippi MS
## 4108             Illinois IL
## 4109             Illinois IL
## 4110         South Dakota SD
## 4111             Virginia VA
## 4112           California CA
## 4113       North Carolina NC
## 4114           California CA
## 4115           NEW JERSEY NJ
## 4116                Texas TX
## 4117                Texas TX
## 4118                Texas TX
## 4119             Missouri MO
## 4120           WASHINGTON WA
## 4121           WASHINGTON WA
## 4122           Washington WA
## 4123           Washington WA
## 4124           California CA
## 4125                Texas TX
## 4126              FLORIDA FL
## 4127                Idaho ID
## 4128                TEXAS TX
## 4129                Texas TX
## 4130           California CA
## 4131             Colorado CO
## 4132             NEW YORK NY
## 4133            Minnesota MN
## 4134            Minnesota MN
## 4135            Minnesota MN
## 4136            MINNESOTA MN
## 4137            Minnesota MN
## 4138               NEVADA NV
## 4139            Minnesota MN
## 4140            MINNESOTA MN
## 4141              Wyoming WY
## 4142            MINNESOTA MN
## 4143           California CA
## 4144                Texas TX
## 4145            Wisconsin WI
## 4146             Virginia VA
## 4147           California CA
## 4148              Florida FL
## 4149           California CA
## 4150           California CA
## 4151            Minnesota MN
## 4152           California CA
## 4153           California CA
## 4154                TEXAS TX
## 4155           California CA
## 4156             Virginia VA
## 4157             Virginia VA
## 4158             Illinois IL
## 4159             Illinois IL
## 4160             Illinois IL
## 4161             Illinois IL
## 4162                Idaho ID
## 4163             Illinois IL
## 4164             Virginia VA
## 4165             Virginia VA
## 4166             Illinois IL
## 4167           New Jersey NJ
## 4168             Virginia VA
## 4169             Virginia VA
## 4170             ILLINOIS IL
## 4171                Texas TX
## 4172                Texas TX
## 4173           Washington WA
## 4174             Virginia VA
## 4175             KENTUCKY KY
## 4176             VIRGINIA VA
## 4177             Illinois IL
## 4178             Illinois IL
## 4179             Illinois IL
## 4180           California CA
## 4181             Michigan MI
## 4182           California CA
## 4183           California CA
## 4184                 Utah UT
## 4185           Washington WA
## 4186             Michigan MI
## 4187           California CA
## 4188           California CA
## 4189           California CA
## 4190           California CA
## 4191           California CA
## 4192             Michigan MI
## 4193           California CA
## 4194             Kentucky KY
## 4195           Washington WA
## 4196             MICHIGAN MI
## 4197             Virginia VA
## 4198             NEW YORK NY
## 4199           Washington WA
## 4200             Kentucky KY
## 4201           Washington WA
## 4202            Minnesota MN
## 4203        MASSACHUSETTS MA
## 4204             Colorado CO
## 4205                Texas TX
## 4206            Wisconsin WI
## 4207               Alaska AK
## 4208               Oregon OR
## 4209                Texas TX
## 4210                TEXAS TX
## 4211           California CA
## 4212           California CA
## 4213                Idaho ID
## 4214              Florida FL
## 4215                TEXAS TX
## 4216                TEXAS TX
## 4217                TEXAS TX
## 4218                TEXAS TX
## 4219                TEXAS TX
## 4220                TEXAS TX
## 4221                TEXAS TX
## 4222                TEXAS TX
## 4223                Texas TX
## 4224            Tennessee TN
## 4225                Texas TX
## 4226                TEXAS TX
## 4227            Minnesota MN
## 4228           California CA
## 4229             Virginia VA
## 4230             Virginia VA
## 4231             VIRGINIA VA
## 4232             Virginia VA
## 4233              Florida FL
## 4234              Florida FL
## 4235             Colorado CO
## 4236            Tennessee TN
## 4237       South Carolina SC
## 4238           California CA
## 4239           California CA
## 4240           California CA
## 4241           California CA
## 4242           California CA
## 4243           New Mexico NM
## 4244           New Mexico NM
## 4245                Texas TX
## 4246           CALIFORNIA CA
## 4247               NEVADA NV
## 4248             COLORADO CO
## 4249           California CA
## 4250             Kentucky KY
## 4251             Kentucky KY
## 4252            Minnesota MN
## 4253            Wisconsin WI
## 4254           California CA
## 4255           California CA
## 4256       North Carolina NC
## 4257             Michigan MI
## 4258            Minnesota MN
## 4259            WISCONSIN WI
## 4260           Washington WA
## 4261            Minnesota MN
## 4262            MINNESOTA MN
## 4263             Michigan MI
## 4264            MINNESOTA MN
## 4265            MINNESOTA MN
## 4266            Louisiana LA
## 4267           California CA
## 4268           California CA
## 4269           California CA
## 4270            Minnesota MN
## 4271              Montana MT
## 4272              Montana MT
## 4273             Michigan MI
## 4274              Florida FL
## 4275             Kentucky KY
## 4276            WISCONSIN WI
## 4277                Idaho ID
## 4278            Minnesota MN
## 4279              Florida FL
## 4280           California CA
## 4281             Virginia VA
## 4282            Minnesota MN
## 4283            Minnesota MN
## 4284             Maryland MD
## 4285             Colorado CO
## 4286           California CA
## 4287            Wisconsin WI
## 4288           California CA
## 4289                Idaho ID
## 4290            Wisconsin WI
## 4291        West Virginia WV
## 4292               Oregon OR
## 4293           California CA
## 4294             Michigan MI
## 4295            MINNESOTA MN
## 4296            Minnesota MN
## 4297           New Mexico NM
## 4298            Minnesota MN
## 4299             Illinois IL
## 4300             Kentucky KY
## 4301           California CA
## 4302             NEW YORK NY
## 4303            Minnesota MN
## 4304                Texas TX
## 4305            Minnesota MN
## 4306             Illinois IL
## 4307             Illinois IL
## 4308             Illinois IL
## 4309             Illinois IL
## 4310             Illinois IL
## 4311             Illinois IL
## 4312             Illinois IL
## 4313             Illinois IL
## 4314             Illinois IL
## 4315             Michigan MI
## 4316             MICHIGAN MI
## 4317           California CA
## 4318        West Virginia WV
## 4319            Minnesota MN
## 4320           California CA
## 4321              Florida FL
## 4322                Texas TX
## 4323            MINNESOTA MN
## 4324           California CA
## 4325             NEW YORK NY
## 4326               OREGON OR
## 4327            Minnesota MN
## 4328                Texas TX
## 4329             Maryland MD
## 4330           California CA
## 4331            Minnesota MN
## 4332              Florida FL
## 4333            Minnesota MN
## 4334           New Mexico NM
## 4335                TEXAS TX
## 4336                Texas TX
## 4337           California CA
## 4338          Mississippi MS
## 4339           California CA
## 4340                Texas TX
## 4341           California CA
## 4342             ILLINOIS IL
## 4343             Illinois IL
## 4344             Illinois IL
## 4345             ILLINOIS IL
## 4346             Illinois IL
## 4347             Illinois IL
## 4348            MINNESOTA MN
## 4349             Nebraska NE
## 4350             Nebraska NE
## 4351            MINNESOTA MN
## 4352            Minnesota MN
## 4353             Michigan MI
## 4354             Michigan MI
## 4355           California CA
## 4356              Alabama AL
## 4357           California CA
## 4358            Minnesota MN
## 4359           California CA
## 4360                Texas TX
## 4361       North Carolina NC
## 4362            Minnesota MN
## 4363           California CA
## 4364               Alaska AK
## 4365           California CA
## 4366           California CA
## 4367           California CA
## 4368           California CA
## 4369             Kentucky KY
## 4370             Illinois IL
## 4371             ILLINOIS IL
## 4372             Illinois IL
## 4373       North Carolina NC
## 4374           Washington WA
## 4375           WASHINGTON WA
## 4376             Michigan MI
## 4377             Michigan MI
## 4378             Michigan MI
## 4379             Michigan MI
## 4380             Illinois IL
## 4381              Wyoming WY
## 4382            MINNESOTA MN
## 4383            MINNESOTA MN
## 4384                TEXAS TX
## 4385                Texas TX
## 4386           California CA
## 4387             Michigan MI
## 4388           California CA
## 4389                Idaho ID
## 4390           Washington WA
## 4391                Idaho ID
## 4392             ILLINOIS IL
## 4393             Illinois IL
## 4394        West Virginia WV
## 4395           California CA
## 4396               Oregon OR
## 4397           California CA
## 4398           California CA
## 4399           California CA
## 4400                Texas TX
## 4401           California CA
## 4402           California CA
## 4403           California CA
## 4404           California CA
## 4405           California CA
## 4406           California CA
## 4407           California CA
## 4408           California CA
## 4409           California CA
## 4410           California CA
## 4411                Texas TX
## 4412           California CA
## 4413           California CA
## 4414           California CA
## 4415           California CA
## 4416           California CA
## 4417           California CA
## 4418           California CA
## 4419           California CA
## 4420           California CA
## 4421           California CA
## 4422            Wisconsin WI
## 4423              Georgia GA
## 4424                Idaho ID
## 4425           California CA
## 4426             Illinois IL
## 4427             Illinois IL
## 4428           California CA
## 4429           California CA
## 4430           California CA
## 4431           California CA
## 4432           California CA
## 4433           California CA
## 4434           California CA
## 4435           California CA
## 4436           California CA
## 4437           California CA
## 4438                TEXAS TX
## 4439                Texas TX
## 4440                TEXAS TX
## 4441           California CA
## 4442              Florida FL
## 4443                Texas TX
## 4444                Texas TX
## 4445           California CA
## 4446           California CA
## 4447           California CA
## 4448             KENTUCKY KY
## 4449       South Carolina SC
## 4450           Washington WA
## 4451             New York NY
## 4452             MICHIGAN MI
## 4453                Texas TX
## 4454            Minnesota MN
## 4455              Georgia GA
## 4456           California CA
## 4457       North Carolina NC
## 4458                 Iowa IA
## 4459           Washington WA
## 4460           CALIFORNIA CA
## 4461                Texas TX
## 4462             Illinois IL
## 4463              Florida FL
## 4464                Texas TX
## 4465           Washington WA
## 4466              FLORIDA FL
## 4467           California CA
## 4468           New Mexico NM
## 4469              Florida FL
## 4470                Texas TX
## 4471             Nebraska NE
## 4472           California CA
## 4473       NORTH CAROLINA NC
## 4474                Texas TX
## 4475           California CA
## 4476           California CA
## 4477           California CA
## 4478              Florida FL
## 4479           Washington WA
## 4480           California CA
## 4481              Florida FL
## 4482           Washington WA
## 4483            Minnesota MN
## 4484            Wisconsin WI
## 4485             Kentucky KY
## 4486              Florida FL
## 4487           Washington WA
## 4488                Texas TX
## 4489            Minnesota MN
## 4490                Texas TX
## 4491             Virginia VA
## 4492           Washington WA
## 4493              Florida FL
## 4494              Florida FL
## 4495              Florida FL
## 4496              Florida FL
## 4497             Nebraska NE
## 4498                Texas TX
## 4499           Washington WA
## 4500           Washington WA
## 4501           California CA
## 4502           California CA
## 4503           California CA
## 4504              Florida FL
## 4505              Florida FL
## 4506                Texas TX
## 4507          Mississippi MS
## 4508           California CA
## 4509           Washington WA
## 4510         SOUTH DAKOTA SD
## 4511           Washington WA
## 4512           California CA
## 4513           California CA
## 4514           Washington WA
## 4515           New Mexico NM
## 4516             Michigan MI
## 4517                Texas TX
## 4518                Texas TX
## 4519                TEXAS TX
## 4520                TEXAS TX
## 4521                Texas TX
## 4522            Wisconsin WI
## 4523           California CA
## 4524            Minnesota MN
## 4525            Minnesota MN
## 4526            Wisconsin WI
## 4527                TEXAS TX
## 4528            Wisconsin WI
## 4529            Minnesota MN
## 4530           California CA
## 4531           California CA
## 4532       North Carolina NC
## 4533              Florida FL
## 4534             Kentucky KY
## 4535             Illinois IL
## 4536                Texas TX
## 4537           California CA
## 4538             Virginia VA
## 4539             Virginia VA
## 4540              Florida FL
## 4541              Florida FL
## 4542           California CA
## 4543           California CA
## 4544            MINNESOTA MN
## 4545                Texas TX
## 4546           Washington WA
## 4547           California CA
## 4548                TEXAS TX
## 4549           WASHINGTON WA
## 4550            Tennessee TN
## 4551              Florida FL
## 4552             Nebraska NE
## 4553              Florida FL
## 4554           New Mexico NM
## 4555           California CA
## 4556           California CA
## 4557           California CA
## 4558           California CA
## 4559           California CA
## 4560           California CA
## 4561           California CA
## 4562           California CA
## 4563           California CA
## 4564           California CA
## 4565           California CA
## 4566                Idaho ID
## 4567              Florida FL
## 4568           California CA
## 4569           California CA
## 4570           California CA
## 4571           California CA
## 4572            Minnesota MN
## 4573              Florida FL
## 4574           California CA
## 4575              Florida FL
## 4576          Mississippi MS
## 4577           Washington WA
## 4578           Washington WA
## 4579           Washington WA
## 4580           Washington WA
## 4581           Washington WA
## 4582           Washington WA
## 4583                 Utah UT
## 4584                TEXAS TX
## 4585                TEXAS TX
## 4586           California CA
## 4587            MINNESOTA MN
## 4588           California CA
## 4589           Washington WA
## 4590            Tennessee TN
## 4591                Idaho ID
## 4592           Washington WA
## 4593           Washington WA
## 4594           California CA
## 4595             Colorado CO
## 4596                Texas TX
## 4597                Texas TX
## 4598             MICHIGAN MI
## 4599             Colorado CO
## 4600           California CA
## 4601           California CA
## 4602           California CA
## 4603              Arizona AZ
## 4604           California CA
## 4605           California CA
## 4606            Minnesota MN
## 4607          Mississippi MS
## 4608           California CA
## 4609           California CA
## 4610           California CA
## 4611           California CA
## 4612           California CA
## 4613               Nevada NV
## 4614            WISCONSIN WI
## 4615              Florida FL
## 4616              Florida FL
## 4617             Missouri MO
## 4618           California CA
## 4619              Florida FL
## 4620           California CA
## 4621            Minnesota MN
## 4622           Washington WA
## 4623           California CA
## 4624         Pennsylvania PA
## 4625                Texas TX
## 4626          Mississippi MS
## 4627                Texas TX
## 4628       North Carolina NC
## 4629           California CA
## 4630           Washington WA
## 4631           California CA
## 4632            Minnesota MN
## 4633           Washington WA
## 4634             Michigan MI
## 4635             Missouri MO
## 4636            Wisconsin WI
## 4637               Nevada NV
## 4638           California CA
## 4639           New Mexico NM
## 4640            Minnesota MN
## 4641           NEW JERSEY NJ
## 4642             Michigan MI
## 4643                 Utah UT
## 4644                Texas TX
## 4645            Louisiana LA
## 4646             Virginia VA
## 4647                Texas TX
## 4648               Nevada NV
## 4649                 Utah UT
## 4650              Florida FL
## 4651                 Utah UT
## 4652            MINNESOTA MN
## 4653                Idaho ID
## 4654                Texas TX
## 4655                Texas TX
## 4656             Colorado CO
## 4657                Texas TX
## 4658                Texas TX
## 4659                Texas TX
## 4660                Texas TX
## 4661                Texas TX
## 4662            Wisconsin WI
## 4663         SOUTH DAKOTA SD
## 4664         SOUTH DAKOTA SD
## 4665                Texas TX
## 4666                Texas TX
## 4667           Washington WA
## 4668                Texas TX
## 4669             Kentucky KY
## 4670              Florida FL
## 4671                Texas TX
## 4672                Texas TX
## 4673           Washington WA
## 4674           Washington WA
## 4675             COLORADO CO
## 4676             COLORADO CO
## 4677           California CA
## 4678           California CA
## 4679             Michigan MI
## 4680              Florida FL
## 4681             Kentucky KY
## 4682               Nevada NV
## 4683           Washington WA
## 4684           New Mexico NM
## 4685           California CA
## 4686                Texas TX
## 4687             Michigan MI
## 4688             Michigan MI
## 4689            Minnesota MN
## 4690            Minnesota MN
## 4691            Minnesota MN
## 4692            Wisconsin WI
## 4693            Minnesota MN
## 4694             Michigan MI
## 4695              Florida FL
## 4696             Kentucky KY
## 4697             NEW YORK NY
## 4698             Michigan MI
## 4699                Idaho ID
## 4700             Illinois IL
## 4701              Florida FL
## 4702            Minnesota MN
## 4703            Minnesota MN
## 4704            Minnesota MN
## 4705              Florida FL
## 4706              Florida FL
## 4707             Missouri MO
## 4708              Florida FL
## 4709              Florida FL
## 4710             MARYLAND MD
## 4711            Minnesota MN
## 4712            Minnesota MN
## 4713                Texas TX
## 4714           California CA
## 4715           CALIFORNIA CA
## 4716           California CA
## 4717            Wisconsin WI
## 4718       North Carolina NC
## 4719           Washington WA
## 4720       North Carolina NC
## 4721             Kentucky KY
## 4722           California CA
## 4723             Michigan MI
## 4724             Michigan MI
## 4725             Illinois IL
## 4726             ILLINOIS IL
## 4727                Texas TX
## 4728           Washington WA
## 4729             Kentucky KY
## 4730           Washington WA
## 4731              Florida FL
## 4732             ILLINOIS IL
## 4733             Nebraska NE
## 4734           WASHINGTON WA
## 4735           California CA
## 4736               NEVADA NV
## 4737               Nevada NV
## 4738             Michigan MI
## 4739          Connecticut CT
## 4740              Florida FL
## 4741           Washington WA
## 4742                Texas TX
## 4743           California CA
## 4744           California CA
## 4745           California CA
## 4746           Washington WA
## 4747                Texas TX
## 4748                Texas TX
## 4749                Texas TX
## 4750                Texas TX
## 4751                Texas TX
## 4752                Texas TX
## 4753                Texas TX
## 4754                Texas TX
## 4755           Washington WA
## 4756                Texas TX
## 4757                Texas TX
## 4758              Florida FL
## 4759           WASHINGTON WA
## 4760                Texas TX
## 4761             MARYLAND MD
## 4762             Missouri MO
## 4763             Michigan MI
## 4764             MICHIGAN MI
## 4765             Michigan MI
## 4766             Michigan MI
## 4767             MICHIGAN MI
## 4768             MICHIGAN MI
## 4769             Michigan MI
## 4770             MICHIGAN MI
## 4771             MICHIGAN MI
## 4772             MICHIGAN MI
## 4773             MICHIGAN MI
## 4774             Michigan MI
## 4775             MICHIGAN MI
## 4776           California CA
## 4777             ILLINOIS IL
## 4778             Nebraska NE
## 4779                TEXAS TX
## 4780             ILLINOIS IL
## 4781              Florida FL
## 4782             Kentucky KY
## 4783             Kentucky KY
## 4784              ALABAMA AL
## 4785             ILLINOIS IL
## 4786              Florida FL
## 4787             ILLINOIS IL
## 4788              Arizona AZ
## 4789              Arizona AZ
## 4790              Arizona AZ
## 4791              Arizona AZ
## 4792                Texas TX
## 4793                Texas TX
## 4794             MICHIGAN MI
## 4795             NEW YORK NY
## 4796           California CA
## 4797             Colorado CO
## 4798                 Utah UT
## 4799           California CA
## 4800           California CA
## 4801                Texas TX
## 4802            Minnesota MN
## 4803         South Dakota SD
## 4804                 Utah UT
## 4805           Washington WA
## 4806           California CA
## 4807               Nevada NV
## 4808              Florida FL
## 4809              Georgia GA
## 4810              Arizona AZ
## 4811              FLORIDA FL
## 4812              Florida FL
## 4813              Arizona AZ
## 4814             Kentucky KY
## 4815             Michigan MI
## 4816             Kentucky KY
## 4817           California CA
## 4818              Florida FL
## 4819            Minnesota MN
## 4820           California CA
## 4821           California CA
## 4822              Florida FL
## 4823            Minnesota MN
## 4824           California CA
## 4825             Michigan MI
## 4826           WASHINGTON WA
## 4827           WASHINGTON WA
## 4828           California CA
## 4829              Florida FL
## 4830            MINNESOTA MN
## 4831            MINNESOTA MN
## 4832            MINNESOTA MN
## 4833            MINNESOTA MN
## 4834            MINNESOTA MN
## 4835            MINNESOTA MN
## 4836             Michigan MI
## 4837             Michigan MI
## 4838           California CA
## 4839           Washington WA
## 4840              Georgia GA
## 4841                Texas TX
## 4842             Michigan MI
## 4843             NEW YORK NY
## 4844           California CA
## 4845          MISSISSIPPI MS
## 4846           Washington WA
## 4847                Texas TX
## 4848           California CA
## 4849             Maryland MD
## 4850              Alabama AL
## 4851           Washington WA
## 4852           California CA
## 4853                Idaho ID
## 4854              Florida FL
## 4855              Florida FL
## 4856              FLORIDA FL
## 4857             ILLINOIS IL
## 4858       North Carolina NC
## 4859                Texas TX
## 4860                Texas TX
## 4861                Texas TX
## 4862                Texas TX
## 4863                Texas TX
## 4864                Texas TX
## 4865                Texas TX
## 4866                Texas TX
## 4867                Texas TX
## 4868                Texas TX
## 4869                Texas TX
## 4870                Texas TX
## 4871                Texas TX
## 4872                Texas TX
## 4873                Texas TX
## 4874                Texas TX
## 4875                Texas TX
## 4876                Texas TX
## 4877        Massachusetts MA
## 4878            Wisconsin WI
## 4879              FLORIDA FL
## 4880                Texas TX
## 4881                Texas TX
## 4882                Texas TX
## 4883             Michigan MI
## 4884          Mississippi MS
## 4885         South Dakota SD
## 4886         SOUTH DAKOTA SD
## 4887                Texas TX
## 4888                Texas TX
## 4889           Washington WA
## 4890                Texas TX
## 4891             NEW YORK NY
## 4892           California CA
## 4893             Michigan MI
## 4894              Florida FL
## 4895              Arizona AZ
## 4896                TEXAS TX
## 4897           California CA
## 4898                Texas TX
## 4899                Texas TX
## 4900                Texas TX
## 4901                Texas TX
## 4902                Texas TX
## 4903           California CA
## 4904           California CA
## 4905           California CA
## 4906                Texas TX
## 4907           Washington WA
## 4908                Texas TX
## 4909                Texas TX
## 4910                Texas TX
## 4911             Colorado CO
## 4912           California CA
## 4913             Kentucky KY
## 4914              FLORIDA FL
## 4915             Kentucky KY
## 4916              Florida FL
## 4917             Virginia VA
## 4918                Texas TX
## 4919            Minnesota MN
## 4920            MINNESOTA MN
## 4921             Colorado CO
## 4922              FLORIDA FL
## 4923             Michigan MI
## 4924                Texas TX
## 4925             Kentucky KY
## 4926             Kentucky KY
## 4927             KENTUCKY KY
## 4928              Florida FL
## 4929       North Carolina NC
## 4930       North Carolina NC
## 4931               Oregon OR
## 4932              Florida FL
## 4933              Florida FL
## 4934              Alabama AL
## 4935                TEXAS TX
## 4936                TEXAS TX
## 4937                Texas TX
## 4938             Virginia VA
## 4939              Arizona AZ
## 4940              Alabama AL
## 4941             ILLINOIS IL
## 4942                Texas TX
## 4943          Mississippi MS
## 4944          MISSISSIPPI MS
## 4945                Texas TX
## 4946             Kentucky KY
## 4947                Texas TX
## 4948                Texas TX
## 4949               Alaska AK
## 4950       North Carolina NC
## 4951              Florida FL
## 4952              Florida FL
## 4953              Alabama AL
## 4954                Idaho ID
## 4955                Texas TX
## 4956              Florida FL
## 4957              Florida FL
## 4958             Kentucky KY
## 4959              Florida FL
## 4960                Texas TX
## 4961             Kentucky KY
## 4962             Virginia VA
## 4963             Virginia VA
## 4964             Kentucky KY
## 4965       North Carolina NC
## 4966              FLORIDA FL
## 4967              Florida FL
## 4968             Kentucky KY
## 4969             Kentucky KY
## 4970             Michigan MI
## 4971                Texas TX
## 4972                Texas TX
## 4973             Virginia VA
## 4974            Minnesota MN
## 4975           California CA
## 4976              Alabama AL
## 4977                Texas TX
## 4978           California CA
## 4979                Texas TX
## 4980           California CA
## 4981             Illinois IL
## 4982           California CA
## 4983            Wisconsin WI
## 4984           Washington WA
## 4985           California CA
## 4986           Washington WA
## 4987           Washington WA
## 4988             Michigan MI
## 4989             Virginia VA
## 4990             Virginia VA
## 4991             MICHIGAN MI
## 4992           California CA
## 4993             Michigan MI
## 4994           California CA
## 4995            TENNESSEE TN
## 4996          Mississippi MS
## 4997                Texas TX
## 4998         SOUTH DAKOTA SD
## 4999         SOUTH DAKOTA SD
## 5000           California CA
## 5001                Texas TX
## 5002                Texas TX
## 5003                Texas TX
## 5004           Washington WA
## 5005                Texas TX
## 5006              Florida FL
## 5007             Nebraska NE
## 5008            Minnesota MN
## 5009              FLORIDA FL
## 5010           California CA
## 5011             Kentucky KY
## 5012                Texas TX
## 5013                Texas TX
## 5014            Wisconsin WI
## 5015                Texas TX
## 5016             Virginia VA
## 5017           California CA
## 5018            Tennessee TN
## 5019                Texas TX
## 5020                Texas TX
## 5021                Texas TX
## 5022                Texas TX
## 5023                Texas TX
## 5024                Texas TX
## 5025           California CA
## 5026                Texas TX
## 5027                Texas TX
## 5028                Texas TX
## 5029                Texas TX
## 5030           California CA
## 5031                TEXAS TX
## 5032           California CA
## 5033       South Carolina SC
## 5034           New Jersey NJ
## 5035                Texas TX
## 5036             Michigan MI
## 5037           California CA
## 5038              Florida FL
## 5039                Texas TX
## 5040                Texas TX
## 5041           CALIFORNIA CA
## 5042           California CA
## 5043             Illinois IL
## 5044           Washington WA
## 5045             Michigan MI
## 5046                Texas TX
## 5047           California CA
## 5048              Arizona AZ
## 5049           California CA
## 5050           California CA
## 5051           California CA
## 5052           California CA
## 5053           California CA
## 5054           California CA
## 5055           California CA
## 5056                Texas TX
## 5057           California CA
## 5058          Mississippi MS
## 5059       South Carolina SC
## 5060             Virginia VA
## 5061                Texas TX
## 5062              Georgia GA
## 5063              Florida FL
## 5064               Nevada NV
## 5065              Florida FL
## 5066       North Carolina NC
## 5067       North Carolina NC
## 5068             Virginia VA
## 5069                Texas TX
## 5070              Florida FL
## 5071              Arizona AZ
## 5072              Alabama AL
## 5073           California CA
## 5074           California CA
## 5075           Washington WA
## 5076              Florida FL
## 5077           California CA
## 5078           California CA
## 5079                 Utah UT
## 5080           Washington WA
## 5081       South Carolina SC
## 5082             Kentucky KY
## 5083              Alabama AL
## 5084             MICHIGAN MI
## 5085           WASHINGTON WA
## 5086                 Utah UT
## 5087           California CA
## 5088           New Jersey NJ
## 5089            Minnesota MN
## 5090             MICHIGAN MI
## 5091       North Carolina NC
## 5092            Tennessee TN
## 5093             Kentucky KY
## 5094                Idaho ID
## 5095              Florida FL
## 5096           NEW JERSEY NJ
## 5097            Minnesota MN
## 5098                Texas TX
## 5099             Michigan MI
## 5100              Florida FL
## 5101              Florida FL
## 5102                TEXAS TX
## 5103           New Mexico NM
## 5104             Illinois IL
## 5105             Illinois IL
## 5106                TEXAS TX
## 5107             Nebraska NE
## 5108           CALIFORNIA CA
## 5109           New Jersey NJ
## 5110           CALIFORNIA CA
## 5111             New York NY
## 5112               Oregon OR
## 5113                Texas TX
## 5114             Nebraska NE
## 5115           California CA
## 5116             Colorado CO
## 5117           California CA
## 5118           California CA
## 5119           California CA
## 5120           California CA
## 5121           CALIFORNIA CA
## 5122           Washington WA
## 5123           California CA
## 5124           California CA
## 5125           California CA
## 5126           California CA
## 5127           California CA
## 5128             Kentucky KY
## 5129           California CA
## 5130           California CA
## 5131           California CA
## 5132           California CA
## 5133             Kentucky KY
## 5134                 Utah UT
## 5135           California CA
## 5136           California CA
## 5137                Texas TX
## 5138           California CA
## 5139           California CA
## 5140           California CA
## 5141           California CA
## 5142           California CA
## 5143               Alaska AK
## 5144           California CA
## 5145                Idaho ID
## 5146            Minnesota MN
## 5147             Kentucky KY
## 5148             Missouri MO
## 5149           California CA
## 5150                Texas TX
## 5151           California CA
## 5152                Idaho ID
## 5153                Texas TX
## 5154                Texas TX
## 5155           Washington WA
## 5156           Washington WA
## 5157             Michigan MI
## 5158             MICHIGAN MI
## 5159             Colorado CO
## 5160            Wisconsin WI
## 5161           California CA
## 5162           California CA
## 5163                Texas TX
## 5164                Idaho ID
## 5165             Michigan MI
## 5166           California CA
## 5167                Texas TX
## 5168                Texas TX
## 5169                Texas TX
## 5170                Texas TX
## 5171                Texas TX
## 5172             Michigan MI
## 5173             Missouri MO
## 5174           California CA
## 5175        West Virginia WV
## 5176             Michigan MI
## 5177                Texas TX
## 5178             VIRGINIA VA
## 5179           California CA
## 5180                Texas TX
## 5181           California CA
## 5182             MICHIGAN MI
## 5183              Florida FL
## 5184           California CA
## 5185           California CA
## 5186           California CA
## 5187            Minnesota MN
## 5188             New York NY
## 5189            WISCONSIN WI
## 5190           California CA
## 5191           NEW JERSEY NJ
## 5192           California CA
## 5193           California CA
## 5194                Texas TX
## 5195           California CA
## 5196             Virginia VA
## 5197             Michigan MI
## 5198                Texas TX
## 5199             Colorado CO
## 5200           New Mexico NM
## 5201           Washington WA
## 5202           California CA
## 5203             Colorado CO
## 5204           California CA
## 5205              Arizona AZ
## 5206           California CA
## 5207           California CA
## 5208           California CA
## 5209           California CA
## 5210             Michigan MI
## 5211           California CA
## 5212           New Mexico NM
## 5213           California CA
## 5214           California CA
## 5215                Texas TX
## 5216         South Dakota SD
## 5217            Minnesota MN
## 5218             Michigan MI
## 5219            MINNESOTA MN
## 5220              Florida FL
## 5221           New Jersey NJ
## 5222            Minnesota MN
## 5223            Minnesota MN
## 5224                Texas TX
## 5225            Minnesota MN
## 5226            Minnesota MN
## 5227            Minnesota MN
## 5228            Tennessee TN
## 5229             KENTUCKY KY
## 5230             Virginia VA
## 5231                Texas TX
## 5232                Texas TX
## 5233            Minnesota MN
## 5234            Minnesota MN
## 5235               OREGON OR
## 5236                IDAHO ID
## 5237              Florida FL
## 5238            Wisconsin WI
## 5239              Alabama AL
## 5240           Washington WA
## 5241            Minnesota MN
## 5242                Texas TX
## 5243                Texas TX
## 5244                Texas TX
## 5245                Texas TX
## 5246                Texas TX
## 5247                Texas TX
## 5248                Texas TX
## 5249                Texas TX
## 5250                Texas TX
## 5251                Texas TX
## 5252                Texas TX
## 5253                Texas TX
## 5254                Texas TX
## 5255                 Iowa IA
## 5256                Texas TX
## 5257           California CA
## 5258           California CA
## 5259              Florida FL
## 5260              Florida FL
## 5261              Florida FL
## 5262              Florida FL
## 5263           New Jersey NJ
##                                                       School.Name   NCES.SchID
## 1                                       112 ALC Independent Study 270819000000
## 2                                           112 ALC MIDDLE SCHOOL 270819000000
## 3                                              112 ALC Seat-Based 270819000000
## 4                                 21st Century Learning Institute  60429013779
## 5                                                  270 - HAP - IS 270003000000
## 6                                         270 HOPKINS ALTERNATIVE 270003000000
## 7                                                  270 HOPKINS IS 270003000000
## 8                                   270 HOPKINS NORTH JR HIGH ALC 270003000000
## 9                                    270 HOPKINS WEST JR HIGH ALC 270003000000
## 10                                    272 CENTRAL MIDDLE SCH. ALT 270003000000
## 11                                         276 MINNETONKA COMPASS 270003000000
## 12                                  276 MINNETONKA COMPASS EXT YR 270003000000
## 13                                           276 MINNETONKA HS IS 270003000000
## 14                             277 WESTONKA AREA LEARNING ACADEMY 270003000000
## 15                                     277-GRANDVIEW MIDDLE - ALC 270003000000
## 16                              283 ST LOUIS PK INDEPENDENT STUDY 270003000000
## 17                               283-IND STDY 15 AND UNDER - I.S. 270003000000
## 18                                         283-ST. LOUIS PARK ALC 270003000000
## 19                                   3B JUVENILE DETENTION CENTER 160153000000
## 20                                                     3D ACADEMY 481739000000
## 21                               4092 - WATERSHED HIGH SCHOOL ALC 270003000000
## 22                                4122 - EAGLE RIDGE ACADEMY - IS 270003000000
## 23                              4126 - PRAIRIE SEEDS ACADEMY - IS 270003000000
## 24                                            54th Street Academy 262016000000
## 25                             622 ALTERNATIVE MIDDLE/HIGH SCHOOL 272385000000
## 26                                                      70 ONLINE  80615006496
## 27                                                 800 W Broadway 272124000000
## 28                                        800 W Broadway Extended 272124000000
## 29                                          916 MAHTOMEDI ACADEMY 270226000000
## 30                                     A. G. A. P. E. TEEN PARENT 273384000000
## 31                                           A.QUINN JONES CENTER 120003000000
## 32                     Aaron Cohn Regional Youth Detention Center 130003000000
## 33                                    ABC Secondary (Alternative)  60162010232
## 34                                            ABE DIPLOMA PROGRAM 273239000000
## 35                       Aberdeen Alternative Learning Center- 12 460207000000
## 36                                                 ABERNATHY DAEP 480741000000
## 37                                               ABOUT FACE JJAEP 481830000000
## 38                                          ABOUT FACE PROGRAM EL 481830000000
## 39                                    Abraham Lincoln Alternative  63762002045
## 40                                   Abraham Lincoln Continuation  63315005148
## 41                                      Abraxas Continuation High  63153004883
## 42                          Academic and Career Education Academy 260033000000
## 43                                  ACADEMIC BEHAVIOR SCHOOL EAST 480026000000
## 44                                  ACADEMIC BEHAVIOR SCHOOL WEST 480026000000
## 45                               Academic Behavior&Community Acad 170016000000
## 46                                 ACADEMIC CENTER FOR EXCELLENCE  50375001019
## 47                                   ACADEMIC SOLUTIONS ACADEMY A 120018000000
## 48                                 ACADEMIC SOLUTIONS HIGH SCHOOL 120018000000
## 49                                     Academy (The)- SF @McAteer  63441012526
## 50                                                     Academy 21 260858000000
## 51                                                    Academy 360 510084000000
## 52                                          ACADEMY AT LARRAGOITE 350237000000
## 53                                   Academy at Virginia Randolph 510189000000
## 54                                           ACADEMY DEL SOL ALT. 350003000000
## 55                                             Academy for Change  60837011853
## 56                                                  ACADEMY JJAEP 480747000000
## 57                                ACADEMY OF ACCELERATED LEARNING 480003000000
## 58                                              ACADEMY OF CHOICE 484110000000
## 59                                         ACADEMY OF CREATIVE ED 483294000000
## 60                                              ACADEMY OF DALLAS 480009000000
## 61                          Academy of Engineering and Technology 510225000000
## 62                                        Academy of the Redwoods  61419010801
## 63                                         FAIRMONT YOUTH ACADEMY 540051000000
## 64                                   ALTERNATIVE HIGH SCHOOL AT 4 360585000000
## 65                             Academy West Alternative Education 263597000000
## 66                          Acalanes Center for Independent Study  60165010751
## 67                                                           ACCE 263663000000
## 68                                   Accelerated Learning Academy 261452000000
## 69                                    ACCELERATED LEARNING CENTER 480003000000
## 70                                     ACCELERATION ACADEMIES LLC 120039000000
## 71                                           Acceleration Academy 530048000000
## 72                                           ACCELERATION ACADEMY 120177000000
## 73                                              ACCELERATION EAST 120144000000
## 74                             ACCELERATION MIDDLE CHARTER SCHOOL 120108000000
## 75                                              ACCELERATION WEST 120144000000
## 76                                                       ACCELERE 317482000000
## 77                                                         ACCESS 273381000000
## 78                                        Access County Community  69102410567
## 79                                           Access Juvenile Hall  69102409236
## 80                      ACE Academy SDA Glendale Lincoln Woodward 260094000000
## 81                                 ACE COMMUNITY CHALLENGE SCHOOL  80336001764
## 82                                               ACES High School 530543000000
## 83                                                ACHIEVE ACADEMY 484653000000
## 84                                        ACHIEVE CENTER OF PASCO 120153000000
## 85                         Achievement Academy @ Harbor City High 240009000000
## 86                                        Achievement High School 263021000000
## 87                             Achievement Integrity And Maturity 510126000000
## 88                                                        Ackerly 210299000000
## 89                              Ackerson Lake Community Education 262496000000
## 90                                                           ACTS 120087000000
## 91                                     ADA COUNTY JUVENILE CENTER 160036000000
## 92                                ADA-BORUP AREA LEARNING PROGRAM 270013000000
## 93                                         Adair Learning Academy 210003000000
## 94                                              Adams County RSSP 170016000000
## 95                                     ADAMS YOUTH SERVICE CENTER  80258006343
## 96                                 Adelante Dual Language Academy  60231011793
## 97                              Adelante Dual Language Academy II  60231014147
## 98                                                  Adelante High  63227002047
## 99                                                  Adelante High  60006111814
## 100                                  Adelante High (Continuation)  63363005189
## 101                                    ADJUDICATED YOUTH FACILITY 120138000000
## 102                                                ADMIN SERVICES 480783000000
## 103                                         Adobe Mountain School  40973401517
## 104                                  Adrian Community High School 260195000000
## 105                               Adult & Career Education Center 510111000000
## 106                                               ADULT ACADEMICS 273178000000
## 107                               Adult and Community Ed Building 263495000000
## 108                                                ADULT BASIC ED 483510000000
## 109                         ADULT DIAGNOSTIC AND TREATMENT CENTER 340009000000
## 110                                                      ADULT ED 481168000000
## 111                                                      ADULT ED 481970000000
## 112                                               Adult Education 320012000000
## 113                                        Adult Education Center 510189000000
## 114                                            ADULT LEARNING CTR 480744000000
## 115                                           Adult Learning Ctr. 510384000000
## 116                                     ADULT TRANSITION SERVICES 481776000000
## 117                                       ADULT/COMMUNITY LRN CTR 484668000000
## 118                                               AdVance Academy 370465000000
## 119                                 Advantage Alternative Program 261803000000
## 120                                                    AEP CAMPUS 482367000000
## 121                                        Afflerbaugh-Paige Camp  69107812710
## 122                              Afternoon Group Learning Centers 240012000000
## 123                                           AFTERSCHOOL PROGRAM 271023000000
## 124                                         Aggeler Community Day  62271011315
## 125                            Ahrens Educational Resource Center 210299000000
## 126                                                 Ahwahnee High  60016007902
## 127                                                           AIM 260663000000
## 128                                                AIM CENTER H S 484416000000
## 129                                     AIM COLLEGE & CAREER PREP 482028000000
## 130                                               AIM High School 530802000000
## 131                                       Airport Virtual Academy 260198000000
## 132                           AITKIN ALTERNATIVE LEARNING PROGRAM 270276000000
## 133                                        Al Kennedy High School 411158000000
## 134                                               ALACHUA ACADEMY 120003000000
## 135                                           ALACHUA COUNTY JAIL 120003000000
## 136                    ALACHUA REGIONAL JUVENILE DETENTION CENTER 120003000000
## 137                                      Alameda County Community  69105106830
## 138                            Alameda County Juvenile Hall/Court  69105109264
## 139                      Alameda Science and Technology Institute  60177010547
## 140                        ALAMOSA OMBUDSMAN SCHOOL OF EXCELLENCE  80207006508
## 141                                                          ALBA  63432007682
## 142                                         Albany Options School 410112000000
## 143                         ALBERT C WAGNER CORRECTIONAL FACILITY 340009000000
## 144                                  Albert Einstein Continuation  62271002976
## 145                               ALBERT LEA AREA LEARNING CENTER 270297000000
## 146                                    Albert Powell Continuation  64347007028
## 147                                    ALC - EDEN PRAIRIE HS - IS 270003000000
## 148                                            ALC - Gateway - EY 270003000000
## 149                                               ALC - NECA - EY 270003000000
## 150                                               ALC - SECA - EY 270003000000
## 151                                              ALC - W-ALT - EY 270003000000
## 152                                                 ALC at Bryant 510126000000
## 153                                                  ALC at Burke 510126000000
## 154                                               ALC at Montrose 510126000000
## 155                                          ALC at Mountain View 510126000000
## 156                                   ALC BMS Middle Year Program 272520000000
## 157                                               ALC CONNECTIONS 273384000000
## 158                                           ALC CREDIT RECOVERY 272520000000
## 159                                        ALC EDEN PRAIRIE HS-IS 270003000000
## 160                                 ALC EDINA HS ALTERNATIVE - IS 270003000000
## 161                                       ALC EVENING HIGH SCHOOL 273384000000
## 162                                              ALC EXTENDED DAY 272124000000
## 163                                        ALC GATEWAY TO COLLEGE 273384000000
## 164                                         ALC INDEPENDENT STUDY 272520000000
## 165                                  ALC MGMS Middle Year Program 272520000000
## 166                                              ALC NIGHT SCHOOL 272805000000
## 167                                  ALC NVMS Middle Year Program 272520000000
## 168                                   ALC OMS Middle Year Program 272520000000
## 169                                                  ALC ON TRACK 273384000000
## 170                                             ALC Online School 273384000000
## 171                                 ALC RICHFIELD - SUCCESS AT 15 270003000000
## 172                                           ALC RICHFIELD HS-IS 270003000000
## 173                               ALC SECONDARY EXTENDED PROGRAMS 273384000000
## 174                                   ALC SECONDARY SPECIAL SITES 273384000000
## 175                                               ALC SENIOR HIGH 272520000000
## 176                                    ALC SUMMER CREDIT RECOVERY 273180000000
## 177                                             ALC WESTONKA - IS 270003000000
## 178                                      ALC-ORONO HIGH SCHOOL IS 270003000000
## 179                                     Alcorn ALTERNATIVE SCHOOL 280039000000
## 180                                       ALDINE EDUCATION CENTER 480771000000
## 181                                              ALDINE J J A E P 480771000000
## 182                                   ALEE ACADEMY CHARTER SCHOOL 120105000000
## 183                                          ALEGENT/IMMANUEL RTC 310018000000
## 184                                               Alessandro High  61692002149
## 185                                               Alexandra House 270318000000
## 186                                 Alexandria Educational Center 210090000000
## 187                                  Alger B. Wilkins High School 370001000000
## 188                           Alger Maximum Correctional Facility 260000000000
## 189                                     ALGOA CORRECTIONAL CENTER 290003000000
## 190                                 Algonac Alternative Education 260219000000
## 191                                 ALICE CARLSON APPLIED LRN CTR 481970000000
## 192                                              Alice M. Worsley  69100709219
## 193                                               ALICIA R CHACON 484668000000
## 194                                           ALIEF ISD J J A E P 480783000000
## 195                                     ALIEF LEARNING CTR (6-12) 480783000000
## 196                                      ALIEF LEARNING CTR (K-6) 480783000000
## 197                     ALLAN K & CAROLYN H BIRD EDUCATION CENTER 483510000000
## 198                               Allegan Alternative High School 260222000000
## 199                             ALLEGANY CO SHERIFF C/O TREASURER 360002000000
## 200                                Allen Co Youth Services Center 180825000000
## 201                                   Allen Park Community School 260252000000
## 202                                    Allgood Alternative School  10042000670
## 203                                          Alliance High School 411004000000
## 204                                                        ALLIES  80387006725
## 205                                                 Allina PHP CT 270003000000
## 206                                        ALLISON L STEELE E L C 483948000000
## 207                                   Almanor High (Continuation)  63117007824
## 208                                            ALOMA HIGH CHARTER 120144000000
## 209                                ALOP Academic Learning Program 170022000000
## 210                                           ALP Credit Recovery 270012000000
## 211                                                         ALPHA 482874000000
## 212                                     Alpine County Opportunity  69105806965
## 213                         Alpine County Secondary Community Day  60207006968
## 214                                 Alps View High (Continuation)  60133106604
## 215                                            Alta Vista Academy  63864010385
## 216                                   Alta Vista Alternative High  60141412435
## 217                            Alta Vista Alternative Junior High  60141412760
## 218                                               Alta Vista High  62631003931
## 219                                Alta Vista High (Continuation)  64119006812
## 220                                       ALTER DISCIPLINE CAMPUS 481770000000
## 221                                                  ALTER ED CTR 481800000000
## 222                                                 ALTER ED PROG 481111000000
## 223                                                 ALTER ED PROG 482406000000
## 224                                                     ALTER H S 483294000000
## 225                                              ALTER IMPACT CTR 480001000000
## 226                                            ALTER LEARNING CTR 482523000000
## 227                                                  ALTER MIDDLE 483294000000
## 228                                                     ALTER SCH 482855000000
## 229                                                     ALTER SCH 481984000000
## 230                                                     ALTER SCH 483543000000
## 231                                                  ALTER SCHOOL 480765000000
## 232                  Altern Ed Prgm/Behav Disord Youth/Montgomery 510008000000
## 233                                          ALTERNATIVE AGENCIES  50900000459
## 234                                            ALTERNATIVE CENTER 481815000000
## 235                              ALTERNATIVE CENTER FOR EDUCATION 120093000000
## 236                              Alternative Center for Education 262994000000
## 237                             Alternative Center For Excellence  90102001129
## 238  Alternative Computerized Education (ACE) Charter High School  40007901008
## 239                                  Alternative Education Center 510171000000
## 240                                  Alternative Education Center 510246000000
## 241                                  Alternative Education Center 510132000000
## 242                                 Alternative Education Program 530945000000
## 243                                 ALTERNATIVE EDUCATION PROGRAM 482874000000
## 244                                  ALTERNATIVE EDUCATION SCHOOL 483228000000
## 245                        Alternative Education-San Joaquin High  68450009467
## 246               Alternative Educational Academy of Iosco County 260103000000
## 247              Alternative Educational Academy of Ogemaw County 260109000000
## 248                 ALTERNATIVE EDUCATIONAL DEVELOPMENTAL PROGRAM 120105000000
## 249                                                ALTERNATIVE EL 483294000000
## 250                                  Alternative Family Education  63560007437
## 251                                               ALTERNATIVE H S 483312000000
## 252                                       Alternative High School 341269000000
## 253                               ALTERNATIVE HIGH SCHOOL PROGRAM 120195000000
## 254         Alternative Learning Academy at Conley-Caraballo High  62691011552
## 255                                   Alternative Learning Center  10333001395
## 256                                   ALTERNATIVE LEARNING CENTER 480894000000
## 257                                   Alternative Learning Center  10288001155
## 258                                   ALTERNATIVE LEARNING CENTER 482658000000
## 259                                   Alternative Learning Center  63417010048
## 260                                   ALTERNATIVE LEARNING CENTER 280477000000
## 261                               ALTERNATIVE LEARNING CTR - WEST 481611000000
## 262                                 ALTERNATIVE LEARNING CTR-EAST 481611000000
## 263                                  Alternative Learning Program 261995000000
## 264                                   ALTERNATIVE LEARNING SCHOOL 280285000000
## 265                                  Alternative Learning Systems  20060000325
## 266                                            ALTERNATIVE MIDDLE 483312000000
## 267                              Alternative Middle & High School 348036000000
## 268                                      ALTERNATIVE MIDDLE SOUTH 483312000000
## 269                                  ALTERNATIVE OUTREACH PROGRAM 120039000000
## 270                                   ALTERNATIVE PROGRAM CENTRAL 120150000000
## 271                                          Alternative Programs 240048000000
## 272                                     ALTERNATIVE RESOURCE CTR. 290001000000
## 273                                            ALTERNATIVE SCHOOL 484068000000
## 274                                            ALTERNATIVE SCHOOL 484161000000
## 275                                            Alternative School 191878000000
## 276                                            ALTERNATIVE SCHOOL 480945000000
## 277                                            Alternative School 130029000000
## 278                                            Alternative School  10114000819
## 279                                            Alternative School 530502000000
## 280                                  Alternative School at Levitt 341800000000
## 281                                  ALTERNATIVES FOR SUCCESS SCH 317443000000
## 282                                      Alterntive Learning Cent 191914000000
## 283                                 ALVIN V ANDERSON RISE ACADEMY 484347000000
## 284                          Alvord Alternative Continuation High  60243013134
## 285                                      Alvord Continuation High  60243000128
## 286                         AMADOR R RODRIGUEZ JUVENILE BOOT CAMP 483879000000
## 287                                   AMARILLO COLLEGIATE ACADEMY 480016000000
## 288                                   Amelia Earhart Continuation  62271002972
## 289                                        AMERICAN FALLS ACADEMY 160006000000
## 290                                           AMERICAN INDIAN OIC 272124000000
## 291                                  American Indian OIC Extended 272124000000
## 292                           American Legion High (Continuation)  63384005221
## 293                           AMI KIDS CENTER FOR PERSONAL GROWTH 120156000000
## 294                                        AMI KIDS EMERALD COAST 120138000000
## 295                         AMI KIDS RIO GRANDE VALLEY (FKA RGMI) 482829000000
## 296                                                  AMI KIDS YES 120087000000
## 297                                                       AMIKIDS 120111000000
## 298                                                       AMIKIDS 120003000000
## 299                                           AMIKIDS CLAY COUNTY 120030000000
## 300                                          AMIKIDS JACKSONVILLE 120048000000
## 301                                               AMIKIDS MANATEE 120123000000
## 302                                      AMIKIDS MIAMI-DADE NORTH 120039000000
## 303                                      AMIKIDS MIAMI-DADE SOUTH 120039000000
## 304                            AMIKIDS OF GREATER FORT LAUDERDALE 120018000000
## 305                                               AMIKIDS ORLANDO 120144000000
## 306                                     AMIKIDS SOUTHWEST FLORIDA 120108000000
## 307                                               AMIKIDS VOLUSIA 120192000000
## 308                                   Amistad High (Continuation)  61111007694
## 309                                                        Anchor 270951000000
## 310                                   Ancora Psychiatric Hospital 340009000000
## 311                                      ANDERSON ACCELERATED H S 481020000000
## 312                                        Anderson Community Day  60270007439
## 313                                      ANDREWS EDUCATION CENTER 480828000000
## 314                                           ANDREWS HIGH SCHOOL 120018000000
## 315                                   Angel's Gate (Continuation)  62271002815
## 316                                     Ann Klein Forensic Center 340009000000
## 317                                             ANNA WESTIN HOUSE 273384000000
## 318                                        Annapolis Road Academy 240051000000
## 319                                     Anne Arundel Evening High 240006000000
## 320                                Anniston City Boot Camp School  10009001246
## 321                                   ANNUNCIATION MATERNITY HOME 480007000000
## 322                           Anoka-Hennepin Regional High School 270318000000
## 323                            Anoka-Hennepin Regn HS Summer Prog 270318000000
## 324                              Anoka-Hennepin Regn Night School 270318000000
## 325                              ANOKA-HENNEPIN SPECIALTY PROGRAM 270318000000
## 326                               Anoka-Hennepin Tech High School 270318000000
## 327                                     Another Course To College 250279000000
## 328                                                 Anson Academy 370018000000
## 329                                        Antelope Community Day  60276008413
## 330                                                ANTHONY CENTER 540051000000
## 331                                          ANTHONY LOUIS CENTER 270003000000
## 332                                          ANTHONY LOUIS CENTER 272385000000
## 333                                           ANTHONY LOUIS HOUSE 270318000000
## 334                                                   ANTON P E P 480846000000
## 335                 AOC-Cochise County Juvenile Dentention Centre  40045702585
## 336                   AOC-Graham County Juvenile Detention Center  40045602578
## 337                    AOC-Pinal County Juvenile Detention Center  40045302580
## 338               AOC-Santa Cruz County Juvenile Detention Center  40046202572
## 339                  AOC-Yavapai County Juvenile Detention Center  40046002581
## 340                     AOC-Yuma County Juvenile Detention Center  40045802573
## 341                     AOC_Gila County Juvenile Detention Center  40076702960
## 342                             APALACHICOLA FOREST YOUTH ACADEMY 120117000000
## 343                                                  APEX Academy 210012000000
## 344                                                   Apollo High  61182006643
## 345                                                   Apollo High  63684006245
## 346                       Appleton Cooperative Educational Center 550039000000
## 347                          Applications and Research Laboratory 240042000000
## 348                                     APS-Forrest Hills Academy 130012000000
## 349                                            ARANSAS PASS JJAEP 480858000000
## 350                                    ARAPAHOE RIDGE HIGH SCHOOL  80249001219
## 351                      Arbuckle Alternative High (Continuation)  63036002931
## 352                                                           ARC 170016000000
## 353                                   Arcola Bridges/Beacons RSSP 170018000000
## 354                               AREA ADULT LEARNING COOPERATIVE 271807000000
## 355                                   AREA LEARNING CENTER SUMMER 274236000000
## 356                                     Arena High (Continuation)  61221008826
## 357                                     Argus High (Continuation)  60813000782
## 358                                                          ARIS 270226000000
## 359                                       ARISE Shelter Care - 71 466627000000
## 360                                       Ark Independent Studies  63560007869
## 361                                      ARLINGTON COLLEGIATE H S 480870000000
## 362                                          Arlington Open Doors 530024000000
## 363                            Armada Continuing Education Center 260324000000
## 364                                     ARMSTRONG CREDIT RECOVERY 273178000000
## 365                                     Arrow High (Continuation)  60819000798
## 366                                     ARROWHEAD JUVENILE CENTER 271104000000
## 367                                    Arroyo Seco Museum Science  62271008888
## 368                                   ARTHUR MILLER CAREER CENTER 482517000000
## 369                                  ARTS & HUMANITIES FOCUS PRGM 317284000000
## 370                               Arts and Technology High School 411317000000
## 371               Asawa (Ruth) SF Sch of the Arts A Public School  63441001276
## 372                                                Asbury Academy 370268000000
## 373                                         ASCEND CAREER ACADEMY 120018000000
## 374                                            Ascent High School 260002000000
## 375                                                       ASH H S 483507000000
## 376                                                  Asher School 263234000000
## 377                                                    New School 210303000000
## 378                              Ashley Chapel Educational Center 370387000000
## 379                                      Ashley Valley Educ. Ctr. 490108000000
## 380                                    ASP - Florence West/A.C.I.  40012001814
## 381                                  ASP - Marana O.C.T.F./A.C.I.  40012001813
## 382                                     ASP - Phoenix West/A.C.I.  40012001810
## 383                                         ASPC - Douglas/A.C.I.  40012001646
## 384                               ASPC - Safford/Ft. Grant/A.C.I.  40012001815
## 385                                                    ASPC-Eyman  40012001647
## 386                                                 ASPC-Florence  40012001641
## 387                                            ASPC-Phoenix/Globe  40012001645
## 388                                                  ASPC-Winslow  40012001812
## 389                                           ASPEN VALLEY CAMPUS  80192000858
## 390                                                Aspire Academy 510324000000
## 391                                        ASPIRE ACADEMY CHARTER 120144000000
## 392                                    ASPIRE Academy High School 320009000000
## 393                                Aspire Alternative High School 170017000000
## 394                                          Aspire Community Day  61692013907
## 395                                                   ASSATA High 550960000000
## 396                                                ASSESSMENT CTR 481970000000
## 397                                                ASSIST RSSP 12 170017000000
## 398                                               ASSIST TAOEP 12 170017000000
## 399                                         West Mall Alternative  60330010317
## 400                                             ATASCOSA CO ALTER 484074000000
## 401                                             ATASCOSA CO ALTER 483519000000
## 402                                             ATASCOSA CO ALTER 481371000000
## 403                                     ATASCOSA CO JUVENILE UNIT 483552000000
## 404                                         ATASCOSA COUNTY JJAEP 481695000000
## 405                       ATASCOSA COUNTY JUVENILE JUSTICE CENTER 482496000000
## 406                               ATASCOSA JUVENILE DETENTION CTR 483447000000
## 407                        Atherton Vern Van Y Educational Center 260354000000
## 408                                       ATLANTIC CO JUV DET CTR 340009000000
## 409                       Atlantic County Alternative High School 340099000000
## 410                                      Atlantic Regional School 340009000000
## 411                        Atlantic Transitional Education Center 340009000000
## 412                                   Attleboro Community Academy 250219000000
## 413                                        Atwater Senior Academy  60342011167
## 414                                       Lexington Day Treatment 210186000000
## 415                       Augusta Regional Youth Detention Center 130003000000
## 416                              Augusta Youth Development Campus 130003000000
## 417                                    Aurora High (Continuation)  60690000633
## 418                        Aurora Plains Academy High School - 05 465571000000
## 419                      Aurora Plains Academy Middle School - 04 465571000000
## 420                                   AUSTIN AREA LEARNING CENTER 270345000000
## 421                           AUSTIN AREA LEARNING CNTR. - SUMMER 270345000000
## 422                                            AUSTIN CAN ACADEMY 480002000000
## 423                                                   AUSTIN OAKS 480007000000
## 424                                            AUSTIN ST HOSPITAL 480894000000
## 425                             Autauga County Alternative School  10024000587
## 426                                                  AVAIL School  20018000714
## 427                                                   Avalon High  62271002830
## 428                                            Avanti High School 530618000000
## 429                                              Avondale Academy 260369000000
## 430                        AXTELL BRUCEVILLE-EDDY LEARNING CENTER 480915000000
## 431                                                AXTELL/BE DAEP 481173000000
## 432                        AXTELL/BRUCEVILLE-EDDY LEARNING CENTER 481173000000
## 433                                           AZLE HORNET ACADEMY 480920000000
## 434                                           AZLEWAY - BIG SANDY 480026000000
## 435                                         AZLEWAY - CHAPEL HILL 480026000000
## 436                                         AZLEWAY - WILLOW BEND 480026000000
## 437                                           AZTEC YOUTH ACADEMY 350001000000
## 438                                            B C Ed Tech Center 370033000000
## 439                                        B H R A Cooperative HS 170143000000
## 440                                                 Back Bay High  62724004122
## 441                                     Baden High (Continuation)  63753006340
## 442                                                BADGER ACADEMY  50288001456
## 443                                                    BAGLEY ALP 270357000000
## 444                  Balboa Gifted/High Ability Magnet Elementary  62271002833
## 445                              Baltimore County Home & Hospital 240012000000
## 446                                         Bangor Career Academy 260387000000
## 447                                Bangor Township Virtual School 260390000000
## 448                        Banner Preparatory School of Milwaukee 550960000000
## 449                                     Banning Independent Study  60384008555
## 450                                                BANQUETE JJAEP 480941000000
## 451                          Baraga Maximum Correctional Facility 260000000000
## 452                    BARBARA CARDWELL CAREER PREPARATORY CENTER 482442000000
## 453                      BARBARA CULVER JUVENILE DETENTION CENTER 483057000000
## 454                              SCHOOL COMMUNITY GUIDANCE CENTER 481623000000
## 455              LEARNING ALTERNATIVE CENTER FOR EMPOWERING YOUTH 481623000000
## 456                                          BARBOURSVILLE SCHOOL 540051000000
## 457                                Barclay Hills Education Center 262742000000
## 458                                  Bardstown Alternative School 210027000000
## 459                                                  Barely Bears  40232001025
## 460                                 Barker Creek Community School 530108000000
## 461                                     Barnabus Home High School 210294000000
## 462                                   Barnabus Home Middle School 210294000000
## 463                                  BARNES LEARNING CENTER (ALC) 540072000000
## 464                                       Barrows Adult Education 263384000000
## 465                                   Bartlett Educational Center 210174000000
## 466                                          BARTOW YOUTH ACADEMY 120159000000
## 467                                                BASIC SKILLS-4 272124000000
## 468                                 BASIN ALTERNATIVE HIGH SCHOOL 160318000000
## 469                             BASTROP COUNTY JUVENILE BOOT CAMP 481836000000
## 470                             BASTROP COUNTY JUVENILE BOOT CAMP 484055000000
## 471                          Bates Technical College - Open Doors 530001000000
## 472                             Battle Creek Area Learning Center 260028000000
## 473                                                         BAVEL 210030000000
## 474                                   Bay City Adult EducationCTP 260426000000
## 475                Wenona Center Home of Wenona HighMiddle School 260426000000
## 476                                  Bay City Western High School 260426000000
## 477                        BAY REGIONAL JUVENILE DETENTION CENTER 120009000000
## 478                                                      Bay View 550582000000
## 479                               BayArenac Community High School 260007000000
## 480                                     BAYCARE BEHAVIORAL HEALTH 120153000000
## 481                                         Bayside Community Day  62580007213
## 482                                           BAYSIDE HIGH SCHOOL 120156000000
## 483                                           BBE LEARNING CENTER 270009000000
## 484                                       BCDC Educational Center 240012000000
## 485                         Beach High-Intensive Learning Program  62250013001
## 486                                                Beacon Academy 210573000000
## 487                                                    Beacon ALP 270579000000
## 488                                                 BEACON ALP IS 270579000000
## 489                                            BEACON HIGH SCHOOL 120033000000
## 490                           BECKER ALTERNATIVE LEARNING PROGRAM 270387000000
## 491                                                BECKLEY CENTER 540051000000
## 492                          Beckwourth (Jim) High (Continuation)  63117007825
## 493                       Bedford CommunityFamily Learning Center 261725000000
## 494                   Bedford County Alternative Education Center 510036000000
## 495                    BEDFORD STUYVESANT PREPARATORY HIGH SCHOOL 360009000000
## 496                                           BELEN INFINITY HIGH 350018000000
## 497                                             BELL CO J J A E P 484233000000
## 498                                             BELL CO J J A E P 480986000000
## 499                                                 BELL CO JJAEP 480954000000
## 500                                                 BELL CO JJAEP 483858000000
## 501                                Bell County Alternative School 210039000000
## 502                                BELL COUNTY ALTERNATIVE SCHOOL 480747000000
## 503                                              BELL COUNTY DAEP 483858000000
## 504                                              BELL COUNTY DAEP 483771000000
## 505                                              BELL COUNTY DAEP 482337000000
## 506                                             BELL COUNTY JJAEP 481932000000
## 507                                             BELL COUNTY JJAEP 483771000000
## 508                                             BELL COUNTY JJAEP 482337000000
## 509                           Bellamy Creek Correctional Facility 260000000000
## 510                       Belle Fourche Education Connection - 09 460561000000
## 511                                BELLE POINT ALTERNATIVE CENTER  50633000354
## 512                                   Bellevue Big Picture School 530039000000
## 513                                                     Bellewood 210299000000
## 514                       Bellflower Alternative Education Center  60444005832
## 515                         Bellingham Family Partnership Program 530042000000
## 516                              Bellingham Re-Engagement Program 530042000000
## 517                             Belmond-Klemme Alternative School 190468000000
## 518                                       Beloit Learning Academy 550105000000
## 519                                  BEMIDJI AREA LEARNING CENTER 270444000000
## 520                                            BEMIDJI MIDDLE ALP 270444000000
## 521                                 BEMIDJI SENIOR LUMBERJACK ALC 270444000000
## 522                   BendleCarmanAinsworth Alternative Education 260789000000
## 523                                  BENNETT MOUNTAIN HIGH SCHOOL 160225000000
## 524                                   BENSON AREA LEARNING CENTER 270447000000
## 525                                          BENSON DAY TREATMENT 270447000000
## 526                                 Benson Secondary/S.E.A.R.C.H.  20018000110
## 527                              Bentley High School BOLD Academy 260480000000
## 528                                                Benzie Academy 260495000000
## 529                           Bergen Co Juvenile Detention Center 340009000000
## 530                                        Bergen Regional School 340009000000
## 531                                   Berkeley Technology Academy  60474011300
## 532                                Berrien County Truancy Academy 260543000000
## 533                               Berrien Springs Adult Education 260543000000
## 534                             Berrien Springs Discovery Academy 260543000000
## 535                               Berrien Springs Virtual Academy 260543000000
## 536                                    Berryessa Union Elementary  60480010400
## 537                                                          BETA 120144000000
## 538                                          Bethany Based School 261644000000
## 539                                        BETHANY CRISES SHELTER 271104000000
## 540                                         Bethel Youth Facility  20000100620
## 541                                            BEXAR CO J J A E P 481815000000
## 542                                            BEXAR CO J J A E P 482247000000
## 543                                            BEXAR CO J J A E P 482499000000
## 544                                            BEXAR CO J J A E P 481785000000
## 545                                            BEXAR CO J J A E P 480759000000
## 546                                            BEXAR CO J J A E P 484068000000
## 547                                            BEXAR CO J J A E P 484095000000
## 548                                            BEXAR CO J J A E P 484092000000
## 549                 BEXAR COUNTY JUVENILE JUSTICE ACADEMY (BCJJA) 483006000000
## 550                                          BEXAR COUNTY LRN CTR 481785000000
## 551                                     Bidwell Continuation High  60285011573
## 552                             Bidwell Point High (Continuation)  63807009644
## 553                                            Big Picture School 530354000000
## 554                                     Big Rapids Virtual School 260578000000
## 555                                                BIG SPRING AEP 481020000000
## 556                                    BIG SPRINGS CHARTER SCHOOL 480023000000
## 557                                 Biggs Secondary Community Day  60504008683
## 558                                BILL DUNCAN OPPORTUNITY CENTER 120159000000
## 559                                   BILL LOGUE DETENTION CENTER 484428000000
## 560                          BILL LOGUE JUVENILE DETENTION CENTER 481396000000
## 561                                            Bill M. Manes High  63507005929
## 562                                      Biltmore Continuation HS 320006000000
## 563                                              Birchwood School 450342000000
## 564                                          BISCAYNE HIGH SCHOOL 120048000000
## 565                                    Bishop Hall Charter School 130489000000
## 566                                      Bishop Independent Study  60140912412
## 567                         Bishop Union Elementary Community Day  60140910805
## 568                      Bishop Union Elementary Community Day II  60140912380
## 569                                      BLACK CANYON HIGH SCHOOL 160102000000
## 570                             Black Diamond High (Continuation)  63060007821
## 571                      Black Hills Academy at Canyon Hills - 08 468012000000
## 572          Black Hills Academy at Canyon Hills High School - 07 468012000000
## 573                        Black Hills Education Connections - 06 466693000000
## 574                               Black River Correctional Center 550004000000
## 575                           Black Rock Alternative/Continuation  62586003890
## 576                                 BLACKBURN ALTERNATIVE PROGRAM 317482000000
## 577                                       Blaine Home Connections 530057000000
## 578                                          Blaine Re-Engagement 530057000000
## 579                                              BLAKEMORE MIDDLE 481104000000
## 580                                               BLENDED ACADEMY 483890000000
## 581        Blended Learning Academies Credit Recovery High School 260107000000
## 582                                                    Blue Heron  62007010818
## 583                                                Blue Peak High 490105000000
## 584                                                    Blue Ridge  69100610766
## 585                                            Blue Ridge Academy 370030000000
## 586                            Blue Ridge Juvenile Detention Home 510004000000
## 587                         BLUEFIELD ALTERNATIVE LEARNING CENTER 540084000000
## 588                                   Bluegrass Challenge Academy 210171000000
## 589                              Bluegrass Discovery Academy High 210510000000
## 590                            Bluegrass Discovery Academy Middle 210510000000
## 591                                           BOARD OF CHILD CARE 540051000000
## 592                  Bob Richards Regional Youth Detention Center 130003000000
## 593                                              BOERNE ALTER SCH 481071000000
## 594                                                     BOKENKAMP 480026000000
## 595                                                      BOLD ALC 270566000000
## 596                                   Booker T Washington Alt Sch 181209000000
## 597                               Boone County Alternative Center 210051000000
## 598                                 BOONVILLE CORRECTIONAL CENTER 290003000000
## 599                                    BOONVILLE TREATMENT CENTER 290003000000
## 600                                          Boston Adult Academy 250279000000
## 601                                           Boston Arts Academy 250279000000
## 602                              Boston Collaborative High School 250279000000
## 603                                    Bostrom Alternative Center  40633001382
## 604                              BOULDER PREP CHARTER HIGH SCHOOL  80249001631
## 605                                             BOULEVARD HEIGHTS 481970000000
## 606                                  BOWERS-WHITLEY CAREER CENTER 120087000000
## 607                                    The Academy at 11th Street 210057000000
## 608                          Bowman (Jereann) High (Continuation)  64251006957
## 609                                    Boyle County Day Treatment 210063000000
## 610                                    Boyle Heights Continuation  62271007763
## 611                                                  Boynton High  60723000658
## 612                                            Boys & Girls Haven 210299000000
## 613                                                BOYS RANCH H S 481104000000
## 614                                            Boys Republic High  60846000832
## 615                                               BOYS TOTEM TOWN 273384000000
## 616                                                     BOYS TOWN 120171000000
## 617             BOYS TOWN INTERVENTION/ASSESSMENT INTERIM PROGRAM 310015000000
## 618                                                      BOYSTOWN 120039000000
## 619                                  BRADFORD INTERVENTION CENTER 120012000000
## 620                                      BRADY EXPLORATION SCHOOL  80480001907
## 621                                          Bragg Street Academy 370256000000
## 622                                       BRAMLETTE STEAM ACADEMY 482811000000
## 623                                       Brandenburg High School 210405000000
## 624                                         BRANDON EPIC 3 CENTER 120087000000
## 625                                 Brandywine Innovation Academy 260660000000
## 626                                               Bravo Lake High  60141806997
## 627                                      BRAZORIA CO ALTER ED CTR 480831000000
## 628                                         BRAZORIA CO J J A E P 481629000000
## 629                                         BRAZORIA CO J J A E P 483444000000
## 630                                         BRAZORIA CO J J A E P 481467000000
## 631                                         BRAZORIA CO J J A E P 484197000000
## 632                                         BRAZORIA CO J J A E P 480809000000
## 633                                         BRAZORIA CO J J A E P 481626000000
## 634                                BRAZORIA CO JUVENILE DETENTION 480831000000
## 635                           BRAZOS CO JUVENILE DETENTION CENTER 481179000000
## 636                                           BRAZOS COUNTY JJAEP 481179000000
## 637                                                    BRAZOS H S 484428000000
## 638                                   BRAZOS RIVER CHARTER SCHOOL 480021000000
## 639            BRAZOS SCHOOL FOR INQUIRY AND CREATIVITY BRYAN/COL 480009000000
## 640             BRAZOS SCHOOL FOR INQUIRY AND CREATIVITY PINEMONT 480009000000
## 641                                       B-SUCCESS ACADEMY - AEC 481119000000
## 642                               Brea Canyon High (Continuation)  60588000528
## 643                     Breaking Barriers Alternative Ed/Henry Co 510010000000
## 644                            Cadet Leadership Education Program 210069000000
## 645                           Breathitt Regional Juvenile Det Ctr 210069000000
## 646                        Breathitt Residential Treatment Center 210069000000
## 647                            Breckenridge Area Learning Program 270615000000
## 648                                Breckinridge Metropolitan High 210299000000
## 649                                   Bremerton Home Link Program 530066000000
## 650                                                Brenkwitz High  61674002123
## 651                                  BRENTWOOD RESIDENTIAL CENTER 360013000000
## 652                                             Brentwood Science  62271002863
## 653                                   BREVARD COUNTY JAIL COMPLEX 120015000000
## 654                      BREVARD COUNTY JUVENILE DETENTION CENTER 120015000000
## 655                                  BREVARD GROUP TREATMENT HOME 120015000000
## 656                                                BREWER ACADEMY 483873000000
## 657                                   Brewster Alternative School 530069000000
## 658                                                BRIDGE ACADEMY 160324000000
## 659                                Bridge Alternative High School 260687000000
## 660                                                  BRIDGE ASSOC 481970000000
## 661                               Bridgepoint High (Continuation)  62706004080
## 662                                 Bridgeport Aurora High School 530072000000
## 663                                                       BRIDGES  80426001596
## 664                                                       Bridges  60285007017
## 665                                               Bridges Academy  62136013720
## 666                                         Bridges Community Day  60819005856
## 667                                         Bridges Community Day  60744010568
## 668                      Bridges Career and Technical High School 410674000000
## 669                                                Bridges School 370063000000
## 670                                     BRIGHTON HERITAGE ACADEMY  80258000729
## 671                                         Briones (Alternative)  62403007071
## 672                                              BRITTANY'S PLACE 273384000000
## 673                                                 Broadway High  63459005709
## 674                                    BRONX REGIONAL HIGH SCHOOL 360009000000
## 675                                                     Brooklawn 210299000000
## 676                                  BROOKLYN ACADEMY HIGH SCHOOL 360009000000
## 677                            Brooklyn Center Early College Acad 270624000000
## 678                             BROOKLYN CENTER INDEPENDENT STUDY 270624000000
## 679                             Brooklyn Center Middle School ALC 270624000000
## 680                                 BROOKLYN CENTER SUMMER SCHOOL 270624000000
## 681                                  Brooks Correctional Facility 260000000000
## 682                                       BROOKWOOD SECURE CENTER 360013000000
## 683                                      BROWARD DETENTION CENTER 120018000000
## 684                                BROWARD YOUTH TREATMENT CENTER 120018000000
## 685                                     Brown City Alternative HS 260704000000
## 686                                   BROWNFIELD EDUCATION CENTER 481161000000
## 687                                   BROWNSVILLE ACADEMIC CENTER 481168000000
## 688                               BROWNSVILLE ACADEMY HIGH SCHOOL 360010000000
## 689                                 BROWNSVILLE LEARNING ACAD H S 481168000000
## 690                           BROWNSVILLE LEARNING ACADEMY MIDDLE 481168000000
## 691                                     BROWNWOOD ACCELERATED H S 481170000000
## 692                                        BRYAN COMMUNITY SCHOOL 317284000000
## 693                                                 Bryant Center 530825000000
## 694                                                   Bryant High 510126000000
## 695                                              Buchanan Step Up 260714000000
## 696                                     Buckhorn Childrens Center 210477000000
## 697                               Buckner Alternative High School 210453000000
## 698                                            BUELL CENTRAL DAEP 483486000000
## 699                                     Buena Vista Community Day  63105011822
## 700                                 Buena Vista Continuation High  60846000833
## 701                                              Buena Vista High  62985004647
## 702                                              Buena Vista High  61515007726
## 703                               Buena Vista High (Continuation)  63873006510
## 704                                           BUINGER CTE ACADEMY 482406000000
## 705                                    Bullitt Alternative Center 210075000000
## 706                                 Bullock Creek Adult Education 260732000000
## 707          Burbank Unified Independent Learning Academy (BUILA)  60645013886
## 708                                     Burbank USD Community Day  60645008013
## 709                                          Burchell High School  20051000720
## 710                              Burk Horizon Southwest Sunset HS 320006000000
## 711                                             BURLINGTON CENTER 540051000000
## 712                                   BURLINGTON CO JUVEN DET CTR 340009000000
## 713                     Burlington County Alternative High School 340244000000
## 714                                    Burlington Regional School 340009000000
## 715                                    Burlington Trans Ed Center 340009000000
## 716                          Burlington-Edison Alternative School 530078000000
## 717                         BURNETT-BAYLAND REHABILITATION CENTER 480005000000
## 718                                          Burney Community Day  61347008376
## 719                               Burney Elementary Community Day  61347010417
## 720                                      Burns Alternative School 410249000000
## 721                            BURNSVILLE ALTERNATIVE HIGH SCHOOL 270729000000
## 722                               BURNSVILLE AREA LEARNING CENTER 270729000000
## 723                           Burnsville Sr High Extended Day Pro 270729000000
## 724                                      Burr Oak Virtual Academy 260741000000
## 725                                          Burton Community Day  60657011821
## 726                                    BUSD School of Opportunity  60402012957
## 727                                 Butler County Learning Center 210081000000
## 728                                 Butte County Community - LEAD  69100213783
## 729                                               Butte View High  63861009449
## 730                                     BYRON SYRING DELTA CENTER  80576000984
## 731                                        C C WASHINGTON ACADEMY 120009000000
## 732                                               C I T Y Program  10162001368
## 733                           C O Bastian (Caliente Youth Center) 320027000000
## 734                             C P Carmichael Alternative School  10240001087
## 735                                      C. G. BETHEL HIGH SCHOOL 120039000000
## 736                                    CAAEP EXTENDED DAY PROGRAM 270942000000
## 737                                Cabarrus Co Opportunity School 370053000000
## 738                                     CABELL ALTERNATIVE SCHOOL 540018000000
## 739                               Cache Creek High (Continuation)  64308007010
## 740                                                    Cache High 490012000000
## 741                                               CADDO MILLS BAU 481485000000
## 742                               Cadillac Innovation High School 260759000000
## 743                                             Cajon Valley Home  60681008590
## 744                                                Cal Burke High  62271011627
## 745                                               Calaveras Hills  62450003664
## 746                                       Calaveras River Academy  69100309215
## 747   Calaveras Unified Alternative-Sierra Hills Education Center  60687009340
## 748                                                 CALDWELL DAEP 481246000000
## 749                                                   Calero High  61182013019
## 750                             Calhoun County Alternative School  10054000700
## 751                                      Calico Continuation High  63682007256
## 752                                California Preparatory Academy  60744012894
## 753                                                    Calla High  62361007775
## 754                             Calloway (Cab) School of the Arts 100130000000
## 755                           Calloway County Alternative Program 210087000000
## 756                                 Calloway County Day Treatment 210087000000
## 757                             Calvert County Alternative School 240015000000
## 758                                              CALVIN NELMS H S 480012000000
## 759                                           CALVIN NELMS MIDDLE 480012000000
## 760                                                  Calvine High  61233007701
## 761                                                   CAM Academy 530038000000
## 762                                   Cambridge Continuation High  61455001986
## 763                                                Cambridge High  60912000935
## 764                                          CAMDEN CO  YOUTH CTR 340009000000
## 765                                          Camden Community Day  60723010663
## 766                              Camden Virtua Kids in Transition 340009000000
## 767                                          Camden Virtua EXCEL? 340009000000
## 768                                        Camden Virtua INSIGHT? 340009000000
## 769                            CAMELOT ACADEMY OF ESCAMBIA COUNTY 120051000000
## 770                          Cameron Academy of Virtual Education 550213000000
## 771                                          CAMERON CO J J A E P 483879000000
## 772                                          CAMERON CO J J A E P 483717000000
## 773                                          CAMERON CO J J A E P 482253000000
## 774                                          CAMERON CO J J A E P 481168000000
## 775                                          CAMERON CO J J A E P 483715000000
## 776                                          CAMERON CO J J A E P 482829000000
## 777                                          CAMERON CO J J A E P 483525000000
## 778                             CAMERON CO JUVENILE DETENTION CTR 481168000000
## 779                                          CAMERON COUNTY JJAEP 482604000000
## 780                                            CAMINO NUEVO YOUTH 350001000000
## 781                                                 Camp Glenwood  69103312025
## 782                               Camp Verde Accommodation School  40160003173
## 783                                   Campbell High Community Day  60016012129
## 784                                  Campbellsville Eagle Academy 210093000000
## 785                                     Campo High (Continuation)  62610002661
## 786                                                 Campus at Lee 510180000000
## 787                                  CANNON FALLS ALC HIGH SCHOOL 279144000000
## 788                               Cannon Falls HS Credit Recovery 279144000000
## 789                            CANTON EDUCATIONAL SERVICES CENTER 280090000000
## 790                                               CANUTILLO JJAEP 481278000000
## 791                                              Canyon Oaks High  62532003776
## 792                                      Canyon Oaks Youth Center  69103312367
## 793                                             Canyon Ridge High  60001412100
## 794                                           Canyon Rose Academy  40063303106
## 795                                    CANYON SPRINGS HIGH SCHOOL 160051000000
## 796                            CAP DIST JUVENILE SECURE DETENTION 360246000000
## 797                                         Cap Sante High School 530015000000
## 798                               Capac Virtual Education Program 260780000000
## 799                                      Cape May Regional School 340009000000
## 800                        Cape May Transitional Education Center 340009000000
## 801                                       Capistrano Virtual/Home  60744011903
## 802                               CAPITAL CITY ALTERNATIVE SCHOOL 280219000000
## 803                                Capital City Independent Study  63384006327
## 804                                                  Capital High 550852000000
## 805                                       Capps Elementary School  40002601389
## 806                                Captain John Continuation High  61995002388
## 807                                              Cardinal Academy 210526000000
## 808                           CARE & TREATMENT HOSPITAL/HOMEBOUND 273180000000
## 809                                 CARE & TREATMENT JDC/VON WALD 273180000000
## 810                        CARE Concerned About Reaching Everyone 551449000000
## 811                             CAREER ACADEMIC PLACEMENT PROGRAM 280219000000
## 812                          Career Academy at Truman High School 530282000000
## 813                                 Career AcademyAdult Education 261833000000
## 814                       Career and Innovation Academy of Orange 341227000000
## 815                                Career and Technical Education 268051000000
## 816                                                 CAREER CENTER 317482000000
## 817                                    Career Connections Academy 263555000000
## 818                                     Career Development School 261638000000
## 819                                             CAREER ENRICHMENT 350006000000
## 820                                                   Career Link 530354000000
## 821                                     CAREER PATHWAYS INSTITUTE 310002000000
## 822                                       CAREER PREP ALTERNATIVE 350039000000
## 823                                            Career Preparation 262613000000
## 824                        Career Readiness Academy at Mosley PLC 370333000000
## 825                                   Carl B. Hutcherson Building 510234000000
## 826                        Carle (William C.) High (Continuation)  62007002399
## 827                                      Carlsbad Seaside Academy  60750008311
## 828                                      Carlsbad Village Academy  60750000712
## 829                                            Carmel Valley High  60753000717
## 830                                  Caro Alternative High School 260804000000
## 831                                   Carol Martin Gatton Academy 210573000000
## 832                                Carpe Diem High (Continuation)  63025001786
## 833                                            Carpinteria Family  60756011345
## 834                                       Carr Lake Community Day  63398010561
## 835                            Carroll County Alt Learning Center 210099000000
## 836                               Carroll County Education Center 510069000000
## 837                     Carroll-Galax Reg Alt Ed Prgm/The RAE Ctr 510010000000
## 838                            Carson Adult Education Corrections 320039000000
## 839                                     Carson Adult Education RG 320039000000
## 840                             Carson City Correctional Facility 260000000000
## 841                        Carson CityCrystal Alternative Academy 260813000000
## 842                       CarsonvillePort Sanilac Learning Center 260816000000
## 843                                     Carter G. Woodson Academy 210186000000
## 844                                      CARTER PARRAMORE ACADEMY 120060000000
## 845                                        Carter Virtual Academy 210102000000
## 846                              Carver (G.W.) Educational Center 100068000000
## 847                                          CARVER ALTER LRN CTR 483870000000
## 848                             Carver College and Career Academy 510084000000
## 849                          Martin Luther King Transition Center 470015000000
## 850                                  CASA ESPERANZA RECOVERY HOME 484365000000
## 851                                                  Cascade High  60658002824
## 852                                  Cascade K-8 Community School 530792000000
## 853                                    Cascade Opportunity Center 410278000000
## 854                            Cascade Parent Partnership Program 530771000000
## 855                                          CASCADES HIGH SCHOOL 360008000000
## 856                                    Casman Alternative Academy 260015000000
## 857                               CASS LAKE-BENA AREA LRNG. CNTR. 270807000000
## 858                                      CASSIA JR/SR HIGH SCHOOL 160066000000
## 859                                     Cassopolis Alternative Ed 260843000000
## 860                                              Catalyst Academy 551059000000
## 861                                              CATAPULT ACADEMY 120030000000
## 862                                              CATAPULT ACADEMY 120048000000
## 863                                              CATAPULT ACADEMY 120039000000
## 864                                   Cathedral Home for Children 560001000000
## 865                    Catonsville Center for Alternative Studies 240012000000
## 866                                                       CCJJAEP 482862000000
## 867                                                       CCJJAEP 483654000000
## 868                                       CCSI Alternative School 170020000000
## 869                                 CDA JUVENILE DETENTION CENTER 160078000000
## 870                                                CDS Elementary  62271010528
## 871                                                 CDS Secondary  62271010519
## 872                                                   CEDAR CREST 480007000000
## 873                                            CEDAR MOUNTAIN H S 483192000000
## 874                                              Cedar Ridge High 490093000000
## 875                      Cedar Street Community and Family Center 262766000000
## 876                               CENTENNIAL AREA LEARNING CENTER 270810000000
## 877                                  CENTENNIAL BOCES HIGH SCHOOL  89920006526
## 878                                  Centennial Continuation High  60981001043
## 879                                        CENTENNIAL HIGH SCHOOL  80399000517
## 880                                  Centennial Independent Study  60006811949
## 881                                        Centennial Park School 410280000000
## 882                                            CENTER ALTERNATIVE 290825000000
## 883                              CENTER FOR ALTERNATIVE EDUCATION 280354000000
## 884                              CENTER FOR ALTERNATIVE EDUCATION 280363000000
## 885                               Center for Alternative Learning  60837012830
## 886                               CENTER FOR ALTERNATIVE LEARNING 480735000000
## 887                               CENTER FOR ALTERNATIVE PROGRAMS 280447000000
## 888                                  CENTER FOR CREATIVE LEARNING 292685000000
## 889                                Center for Diversified Studies 510189000000
## 890                                           Center for Educ Opp 170020000000
## 891                            Center for Educational Opportunity 240039000000
## 892                                  Lapeer Community High School 262118000000
## 893                                                 CENTER SCHOOL 272124000000
## 894                                        Center School Extended 272124000000
## 895                               Centerville High (Continuation)  63140007333
## 896                            Centinela Valley Independent Study  60792012265
## 897                                   CENTRAL ACADEMY HIGH SCHOOL 160210000000
## 898                                  CENTRAL AREA LEARNING CENTER 274236000000
## 899                               Central Bay High (Continuation)  62759000684
## 900                                            Central Coast High  62553003821
## 901                                         Central Davie Academy 370117000000
## 902                                        CENTRAL FREEDOM SCHOOL 271878000000
## 903                                          Central Haywood High 370204000000
## 904                                                  Central High  62271002908
## 905                            CENTRAL HIGH  AREA LEARNING CENTER 271878000000
## 906                                   Central High (Continuation)  62583003873
## 907                                   Central High (Continuation)  60402000358
## 908                                           Central High School 261638000000
## 909                                           CENTRAL HIGH SCHOOL 160192000000
## 910                                           CENTRAL HIGH SCHOOL 120009000000
## 911                                         Central Juvenile Hall  69107812696
## 912                                   Central Medford High School 410804000000
## 913                             MidMichigan Correctional Facility 260000000000
## 914                             CENTRAL MIDDLE ALTERNATIVE (CMAP) 274216000000
## 915                                         Central Middle School 261941000000
## 916                            CENTRAL MINNESOTA JT. POWERS DIST. 270014000000
## 917                                    CENTRAL MN ALC HOLDINGFORD 270014000000
## 918                                        CENTRAL MN ALC KIMBALL 270014000000
## 919                                        CENTRAL MN ALC SARTELL 270014000000
## 920                            CENTRAL MN AREA LEARN CNTR - FOLEY 270014000000
## 921                                 CENTRAL MN. ALC - SAUK RAPIDS 270014000000
## 922                                         CENTRAL NM CORRECTION 350001000000
## 923                                   CENTRAL PASCO GIRLS ACADEMY 120153000000
## 924                                          Central Prep Academy 470264000000
## 925                                                CENTRAL SCHOOL 280303000000
## 926                                          Central School (The) 100130000000
## 927                       Central Unified Alternative/Opportunity  60797009345
## 928                            Central Valley High (Continuation)  61954002342
## 929                                      Central Wisconsin Center 550004000000
## 930                                  Centralia Alternative School 170017000000
## 931                                               Century Academy  60964012664
## 932                                              CENTURY ALT HIGH 350168000000
## 933                                                  Century High  60015310928
## 934                            CENTURY MIDDLE SCHOOL WITHIN A SCH 272808000000
## 935                                          CESAR CHAVEZ ACADEMY 484668000000
## 936                                    CESAR CHAVEZ ACADEMY JJAEP 484668000000
## 937                                        Cesar Chavez Community  69104911976
## 938                                Cesar Chavez Continuation High  60962002220
## 939                                        CESAR E CHAVEZ ACADEMY 480000000000
## 940                                          Cesar E. Chavez High  63531004767
## 941                                  CF Taylor Alternative School  10027002180
## 942                                    CHAFFEE COUNTY HIGH SCHOOL  80264006155
## 943                                         Chaffey Community Day  60816007260
## 944                                  Chaffey District Online High  60816013110
## 945                                             CHALLENGE ACADEMY 480915000000
## 946                                             CHALLENGE ACADEMY 481173000000
## 947                                             CHALLENGE ACADEMY 484504000000
## 948                                             CHALLENGE ACADEMY 483711000000
## 949                                             CHALLENGE ACADEMY 481560000000
## 950                                             CHALLENGE ACADEMY 482820000000
## 951                                             CHALLENGE ACADEMY 481091000000
## 952                                             CHALLENGE ACADEMY 481396000000
## 953                                             CHALLENGE ACADEMY 481497000000
## 954                                             CHALLENGE ACADEMY 482982000000
## 955                                             CHALLENGE ACADEMY 483064000000
## 956                                             CHALLENGE ACADEMY 484428000000
## 957                                             CHALLENGE ACADEMY 482628000000
## 958                                             CHALLENGE ACADEMY 482919000000
## 959                                             CHALLENGE ACADEMY 483741000000
## 960                                          Challenge Elementary 530240000000
## 961                                       CHALLENGE H S SHEFFIELD 482433000000
## 962                                        Challenger High School 530048000000
## 963                                      Challenger Middle School  40342001402
## 964                                      Challenges Community Day  60402011946
## 965                                          CHAMBERS HIGH SCHOOL 120039000000
## 966                                         CHANCERY HIGH CHARTER 120144000000
## 967                                              CHANDLER ACADEMY 540060000000
## 968                        Chandler Traditional Academy - Goodman  40187001399
## 969                                                Chaparral High  62827004375
## 970                                                Chaparral High  63697007874
## 971                                                Chaparral High  61623002017
## 972                                 Chaparral High (Continuation)  60561000506
## 973                                    CharEm Alternative Schools 268024000000
## 974                                         CHARLES BRITT ACADEMY 120156000000
## 975                       Charles F Fernandez Center Alt Learning 551449000000
## 976                                          CHARLIE Y. BROWN ALT 350024000000
## 977                                   Charlottesville Alternative 510078000000
## 978                             Charter Alternative Program (CAP)  69100612762
## 979                   Charter Community School Home Study Academy  69100601981
## 980                                             Chattooga Academy 130108000000
## 981                                        CHAUTAUQUA COUNTY JAIL 360002000000
## 982                                Chautauqua High (Continuation)  60423007264
## 983                                          CHAVEZ EXCEL ACADEMY 483312000000
## 984                                     Cheboygan Virtual Academy 260891000000
## 985                                   Chelan School of Innovation 530120000000
## 986                                             Cheney Open Doors 530123000000
## 987                                   Cherry Hill Regional School 340009000000
## 988                             Cherry Hill Tran-Education Center 340009000000
## 989             Cherry Hill Transportation Education Program(TEP) 340009000000
## 990                 Chesaning Union Schools Alternative Education 260915000000
## 991                                        Chesapeake Alternative 510081000000
## 992                                   Chesnut High (Continuation)  60912010205
## 993                                         CHESTER CREEK ACADEMY 271104000000
## 994                          Chesterfield Juvenile Detention Home 510004000000
## 995                                    Cheviot Hills Continuation  62271002918
## 996                                          Chewelah Alternative 530126000000
## 997                                         Home Link Alternative 530126000000
## 998                                     CHI CHI RODRIQUEZ ACADEMY 120156000000
## 999                                              Chicopee Academy 250366000000
## 1000                               CHILD GUIDANCE CNTR TGH SCHOOL 310015000000
## 1001                                                  Child Haven 320006000000
## 1002                              CHILDREN'S CENTER FOR EDUCATION 120144000000
## 1003                                       CHILDREN'S MEDICAL CTR 481970000000
## 1004                                     CHILDREN'S SHELTER OF SA 483873000000
## 1005                          Childrens Crisis Stabilization Unit 210057000000
## 1006                                         CHILDRENS PSYCHIATRY 350002000000
## 1007                            Chilton County Alternative School  10066002190
## 1008                                Chino Valley Learning Academy  60846010607
## 1009                                            CHIP RICHARTE H S 482060000000
## 1010                               Chippewa Correctional Facility 260000000000
## 1011                   Chippewa Valley Adult and Mohegan Alt Educ 260957000000
## 1012                                  CHISAGO LAKES FAMILY CENTER 270002000000
## 1013                           CHISAGO LAKES HS ALT LEARNING PROG 270002000000
## 1014                                               CHOICE Academy 530354000000
## 1015                               Choice Alternative High School 270579000000
## 1016                            Choice Alternative High School IS 270579000000
## 1017                                    Choice Alternative School 530790000000
## 1018                                   Choices Educational Center 210465000000
## 1019                                        Chrismont Safe School 170017000000
## 1020                            CHRISTA MCAULIFFE LEARNING CENTER 483702000000
## 1021                          Christian County Alternative School 210115000000
## 1022                               Christian County Day Treatment 210115000000
## 1023                                          CHRISTUS SANTA ROSA 483873000000
## 1024                                        CHRYSALIS ALTERNATIVE 350252000000
## 1025                            CHS Drop-Out Reengagement Program 530918000000
## 1026                                           CHSHorizons School 260769000000
## 1027                                Churchill Community Ed Center 263030000000
## 1028                                       Churchill County Adult 320003000000
## 1029                                                  CIS Academy  62994012340
## 1030                                        CISCO LEARNING CENTER 481407000000
## 1031                             CITRUS COUNTY RENAISSANCE CENTER 120027000000
## 1032                                    CITRUS HEALTH SIPP/CRISIS 120039000000
## 1033                                                  Citrus High  60006404878
## 1034                                   Citrus High (Continuation)  61392009367
## 1035  CITRUS MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIES 120027000000
## 1036                                              City Elementary  10039001270
## 1037                                               City of Angels  62271007118
## 1038                            CITY OF PALMS CHARTER HIGH SCHOOL 120108000000
## 1039                                     Clara B Ford Academy SDA 260095000000
## 1040                                    Clare Pioneer High School 260975000000
## 1041                                          Clark Adult Program 320006000000
## 1042                                Clark County Detention Center 320006000000
## 1043                              Clark County Middle/High School 180394000000
## 1044                                        Clarkston High School 260990000000
## 1045                                 Clarkston Junior High School 260990000000
## 1046                      Claxton Regional Youth Detention Center 130003000000
## 1047                                  CLAY COUNTY OUTREACH CENTER 272142000000
## 1048                                CLEAR PATH ALTERNATIVE SCHOOL 481428000000
## 1049                                      CLEARWATER INTERMEDIATE 120156000000
## 1050                           Cleburne County Alternative School  10078002361
## 1051                        CLEWISTON YOUTH DEVELOPMENTAL ACADEMY 120078000000
## 1052                                 ClimaxScotts Virtual Academy 261002000000
## 1053                                              CLINT ISD JJAEP 481443000000
## 1054                                   CLINTON ALTERNATIVE SCHOOL 280109000000
## 1055                           CLINTON COUNTY SHERIFFS DEPARTMENT 360429000000
## 1056                                  Clintondale Virtual Academy 261008000000
## 1057                                   Clio Community High School 261011000000
## 1058                                         Clio Learning Center 261011000000
## 1059                                                         CLIP 530456000000
## 1060                             Clnton/Mrn/Wshngtn Pre-Kind Prog 170017000000
## 1061                               CLOQUET AREA ALT. ED. PROGRAMS 270942000000
## 1062                                     CLOVER CREEK HIGH SCHOOL 160024000000
## 1063                            Clover Valley High (Continuation)  60144206695
## 1064                                    CLOVERLEAF HOME EDUCATION  80345006494
## 1065                              Clovis Community Day Elementary  60903011359
## 1066                               Clovis Community Day Secondary  60903011586
## 1067                                              CLUSTER V SP ED 483843000000
## 1068                                      CMSD ALTERNATIVE SCHOOL 280120000000
## 1069                            CNUSD Hybrid School of Innovation  60985014184
## 1070                                               Coal Canyon HS 320042000000
## 1071                                                   Coast High  61806008856
## 1072                                  COASTAL ALTERNATIVE PROGRAM 481428000000
## 1073                                  COASTAL ALTERNATIVE PROGRAM 483927000000
## 1074                            COASTAL ALTERNATIVE PROGRAM (CAP) 481707000000
## 1075                            COASTAL ALTERNATIVE PROGRAM (CAP) 484251000000
## 1076                                        CodeRVA Regional High 510026000000
## 1077                                      Cold Stream Alternative  63877006175
## 1078                             COLES H S AND EDUCATIONAL CENTER 481527000000
## 1079                               COLLEGE AND CAREER HIGH SCHOOL 350006000000
## 1080                             COLLEGE CAREER & TECHNOLOGY ACAD 483486000000
## 1081                     COLLEGE CAREER TECHNOLOGY ACADEMY (CCTA) 481830000000
## 1082                                        COLLEGE STATION JJAEP 480735000000
## 1083                                        College Street Campus 210030000000
## 1084                                          College View Campus 210249000000
## 1085                                               COLLEGIATE H S 481527000000
## 1086                                                 COLLIER DAEP 482247000000
## 1087                            COLLIER JUVENILE DETENTION CENTER 120033000000
## 1088                                          COLLIN CO J J A E P 480789000000
## 1089                                          COLLIN CO J J A E P 483012000000
## 1090                                          COLLIN CO J J A E P 481329000000
## 1091                                          COLLIN CO J J A E P 483585000000
## 1092                                          COLLIN CO J J A E P 483600000000
## 1093                                          COLLIN CO J J A E P 482001000000
## 1094                                          COLLIN CO J J A E P 481908000000
## 1095                                          COLLIN CO J J A E P 484653000000
## 1096                                          COLLIN CO J J A E P 481485000000
## 1097                         Colony Basic Skills Alternative High  61722007180
## 1098                                 COLORADO HIGH SCHOOL CHARTER  80336001862
## 1099                                            COLORADO ISD DAEP 484521000000
## 1100                      COLORADO'S FINEST HIGH SCHOOL OF CHOICE  80378001310
## 1101                                             Columbia Academy  60978007459
## 1102                              Columbia Academy Anchor Program 270951000000
## 1103                               Columbia Alternative Education 260699000000
## 1104                                  Columbia Alternative School 530156000000
## 1105                            Columbia Correctional Institution 550004000000
## 1106                             Columbia County Education Campus 411172000000
## 1107                             COLUMBIA SECURE CENTER FOR GIRLS 360013000000
## 1108                                             Columbia Step Up 260699000000
## 1109                                     Columbia Virtual Academy 530924000000
## 1110                      Columbia Virtual Academy - Kettle Falls 530399000000
## 1111                            Columbia Virtual Academy - Sultan 530855000000
## 1112                              Columbia Virtual Academy-Orient 530636000000
## 1113                       Columbia-East Valley K-6 Community Day  60945011272
## 1114                                        Columbus Continuation  61146001262
## 1115                                  COLUMBUS ALTERNATIVE SCHOOL 481470000000
## 1116                   COLUMBUS ALTERNATIVE SCHOOL NEW ULM CAMPUS 481470000000
## 1117                       COLUMBUS RESIDENTIAL JUVENILE FACILITY 120087000000
## 1118                       Colusa Alternative High (Continuation)  60957008128
## 1119                                      Colusa Alternative Home  60957004434
## 1120                                                COMAL ACADEMY 481473000000
## 1121                                      COMAL DISCIPLINE CENTER 481473000000
## 1122                                               Come Back Kids  69102613694
## 1123                                            Commander Academy 210576000000
## 1124                                            Commonwealth High 370038000000
## 1125                                   Community Based Classrooms 240051000000
## 1126                                                Community Day  61443008353
## 1127                                                Community Day  60462012327
## 1128                                                Community Day  63753013304
## 1129                                                Community Day  63525008473
## 1130                                                Community Day  60876008015
## 1131                                           Community Day High  62805010718
## 1132                                         Community Day Middle  62805010719
## 1133                                     Community Day School III  60140913022
## 1134                                                 COMMUNITY ED 481674000000
## 1135                                               Community High  62569008166
## 1136                                Community High (Continuation)  62937007329
## 1137                                        Community High School 370045000000
## 1138                                        Community High School 260282000000
## 1139                                    COMMUNITY LEARNING CENTER 280402000000
## 1140                                COMMUNITY PREP CHARTER SCHOOL  80306001299
## 1141                                             Community School 410192000000
## 1142                                             COMMUNITY SCHOOL 483432000000
## 1143                                             Community School 530423000000
## 1144           Community School/Independent Alternative Education  69102911088
## 1145                                       COMMUNITY SERVICES-SEC 482364000000
## 1146                                   COMPASS Alternative School 180015000000
## 1147                                               COMPASS CENTER 482459000000
## 1148                                      Compass Learning Center 272343000000
## 1149                                COMPASS MIDDLE CHARTER SCHOOL 120159000000
## 1150                                          COMPASS-BELL CENTER 270318000000
## 1151                                   Compton Community Day High  60962007148
## 1152                                 Compton Community Day Middle  60962007158
## 1153                       Computer Academy Toppenish High School 530897000000
## 1154                                             COMQUEST ACADEMY 480013000000
## 1155                                 Comstock Compass High School 261059000000
## 1156                                          CONCORD HIGH SCHOOL 360010000000
## 1157                                                  Condor High  62927013007
## 1158                            Conejo Valley High (Continuation)  60964001010
## 1159                                 Confluence Continuation High  63075004780
## 1160                                          Connections Academy 370472000000
## 1161                                          Connections Academy 530774000000
## 1162           CONNECTIONS LEARNING CENTER ON THE EARLE JOHNSON C  80480006306
## 1163                    CONNETQUOT ALTERNATIVE PRESCHOOL AT PREMM 360816000000
## 1164                       Consolidated Community School Services 261560000000
## 1165                            Constantine Alternative Education 261075000000
## 1166                                CONTEMPORARY LEARNING ACADEMY  80336000380
## 1167                                          CONTINUATION SCHOOL 350006000000
## 1168                                  Continuing Education Center 261008000000
## 1169                                   Continuous Learning Center  10237001686
## 1170                                     Contract Learning Center 530315000000
## 1171                                          Contractual Schools 530423000000
## 1172                                      COOK COUNTY ALTERNATIVE 271311000000
## 1173               COOKE/FANNIN/GRAYSON CO JUVENILE POST AJUD FAC 484008000000
## 1174                                                Coolidge RSSP 170020000000
## 1175                                    COOPER ACADEMY AT NAVARRO 483873000000
## 1176                                 Cooper Correctional Facility 260000000000
## 1177                                       COOPER CREDIT RECOVERY 273178000000
## 1178                               COOPERATIVE AREA LEARNING PRG. 273239000000
## 1179                                      Cope Alternative School 170019000000
## 1180                                            COPE CENTER NORTH 120039000000
## 1181                                    COPPELL CLASSICAL ACADEMY 480016000000
## 1182                                           Copper Lake School 550004000000
## 1183                                    Corbin Educational Center 210132000000
## 1184                                  Corbin School of Innovation 210132000000
## 1185                                             Corcoran Academy  60969011955
## 1186               Core Learning Academy at Conley-Caraballo High  62691011551
## 1187                               CORINTH CLASSICAL UPPER SCHOOL 480016000000
## 1188                                                  CORNERSTONE 271497000000
## 1189                                  Cornerstone Learning Center 510060000000
## 1190             CORNING PAINTED POST HIGH SCHOOL LEARNING CENTER 360840000000
## 1191                                            Corona Vista High  60985000905
## 1192                                     Corona-Norco Alternative  60985001047
## 1193                                 Coronado High (Continuation)  64200006876
## 1194                                         CORONADO HIGH SCHOOL 120108000000
## 1195                              CORPUS CHRISTI COLLEGE PREP H S 480000000000
## 1196                                        Correctional Services 260282000000
## 1197                                      CORRECTIVE BEHAVIOR CTR 480888000000
## 1198                                   Corridor Elementary School 410474000000
## 1199                                                COSSA ACADEMY 160015000000
## 1200                                   Costanoa Continuation High  63560006064
## 1201                                                COSTELLO PREP 340009000000
## 1202                                 Cotton Correctional Facility 260000000000
## 1203                                     Cottonwood Community Day  62610007309
## 1204                                                 Country High  64059006698
## 1205                                    Countryside Community Day  63993011528
## 1206                                             County Community  69109003303
## 1207                                             County Community  69100109474
## 1208                         COUNTY OF NASSAU/CORRECTIONAL CENTER 360984000000
## 1209                                    COUNTY RESIDENTIAL CENTER 482985000000
## 1210                                   Cousino Senior High School 263519000000
## 1211                 Covenant House Academy Detroit  Central Site 260032000000
## 1212                    Covenant House Academy Detroit  East Site 260032000000
## 1213               Covenant House Academy Detroit  Southwest Site 260032000000
## 1214                          Covenant House Academy Grand Rapids 260107000000
## 1215                                        Covered Bridge School 260867000000
## 1216                                  Covington Adult High School 210135000000
## 1217                          COVINGTON COUNTY ALTERNATIVE SCHOOL 280129000000
## 1218                                        Cowan Academic Center 320006000000
## 1219                                    Cowan Sunset Southeast HS 320006000000
## 1220                                  COZAD ALTERNATIVE ED CENTER 310546000000
## 1221                                      CPSD Open Doors Program 530141000000
## 1222                                     CRANDALL COMPASS ACADEMY 481551000000
## 1223                               Cranston Early Learning Center 440024000000
## 1224                               Crater Juvenile Detention Home 510004000000
## 1225                                              CRCC-Open Doors 530573000000
## 1226                           Creative Learning Center  Dearborn 261008000000
## 1227                      Creative Learning Center  Highland Park 261008000000
## 1228                             Creative Learning Center  Warren 261008000000
## 1229                                              CREDIT RECOVERY 273180000000
## 1230                                               Creekside High  63720002851
## 1231                                               Creekside High  68450007063
## 1232                               CREMER THERAPEUTIC COMM CENTER 290003000000
## 1233                        Crescent Heights Boulevard Elementary  62271002942
## 1234                                      CRESTVIEW YOUTH ACADEMY 120138000000
## 1235                                             Crim High School 130012000000
## 1236                                                   Crisp RYDC 130003000000
## 1237                                     CROCKETT EARLY HEADSTART 480744000000
## 1238                                                   Croom High 240051000000
## 1239                                    CROSBY CROSSROADS ACADEMY 481575000000
## 1240                                               CROSBYTON DAEP 480000000000
## 1241                              Crossland Evening/Saturday High 240051000000
## 1242                                                   CROSSROADS 480783000000
## 1243                                                   Crossroads  63025008645
## 1244                                           CROSSROADS ACADEMY 120150000000
## 1245                      Crossroads Alternative Education Center  62274012358
## 1246                           Crossroads Alternative High School 262034000000
## 1247                          Crossroads Alternative/Bristol City 510009000000
## 1248                              CROSSROADS AREA LEARNING CENTER 271109000000
## 1249                                            Crossroads Center 240012000000
## 1250                                     Crossroads Community Day  62088008022
## 1251                                  Crossroads Community School 530699000000
## 1252                                               CROSSROADS H S 481524000000
## 1253                                               CROSSROADS H S 481218000000
## 1254                                Crossroads High (Alternative)  62637000183
## 1255                                Crossroads High (Alternative)  62706001921
## 1256                                       Crossroads High School 530321000000
## 1257                                      CROSSROADS HOPE ACADEMY 120024000000
## 1258                                     Crossroads Middle School 240021000000
## 1259                                     CROSSROADS MIDDLE SCHOOL 160210000000
## 1260                                            Crossroads School  10000702359
## 1261                                            Crossroads School  20018000509
## 1262                              CROSSROADS SCHOOL & VOC. CENTER 273354000000
## 1263                                             CROSSROADS SOUTH 273354000000
## 1264                                  Crossroads Treatment Center 210249000000
## 1265                                         CROSSTIMBERS ACADEMY 480028000000
## 1266                                               CROSSWINDS H S 482142000000
## 1267                                  CROTONA ACADEMY HIGH SCHOOL 360008000000
## 1268                              CROW RIVER AREA LEARNING CENTER 271497000000
## 1269                                   CROWLEY ALTERNATIVE SCHOOL 481591000000
## 1270                                   CTR. FOR EDUC. DEVELOPMENT 292280000000
## 1271                              Cullman Area Resource Education  10102001567
## 1272              Cullman Community Comprehensive Learning Center  10099002089
## 1273                 Culver City Unified School District iAcademy  61026013708
## 1274                                             Culver Park High  61026007691
## 1275                                           CUMBERLAND ACADEMY 480003000000
## 1276                                        CUMBERLAND CO JUV CTR 340009000000
## 1277                                       Cumberland Hall School 210115000000
## 1278                                   Cumberland Regional School 340009000000
## 1279                                   CUMBERLAND TRANS ED CENTER 340009000000
## 1280                                        Curlew Parent Partner 530189000000
## 1281                                   Cutler-Orosi Community Day  61035008419
## 1282                                               CVA - Onalaska 530624000000
## 1283                                             CVA-Lopez Island 530453000000
## 1284                                     CVSD Open Doors Programs 530111000000
## 1285                                        CYPRESS CREEK ACADEMY 120027000000
## 1286                        CYPRESS JUVENILE RESIDENTIAL FACILITY 120141000000
## 1287                                  CYPRESS RUN ALTERNATIVE/ESE 120018000000
## 1288                                  CYPRESS-FAIRBANKS J J A E P 481611000000
## 1289                                                      D A E P 481500000000
## 1290                                       Da Vinci Institute 912 260009000000
## 1291                           DADE JUVENILE RESIDENTIAL FACILITY 120039000000
## 1292                                                         DAEP 483987000000
## 1293                                                         DAEP 483591000000
## 1294                                                         DAEP 481773000000
## 1295                                                         DAEP 481396000000
## 1296                                                         DAEP 481251000000
## 1297                                                         DAEP 480846000000
## 1298                                                         DAEP 480744000000
## 1299                                            DAEP AT HOLMGREEN 483312000000
## 1300                                                     DAEP- EL 480894000000
## 1301                         Daily (Allan F.) High (Continuation)  61524001924
## 1302                                              DAKOTA CTY. ALC 270003000000
## 1303                          DAKOTA PRAIRIE AREA LEARNING CENTER 271182000000
## 1304                               DALE CASSENS EDUCATION COMPLEX 120177000000
## 1305                                      DALE JACKSON CAREER CTR 482730000000
## 1306                                    Dale Young Community High 490009000000
## 1307                              DALLAS CAN ACADEMY - GRANT EAST 480002000000
## 1308              DALLAS CAN ACADEMY AT CARROLLTON-FARMERS BRANCH 480002000000
## 1309                         DALLAS CAN ACADEMY AT PLEASANT GROVE 480002000000
## 1310                                   DALLAS CAN ACADEMY CHARTER 480002000000
## 1311                         DALLAS CAN ACADEMY CHARTER-OAK CLIFF 480002000000
## 1312                        DALLAS CO SCHOOL FOR ACCELERATED LRNG 482442000000
## 1313                                          DALLAS COUNTY JJAEP 484188000000
## 1314                                          DALLAS COUNTY JJAEP 481521000000
## 1315                               DALLAS COUNTY JJAEP CFB CAMPUS 481305000000
## 1316                            DALLAS COUNTY JJAEP DESOTO CAMPUS 481686000000
## 1317                               DALLAS COUNTY JUVENILE JUSTICE 480009000000
## 1318                                          DAN CHADWICK CAMPUS 480011000000
## 1319                                                   Dan Jacobs  69104910343
## 1320                      DANIEL C OAKES HIGH SCHOOL--CASTLE ROCK  80345006218
## 1321                              Daniel McKee Alternative School 470369000000
## 1322                               Danville Ctr Adolescent Female 420005000000
## 1323                                        Dare Learning Academy 370111000000
## 1324                                           Dario Cassina High  63726006307
## 1325                               DASSEL-COKATO ALTERNATIVE CTR. 271006000000
## 1326                                                   DATA HOUSE 120177000000
## 1327                            DAVE THOMAS EDUCATION CENTER WEST 120018000000
## 1328                                   DAVENPORT COMMUNITY CAMPUS 120159000000
## 1329                                  Davidson County High School 370114000000
## 1330                                        Davidson River School 370453000000
## 1331                                Davis Bilingual Magnet School  40880001452
## 1332                           Davis School for Independent Study  61062010344
## 1333                                          DAVIS-STUART SCHOOL 540051000000
## 1334                                Davison Alternative Education 261143000000
## 1335                                                  DAWSON DAEP 481638000000
## 1336                                       DAY NURSERY OF ABILENE 480744000000
## 1337                                         Day Reporting School 530870000000
## 1338                                  Daybreak Alternative School 530825000000
## 1339                         Daylor (William) High (Continuation)  61233001395
## 1340                        DAYTONA JUVENILE RESIDENTIAL FACILITY 120192000000
## 1341                                 DCYF Alternative Ed. Program 440001000000
## 1342                       Dearborn Academic Center of Excellence 261160000000
## 1343                                  Dearborn Magnet High School 261160000000
## 1344                          Decoto School for Independent Study  62691013202
## 1345                                           Deep Creek Academy  60003508425
## 1346                                   DEEPHAVEN EDUCATION CENTER 271167000000
## 1347                                  Deer Park Home Link Program 530207000000
## 1348                                   Deer River High School ALP 271014000000
## 1349                                    DeKalb Alternative School 130174000000
## 1350                       DeKalb Regional Youth Detention Center 130003000000
## 1351                                Del Amigo High (Continuation)  63513005946
## 1352                                                 Del Mar High  63442507166
## 1353                                          Del Norte Community  69106308462
## 1354                                              Del Puerto High  63003010334
## 1355                                  Del Valle Continuation High  62211002621
## 1356                                    DEL VALLE OPPORTUNITY CTR 481662000000
## 1357                               DELL CHILDREN'S MEDICAL CENTER 480894000000
## 1358                                                DELTA ACADEMY 481830000000
## 1359                            DELTA ACADEMY OF APPLIED LEARNING  80333002001
## 1360                                                   Delta High  63567006082
## 1361                              Denison Alternative High School 190891000000
## 1362                                          DENTON CO J J A E P 482643000000
## 1363                                          DENTON CO J J A E P 482772000000
## 1364                                          DENTON CO J J A E P 483318000000
## 1365                                          DENTON CO J J A E P 483531000000
## 1366                                          DENTON CO J J A E P 482730000000
## 1367                                          DENTON CO J J A E P 480891000000
## 1368                                          DENTON CO J J A E P 480867000000
## 1369                                          DENTON CO J J A E P 481674000000
## 1370                                          DENTON CO J J A E P 483492000000
## 1371                                          DENTON CO J J A E P 483918000000
## 1372                                          DENTON CO J J A E P 482598000000
## 1373                                          DENTON COUNTY JJAEP 484386000000
## 1374                               DENTON COUNTY JJAEP CFB CAMPUS 481305000000
## 1375                                                 DENTON CREEK 483318000000
## 1376                     DENVER CENTER FOR 21ST LEARNING AT WYMAN  80336006516
## 1377                                                   DENVER CTR 484578000000
## 1378                                    Department of Corrections 130003000000
## 1379                                Department of Human Resources 130003000000
## 1380                                           DEPELCHIN-RICHMOND 480007000000
## 1381                     DEPT. OF CORRECTIONS EDUCATIONAL PROGRAM 120192000000
## 1382                                      Desert Learning Academy  62955013957
## 1383                             Desert Oasis High (Continuation)  60801000772
## 1384                                     Desert Oasis High School 530648000000
## 1385                           Desert Rose Academy Charter School  40032202205
## 1386                                      Desert Rose High School 320006000000
## 1387                            Desert Valley High (Continuation)  60582000525
## 1388                                    Desert View Community Day  61944012500
## 1389                               Desert Winds Continuation High  60282000204
## 1390                                   Deshler Alternative School  10342001656
## 1391                           Design Science Middle College High  61455010779
## 1392                   DESOTO ALTERNATIVE EDUCATION CENTER (DAEP) 481686000000
## 1393                                   DESOTO ALTERNATIVE PROGRAM 120042000000
## 1394                             DESOTO COUNTY ALTERNATIVE CENTER 280132000000
## 1395                                          Dessie Scott School 210597000000
## 1396                                         Destinations Academy 410366000000
## 1397                      DESTINATIONS CAREER ACADEMY OF COLORADO  80486006387
## 1398                                                   DETENT CTR 481970000000
## 1399                                        DETENTION CENTER WEST 120087000000
## 1400                                  DETENTION FACILITY SERVICES 120186000000
## 1401                           DeTour Arts and Technology Academy 260098000000
## 1402                              DETROIT LAKES ALTERNATIVE PROG. 271023000000
## 1403                           DETROIT LAKES AREA LEARNING CENTER 271023000000
## 1404                                     DETROIT LAKES MIDDLE ALC 271023000000
## 1405                               Eastside Detroit Lions Academy 260110000000
## 1406                                            DEVELOPMENTAL CTR 483042000000
## 1407                                   DEVEREUX TREATMENT PROGRAM 120144000000
## 1408                                                   DEVERS AEP 481692000000
## 1409                                           DEVINE DAEP SCHOOL 481695000000
## 1410                                                Dewey Academy  62805004255
## 1411                                     Dewolf Continuation High  61455001720
## 1412                                    Dexter Alternative School 261203000000
## 1413                                         Diablo Community Day  62637008458
## 1414                                              DIAGNOSTIC CTR. 292378000000
## 1415                                    Diamond Ridge High School 490014000000
## 1416                                     DiAnne M Pellerin Center 262187000000
## 1417                      Dickens (Billy Joe) High (Continuation)  60006004164
## 1418                                DICKINSON CONTINUATION CENTER 481707000000
## 1419                              Dillard Alternative High School 411349000000
## 1420                             Diploma Success Community School 261776000000
## 1421                   DISCIPLINARY ALTERNATIVE EDUCATION PROGRAM 481437000000
## 1422                   DISCIPLINARY ALTERNATIVE EDUCATION PROGRAM 480819000000
## 1423           DISCIPLINARY ALTERNATIVE EDUCATIONAL PROGAM (DAEP) 481179000000
## 1424                   DISCIPLINE ALTERNATIVE EDUCATION PLACEMENT 483237000000
## 1425                     DISCIPLINE ALTERNATIVE EDUCATION PROGRAM 484110000000
## 1426                                                    Discovery 530816000000
## 1427                                               Discovery High  64341007904
## 1428                                               Discovery High  60003606335
## 1429                                        DISCOVERY HIGH SCHOOL  80648000051
## 1430                                        Discovery High School 530447000000
## 1431                                Discovery High School-Achieve 530447000000
## 1432                                             DISCOVERY MIDDLE 480013000000
## 1433                                             Discovery School 530423000000
## 1434                                    Dishman Hills High School 530969000000
## 1435                                              DISSTON ACADEMY 120156000000
## 1436                   DISTRICT REASSIGNMENT & OPPORTUNITY CENTER 481371000000
## 1437                                     District Run Home School 530702000000
## 1438                                      DISTRICT SERVICE CENTER 270003000000
## 1439                                             DISTRICT WIDE EL 481970000000
## 1440                                                  Divide High  60524007650
## 1441         Division of Unaccompanied Children's Services (DUCS)  69112212709
## 1442                                  DIXIE TEEN PARENT PRESCHOOL 120045000000
## 1443                                          Dixon Community Day  61128011236
## 1444                                            DOLPHIN PARK HIGH 120018000000
## 1445                               DON E WOODS OPPORTUNITY CENTER 120159000000
## 1446                                   Don Smith Learning Academy 550096000000
## 1447                               DONALD R. KUHN JUVENILE CENTER 540051000000
## 1448                          DONNA ALTERNATIVE EDUCATION PROGRAM 481739000000
## 1449                           DONNA J. BEASLEY TECHNICAL ACADEMY 120108000000
## 1450                               DOROTHY M. WALLACE COPE CENTER 120039000000
## 1451                             Dorothy V. Johnson Community Day  62271012482
## 1452                                                  Dos Caminos  62958012870
## 1453                                   Douglas Alternative School 320009000000
## 1454                      DOUGLAS CO WEST ALTERNATIVE HIGH SCHOOL 310017000000
## 1455                                  Douglas County Adult School 320009000000
## 1456                                  DOUGLAS COUNTY YOUTH CENTER 310015000000
## 1457                                  Douglas R Welch High School 261925000000
## 1458                                              Douglass School 510225000000
## 1459                                                        DOVES 340009000000
## 1460                                    Downriver Virtual Academy 261293000000
## 1461                             Downtown Alternative High School  40880001609
## 1462                                       Downtown Business High  62271007757
## 1463                                                Downtown High  63441005602
## 1464                                   Dozier-Libbey Medical High  60285012278
## 1465                                Dr Bob Forinash Community Day  62241013924
## 1466                                 DR LORENZO G LAFARELLE JJAEP 481830000000
## 1467                                DR LORENZO G LAFARELLE MIDDLE 481830000000
## 1468                         DR M L GARZA-GONZALEZ CHARTER SCHOOL 480003000000
## 1469                                   Dr Rosa Minoka-Hill School 550582000000
## 1470                               Dr. Doug Sears Learning Center  63898002195
## 1471                        ACADEMY FOR COMMUNITY EDUCATION (ACE) 120039000000
## 1472                                Drager Early Education Center 260195000000
## 1473                                                 DRAW ACADEMY 480026000000
## 1474                                                   DRC CAMPUS 480009000000
## 1475                                                DREAM Academy 170019000000
## 1476                                    DROPOUT PREVENTION SCHOOL 120156000000
## 1477                                DUAL IMMERSION ACADEMY SCHOOL  80435001850
## 1478                                  DULUTH AREA LEARNING CENTER 271104000000
## 1479                                  Duncan-Russell Continuation  60004707379
## 1480                                Dunes Alternative High School 263591000000
## 1481                      Dunsmuir Joint Union High Community Day  61170007828
## 1482                                                  DuPage Alop 170018000000
## 1483                                     Dupuy Alternative School  10039001288
## 1484                              DURANGO BIG PICTURE HIGH SCHOOL  80348006597
## 1485                         Durango Transitional Learning Center  40386000068
## 1486                                                Durham Center 411224000000
## 1487                         Durham's Performance Learning Center 370126000000
## 1488                                                DUVAL ACADEMY 120048000000
## 1489   DUVAL MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIES 120048000000
## 1490                     DUVAL REGIONAL JUVENILE DETENTION CENTER 120048000000
## 1491                                                     E-SCHOOL 483510000000
## 1492                       E. A. G. L. E. Center High School - 07 462010000000
## 1493                                       E.A.G.L.E. Center - 09 462010000000
## 1494                                         Eager Street Academy 240009000000
## 1495                                                EAGLE ACADEMY  80345001527
## 1496                                                EAGLE ACADEMY 160210000000
## 1497                                            Eagle Canyon High  63900002780
## 1498                                      EAGLE CAP Innovative HS 410171000000
## 1499                                                  Eagle Creek  60897011806
## 1500                                     Eagle Harbor High School 530033000000
## 1501                                          Eagle Peak at Pratt 530825000000
## 1502                                      Eagle Ridge High School 320030000000
## 1503                                   Eagle Summit Community Day  63697010370
## 1504                                      Eagle Tree Continuation  62271002971
## 1505                          Earl F. Johnson High (Continuation)  61650002086
## 1506                           Earle Jamieson Educational Options  69102312369
## 1507                                      Earlimart Community Day  61176011367
## 1508                                      EARLY CHILDHOOD PROGRAM 270405000000
## 1509                                        EARLY COLLEGE ACADEMY 350006000000
## 1510                                           Early College High  62724011702
## 1511                                    Early College High School 411082000000
## 1512                                     EARLY EDUCATION SERVICES 480744000000
## 1513                                          EARLY LEARNING WING 482391000000
## 1514                                          East Aurora HS RSSP 170019000000
## 1515                                           East Bay Arts High  63471011567
## 1516                              EAST CENTRAL ALTERNATIVE SCHOOL 280315000000
## 1517                                   EAST CENTRAL CHOICE PROGAM 481785000000
## 1518                                East Grays Harbor High School 530249000000
## 1519                                 East Grays Harbor Open Doors 530249000000
## 1520                                     East High (Continuation)  61419001619
## 1521                          East Jordan Alternative High School 261256000000
## 1522                                              East Lee Campus 261608000000
## 1523                            East Los Angeles County Community  69107808006
## 1524                               EAST MIDDLE ALTERNATIVE (EMAP) 274216000000
## 1525                               EAST RECEP/DIAG CORR CENT/ACAD 290003000000
## 1526                               EAST RECEP/DIAG CORR CENT/DIAG 290003000000
## 1527                                         East Stanislaus High  60006210697
## 1528                                            EAST VIEW ACADEMY 270226000000
## 1529                                            East Village High  63432012303
## 1530                       LIFE SKILLS CENTER OF COLORADO SPRINGS  80306001841
## 1531                                         EASTLAND CARE CAMPUS 481796000000
## 1532                      Eastman Regional Youth Detention Center 130003000000
## 1533                             Eastman Youth Development Campus 130003000000
## 1534                            Eastmont Columbia Virtual Academy 530231000000
## 1535                                         Easton Community Day  60141510785
## 1536                                     Easton Continuation High  60141507896
## 1537                Eastside Academy/Transitional Learning Center  61191012703
## 1538                             Eau Claire Alternative Education 261281000000
## 1539                                  ECHO Juvenile Detention Ctr 170018000000
## 1540                                      ECON RIVER HIGH CHARTER 120144000000
## 1541                                           ECTOR CO YOUTH CTR 481800000000
## 1542                                Ed Donaldson Education Center  61932002323
## 1543                                     EDCOUCH-ELSA H S ACADEMY 481806000000
## 1544                                      EDEN VALLEY-WATKINS ALP 271119000000
## 1545                               Edge High School - Himmel Park  40007801006
## 1546                       EDINBURG ALTERNATIVE EDUCATION ACADEMY 481818000000
## 1547                                     Edison High School - SWS 272124000000
## 1548                                Edmonds Career Access Program 530240000000
## 1549                                    Edmonds eLearning Academy 530240000000
## 1550                                         Edmonds Heights K-12 530240000000
## 1551                                             EDNA ALTERNATIVE 481821000000
## 1552                   EDNA MAHAN CORRECTIONAL FACILITY FOR WOMEN 340009000000
## 1553                                            EDNA TAMAYO HOUSE 482253000000
## 1554                                      EDOP DCALS EXTENDED DAY 270003000000
## 1555                               EDUC THERAP SUPPORT AT MADISON 292928000000
## 1556                                         EDUCATION DEV CENTER 350111000000
## 1557                               Educational Opportunity Center 530132000000
## 1558                  Educational Opportunity Center Reengagement 530132000000
## 1559                                 Educational Partnership High  62250010239
## 1560                                   EDUCATIONAL SERVICE UNIT 5 318005000000
## 1561                            EDUCATIONAL SERVICES PROGRAM-EAST 120150000000
## 1562                            EDUCATIONAL SERVICES PROGRAM-WEST 120150000000
## 1563                                  Educational Training Center  62676007618
## 1564                      EDWARD A REYNOLDS WEST SIDE HIGH SCHOOL 360008000000
## 1565           Edward C. Merlo Institute of Environmental Studies  63801012098
## 1566                                          Eel River Community  69100910793
## 1567                                 Egeler Correctional Facility 260000000000
## 1568                                            EHS SUMMER SCHOOL 270003000000
## 1569                                     EL ALTER LEARNING CENTER 482566000000
## 1570                                               El Camino High  64098001880
## 1571                                               El Camino High  60994001076
## 1572                                El Camino High (Continuation)  62769004162
## 1573                             El Camino Real Continuation High  63066004756
## 1574                                       El Centro Jr./Sr. High  69102711055
## 1575                                                      EL DAEP 481965000000
## 1576                                                      EL DAEP 482364000000
## 1577                                                      EL DAEP 483808000000
## 1578                                                      EL DAEP 481815000000
## 1579                     El Monte Union High School Community Day  61212007516
## 1580                                              EL PASO ACADEMY 480021000000
## 1581                                         EL PASO ACADEMY WEST 480021000000
## 1582                                                    El Puente  63398012977
## 1583                                               El Puente High  61384001560
## 1584                              El Sereno Alternative Education  63462008192
## 1585                              Elam Alexander Academy at Burke 130042000000
## 1586                  Elbert Shaw Regional Youth Detention Center 130003000000
## 1587                                      ELDER COOP ALTER SCHOOL 482562000000
## 1588                                ELDER COOP ALTERNATIVE SCHOOL 484515000000
## 1589                                Elementary Middle Alternative 470429000000
## 1590           ELEMENTARY' DISCIPLINARY ALTERNATIVE EDUCATION PRG 481623000000
## 1591                           Elinor Lincoln Hickey Jr./Sr. High  69102711052
## 1592                              Elizabeth Tate Alt. High School 191470000000
## 1593                                                    Elk Creek  69106310762
## 1594                          ELK RIVER DISTRICT SHARED TIME PROG 271137000000
## 1595                                  Elk River Middle School ALC 271137000000
## 1596                                                 ELKHART DAEP 481839000000
## 1597                                       ELKINS MOUNTAIN SCHOOL 540051000000
## 1598                                            Ella Barkley High  60133910219
## 1599                         Ellington (Duke) High (Continuation)  62271002984
## 1600                                                     Elm High  60141512820
## 1601                                           ELMER C WATSON H S 481770000000
## 1602                                           ELVIS J BALLEW H S 483486000000
## 1603                                         Elwood J. Keema High  60133207240
## 1604                             EMERALD COAST CAREER INSTITUTE N 120138000000
## 1605                                          EMERSON HIGH SCHOOL 160153000000
## 1606                                          Emerson High School 530423000000
## 1607                                                 Emerson K-12 530423000000
## 1608                                   EMILY GRIFFITH HIGH SCHOOL  80336000345
## 1609                                                Emily Program 273378000000
## 1610                          HINCKLEY-FINLAYSON ALTERNATIVE PROG 271407000000
## 1611                                          Empowerment Academy 510189000000
## 1612                                              EMPOWERMENT H S 480013000000
## 1613                                               Encanto School  40567000460
## 1614                                             ENDEAVOR ACADEMY 120081000000
## 1615                                         Endeavor Alternative  60813005472
## 1616               ENDEAVOR HS-JOE FRANK CAMPBELL LEARNING CENTER 481359000000
## 1617                        Enrich Excel Achieve Learning Academy 551590000000
## 1618                         Enterprise Academy/Newport News City 510007000000
## 1619                                       Enterprise Alternative  60903009760
## 1620                               ENTERPRISE CHARTER HIGH SCHOOL 120156000000
## 1621                                              Enterprise High  61949008865
## 1622                                              Enterprise Plus  63660012154
## 1623                                         Enterprise Secondary  69101709021
## 1624                     Env Acad of Research Tech and Earth Scis  60964012393
## 1625                             Environmental & Adventure School 530423000000
## 1626                                                      EPSILON 270003000000
## 1627                               Eric Birch High (Continuation)  61392001586
## 1628                                   ERIE COUNTY HOLDING CENTER 360585000000
## 1629                                          ESCAMBIA BOYS' BASE 120051000000
## 1630                                      ESCAMBIA CHARTER SCHOOL 120051000000
## 1631                           Escambia County Alternative School  10135000840
## 1632                                  ESCAMBIA JUVENILE DETENTION 120051000000
## 1633                               ESCAMBIA SCH. DIST. JAIL PROG. 120051000000
## 1634                              Escanaba Student Success Center 261350000000
## 1635                              ESD 112 Open Doors Reengagement 530001000000
## 1636                                    ESL TEEN LITERACY PROGRAM 317482000000
## 1637                                               Esperanza High  61035009776
## 1638                                Esperanza High (Continuation)  60005102015
## 1639                                         ESSEX CAMPUS ACADEMY 348030000000
## 1640                                        ESSEX CO  YOUTH HOUSE 340009000000
## 1641                                            ESSEX HIGH SCHOOL 348030000000
## 1642                                                    ESSEX RGC 340009000000
## 1643                                        ESSEX REGIONAL SCHOOL 340009000000
## 1644                                               ESTEEM ACADEMY 120144000000
## 1645                                    ESTES PARK OPTIONS SCHOOL  80381006426
## 1646                                Estill County Success Academy 210176000000
## 1647                                      ESTRADA ACHIEVEMENT CTR 483873000000
## 1648                                 Estrellita Continuation High  61482001820
## 1649                                       Etiwanda Community Day  61296012260
## 1650                                     Eugene Education Options 410474000000
## 1651                                             Eureka Community  69100910794
## 1652                                                    EV Online 530228000000
## 1653                                        EV Parent Partnership 530228000000
## 1654                                                 EVADALE DAEP 481875000000
## 1655                              Evaluation and Detention Center 450342000000
## 1656                                 Eveleth Gilbert HOPE Program 270002000000
## 1657                                  Evening Educational Options  10237002177
## 1658                                          Evening High School 240066000000
## 1659                                 Evening School of Excellence 510189000000
## 1660                                 Everett Reengagement Academy 530267000000
## 1661                                   EVERETT WADE JUVENILE CTR. 291376000000
## 1662                               EVERGLADES PREPARATORY ACADEMY 120150000000
## 1663                                            Evergreen Academy 170020000000
## 1664                                Evergreen Community Day (5-8)  61317007461
## 1665                                  Evergreen Community Day K-5  61317012160
## 1666                                       Evergreen Continuation  62271002995
## 1667                                         Evergreen Elementary  64158012499
## 1668                                               Evergreen High  60016010254
## 1669                                             Evergreen Middle  64158012545
## 1670                                          EVERMAN ACADEMY H S 481881000000
## 1671                                   EVOLUTION ACADEMY BEAUMONT 480024000000
## 1672                             EVOLUTION ACADEMY CHARTER SCHOOL 480024000000
## 1673                                    EVOLUTION ACADEMY HOUSTON 480024000000
## 1674                                      EYES-E-NINI-HASSEE CAMP 120156000000
## 1675                                  EWES-ECKERD YOUTH CHALLENGE 120156000000
## 1676                                                EXCEL ACADEMY  80336006599
## 1677                                                EXCEL ACADEMY 482382000000
## 1678                                        EXCEL ACADEMY (JJAEP) 483432000000
## 1679                                     EXCEL ACADEMY (MURWORTH) 482115000000
## 1680                         Excel Academy @ Francis M. Wood High 240009000000
## 1681                    EXCEL ACADEMY EDUCATION TRANSITION CENTER 480005000000
## 1682                                        EXCEL CENTER LOCKHART 480145000000
## 1683                                          EXCEL H S OF CHOICE 483498000000
## 1684                                               EXCELL PROGRAM 484467000000
## 1685                                         Exeter Community Day  60142308662
## 1686                       Exeter Independent Study (Alternative)  60142307466
## 1687                                             Explorer Academy 530816000000
## 1688                                    Explorer Community School 530423000000
## 1689                             Expo Alternative Learning Center 193048000000
## 1690                                Extended Day Learning Program 240012000000
## 1691                                             F S LARA ACADEMY 482679000000
## 1692                               F. B. Gwynn Educational Center 240027000000
## 1693                                                 FABENS JJAEP 481890000000
## 1694                                Fair View High (Continuation)  60837000818
## 1695                                    Fairfax County Adult High 510126000000
## 1696                              Fairfax Juvenile Detention Home 510004000000
## 1697                                 Fairfield Alternative School  10144001361
## 1698                    Fairfield-Suisun Elementary Community Day  61336011867
## 1699                               Fairvalley High (Continuation)  61005001090
## 1700                                         FAIRVIEW ACCELERATED 482160000000
## 1701                                         FAIRVIEW ACCELERATED 484155000000
## 1702                                         FAIRVIEW ACCELERATED 483738000000
## 1703                                         FAIRVIEW ACCELERATED 484441000000
## 1704                                         FAIRVIEW ACCELERATED 480930000000
## 1705                                         FAIRVIEW ACCELERATED 484404000000
## 1706                                         FAIRVIEW ACCELERATED 481401000000
## 1707                                         FAIRVIEW ACCELERATED 483075000000
## 1708                                         FAIRVIEW ACCELERATED 480930000000
## 1709                                    FAIRVIEW ACCELERATED DAEP 484441000000
## 1710                        FAIRVIEW ACCELERATED EDUCATIONAL COOP 483398000000
## 1711                                                 FAIRVIEW AEP 484471000000
## 1712                             FAIRVIEW ALTERNATIVE HIGH SCHOOL 273243000000
## 1713                                                FAIRVIEW DAEP 482160000000
## 1714                                                FAIRVIEW DAEP 481401000000
## 1715                                                FAIRVIEW DAEP 484471000000
## 1716                                                FAIRVIEW DAEP 481807000000
## 1717                                                FAIRVIEW DAEP 483075000000
## 1718                                                FAIRVIEW DAEP 483738000000
## 1719                                                FAIRVIEW DAEP 484155000000
## 1720                                FAIRVIEW DAY TREATMENT CENTER 270002000000
## 1721                                        FAIRVIEW DUAL PROGRAM 272385000000
## 1722                                             FAIRVIEW PROGRAM 271137000000
## 1723                                       FAIRVIEW SCHOOL (DAEP) 483398000000
## 1724                                    FAIRVIEW SPECIAL PROGRAMS 481401000000
## 1725                                    FAIRVIEW SPECIAL PROGRAMS 484471000000
## 1726                                    FAIRVIEW SPECIAL PROGRAMS 483357000000
## 1727                                    FAIRVIEW SPECIAL PROGRAMS 483738000000
## 1728                                    FAIRVIEW SPECIAL PROGRAMS 484155000000
## 1729                                                  FAIRVIEW VT 481401000000
## 1730                                  FAITH FAMILY MASTER ACADEMY 480011000000
## 1731                                         FALKENBURG ROAD JAIL 120087000000
## 1732                                     Fall River Community Day  61347008371
## 1733                          Fall River Elementary Community Day  61347010418
## 1734                                 Fallbrook Homeschool Academy  61350007305
## 1735                                           Falls Academy - 08 463171000000
## 1736                                             FALLS CAREER H S 482901000000
## 1737                                           Family Care Center 210186000000
## 1738                               Family Court Elementary School  10039000530
## 1739                                     Family Court High School  10039001761
## 1740                  Family Education Center For Parenting Teens 510027000000
## 1741                                                  Family Link 530930000000
## 1742                                         FAMILY LITERACY CTR. 291941000000
## 1743                                                Family School 410474000000
## 1744                                  Family Tree Learning Center  61692011022
## 1745                                          FAPSGEAR UP ACADEMY 261425000000
## 1746                               FARIBAULT AREA LEARNING CENTER 271176000000
## 1747                                     FARIBAULT DAY SCHOOL ALC 271176000000
## 1748                               Farmington Central High School 261407000000
## 1749                               FARMINGTON CORRECTIONAL CENTER 290003000000
## 1750                                  FARMINGTON TREATMENT CENTER 290003000000
## 1751                                    Vallejo Education Academy  64074011224
## 1752                   Farwell Timberland Alternative High School 261410000000
## 1753                                            Fast Forward High 490002000000
## 1754                               Fayette County Learning Center 210186000000
## 1755                            Fayette Regional Juvenile Det Ctr 210186000000
## 1756                                        Feather River Academy  69104211997
## 1757                         Felmers O Chaney Correctional Center 550004000000
## 1758                                      FENLEY TRANSITIONAL H S 482247000000
## 1759                                   FENLEY TRANSITIONAL MIDDLE 482247000000
## 1760                                           Fenway High School 250279000000
## 1761                            FERGUS FALLS AREA LEARNING CENTER 271188000000
## 1762                        Fernando R. Ledesma Continuation High  61212001367
## 1763                                       FERNDALE RE-ENGAGEMENT 530285000000
## 1764                           FERNDELL HENRY CENTER FOR LEARNING 481965000000
## 1765                                         Fillmore Central ALP 270010000000
## 1766                              FINGER LAKES RESIDENTIAL CENTER 360013000000
## 1767                                      Firebaugh Community Day  61384012917
## 1768                                            FIRST CITY SCHOOL 270444000000
## 1769                                           First State School 100130000000
## 1770                                                    FISD DAEP 482544000000
## 1771                                                   FISD JJAEP 482544000000
## 1772                                      FIT Academy High School 270043000000
## 1773                                   Fitzgerald Virtual Academy 261446000000
## 1774                             Five County Regional Alternative 170019000000
## 1775                                 FIVE-COUNTY DETENTION CENTER 160111000000
## 1776                                                 FLAGLER HIGH 120018000000
## 1777                                 Flambeau Correctional Center 550004000000
## 1778                                                 FLEX Program 170018000000
## 1779                                     Flexible Student Support 240021000000
## 1780                              FLOODWOOD ALT. LEARNING PROGRAM 271221000000
## 1781                              FLORENCE CRITTENTON HIGH SCHOOL  80336001575
## 1782                                     Florence Learning Center  10153001644
## 1783                         Florence McClure Correctional Center 320006000000
## 1784                                        FLORESVILLE ALTER CTR 481935000000
## 1785                               FLORESVILLE ALTERNATIVE CENTER 483555000000
## 1786                FLORESVILLE ALTERNATIVE CENTER CHOICE PROGRAM 483831000000
## 1787                FLORESVILLE ALTERNATIVE CENTER CHOICE PROGRAM 483831000000
## 1788                              NIXON-SMILEY ALTERNATIVE CENTER 482631000000
## 1789                         FLORIDA FUTURES ACADEMY NORTH CAMPUS 120150000000
## 1790                    Florida Parishes Juvenile Detention Cntr. 220168000000
## 1791                                 FLORIDA SHERIFF'S BOYS RANCH 120183000000
## 1792                                            FLOYDADA ISD DAEP 481944000000
## 1793                                                    FOCUS ALP 270822000000
## 1794                                       FOCUS Safe Sch Program 170017000000
## 1795                                             Folsom Lake High  61389008280
## 1796                                    Foothill Alternative High  60756006574
## 1797                                       Foothill Community Day  62720011332
## 1798                                                Foothill High  61182001300
## 1799                                         FOOTHILL HIGH SCHOOL 350001000000
## 1800                                                Foothill Plus  63660012164
## 1801                                            Foothills Academy 210126000000
## 1802                                                     McDowell 370294000000
## 1803                                               Foothills High  63488009629
## 1804                             FOREST LAKE AREA LEARNING CENTER 271227000000
## 1805                                          Forest Park Academy 510330000000
## 1806                                     Forks Alternative School 530702000000
## 1807                                       FORNEY ACADEMIC CENTER 481956000000
## 1808                                           FORT BEND CO ALTER 484135000000
## 1809                                           FORT BEND CO ALTER 483231000000
## 1810                                           FORT BEND CO ALTER 481965000000
## 1811                                           FORT BEND CO ALTER 482517000000
## 1812                                           FORT BEND CO ALTER 482658000000
## 1813                                            Fort Logan School 210348000000
## 1814                      FORT WORTH CAN ACADEMY LANCASTER AVENUE 480002000000
## 1815                             FORT WORTH CAN ACADEMY WESTCREEK 480002000000
## 1816                                Fourth Street Learning Center 261962000000
## 1817                                 Fowler Academy Community Day  61425013163
## 1818                          Fowler Academy Community Day (9-12)  61425010773
## 1819                                  Fowler Academy Continuation  61425001637
## 1820                             Fowler Academy Independent Study  61425012543
## 1821                          Fowlerville Online Learning Academy 261473000000
## 1822                            Fox Lake Correctional Institution 550004000000
## 1823                                    FRANCIS HOWELL UNION HIGH 292895000000
## 1824                          Francisco Bravo Medical Magnet High  62271010240
## 1825                                     FRANK CHURCH HIGH SCHOOL 160036000000
## 1826                 FRANK L MADLA ACCELERATED COLLEGIATE ACADEMY 480006000000
## 1827                                       FRANK M TEJEDA ACADEMY 482247000000
## 1828                           FRANKLIN COUNTY ALTERNATIVE SCHOOL 120057000000
## 1829                                 FRANKLIN COUNTY HIGH SCHOOOL 160096000000
## 1830                                              Franklin School 410348000000
## 1831                     Franklin-Simpson High School West Campus 210540000000
## 1832                                               FRED MOORE H S 481674000000
## 1833                                   FRED W EDWARDS ACADEMY AEC 484233000000
## 1834               FREDDA NOTTINGHAM ALTERNATIVE EDUCATION CENTER 481641000000
## 1835                        FREDERICK A DOUGLASS LEARNING ACADEMY 481437000000
## 1836                              Frederick County Virtual School 240033000000
## 1837                                      FREDERICK DOUGLASS HIGH 290100000000
## 1838                                          Freedom Academy ALC 270042000000
## 1839                           Freedom Academy of Imperial Valley  61743013071
## 1840                                                 FREEDOM HIGH 350006000000
## 1841                                                 Freedom High  63660007822
## 1842                                                 Freedom Home  60006814039
## 1843                                Freeport Alternative High Sch 170017000000
## 1844                                      FREMONT LEARNING CENTER 317071000000
## 1845                                                  Fresh Start 530870000000
## 1846                                           Fresh Start Center 510360000000
## 1847                                     FRESHWATER ED. DIST. ALC 270001000000
## 1848                                   Fresno Flats Community Day  60408007167
## 1849                                             Frida Kahlo High  62271011629
## 1850                          FRIDLEY MIDDLE AREA LEARNING CENTER 271242000000
## 1851                           FRIDLEY MOORE LK AREA LEARNING CTR 271242000000
## 1852                                                Frontier High  62927004518
## 1853                                 Frontier High (Continuation)  64248009008
## 1854                                         FRONTIER HIGH SCHOOL  80372001775
## 1855                                FRUITLAND PREPARATORY ACADEMY 160114000000
## 1856                                    Fruitport Adult Education 261539000000
## 1857                                        FT. ZUMWALT HOPE HIGH 290837000000
## 1858                                      Full Circle High School 251089000000
## 1859                                 Fulton Alternative Education 261542000000
## 1860                                FULTON RECEPTION AND DIAG CTR 290003000000
## 1861           Furman (Duane E.) High (Independent Study Program)  62334004611
## 1862                     Future Bound Independent Study Secondary  63171011172
## 1863                                                      Futures 190513000000
## 1864                                               Futures School 530423000000
## 1865                                            Futures Unlimited 170020000000
## 1866                                          Futurus High School 530114000000
## 1867                                     FW RGNL PROGRAM FOR DEAF 481970000000
## 1868                                 G L WILEY OPPORTUNITY CENTER 484428000000
## 1869                                            G O A L S PROGRAM 484011000000
## 1870                                            G O A L S PROGRAM 482212000000
## 1871                                            G O A L S PROGRAM 483156000000
## 1872                              Gadsden City Alternative School  10162001646
## 1873                                GAINES ALTERNATIVE AT HAMBLEN 120174000000
## 1874                  Gainesville Regional Youth Detention Center 130003000000
## 1875                       GalesburgAugusta Alternative Education 261545000000
## 1876                                   GALLUP CENTRAL ALTERNATIVE 350111000000
## 1877                                   GALVESTON CO DETENTION CTR 481707000000
## 1878                                       GALVESTON CO J J A E P 481995000000
## 1879                                       GALVESTON CO J J A E P 481707000000
## 1880                                       GALVESTON CO J J A E P 483927000000
## 1881                                       GALVESTON CO J J A E P 482331000000
## 1882                                       GALVESTON CO J J A E P 482028000000
## 1883                                           GALVESTON CO JJAEP 481428000000
## 1884                           GARDEN STATE CORRECTIONAL FACILITY 340009000000
## 1885                  Gardner Academy for Learning and Technology 250513000000
## 1886                                     GARFIELD AUXILIARY MS/HS 340576000000
## 1887                                                Garfield High  63432005468
## 1888                                                  GARLAND AEC 482034000000
## 1889                                          GARLAND CAN ACADEMY 480002000000
## 1890                                          GARY W CAMPBELL H S 482520000000
## 1891                        GARZA COUNTY REGIONAL JUVENILE CENTER 483549000000
## 1892                                       GARZA INDEPENDENCE H S 480894000000
## 1893                                       Gaston Virtual Academy 370162000000
## 1894                                       Gates Secondary School 530294000000
## 1895                                                      Gateway 530813000000
## 1896                                                      GATEWAY 482878000000
## 1897                                              Gateway Academy 210459000000
## 1898                                  Gateway Academy High School 210228000000
## 1899                     GATEWAY ACADEMY-SIERRA VISTA CHARTER H S 480017000000
## 1900                         GATEWAY ACADEMY-TOWNLAKE CHARTER H S 480017000000
## 1901                                   GATEWAY ACHIEVEMENT CENTER 540075000000
## 1902                                               Gateway Center  69103311960
## 1903                                  Gateway Children's Services 210425000000
## 1904                                            Gateway Community  69104710708
## 1905                                        Gateway Community Day  61495008638
## 1906                                   GATEWAY COMMUNITY SERVICES 120048000000
## 1907                                     GATEWAY EDUCATIONAL CTR. 293102000000
## 1908                                  Gateway Educational Options  61495001636
## 1909                                                  GATEWAY H S 482566000000
## 1910                                  Gateway High (Continuation)  60903000910
## 1911                                  Gateway High (Continuation)  60855007678
## 1912                                  Gateway High (Continuation)  62637010195
## 1913                                               GATEWAY MIDDLE 482566000000
## 1914                                                  GATEWAY SCH 480957000000
## 1915                                               Gateway School 240021000000
## 1916                                               Gateway School 370058000000
## 1917                                  GATEWAY STUDENT SUPPORT CTR 481212000000
## 1918                                             GATEWAY TECH H S 480024000000
## 1919                                           Gateway to College 251185000000
## 1920                                           GATEWAY TO COLLEGE 317482000000
## 1921                                           Gateway to College 530354000000
## 1922                                      Gateway to College - IS 270003000000
## 1923                          Gateway to College at Laney College  62805012506
## 1924 Gateway to College at Springfield Technical Community Colleg 251113000000
## 1925                     Gateway to CollegeMott Community College 261452000000
## 1926                                GATEWAY TO GRADUATION ACADEMY 483879000000
## 1927                                   Gateway To Success Academy 260110000000
## 1928                                  GAUSE ACADEMY OF LEADERSHIP 120159000000
## 1929                          Gaylord Virtual Instruction Program 261573000000
## 1930                                GCCLR INSTITUTE OF TECHNOLOGY 480003000000
## 1931                                    Gene Drevno Community Day  63942011674
## 1932                        GENE SPARADO REGIONAL JUVENILE CENTER 540051000000
## 1933                                 General Academic Development 510189000000
## 1934                    Generating Recovery of Academic Direction 510189000000
## 1935                                          Genesee County Jail 262472000000
## 1936                               Genesee Valley Regional Center 262472000000
## 1937                                                  GENESIS H S 480957000000
## 1938                                               Genesis School  10087002360
## 1939                                GEO International High School 210573000000
## 1940                         George and Evelyn Stein Continuation  60004712105
## 1941                                           Alternative School 280156000000
## 1942                                        GEORGE GERVIN ACADEMY 480001000000
## 1943                                         GEORGE I SANCHEZ H S 480002000000
## 1944                                       GEORGE I SANCHEZ NORTH 480002000000
## 1945                                    GEORGE M KOZMETSKY SCHOOL 480007000000
## 1946               George S Mickelson Alternative Elementary - 06 466045000000
## 1947              George S Mickelson Alternative High School - 04 466045000000
## 1948                                George S. Patton Continuation  62271003276
## 1949                              GEORGE W  HERLICH JUV  DET  CTR 340009000000
## 1950                                    George W. Hartmann Center 130351000000
## 1951                                       George Washington High 490072000000
## 1952                                        GEORGETOWN ALTER PROG 482060000000
## 1953                       GEORGETOWN BEHAVIORAL HEALTH INSTITUTE 480007000000
## 1954                                              South Park TAPP 210299000000
## 1955                                          Gerber Jr./Sr. High  69102712343
## 1956                                  Gilbert High (Continuation)  60263000174
## 1957                                               GILLIAM SCHOOL  80336006345
## 1958                             Gladwin Community Alternative HS 261599000000
## 1959                                             Glen Dale Center 210165000000
## 1960                                               Glen View High  60429008261
## 1961  Glendale Union High School District Online Learning Academy  40345001574
## 1962                                          Glenmor High School 260762000000
## 1963                           Global Community HS at Morris Hall 320006000000
## 1964                                                 GOAL ACADEMY  80387006393
## 1965                                                 GOAL Program 130084000000
## 1966                                                        GOALS 483808000000
## 1967                                                        GOALS 483288000000
## 1968                                                 GODLEY JJAEP 482096000000
## 1969                               Godwin Heights Learning Center 261611000000
## 1970                               Gogebic Co Community Education 261947000000
## 1971                                Gold Ridge Educational Center  69104614139
## 1972                                             Gold Strike High  60687000627
## 1973                                Golden Gate Community Charter  69100510472
## 1974                                         Golden Heart Academy  20060000049
## 1975                                                 Golden Ridge  69100607386
## 1976                                          Gonzales David Camp  69107812804
## 1977                          Goodhue High School Credit Recovery 279144000000
## 1978                                                Goodwill High  63697206778
## 1979                                   Gordon Correctional Center 550004000000
## 1980                                     GORDON PARKS HIGH SCHOOL 273384000000
## 1981                                         GOSHEN SECURE CENTER 360013000000
## 1982                                        Grad Alliance Program 530039000000
## 1983                                GRADUATION ASSISTANCE PROGRAM 120090000000
## 1984                               GRADUATION PREP ACADEMY LANIER 480894000000
## 1985                               GRADUATION PREP ACADEMY TRAVIS 480894000000
## 1986                                             Graham and Parks 250327000000
## 1987                                          GRAHAM LEARNING CTR 482136000000
## 1988                                                 Granada High  62127009563
## 1989                                     Grand Haven Cyber School 261638000000
## 1990                     GRAND ISLAND INTERVENTION AND ASSESSMENT 310015000000
## 1991                                       GRAND MESA HIGH SCHOOL  80303001434
## 1992                             GRAND MESA YOUTH SERVICES CENTER  80028606702
## 1993                             GRAND MESA YOUTH SERVICES CENTER  80435006346
## 1994                                     GRAND PARK CAREER CENTER 120048000000
## 1995                            GRAND RAPIDS AREA LEARNING CENTER 271317000000
## 1996                                 Grand Rapids Learning Center 261644000000
## 1997                                   GRANDVIEW ALTERNATIVE SCH. 291314000000
## 1998                                               Grandview High 550960000000
## 1999                                          GRANDVIEW ISD JJAEP 482154000000
## 2000                                      Granite Connection High 490036000000
## 2001                                     Granite Falls Open Doors 530321000000
## 2002                                            Grant High School 261650000000
## 2003                                        Grant Learning Center 261650000000
## 2004                                                GRASP ACADEMY 120048000000
## 2005                                    Gravenstein Community Day  61584010684
## 2006                                          GRAVITY High School 530001000000
## 2007                                         GRAYSON CO J J A E P 482367000000
## 2008                                         GRAYSON CO J J A E P 484563000000
## 2009                            Grayson Co. Alternative Education 210230000000
## 2010                         GRAYSON COUNTY SPECIAL EDUCATION SSA 482196000000
## 2011                                 Great Lakes Online Education 261103000000
## 2012                                    Great Lakes Online School 262715000000
## 2013                                Great Start Readiness Program 268082000000
## 2014                                   Greeley Alternative School 170020000000
## 2015                           Green Bay Correctional Institution 550004000000
## 2016                                                    GREEN RGC 340009000000
## 2017                                           Green River School 210081000000
## 2018                                    GREEN SPRINGS HIGH SCHOOL 120039000000
## 2019                      Green Valley Academy at Edgar Allan Poe 240051000000
## 2020                                            Green Valley High  64356007044
## 2021                               Green Valley Independent Study  64356011215
## 2022                       Greenbrier Alternative Learning Center 470378000000
## 2023                                         Greenfield Community  61605012448
## 2024                                 Greenview Alternative School 193054000000
## 2025                   GREENVILLE ALTERNATIVE EDUCATIONAL PROGRAM 482172000000
## 2026                                     Greenville Middle School 261716000000
## 2027                                            Greenwood Academy  63255005031
## 2028                            GREGG COUNTY SHARED SERVICES DAEP 484119000000
## 2029                          GRENADA ENRICHMENT & TRANSITION CEN 280168000000
## 2030                        Greyhound Central Performance Academy 261269000000
## 2031                          Greystone Park Psychiatric Hospital 340009000000
## 2032                                           Griffin Bay School 530765000000
## 2033                                      GRIMES EDUCATION CENTER 481305000000
## 2034                               GRISCOM JUVENILE DETENTION CTR 292928000000
## 2035                                  Griswold Alternative School  90174001721
## 2036                                                  Groppi High 550960000000
## 2037                                Grossmont Middle College High  61623010630
## 2038                                       GROVE STREET ACADEMIES 280447000000
## 2039                                                 Grow Academy 550004000000
## 2040                               GUADALUPE ALTERNATIVE PROGRAMS 273384000000
## 2041                                  GUADALUPE COUNTY CORRECTION 350001000000
## 2042                                               Guardian Angel 210036000000
## 2043                                              GUIDANCE CENTER 483432000000
## 2044                                    Gull Lake Gateway Academy 261725000000
## 2045                                     Gull Lake Virtual School 261725000000
## 2046                           Gus Harrison Correctional Facility 260000000000
## 2047           Gwinnett InterVention Education (GIVE) Center East 130255000000
## 2048                                          H L Trigg Community 370354000000
## 2049                                            H S AHEAD ACADEMY 482364000000
## 2050                                                    H S POINT 481653000000
## 2051                                       H.e.a.r.t. High School 530747000000
## 2052                                             H.O.M.E. Program 530723000000
## 2053                                                 HAC DAEP H S 482247000000
## 2054                                              HAC DAEP MIDDLE 482247000000
## 2055                                            HALE CO J J A E P 482205000000
## 2056                                                HALE CO JJAEP 483468000000
## 2057                                                HALE CO JJAEP 484599000000
## 2058                                            HALE COUNTY JJAEP 483507000000
## 2059                                 Halifax County Career Center 510177000000
## 2060                                    HALL CENTER FOR EDUCATION 480771000000
## 2061                                              HALLSVILLE DAEP 482217000000
## 2062                                          Hallyburton Academy 370048000000
## 2063                            Hamblen County Alternative School 470000000000
## 2064                                       Hamilton Community Day  60133908481
## 2065                                         Hamilton High School 261740000000
## 2066                                Handlon Correctional Facility 260000000000
## 2067                                        Hanford Community Day  61650007103
## 2068                             Hanford Elementary Community Day  61647008707
## 2069                                 Hanford Night (Continuation)  61650008854
## 2070                                 HanoverHorton Virtual School 261764000000
## 2071                                   Happy Valley Community Day  61657011803
## 2072                                 Happy Valley Learning Center 210222000000
## 2073                              Harbor Academy Reg Safe Sch Prg 170022000000
## 2074                                   HARBOR EDUCATIONAL PROGRAM 271353000000
## 2075                                           Harbor High School 261899000000
## 2076                         Harbour Way Elementary Community Day  63255007080
## 2077                                           HARDIN CO ALTER ED 481353000000
## 2078                                           HARDIN CO ALTER ED 482592000000
## 2079                                           HARDIN CO ALTER ED 484023000000
## 2080                                    HARDIN CO ALTERNATIVE AEP 484500000000
## 2081                                          HARDIN CO J J A E P 482241000000
## 2082                      HARDIN COUNTY ALTERNATIVE ED - BUNA ISD 481209000000
## 2083                           Hardin County Day Treatment Center 210249000000
## 2084                       HARLANDALE ALTERNATIVE CENTER BOOT H S 482247000000
## 2085                    HARLANDALE ALTERNATIVE CENTER BOOT MIDDLE 482247000000
## 2086                               HARLEM RENAISSANCE HIGH SCHOOL 360008000000
## 2087                                   HARMS ADV TECH CENTER-WNCC 318013000000
## 2088                       HAROLD D GUTHRIE CENTER FOR EXCELLENCE 484110000000
## 2089                                  HAROLD FERGUSON HIGH SCHOOL  80540000941
## 2090                          Harold McAlister High (Opportunity)  62271003070
## 2091                                               Harper Academy 261776000000
## 2092                                                  HARPER DAEP 482364000000
## 2093                                 Harper Woods Virtual Academy 261776000000
## 2094                          HARRELL ACCELERATED LEARNING CENTER 484578000000
## 2095                                          HARRIS CO J J A E P 481653000000
## 2096                                          HARRIS CO J J A E P 482364000000
## 2097                                          HARRIS CO J J A E P 484110000000
## 2098                                              HARRIS CO JJAEP 482574000000
## 2099                                              HARRIS CO JJAEP 481428000000
## 2100                            HARRIS CO SCH FOR ACCELERATED LRN 482517000000
## 2101                      HARRIS COUNTY JUVENILE DETENTION CENTER 480005000000
## 2102                                  HARRIS COUNTY YOUTH VILLAGE 480005000000
## 2103                                  Harris Newmark Continuation  62271003214
## 2104                               Harrison Alternative Education 261782000000
## 2105                                              Harrison Center 262883000000
## 2106                            HARRISON CO EVOLUTION HIGH SCHOOL 540051000000
## 2107                          HARRISON CO EVOLUTION MIDDLE SCHOOL 540051000000
## 2108                           HARRISON COUNTY ALTERNATIVE SCHOOL 280177000000
## 2109                              Harrison County Learning Center 210258000000
## 2110                                             Harry P B Carden  69104809261
## 2111                               Hartford Alternative Education 261788000000
## 2112                                                 Harvest High  63288013703
## 2113                                  HASTINGS ALTERNATIVE CENTER 271353000000
## 2114                               HASTINGS JUVENILE CORRECTIONAL 120174000000
## 2115                                               HAUKE ALTER ED 481500000000
## 2116                                    HAWTHORNE DIPLOMA PROGRAM 273180000000
## 2117                                 Hawthorne Middle/High School 410951000000
## 2118                         HAYS CO JUVENILE JUSTICE ALT ED PROG 480001000000
## 2119                         Hazel Park ACCESS Alternative School 261803000000
## 2120                                   Hazel Park Adult Education 261803000000
## 2121                                        Hazel Park ESL 9 Mile 261803000000
## 2122                                 Hazel Park Training Facility 261803000000
## 2123                              Hazel Park Training Facility II 261803000000
## 2124                                HB Woodlawn Secondary Program 510027000000
## 2125                                     HC JJAEP - EXCEL ACADEMY 481575000000
## 2126                                                   HEAD START 483510000000
## 2127                             HEADWATERS EDUC LEARNING PROGRAM 272808000000
## 2128                                              HEADWAY ACADEMY 270003000000
## 2129                                        Headway Academy North 270003000000
## 2130                                                 HEALY-MURPHY 483873000000
## 2131                                        HEARTLAND GIRLS RANCH 270447000000
## 2132                                Heartland High (Continuation)  63627006184
## 2133                                        HEARTLAND HIGH SCHOOL 160203000000
## 2134                                    Heather Ridge High School 240033000000
## 2135                                  Heather Ridge Middle School 240033000000
## 2136                  Helen Hunt Jackson College Prep High School  61692009555
## 2137                                       Helensview High School 418018000000
## 2138                                                 HELPING HAND 480007000000
## 2139                                Hemlock Alternative Education 261818000000
## 2140                        HEMPSTEAD ALTERNATIVE LEARNING CENTER 482292000000
## 2141                                                    Henderson  62223008321
## 2142                                Henderson Bay Alt High School 530669000000
## 2143                              Henderson County Career Academy 370210000000
## 2144                                               Henderson High 370405000000
## 2145                                                HENDRICKS ALC 271368000000
## 2146                                  Hendricks Middle School ALC 271368000000
## 2147                                  HENNEPIN GATEWAY TO COLLEGE 270003000000
## 2148                Henrico Juvenile Detention Home - James River 510004000000
## 2149                                  Henry County Virtual Campus  10174002120
## 2150                             HENRY D PERRY EDUCATIONAL CENTER 120018000000
## 2151                             Henry David Thoreau Continuation  62271003398
## 2152                                      Henry High School - SWS 272124000000
## 2153                       Henry Niedermeier Center for Education 260198000000
## 2154                                                  HERE'S HELP 120039000000
## 2155                     HEREFORD CENTER FOR ACCELERATED LEARNING 482301000000
## 2156                                             HERITAGE ACADEMY 480008000000
## 2157                                       Heritage Academy - SWS 272124000000
## 2158                                  HERITAGE ACADEMY OF DEL RIO 480008000000
## 2159                              HERITAGE ACADEMY OF SAN ANTONIO 480008000000
## 2160                                HERITAGE ACADEMY OF WINDCREST 480008000000
## 2161                                       Heritage Community Day  63918010470
## 2162                                    Heritage Park High School 210147000000
## 2163                            Heritage Valley Independent Study  61380012893
## 2164                          HERMANTOWN ALTERNATIVE LEARNING PRG 271392000000
## 2165                                         HERNANDO COUNTY JAIL 120081000000
## 2166                                       Hesperia Community Day  60001408296
## 2167                                       HESTER JUVENILE DETENT 483879000000
## 2168                                              HIDALGO ACADEMY 482310000000
## 2169                                         HIDALGO CO J J A E P 483715000000
## 2170                                         HIDALGO CO J J A E P 484496000000
## 2171                                         HIDALGO CO J J A E P 483591000000
## 2172                                         HIDALGO CO J J A E P 483104000000
## 2173                                         HIDALGO CO J J A E P 483123000000
## 2174                                         HIDALGO CO J J A E P 481739000000
## 2175                                         HIDALGO CO J J A E P 481806000000
## 2176                                     HIDALGO COUNTY BOOT CAMP 484496000000
## 2177                                     HIDALGO COUNTY J J A E P 483993000000
## 2178                                            HIDALGO J J A E P 482310000000
## 2179                                                  HIGH DESERT 160294000000
## 2180                                    High Desert Community Day  62519008526
## 2181                              High Desert Correctional Center 320006000000
## 2182                                  High Desert Premier Academy  60001708588
## 2183                                     High Desert State Prison 320006000000
## 2184                                             High Plains - 06 461230000000
## 2185                                              HIGH POINT EAST 483999000000
## 2186                                            HIGH POINT SCHOOL 482115000000
## 2187                                        HS 560 CITY-AS-SCHOOL 360008000000
## 2188                                         High School Re Entry 530802000000
## 2189                                 TRANSITION EXPULSION PROGRAM 317284000000
## 2190                                   HIGH SCHOOL SUMMER PROGRAM 272295000000
## 2191                                    HIGHBANKS LEARNING CENTER 120192000000
## 2192                                   HIGHLAND PARK ALTER ED CTR 482325000000
## 2193                                   Highland Park Continuation  62271003082
## 2194                                  HIGHLAND RESIDENTIAL CENTER 360013000000
## 2195                                            Highlands Academy  62007002402
## 2196                        HIGHLANDS COUNTY SCHOOLS JAIL PROGRAM 120084000000
## 2197                                        Highlands High School 530622000000
## 2198                            Highlands Juvenile Detention Home 510004000000
## 2199                                      HIGHLANDS YOUTH ACADEMY 120159000000
## 2200                                  Highline Home School Center 530354000000
## 2201                                     Highline Open Doors 1418 530354000000
## 2202                                                    HIGHPOINT 480771000000
## 2203                                                    HIGHPOINT 480945000000
## 2204                                             HIGHPOINT - DAEP 482619000000
## 2205                                               HIGHPOINT EAST 482391000000
## 2206                                        HIGHPOINT SCHOOL EAST 480026000000
## 2207                               HIGHPOINT SCHOOL EAST (CROSBY) 481575000000
## 2208                                 HIGHPOINT SCHOOL EAST (DAEP) 482025000000
## 2209                                       HIGHPOINT SCHOOL NORTH 480026000000
## 2210                                      HIGHRIDGE FAMILY CENTER 120150000000
## 2211                                                 HIGHVIEW ALC 273178000000
## 2212                                   HIGHVIEW INDEPENDENT STUDY 273178000000
## 2213                                            HILL CO J J A E P 482448000000
## 2214                                            HILL CO J J A E P 480738000000
## 2215                                            HILL CO J J A E P 480852000000
## 2216                                            HILL CO J J A E P 482328000000
## 2217                                            HILL CO J J A E P 482373000000
## 2218                                            HILL CO J J A E P 484572000000
## 2219                                                HILL CO JJAEP 481236000000
## 2220                                             HILL COUNTRY H S 482559000000
## 2221                                     HILL COUNTRY YOUTH RANCH 480023000000
## 2222                                            HILL COUNTY JJAEP 483456000000
## 2223                                            HILL COUNTY JJAEP 481065000000
## 2224                                            HILL COUNTY JJAEP 483162000000
## 2225                                            HILL COUNTY JJAEP 482880000000
## 2226                                            HILL COUNTY JJAEP 481548000000
## 2227                                      Hillcrest Academy-North 341640000000
## 2228                                      Hillcrest Academy-South 341640000000
## 2229                           Hillcrest at Youth Services Center  69103309248
## 2230                                   HILLCREST EDUCATION CENTER 291827000000
## 2231                              Hillcrest Hall Treatment Center 210425000000
## 2232                                             Hillcrest School 550732000000
## 2233                                   HILLSBOROUGH GIRLS ACADEMY 120087000000
## 2234                                                Hillside High  60001609085
## 2235                                  Hillside Junior/Senior High  62610006496
## 2236                                               HILLTOP SCHOOL 291830000000
## 2237                                             Hillview Academy 210549000000
## 2238                                 Hillview High (Continuation)  64015006641
## 2239                                                    HIS HOUSE 120039000000
## 2240                            HLWW ALTERNATIVE LEARNING PROGRAM 270012000000
## 2241                                      HOFFMAN LEARNING CENTER 273387000000
## 2242                             Holland Virtual Tech High School 261842000000
## 2243                               HOLLANDALE ALTERNATIVE PROGRAM 280189000000
## 2244                                       HOLMES LEARNING CENTER 280198000000
## 2245                                             HOLMGREEN CENTER 483312000000
## 2246                                   HOLYOKE ALTERNATIVE SCHOOL  80471006610
## 2247                                  Home Assignments-Elementary 240012000000
## 2248                                   Home Assignments-Secondary 240012000000
## 2249                                          Home Choice Academy 530270000000
## 2250                                      Home Education Exchange 530792000000
## 2251                                          Home Education Site 261644000000
## 2252                              Home of the Innocents Discovery 210299000000
## 2253                                 Home of the Innocents School 210299000000
## 2254                                       Home School Experience 530502000000
## 2255                                    HOME/HOSPITAL INSTRUCTION 273384000000
## 2256                                            HOMEBASED COMP ED 483294000000
## 2257                                                    HOMEBOUND 483312000000
## 2258                                                    HOMEBOUND 482568000000
## 2259                                                    HOMEBOUND 481023000000
## 2260                                                    HOMEBOUND 482406000000
## 2261                                               Homeconnection 530594000000
## 2262                                               HomeConnection 530183000000
## 2263                                                     Homelink 530420000000
## 2264                                               Homelink River 530038000000
## 2265                                            Homer Flex School  20039000081
## 2266                                      Homestead (Alternative)  64098007931
## 2267                                              Homewood School 240042000000
## 2268                                                    HomeWorks 530123000000
## 2269                                 Honey Run Academy Elementary  62982012238
## 2270                                  Honey Run Academy Secondary  62982008451
## 2271                                        Hooker Oak Elementary  60837000820
## 2272                                                 Hope Academy  10141001874
## 2273                                                 Hope Academy 348036000000
## 2274                                                 HOPE ACADEMY 120060000000
## 2275                                                 HOPE ACADEMY  50784000805
## 2276                                                 HOPE ACADEMY 482613000000
## 2277                                                     HOPE H S 481248000000
## 2278                                             Hope High School  10177002358
## 2279                                    Hope Hill Children's Home 210425000000
## 2280                                                  HOPE SCHOOL 120096000000
## 2281                                                  Hope School  40078402933
## 2282                                 Hopkins County Day Treatment 210286000000
## 2283                               Hopkins County Schools Academy 210286000000
## 2284                                                      Horizon  61111008560
## 2285                                                 Horizon High  60004007830
## 2286                                          Horizon High School 261752000000
## 2287                                          Horizon High School  10117002090
## 2288                                             HORIZONS ACADEMY 120123000000
## 2289                                          Horizons Elementary 370058000000
## 2290                                 HORIZONS EXPLORATORY ACADEMY  80633006413
## 2291                                         Horizons High School 210555000000
## 2292                                          HORIZONS K-8 SCHOOL  80249006199
## 2293                           Horizons School: Independent Study  62637009946
## 2294                      Horizonte Instruction & Training Center 490087000000
## 2295                                  Horse Creek Learning Center 210123000000
## 2296            HORTON DISCIPLINARY ALTERNATIVE EDUCATION PROGRAM 484496000000
## 2297                                           HOSPITAL/HOMEBOUND 483510000000
## 2298                                           HOSPITAL/HOMEBOUND 481623000000
## 2299                            Houghton Lake Community Education 261860000000
## 2300                                   HOUSTON ALTERNATIVE SCHOOL 280201000000
## 2301                                  HOUSTON CAN ACADEMY - HOBBY 480002000000
## 2302                                  HOUSTON CAN ACADEMY - NORTH 480002000000
## 2303                              HOUSTON CAN ACADEMY - SOUTHWEST 480002000000
## 2304                            Houston County Alternative School  10177000882
## 2305                               HOUSTON HEIGHTS CHARTER SCHOOL 480012000000
## 2306                               Howard B. Owens Science Center 240051000000
## 2307                                      Howard Learning Academy 370001000000
## 2308                                              HS CULTURE CLUB 271023000000
## 2309                                     HS EXTENDED YEAR PROGRAM 271023000000
## 2310                                                HUCKABAY DAEP 482376000000
## 2311                                       HUDSON CO  YOUTH HOUSE 340009000000
## 2312                                       HUDSON REGIONAL SCHOOL 340009000000
## 2313                               Hudson Alternative High School 261881000000
## 2314                                     Hugh C. Spalding Academy 210378000000
## 2315                                        HUIE SPECIAL EDUC CTR 481305000000
## 2316                             HUMBLE COMMUNITY LEARNING CENTER 482391000000
## 2317                               Humboldt Adult Ed Correctional 320021000000
## 2318                                       Humboldt Adult Program 320021000000
## 2319                    Humboldt County Office of Education Court  69100910797
## 2320      Humboldt County Office of Education Juvenile Hall Court  69100910798
## 2321                            Huntington Therapeutic Day School 250309000000
## 2322                                 Huron Valley Adult Education 261899000000
## 2323                                          Huron Valley Womens 260000000000
## 2324                                               HUSTON ACADEMY 480016000000
## 2325                                                 Hutch School 530771000000
## 2326                              HUTCHINSON MIDDLE SCHOOL A.L.C. 271497000000
## 2327                            HUTCHINSON NIGHT ALT LEARNING CTR 271497000000
## 2328                            I Kan Regional Alternatve Att Ctr 170019000000
## 2329                                                      I-TRACC 530111000000
## 2330                     IDAHO CONNECTS ONLINE ALTERNATIVE SCHOOL 160015000000
## 2331                                     IDAHO VISION HIGH SCHOOL 160000000000
## 2332                           IDAHO YOUTH CHALLENGE ACADEMY FALL 160252000000
## 2333                         IDAHO YOUTH CHALLENGE ACADEMY SPRING 160252000000
## 2334                                                  IDEA Center  61623013915
## 2335                                                        iGrad 530396000000
## 2336                                                iGrad Academy 530594000000
## 2337                                        iHigh Virtual Academy  63432012534
## 2338                                 IL Center for Rehab & Educ-R 170010000000
## 2339                             Il Youth Center - Pere Marquette 170001000000
## 2340                                                iLead Academy 210099000000
## 2341                             Il Mathematics & Science Academy 170010000000
## 2342                            Illinois Youth Center-Warrenville 170001000000
## 2343                              Illinois Youth Ctr - St Charles 170001000000
## 2344                                         Imagineering Academy 210051000000
## 2345                                      IMK Community Education 261941000000
## 2346                                IMMOKALEE TEEN PARENTING PROG 120033000000
## 2347                                         IMPACT HALFWAY HOUSE 120048000000
## 2348                                  IMPACT Reengagement Program 530462000000
## 2349                                  Imperial Ave. Holbrook High  61821002242
## 2350                      Imperial County Juvenile Hall/Community  69101009224
## 2351                                                 Independence  62223008320
## 2352                                         INDEPENDENCE ACADEMY 291548000000
## 2353                         INDEPENDENCE ALTERNATIVE HIGH SCHOOL 160027000000
## 2354                                    Independence Continuation  62271003100
## 2355                                    Independence Continuation  61207001343
## 2356                               Independence Continuation High  60006808144
## 2357                                            Independence High  62160008457
## 2358                                            Independence High  63441007840
## 2359                                            Independence High 490081000000
## 2360                                            Independence High  60004812391
## 2361                              Independence High (Alternative)  63363010036
## 2362                              Independence High (Alternative)  60015310932
## 2363                              Independence High (Alternative)  62466008164
## 2364                             Independence High (Continuation)  60245008785
## 2365                                     INDEPENDENCE HIGH SCHOOL 360008000000
## 2366                                     Independence High School 130228000000
## 2367                                     Independence High School 320002000000
## 2368                                     INDEPENDENCE HIGH SCHOOL 350001000000
## 2369                                          Independent Scholar 530744000000
## 2370                                    INDEPENDENT STUDY PROGRAM 317482000000
## 2371                            Independent Study Sojourner Truth  62805005701
## 2372                               Indian Hills Continuation High  62100002521
## 2373                               INDIANHEAD ACADEMY HIGH SCHOOL 160333000000
## 2374                               INDIANOLA ACADEMIC ACHIEVEMENT 280019000000
## 2375                               Individualized Learning Center 191653000000
## 2376                               INDUSTRY LIMITED SECURE SCHOOL 360013000000
## 2377                                  Ingham AcademyFamily Center 262115000000
## 2378                                   Ingham County Youth Center 262115000000
## 2379                                   Ingham Virtual High School 262145000000
## 2380                                  Inglewood Continuation High  61839003213
## 2381                                    INITIAL POINT HIGH SCHOOL 160177000000
## 2382                              Innovations Academy of Palmdale  62958013949
## 2383                                      Innovations High School 320048000000
## 2384                                   INNOVATIONS MIDDLE CHARTER 120144000000
## 2385                                Innovative & Alternative High 550852000000
## 2386                              Innovative & Alternative Middle 550852000000
## 2387                                   Insight School of Michigan 260108000000
## 2388                                 Insight School of Washington 530702000000
## 2389                             Insight School of Wisconsin High 550891000000
## 2390                                     INSIGHTS LEARNING CENTER 481970000000
## 2391                          INSPIRED FOR EXCELLENCE ACADEMY INC 482364000000
## 2392                                            INSTR/GUID CENTER 482967000000
## 2393                              INSTRUCTIONAL & GUIDANCE CENTER 483774000000
## 2394                                          INT'L NEWCOMER ACAD 481970000000
## 2395                                      INTEGRATED ARTS ACADEMY 270819000000
## 2396                     Interagency Alternative Secondary Center 510126000000
## 2397                                       Interagency Open Doors 530771000000
## 2398                                         Interagency Programs 530771000000
## 2399                               International Community School 530423000000
## 2400                                            INTERNATIONAL H S 480894000000
## 2401                             INTERNATIONAL NEWCOMER INSTITUTE 482142000000
## 2402                               International Polytechnic High  69107804580
## 2403                                         International School 530039000000
## 2404                                             Internet Academy 530282000000
## 2405                           Internet Pasco Academy of Learning 530657000000
## 2406                                Intervention Learning Program  40831002130
## 2407                                            Inverness Academy 260891000000
## 2408                     Invest Roosevelt Alternative High School 261803000000
## 2409                          Ionia Maximum Correctional Facility 260000000000
## 2410                                              IOWA PARK JJAEP 482426000000
## 2411                                    Irwin High (Continuation)  61722009855
## 2412                             IS THE ALTERNATIVE PROGRAM (TAP) 274216000000
## 2413                                        TEXAS VIRTUAL ACADEMY 480021000000
## 2414                                      ISD 181 LEARNING CENTER 270609000000
## 2415                                                 ISD 281 I.S. 273178000000
## 2416                                        ISD 361 - ALC Program 270022000000
## 2417                                                ISEAP Program 510189000000
## 2418                       IshpemingNegauneeNICE Comm Ed Division 261953000000
## 2419                                         Island Community Day  61980012097
## 2420                                   Island High (Continuation)  60177000048
## 2421                                      ISLAND PARK HIGH SCHOOL 120108000000
## 2422                                    ISLE AREA LEARNING CENTER 271551000000
## 2423                                     ITASKIN EDUCATION CENTER 271317000000
## 2424                                  ITAWAMBA IMPROVEMENT CENTER 280210000000
## 2425                                              ITINERANT SP ED 483510000000
## 2426                          IVAN SAND AFTER SCHOOL CREDIT RECOV 271137000000
## 2427                              IVAN SAND COMMUNITY HIGH SCHOOL 271137000000
## 2428                            IVAN SAND COMMUNITY SCHOOL SUMMER 271137000000
## 2429                               IVAN SAND COMMUNITY SCHOOL- IS 271137000000
## 2430                                      Ivy High (Continuation)  61353001546
## 2431                                                  IYC Chicago 170001000000
## 2432                                                  IYC Kewanee 170001000000
## 2433                                                    J J A E P 482985000000
## 2434                                                    J J A E P 481431000000
## 2435                                                    J J A E P 481818000000
## 2436                                                    J J A E P 482613000000
## 2437                                        J W Turlington School 370225000000
## 2438                                             J. C. Montgomery  69101309227
## 2439                                             J. C. Roe Center 370333000000
## 2440                                  J. E. Young Academic Center  61455005749
## 2441                                        J. Everett Barr Court  69103809252
## 2442                         J.M. "CHICK" BUCKBEE JUVENILE CENTER 540051000000
## 2443                                    Jack London Community Day  62271012188
## 2444                                     Jack London Continuation  62271003146
## 2445                            JACKIE HARRIS PREPARATORY ACADEMY 120051000000
## 2446                                  Jackson Academy High School 210573000000
## 2447                                Jackson Academy Middle School 210573000000
## 2448                                   JACKSON ALTERNATIVE SCHOOL 120096000000
## 2449                           Jackson Co Juvenile Detention Cntr 180105000000
## 2450                               Jackson Co Sch of Alternatives 370234000000
## 2451                             Jackson Correctional Institution 550004000000
## 2452                            Jackson County Alternative School  10183000888
## 2453                                          Jackson County Jail 261962000000
## 2454                                             Jackson Pathways 261962000000
## 2455                                    JACKSON SIPP/CHILD CRISIS 120039000000
## 2456                                       Jackson/Perry MS TAOEP 170019000000
## 2457                              Jacobsen High (China Spring YC) 320009000000
## 2458                             Jail-Gila County Sheriffs Office  40076502958
## 2459                           Jail-Graham County Sheriffs Office  40076202955
## 2460                         Jail-Greenlee County Sheriffs Office  40077902952
## 2461                         Jail-Maricopa County Sheriffs Office  40045902575
## 2462                       Jail-Santa Cruz County Sheriffs Office  40077702937
## 2463                                  James A. Taylor High School 530579000000
## 2464                    West Allis-West Milwaukee Learning Center 551626000000
## 2465                      JAMES H. "TIGER" MORTON JUVENILE CENTER 540051000000
## 2466                                 JAMES IRVIN EDUCATION CENTER 120153000000
## 2467                                           JAMES M STEELE H S 483318000000
## 2468                                   James R. Allen High School 210405000000
## 2469                      Jamison (Donald C.) High (Continuation)  62140002562
## 2470                                           Jan Work Community  69105206046
## 2471                                     Jane Addams Continuation  62271002801
## 2472                                          Jane Frederick High  63801009446
## 2473                                 JANN MANN EDUCATIONAL CENTER 120039000000
## 2474                                                  Jarvis Camp  69107812682
## 2475                                               JCC - LEWISTON 160002000000
## 2476                                                  JCC - NAMPA 160002000000
## 2477                                             JCC - ST ANTHONY 160002000000
## 2478                                                 JCPS eSchool 210299000000
## 2479                                                        JCSSA 482096000000
## 2480                                      JD HALL LEARNING CENTER 482667000000
## 2481                                         JEAN MASSIEU ACADEMY 480010000000
## 2482                                            JEDI Virtual K-12 550771000000
## 2483                                          Jeffers High School 260189000000
## 2484                                       JEFFERSON CO J J A E P 482232000000
## 2485                                       JEFFERSON CO J J A E P 483543000000
## 2486                                       JEFFERSON CO J J A E P 483849000000
## 2487                                      JEFFERSON CO YOUTH ACAD 483228000000
## 2488                                      JEFFERSON CO YOUTH ACAD 483540000000
## 2489                                      JEFFERSON CO YOUTH ACAD 480967000000
## 2490                          JEFFERSON COUNTY ALTERNATIVE SCHOOL 280222000000
## 2491                  Jefferson County Couns And Learning CtrWest  10192001862
## 2492              Jefferson County Counseling Learning CenterEast  10192000466
## 2493                                        Jefferson County High 210299000000
## 2494                                Jefferson High (Continuation)  63694001734
## 2495                                        JEFFERSON HIGH SCHOOL 160157000000
## 2496                                 JEFFERSON JUNIOR/SENIOR HIGH  80441006461
## 2497                           JEFFERSON/TODD ALTERNATIVE PROGRAM 280240000000
## 2498                           Jeffrey Behavior Jr/Sr High School 320006000000
## 2499                                Jenison International Academy 261983000000
## 2500                                     Jewel City Community Day  61524008019
## 2501                             JHW INSPIRE ACADEMY - AFTON OAKS 480005000000
## 2502                            JHW INSPIRE ACADEMY - BELL COUNTY 480005000000
## 2503                               JHW INSPIRE ACADEMY - CROCKETT 480005000000
## 2504                               JHW INSPIRE ACADEMY - GRANBURY 480005000000
## 2505                            JHW INSPIRE ACADEMY - HAYS COUNTY 480005000000
## 2506                           JHW INSPIRE ACADEMY - LEGACY RANCH 480005000000
## 2507                               JHW INSPIRE ACADEMY - MERIDELL 480005000000
## 2508                               JHW INSPIRE ACADEMY - ROCKDALE 480005000000
## 2509                         JHW INSPIRE ACADEMY - WILLIAMS HOUSE 480005000000
## 2510                                          Jill Kinmont Boothe  69101100411
## 2511                                                        JJAEP 484590000000
## 2512                                                        JJAEP 482865000000
## 2513                                                        JJAEP 481323000000
## 2514                                                        JJAEP 484071000000
## 2515                                                        JJAEP 484481000000
## 2516                                                        JJAEP 481500000000
## 2517                                                        JJAEP 483873000000
## 2518                                                 JJAEP CAMPUS 482391000000
## 2519                                    JJAEP DISCIPLINARY SCHOOL 482619000000
## 2520                                    JJAEP DISCIPLINARY SCHOOL 481359000000
## 2521                                  JJAEP-SOUTHWEST KEY PROGRAM 483025000000
## 2522                                               JO KELLY SP ED 481970000000
## 2523                                        JOANN BRIDGES ACADEMY 120120000000
## 2524                                       JOE DALE SPARKS CAMPUS 481674000000
## 2525                                            Johanna Boss High  60142207737
## 2526                    Johanna Echols-Hansen High (Continuation)  60897000901
## 2527                                               John B. Allard  69104111486
## 2528                             John C Burke Correctional Center 550004000000
## 2529                                       John F. Cruikshank Jr.  69103107355
## 2530                                         John F. Kennedy High  60985011712
## 2531                              John Finney High (Continuation)  64074006734
## 2532                                       John Hope Continuation  62271003093
## 2533                                  John J. Cairns Continuation  62187005524
## 2534               John J. Wright Educational And Cultural Center 510364000000
## 2535                        JOHN LESLIE PATTON JR ACADEMIC CENTER 481623000000
## 2536                                 JOHN POLK ALTERNATIVE SCHOOL 120171000000
## 2537                                                 JOHN R ROACH 481059000000
## 2538                                          John R. Wooden High  62271002806
## 2539                JOHN V LINDSAY WILDCAT ACADEMY CHARTER SCHOOL 360005000000
## 2540                                             John Vierra High  60594006991
## 2541           Johnny Gray Jones Youth Shelter & Detention Center 220027000000
## 2542                            Johnson County Alternative School 210306000000
## 2543                                     JOHNSON COUNTY J J A E P 482493000000
## 2544                                         JOHNSON COUNTY JJAEP 481218000000
## 2545                                         Johnson Youth Center  20021000396
## 2546                                 JONES COUNTY LEARNING CENTER 280228000000
## 2547                                          Jonesville Pathways 261992000000
## 2548                              Jordan (June) School for Equity  63441011252
## 2549                            Joseph B. Johnson Learning Center 510236000000
## 2550                                              JOURDANTON DAEP 482496000000
## 2551                                             JOURNEYS ACADEMY 120171000000
## 2552                                   SWEETWATER ACCELERATED H S 484203000000
## 2553                                         JT BRACKENRIDGE DAEP 483873000000
## 2554                          JUBILEE - LAKE VIEW UNIVERSITY PREP 480018000000
## 2555                                       JUBILEE HIGHLAND HILLS 480018000000
## 2556                                          JUBILEE SAN ANTONIO 480018000000
## 2557                       Judith P. Hoyer Early Childhood Center 240030000000
## 2558                                          JUDSON CARE ACADEMY 482499000000
## 2559                                         JUDSON LEARNING ACAD 482499000000
## 2560                                         JUDSON STEAM ACADEMY 482811000000
## 2561                            JUDY ANDREWS SECOND CHANCE CENTER 120051000000
## 2562                                          Junipero Serra High  60744000703
## 2563                                               JUST FOR GIRLS 120123000000
## 2564                                               JUST FOR GIRLS 120123000000
## 2565                                  JUSTICE HIGH CHARTER SCHOOL  80249002013
## 2566                                                JUVENILE CTR. 290525000000
## 2567                                          JUVENILE DETENT CTR 482658000000
## 2568                                          JUVENILE DETENT CTR 482855000000
## 2569                                          JUVENILE DETENT CTR 483873000000
## 2570                                          JUVENILE DETENT CTR 482811000000
## 2571                                           Juvenile Detention 320012000000
## 2572                                           Juvenile Detention 320006000000
## 2573                                           Juvenile Detention 551449000000
## 2574                                           JUVENILE DETENTION 120144000000
## 2575                                       Juvenile Detention 3-5 320006000000
## 2576                                    Juvenile Detention Center 170017000000
## 2577                                    JUVENILE DETENTION CENTER 120123000000
## 2578                                    JUVENILE DETENTION CENTER 480744000000
## 2579                                     Juvenile Services Center 268090000000
## 2580                                    JUVENILE DETENTION CENTER 120153000000
## 2581                                    JUVENILE DETENTION CENTER 483969000000
## 2582                                    JUVENILE DETENTION CENTER 483890000000
## 2583                                       JUVENILE DETENTION CTR 481500000000
## 2584                                       JUVENILE DETENTION CTR 484035000000
## 2585                                       JUVENILE DETENTION CTR 481818000000
## 2586                                      JUVENILE DETENTION CTR. 292676000000
## 2587                                      JUVENILE DETENTION CTR. 291191000000
## 2588                                      JUVENILE DETENTION CTR. 291443000000
## 2589                                  JUVENILE FEMALE SECURE UNIT 340009000000
## 2590                   Juvenile Hall (Endeavor/Voyager Secondary)  69101708131
## 2591                                         JUVENILE JUSTICE AEP 481623000000
## 2592                                         JUVENILE JUSTICE AEP 482025000000
## 2593                                 JUVENILE JUSTICE ALTERNATIVE 480001000000
## 2594                      JUVENILE JUSTICE ALTERNATIVE ED PROGRAM 481970000000
## 2595                JUVENILE JUSTICE ALTERNATIVE ED PROGRAM/VENUS 484401000000
## 2596               JUVENILE JUSTICE ALTERNATIVE EDUCATION PROGRAM 484107000000
## 2597                                      Juvenile Justice Center 181029000000
## 2598                               JUVENILE JUSTICE CENTER ALT ED 120039000000
## 2599                                        JUVENILE JUSTICE CTR. 292886000000
## 2600                                        JUVENILE JUSTICE CTR. 291854000000
## 2601                                        JUVENILE JUSTICE CTR. 290100000000
## 2602                                        JUVENILE JUSTICE CTR. 290699000000
## 2603                              JUVENILE MEDIUM SECURE FACILITY 340009000000
## 2604                        JUVENILE MEDIUM SECURE FACILITY SOUTH 340009000000
## 2605                                   JUVENILE OFFENDERS PROGRAM 120144000000
## 2606                                      JUVENILE SERVICE CENTER 273384000000
## 2607                                     Juvenile Services Center 180765000000
## 2608                        JUVENILLE JUSTICE ALTERNATIVE PROGRAM 484365000000
## 2609                                                    K ACADEMY 482544000000
## 2610                                                    K C J D C 482559000000
## 2611                              K-12 Ellensburg Learning Center 530246000000
## 2612                                    Kalamazoo Adult Education 261995000000
## 2613                        Kalamazoo Innovative Learning Program 261995000000
## 2614                                         Kalapuya High School 410204000000
## 2615                                 Kalkaska Alternative Program 262005000000
## 2616                                        KARNES CITY J J A E P 482514000000
## 2617                                                 KASE ACADEMY 483999000000
## 2618                                 KATHERINE ANNE PORTER SCHOOL 480013000000
## 2619                                                  Kaweah High  60142301505
## 2620                                                 KCISD - DAEP 482514000000
## 2621                                          KEC Central EFE 170 170018000000
## 2622                                                  KEENE JJAEP 482523000000
## 2623                         Keith B. Bright High (Juvenile Hall)  60140904490
## 2624                               KEITH LUTZ HORIZON HIGH SCHOOL 317374000000
## 2625                                       Keith McCarthy Academy  60002712094
## 2626                                    Kelseyville Community Day  61932010511
## 2627                                             KEMP ALTERNATIVE 482532000000
## 2628                            Ken 'Chief' Hill Learning Academy  40187002939
## 2629                                Kenai Alternative High School  20039000079
## 2630                                      KENNEDALE ALTER ED PROG 482550000000
## 2631                                                 DAVIS CENTER 540051000000
## 2632                            Kenowa Hills Pathways High School 262028000000
## 2633                                   Kent Mountain View Academy 530396000000
## 2634                                         Kent Phoenix Academy 530396000000
## 2635                            Kenyon-Wanamingo Alternative Prog 271710000000
## 2636                          Kenyon-Wanamingo High School Credit 279144000000
## 2637                                      Keough Memorial Academy 250246000000
## 2638                                        Kern County Community  69101207502
## 2639                                   Kern County Juvenile Court  69101209226
## 2640                    KERRVILLE DISCIPLINARY ALTERNATIVE SCHOOL 482559000000
## 2641                      Kettle Moraine Correctional Institution 550004000000
## 2642                                                    KEYS ACAD 484071000000
## 2643                                                    KEYS ACAD 482253000000
## 2644                                                  KEYS CENTER 120132000000
## 2645                                                      KEYS EL 484071000000
## 2646                                                     KEYS H S 482406000000
## 2647                                           KI CHARTER ACADEMY 480145000000
## 2648                                     Kiita Learning Community  20061000470
## 2649                                                KILLEEN JJAEP 482566000000
## 2650                     King (Martin Luther) High (Continuation)  61062001179
## 2651                                                    King Open 250327000000
## 2652                                King/Drew Medical Magnet High  62271009150
## 2653                                    Kings Canyon Continuation  61970002369
## 2654                                  Kings Lake Education Center  60969011284
## 2655                              Kings River High (Continuation)  63525005974
## 2656                             Kingsburg Independent Study High  61983012859
## 2657                                             Kingswood School 370150000000
## 2658                                   Kinney High (Continuation)  61389001573
## 2659                                        KINPORT MIDDLE SCHOOL 160264000000
## 2660                                Kinross Correctional Facility 260000000000
## 2661                                           Kirby Dorothy Camp  69107812777
## 2662                                      Klamath Learning Center 410708000000
## 2663                                                  KLEIN ANNEX 482574000000
## 2664                            KLEIN EDUCATION PLACEMENT PROGRAM 482574000000
## 2665                                                   KLEIN SEMS 482574000000
## 2666                                          KMS LEARNING CENTER 270009000000
## 2667                                              KNIGHTS ACADEMY 273379000000
## 2668                                      Knox Appalachian School 210315000000
## 2669                                    Knox County Day Treatment 210315000000
## 2670                                 Knox County Learning Academy 210315000000
## 2671                                         Knox Inspire Academy 210315000000
## 2672                                  KOKESH AREA LEARNING CENTER 272505000000
## 2673                                     Konocti Education Center  62007013894
## 2674                                      KOOTENAI BRIDGE ACADEMY 160015000000
## 2675                                 KOSCIUSKO ALTERNATIVE SCHOOL 280234000000
## 2676                                   Kuskokwim Learning Academy  20000100318
## 2677                                   Kyrene De Los Lagos School  40423001405
## 2678                                                      L C Y C 481518000000
## 2679                                              L ISD J J A E P 482667000000
## 2680                         L.A. County High School for the Arts  69107809663
## 2681                                La Center Home School Academy 530417000000
## 2682                                  La Cuesta Continuation High  60141406023
## 2683                                 La Entrada Continuation High  63462005789
## 2684                                              La Entrada High  63066006103
## 2685                                 La Familia Continuation High  60907000923
## 2686                                             LA FERIA ACADEMY 482604000000
## 2687                                La Paloma High (Continuation)  62160002572
## 2688                                 La Sierra High (Alternative)  61476007723
## 2689                                       LA VILLA J J A E P H S 482634000000
## 2690                                 La Vista High (Continuation)  61476001812
## 2691                          LABELLE YOUTH DEVELOPMENTAL ACADEMY 120078000000
## 2692                                      Lad Lake Synergy School 550960000000
## 2693                   Lafourche Parish Juvenile Justice Facility 220090000000
## 2694                                                  Laguna High  60267000195
## 2695                                                 LAKE ACADEMY 120087000000
## 2696                                          LAKE ACADEMY EUSTIS 120105000000
## 2697                                        LAKE ACADEMY LEESBURG 120105000000
## 2698                                    Valley Alternative Magnet  62271003416
## 2699                                 Lake City Alternative School 262061000000
## 2700                                    Lake City Credit Recovery 279144000000
## 2701                                   Lake Co Collaborative Alop 170019000000
## 2702                                     LAKE COUNTY ACER PROGRAM 120105000000
## 2703                     Lake Cumberland Youth Development Center 210579000000
## 2704                                          Lake Forest Academy 370333000000
## 2705                       Lake Huron Virtual  Hybrid High School 262523000000
## 2706                                             LAKE PARK SCHOOL 274272000000
## 2707                                LAKE PEND OREILLE HIGH SCHOOL 160000000000
## 2708                            Lake Roosevelt Alternative School 530313000000
## 2709                               Lakeland Correctional Facility 260000000000
## 2710                           Lakeport Alternative (Home School)  62067008712
## 2711                                       Lakeport Community Day  62067012081
## 2712                                                LAKES ACADEMY 480140000000
## 2713                                LAKES COUNTRY YOUTH EDUC SVCS 270008000000
## 2714                                     Lakeshore Virtual School 261587000000
## 2715                                             Lakeside Academy 270042000000
## 2716                                             LAKESIDE ACADEMY 271104000000
## 2717                                      Lakeside Charter School 260106000000
## 2718                                              LAKESIDE SCHOOL 400006000000
## 2719                                  LAKEVIEW DROPOUT PREVENTION 120051000000
## 2720                                              LAKEVIEW SCHOOL 274272000000
## 2721                                              Lakeview School 370126000000
## 2722                               LAKEVILLE AREA LEARNING CENTER 271778000000
## 2723                         Lakewood NWESD 189 Open Door Program 530426000000
## 2724                                                LAMAR ACADEMY 482967000000
## 2725                                            LAMAR DELTA ALTER 483301000000
## 2726                                                  LAMESA DAEP 481086000000
## 2727                                       LAMESA SUCCESS ACADEMY 482661000000
## 2728                  Lancaster Alternative and Virtual Academies  62088005857
## 2729                                                 Lander Adult 320024000000
## 2730                                                Landmark High 490063000000
## 2731                           Langston High Continuation Program 510027000000
## 2732                                LANIER-JAMES EDUCATION CENTER 120018000000
## 2733       LAnse CreuseMount Clemens Center for Lifelong Learning 262187000000
## 2734                                      Lansing Adult Education 262115000000
## 2735                        LARRY D GUINN SPECIAL PROGRAMS CENTER 483510000000
## 2736                                                 LAS AMERICAS 482364000000
## 2737                                Las Flores High (Alternative)  61233007700
## 2738          Las Flores Home Education Independent Study Academy  60444013706
## 2739                                LaSalle County Detention Home 170019000000
## 2740                                         Lassen Community Day  62106007104
## 2741                           LAUDERDALE CO EDUCATIONAL & SKILLS 280243000000
## 2742                                              LAUDERHILL HIGH 120018000000
## 2743                                  Laurel County Day Treatment 210321000000
## 2744                                Laurel County Virtual Academy 210321000000
## 2745                                      LAUREL EDUCATION CENTER 280246000000
## 2746                                                 LAUREL RIDGE 480007000000
## 2747                              LAURENTIAN ENVIRONMENTAL CENTER 272295000000
## 2748                           Lawton Accelerated Academic Center 262124000000
## 2749                                Laytonville Continuation High  64258000666
## 2750                                             LEAD ACADEMY H S 482811000000
## 2751                                       LEAD INNOVATION STUDIO 292355000000
## 2752              Lead-Deadwood Career & Technical Education - 10 464130000000
## 2753                                          Leaders In Learning 530513000000
## 2754                                           LEADERSHIP ACADEMY 480005000000
## 2755                                           LEADERSHIP ACADEMY 480894000000
## 2756                                   LEALMAN INNOVATION ACADEMY 120156000000
## 2757                                             LEAP HIGH SCHOOL 273384000000
## 2758                                              LEARNERS CENTER 270729000000
## 2759                                             Learning Academy 210477000000
## 2760                               Learning Academy at Bloomfield  90033001619
## 2761                               LEARNING ACADEMY OF SANTA ROSA 120165000000
## 2762                                                 LEARNING CTR 482730000000
## 2763                                 Learning Options High School 262073000000
## 2764                             Learning Post High (Alternative)  64251007369
## 2765                               LEE ADOLESCENT MOTHERS PROGRAM 120108000000
## 2766                           LEE CO. SCHOOLS IMPROVEMENT CENTER 280255000000
## 2767                                          LEE CTY CORRECTIONS 350001000000
## 2768                                              LEE COUNTY JAIL 120108000000
## 2769                                                     Lee High 450000000000
## 2770                                          Lee V. Pollard High  60985000853
## 2771                              Leffingwell High (Continuation)  60004907413
## 2772                            LEFLORE COUNTY ALTERNATIVE SCHOOL 280258000000
## 2773                                                  Legacy High  62664013721
## 2774                                           Legacy High School 261791000000
## 2775                                           Legacy High School 530393000000
## 2776                                           Legacy High School 530270000000
## 2777                                   LEGACY OPTIONS HIGH SCHOOL  80336006669
## 2778                                      LEGACY SCHOLARS ACADEMY 120192000000
## 2779                          LEHMAN ALTERNATIVE COMMUNITY SCHOOL 361557000000
## 2780                            Leighton Hall (Dentention Center) 320021000000
## 2781                                       Lennox Virtual Academy  62142014005
## 2782                               Lenoir County Learning Academy 370261000000
## 2783                            LEON CO JUVENILE DETENTION CENTER 120111000000
## 2784                                             LEON COUNTY JAIL 120111000000
## 2785                                                Lerna Bridges 170018000000
## 2786                                           LES PETERS ACADEMY 120087000000
## 2787                                                 LESTER DAVIS 481674000000
## 2788                                  LESTER R ARNOLD HIGH SCHOOL  80195001307
## 2789                     Letcher County Alternative Education Ctr 210336000000
## 2790                                                 LETOT CAMPUS 480009000000
## 2791                                        LEVY LEARNING ACADEMY 120114000000
## 2792                                LEWIS AND CLARK LEARNING CTR. 291229000000
## 2793                              Lewis County Alternative School 530117000000
## 2794                                            Lewis Opportunity  63583011807
## 2795                                          Lewis River Academy 531005000000
## 2796                                              LIBERTY ACADEMY 291854000000
## 2797                                              LIBERTY ACADEMY 484415000000
## 2798                                                  LIBERTY H S 482364000000
## 2799                                                 Liberty High 210299000000
## 2800                                                 Liberty High  62223002655
## 2801                                                 Liberty High  60462000425
## 2802                                   Liberty High (Alternative)  63459006645
## 2803                                  Liberty High (Continuation)  60004807405
## 2804                    LIBERTY HIGH SCHOOL ACADEMY FOR NEWCOMERS 360008000000
## 2805                                      LIBERTY LEARNING CENTER 120117000000
## 2806                                LIBERTY WILDERNESS CROSSROADS 120117000000
## 2807                                           Licton Springs K-8 530771000000
## 2808                                  LIFE LINES ADULT CONNECTION 271878000000
## 2809                                Life Skills Center of Pontiac 260029000000
## 2810                                            LIFEBRIDGE CENTER 120177000000
## 2811                                                     LIFESPAN 273243000000
## 2812                                           Lighthouse Academy 210573000000
## 2813                            Lighthouse Academy  Eagle Village 260095000000
## 2814                             Lighthouse Academy  North Campus 260095000000
## 2815                                 Lighthouse Academy  St Johns 260095000000
## 2816                                 Lighthouse Academy  The Pier 260095000000
## 2817                                  Lighthouse Academy  Waalkes 260095000000
## 2818                                     Lighthouse Community Day  61407008163
## 2819                                              Lighthouse High 490015000000
## 2820                            LIGHTHOUSE LEARNING CENTER - DAEP 481119000000
## 2821                           LIGHTHOUSE LEARNING CENTER - JJAEP 481119000000
## 2822                   LIMESTONE COUNTY JUVENILE DETENTION CENTER 482181000000
## 2823                                              Lincoln Academy 530834000000
## 2824                                                Lincoln Adult 320027000000
## 2825                              Lincoln Alternative High School 262721000000
## 2826                                       Lincoln Co Alternative 320027000000
## 2827                                        Lincoln Community Day  60006811680
## 2828                              Lincoln County Adult Correction 320027000000
## 2829                                     LINCOLN EDUCATION CENTER 270609000000
## 2830                                  Lincoln High (Continuation)  63468005835
## 2831                                          LINCOLN HIGH SCHOOL  80405001611
## 2832                                          LINCOLN HIGH SCHOOL 160093000000
## 2833                                          Lincoln High School 530945000000
## 2834                                          Lincoln High School 530682000000
## 2835                                     Lincoln Hill High School 530834000000
## 2836                                         Lincoln Hills School 550004000000
## 2837                                         LINCOLN JACKSON ARTS 350057000000
## 2838                                             LINCOLN PARK SCH 481168000000
## 2839                                          Lincoln School ALOP 170021000000
## 2840                                          Lincoln School RSSP 170021000000
## 2841                                         Lincoln School TAOEP 170021000000
## 2842                      Lincoln Trail Behavioral Health Systems 210249000000
## 2843                                               LINDA TUTT H S 483918000000
## 2844                                        Lindsay Community Day  62187008420
## 2845                             LITCHFIELD AREA LEARNING PROGRAM 271821000000
## 2846                            LITTLE FALLS CONTINUING EDUCATION 271824000000
## 2847                                                  LITTLE SAND 273087000000
## 2848                                             LIVE OAK ACADEMY 480001000000
## 2849                                         Live Oak Alternative  62205009891
## 2850                                 Live Oak High (Continuation)  60285000213
## 2851                                       LIVINGSTON COUNTY JAIL 361194000000
## 2852                                       LIVINGSTON H S ACADEMY 482778000000
## 2853                           LIZZIE M BURGES ALTERNATIVE SCHOOL 483969000000
## 2854                                        Lloyd Hance Community  69101410510
## 2855                                                      LMP ROE 170019000000
## 2856                                                LMP ROE TAOEP 170019000000
## 2857                                           LOCKHART PRIDE H S 482787000000
## 2858                                                 LOCKNEY DAEP 482789000000
## 2859                                         Loconoma Valley High  62475003707
## 2860                          Lodge Pole Elementary (Alternative)  63680503059
## 2861                              Logan County Alternative School 210354000000
## 2862                        Lomita Math/Science/Technology Magnet  62271003145
## 2863                                        LONE STAR HIGH SCHOOL 120048000000
## 2864                                               Long Barn High  63828009645
## 2865                                               Long Term Case  10117001631
## 2866                                      Longfellow Alt Extended 272124000000
## 2867                                       Longfellow Alternative 272124000000
## 2868                                   Longview Elementary School  40567001170
## 2869                                         LONGVIEW HIGH SCHOOL  80480000988
## 2870                                             LOOKOUT MOUNTAIN  80028606668
## 2871                                   Loon Lake Homelink Program 530450000000
## 2872                                           Loowit High School 530000000000
## 2873                                      Lopez Continuation High  62308003523
## 2874                                                 LOPEZ SCHOOL 280063000000
## 2875                                         Lorin Griset Academy  63531006001
## 2876                                     Loring Nicollet Extended 272124000000
## 2877                                         LORING-NICOLLET HIGH 272124000000
## 2878                                LORRIE YEAGER JUVENILE CENTER 540051000000
## 2879                                                   Los Amigos  62958008728
## 2880                      Los Angeles Center for Enriched Studies  62271008887
## 2881                                    Los Molinos Community Day  62286007462
## 2882                                   Los Padrinos Juvenile Hall  69107812757
## 2883                                    Los Robles Magnet Academy  63186013130
## 2884                                        LOTT DETENTION CENTER 482460000000
## 2885                               LOTT JUVENILE DETENTION CENTER 484228000000
## 2886                                   Loudoun Academy of Science 510225000000
## 2887                          Loudoun Co. Juvenile Detention Home 510004000000
## 2888                                               Louisville Day 210299000000
## 2889                                Louisville Metro Youth Center 210299000000
## 2890                                                 LOVEJOY DAEP 482838000000
## 2891                                                  Lovell High  61035001158
## 2892                      LOWER EAST SIDE PREPARATORY HIGH SCHOOL 360008000000
## 2893                            LOWNDES COUNTY ALTERNATIVE SCHOOL 280273000000
## 2894                                      Loysville Youth Dev Ctr 420993000000
## 2895                                           LPS CAREER ACADEMY 317284000000
## 2896     Lrng in an Urban Comm with High Achievement (L.U.C.H.A.)  60231011445
## 2897                                                      LS MNIC 273384000000
## 2898                           LSH MIDDLE SCHOOL ALTERNATIVE PROG 271807000000
## 2899                                         LUBBOCK CO J J A E P 482412000000
## 2900                                         LUBBOCK CO J J A E P 483243000000
## 2901                                         LUBBOCK CO J J A E P 482850000000
## 2902                                         LUBBOCK CO J J A E P 484044000000
## 2903                                         LUBBOCK CO J J A E P 481983000000
## 2904                              LUBBOCK CO JUVENILE JUSTICE CTR 482850000000
## 2905                                         LUBBOCK CO YOUTH CTR 483780000000
## 2906                                         LUBBOCK CO YOUTH CTR 483987000000
## 2907                              LUBBOCK-COOPER NEW HOPE ACADEMY 481518000000
## 2908                                 Lucerne Valley Community Day  60001506466
## 2909                                     Luke C Moore High School 110003000000
## 2910                                  LUVERNE ALTERNATIVE PROGRAM 271833000000
## 2911                         Lynchburg City Secondary Alternative 510007000000
## 2912                            Lynchburg Juvenile Detention Home 510004000000
## 2913                                               Lynden Academy 530462000000
## 2914                                        LYNDON B JOHNSON DAEP 482142000000
## 2915                                          Lynwood Alternative  62316013431
## 2916                                  Lyon County Adult Education 320030000000
## 2917                                                   LYTLE DAEP 482865000000
## 2918                                          M S U at New Lisbon 340009000000
## 2919                                                  MABANK DAEP 482922000000
## 2920                                    Mabton Step Up To College 530465000000
## 2921                                     MACCORMICK SECURE CENTER 360013000000
## 2922                                MACCRAY Area Learning Program 270009000000
## 2923                                              MacDougall High 450000000000
## 2924                                MacGregor High (Continuation)  60186007638
## 2925                                         Mackinaw High School 263045000000
## 2926                                 Macomb Correctional Facility 260000000000
## 2927                        Macon Regional Youth Detention Center 130003000000
## 2928                               Macon Youth Development Campus 130003000000
## 2929                            Madera County Independent Academy  69101712301
## 2930                                         Mades-Johnstone RSSP 170019000000
## 2931                                   Madison Alternative Center 510267000000
## 2932                               MADISON CO. ALTERNATIVE SCHOOL 280279000000
## 2933                                       Madison Community High  61293007705
## 2934                            Madison County Alternative School  10222000978
## 2935                                 Madison County Day Treatment 210372000000
## 2936            MADISON COUNTY EXCEL ALTERNATIVE EDUCATION CENTER 120120000000
## 2937                              Madison Preparatory High School 262229000000
## 2938                                          MADISON TAP PROGRAM 120120000000
## 2939                                            Madrona Nongraded 530240000000
## 2940                                    Madrone High Continuation  63511005937
## 2941                                     MAGIC VALLEY HIGH SCHOOL 160324000000
## 2942                                MAHNOMEN AREA LEARNING CENTER 271866000000
## 2943                                 Maidu High Independent Study  63075010269
## 2944                                        Maie Ellis Elementary  61350013914
## 2945                                          Main Street Academy 370150000000
## 2946                               MAIN STREET ALTERNATIVE SCHOOL 280186000000
## 2947                                      MAIN STREET HIGH SCHOOL 120147000000
## 2948                            Maine Prairie High (Continuation)  61128001253
## 2949                            Major General Raymond Murray High  64119012180
## 2950                           MALAKOFF ALTERNATIVE PROGRAM (MAP) 482878000000
## 2951                                                         MALC 262391000000
## 2952                                          Malcolm High School 263099000000
## 2953                                 MALCOLM RECTOR TECHNICAL H S 483209000000
## 2954                             Manistique Alternative Ed Center 262247000000
## 2955                                    MANKATO AREA NIGHT SCHOOL 271878000000
## 2956                                   MANKATO AREA SUMMER SCHOOL 271878000000
## 2957                                                 Manning High 450000000000
## 2958                                          MANOR EXCEL ACADEMY 482889000000
## 2959                                 Manteca Community Day (7-12)  62361006561
## 2960                                  Manteca Community Day (K-6)  62361007364
## 2961                                      Manzanita Community Day  60011607169
## 2962                          Maple Grove Alternative High School 263649000000
## 2963                                                   Maple High  62241002687
## 2964                            Maple Valley Pathways High School 262262000000
## 2965                                        Maplewood Parent Coop 530240000000
## 2966                                              Marathon School  20039000513
## 2967                                                    MARC High  60006700732
## 2968                                        Marce Becerra Academy  60004406727
## 2969                                          March Mountain High  62580003868
## 2970                                                 March Valley  62580008561
## 2971                                             Margaret J. Kemp  69103312003
## 2972                                           Marie L. Hare High  61488007724
## 2973                     Marietta Regional Youth Detention Center 130003000000
## 2974                                  Marin County Juvenile Court  69101811913
## 2975                                              Marin Oaks High  62772004190
## 2976                                            Marin's Community  69101809230
## 2977                              MARINE SCIENCE EDUCATION CENTER 120048000000
## 2978                                    MARION ALTERNATIVE CENTER 482910000000
## 2979                             Marion County Alternative School  10231000985
## 2980                                          MARION PARK COMPLEX 280291000000
## 2981                        MARION REG. JUVENILE DETENTION CENTER 120126000000
## 2982                                   MARION TECHNICAL INSTITUTE 120126000000
## 2983                                         MARION YOUTH ACADEMY 120126000000
## 2984                          Mariposa School of Global Education  62100012182
## 2985                         MARLIN ALTERNATIVE EDUCATION PROGRAM 483711000000
## 2986                                                  MARLIN DAEP 481392000000
## 2987                                      Marquette Branch Prison 260000000000
## 2988                                  Marshall Alternative School  10000600986
## 2989                                         Marshall High School 410198000000
## 2990                             Marshall Opportunity High School 262297000000
## 2991                                             Marshall Virtual 262297000000
## 2992                             MART ACADEMIC ALERNATIVE PROGRAM 482919000000
## 2993              Martha K. Glaze Regional Youth Detention Center 130003000000
## 2994                                  MARTIN COUNTY GIRLS ACADEMY 120129000000
## 2995                                           MARTIN COUNTY JAIL 120129000000
## 2996                        Martin L King Acad for Excellence Alt 210186000000
## 2997                                MARVIN W FOOTE YOUTH SERVICES  80291006344
## 2998                                           Mary B. Perry High  60142207920
## 2999                                     MARY BETHUNE ALTERNATIVE 280180000000
## 3000                                      MARY E SMITHEY PACE H S 481764000000
## 3001                      Mary Jo and William MacDonald Maryhurst 210299000000
## 3002                                    Mary Meredith K-12 School  40880001606
## 3003                                   Mary Moss at Adams Academy 240006000000
## 3004                            Mary Walker Alternative High Schl 530483000000
## 3005                                          Mary Walker Promise 530483000000
## 3006                                     Marysville Community Day  62409013879
## 3007                         Marysville Mountain View High School 530486000000
## 3008                        Marysville NWESD 189 Youth Engagement 530486000000
## 3009                                   MARYVILLE TREATMENT CENTER 290003000000
## 3010                                                MASH-KA-WISEN 270759000000
## 3011                              MASON COUNTY SCHOOL FOR SUCCESS 540078000000
## 3012                                 MasonAirport Virtual Academy 262310000000
## 3013                                        Mat-Su Youth Facility  20051000407
## 3014                                                        MATEC 271894000000
## 3015                                     MATTHEWS LEARNING CENTER 482850000000
## 3016                            MATTIE V RUTHERFORD ALT ED CENTER 120048000000
## 3017                        MAVERICKS HIGH SCHOOL AT PALM SPRINGS 120150000000
## 3018                       Maya Angelou Academy at New Beginnings 110009000000
## 3019                                             MAYA ANGELOU H S 481623000000
## 3020                                 Maya Angelou PCS High School 110001000000
## 3021                                                     Maya Lin  60177013107
## 3022                            Mayfield Youth Development Center 210228000000
## 3023                                MC COOK ALTERNATIVE EDUCATION 317347000000
## 3024                                MC LAIN COMMUNITY HIGH SCHOOL  80480001349
## 3025                                      McBain JrSr High School 262331000000
## 3026                                         McClarin High School 130228000000
## 3027                                McClellan High (Continuation)  60790009343
## 3028                                 McCracken Open Campus School 210396000000
## 3029                                    McCracken Regional School 210396000000
## 3030                                             McCreary Academy 210399000000
## 3031                                     McDaniel Learning Center 210321000000
## 3032                                       MCF - OAK PARK HEIGHTS 270027000000
## 3033                                  MCF-MOOSE LAKE/WILLOW RIVER 270027000000
## 3034                             MCF-REDWING MAGINNIS HIGH SCHOOL 270027000000
## 3035                                        McFarland Independent  62423007779
## 3036                               MCGREGOR AREA LEARNING PROGRAM 271917000000
## 3037                                            McKee PreK Center  10243002207
## 3038                                    McKellips Learning Center  40497000578
## 3039                                             McKinley Academy 550861000000
## 3040                                      McKinley Charter School 550405000000
## 3041                                          MC LAIN HIGH SCHOOL  80480006163
## 3042                                  McLaughlin Secondary School  20018000432
## 3043                                MCLENNAN CO CHALLENGE ACADEMY 483129000000
## 3044                            MCLENNAN COUNTY CHALLENGE ACADEMY 482214000000
## 3045                            MCLENNAN COUNTY CHALLENGE ACADEMY 484376000000
## 3046                            MCLENNAN COUNTY CHALLENGE ACADEMY 482061000000
## 3047                                                  McNair Camp  69107812626
## 3048                               McNaughton Correctional Center 550004000000
## 3049                                                  MCSO ADULTS 120126000000
## 3050                                               MCSO JUVENILES 120126000000
## 3051                                 Mead Alternative High School 530492000000
## 3052                              Mead Education Partnership Prog 530492000000
## 3053                                              Mead Open Doors 530492000000
## 3054                                          Meadowbrook Academy 370438000000
## 3055                                    Meadowbrook Community Day  60016007168
## 3056                                           Meadowlark Academy 568026000000
## 3057                                   Meadowood Education Center 240012000000
## 3058                                            Meadowood Program 100130000000
## 3059                         Medical Lake Alternative High School 530495000000
## 3060                                        MEDLOCK YOUTH VILLAGE 480009000000
## 3061                         MELBOURNE CENTER FOR PERSONAL GROWTH 120015000000
## 3062                                                      MELROSE 273378000000
## 3063                                                 MELROSE HIGH 120018000000
## 3064                                 MEMORIAL PATHWAY ACADEMY H S 482034000000
## 3065                                      Mendenhall William Camp  69107812675
## 3066                                        Mendocino Alternative  62448004624
## 3067                                   Mendocino County Community  69101910551
## 3068                                       Mendocino Sunrise High  62448003658
## 3069                                        Mendota Community Day  60002207970
## 3070                                    Mendota Continuation High  60002200374
## 3071                            Mendota Mental Health Institution 550004000000
## 3072                                           MENLO PARK ACADEMY 272124000000
## 3073                                  Menlo Park Academy Extended 272124000000
## 3074                                                         MERC 272124000000
## 3075                                                MERC Extended 272124000000
## 3076                    Merced City School District Community Day  62460008740
## 3077                                 Merced County Juvenile Court  69102009233
## 3078                                    MERCEDES ACADEMIC ACADEMY 483025000000
## 3079                                                MERCEDES DAEP 483025000000
## 3080                               MERCEDES EARLY COLLEGE ACADEMY 483025000000
## 3081                                    MERCER & BLUMBERG LRN CTR 483969000000
## 3082                                               Mercer Central 210411000000
## 3083                                  Mercer County Day Treatment 210411000000
## 3084                                       MERCER REGIONAL SCHOOL 340009000000
## 3085                                             MERIDIAN ACADEMY 160210000000
## 3086                                Meridian Impact Re-Engagement 530501000000
## 3087                          Meridian Parent Partnership Program 530501000000
## 3088                                Merrill Adult Diploma Academy 550921000000
## 3089                                        MERRITT CREEK ACADEMY 271104000000
## 3090                            Mesa Transitional Learning Center  40386000079
## 3091                                  MESABI AREA LEARNING CENTER 271398000000
## 3092                                             MESQUITE ACADEMY 483039000000
## 3093                                   Mesquite Continuation High  63680006237
## 3094                                    METHODIST CHILDREN'S HOME 480007000000
## 3095                                        METRO HEIGHTS ACADEMY 270226000000
## 3096                                            Metro High School 190654000000
## 3097                                            METRO OPPORTUNITY 481970000000
## 3098                        Metro Regional Youth Detention Center 130003000000
## 3099                                Metro Richmond Alternative Ed 510009000000
## 3100                                                 Metro School 550852000000
## 3101                                METRO WEST DETENTION FACILITY 120039000000
## 3102                                             METROPLEX SCHOOL 482566000000
## 3103                                    Metropolitan Continuation  62271003181
## 3104                                 Metropolitan Learning Center 411004000000
## 3105                                           MIAMI BRIDGE NORTH 120039000000
## 3106                                           MIAMI BRIDGE SOUTH 120039000000
## 3107                                        MIAMI MACARTHUR SOUTH 120039000000
## 3108                                          MIAMI YOUTH ACADEMY 120039000000
## 3109                                        Mica Peak High School 530111000000
## 3110                                           Michael J McGivney 268093000000
## 3111                                       Michigan Cyber Academy 261803000000
## 3112                                         Michigan Reformatory 260000000000
## 3113                             Michigan Youth Challenge Academy 262297000000
## 3114                                                Mid City High 190858000000
## 3115                               Mid Valley High (Continuation)  64254000117
## 3116              Mid-City's Prescott School of Enriched Sciences  62271002823
## 3117                              Mid-Columbia Parent Partnership 530393000000
## 3118                                    MID-VALLEY ACADEMY (PK-3) 480013000000
## 3119                                  MIDDLE AREA LEARNING CENTER 271317000000
## 3120                              MIDDLE COLLEGE H S AT HCC FRAGA 482364000000
## 3121                            MIDDLE COLLEGE H S AT HCC GULFTON 482364000000
## 3122                                          Middle College High  63531007197
## 3123                                          Middle College High  63417010366
## 3124                             MIDDLE LEVEL ALTERNATIVE PROGRAM 270609000000
## 3125                                 MIDDLE LEVEL LEARNING CENTER 270002000000
## 3126                                           MIDDLE LVL LRN CTR 481970000000
## 3127                     Middle Peninsula Juvenile Detention Home 510004000000
## 3128                           MIDDLE SCHOOL AREA LEARNING CENTER 273243000000
## 3129                                       Middlefork School RSSP 170021000000
## 3130                               Middlesboro Alternative School 210417000000
## 3131                                      MIDDLESEX CO  YOUTH CTR 340009000000
## 3132                                            MIDDLETON ACADEMY 160213000000
## 3133                               MIDLAND ACADEMY CHARTER SCHOOL 480015000000
## 3134                                  MIDLAND ALTERNATIVE PROGRAM 483057000000
## 3135                                   MIDVALE ALTERNATIVE SCHOOL 160216000000
## 3136                        MIDVALLEY ACADEMY-MCALLEN CHARTER H S 480013000000
## 3137                       MIDVALLEY ACADEMY-MERCEDES CHARTER H S 480013000000
## 3138                     MIDVALLEY ACADEMY-SAN BENITO CHARTER H S 480013000000
## 3139                                       MIDWAY ALTERNATIVE H S 481281000000
## 3140                               MIKE CLEMENS CENTER ADAPT LRNG 290837000000
## 3141                                  MILACA AREA LEARNING CENTER 272067000000
## 3142                                  Milan Alternative Education 262385000000
## 3143                               Miles W. Culwell Community Day  60912008696
## 3144                                               Millcreek High 490114000000
## 3145                                   MILLE LACS ACADEMY (NEXUS) 272505000000
## 3146                                  Millennium High Alternative  63033007819
## 3147                                          Miller Fred C. Camp  69107812732
## 3148                                        Milligan Academy Rssp 170020000000
## 3149                                      Milor Continuation High  63237007338
## 3150                               Milton M Daniels Learning Cntr 370502000000
## 3151                 Milwaukee County Correctional Facility South 550483000000
## 3152                      Milwaukee County Youth Education Center 550960000000
## 3153                          Milwaukee Secure Detention Facility 550004000000
## 3154                                Mineral Alternative Education 320033000000
## 3155                        Mineral County Adult Education School 320033000000
## 3156                           MINERAL COUNTY ALTERNATIVE PROGRAM 540087000000
## 3157                                        MINERAL WELLS ACADEMY 483095000000
## 3158                         MINERAL WELLS/PALO PINTO COUNTY DAEP 484170000000
## 3159                        MINGO COUNTY EXTENDED LEARNING CENTER 540090000000
## 3160                        MINI-CASSIA JUVENILE DETENTION CENTER 160219000000
## 3161                             MINNEWASKA DAY TREATMENT PROGRAM 270002000000
## 3162                          MINNEWASKA SECONDARY ALTERNATIVE PG 270002000000
## 3163                                        Minor Daniels Academy 210299000000
## 3164                                        Mission Community Day  60969012716
## 3165                                         Mission Continuation  62271003189
## 3166                                   Mission Early College High  63543014067
## 3167                                          Mission High School 320006000000
## 3168                                               Mission Valley  62241011344
## 3169                                           Mission Vista High  64119012341
## 3170                                 MISSOURI EASTERN CORR CENTER 290003000000
## 3171                                     MITCHELL GUIDANCE CENTER 484415000000
## 3172                              MITCHELL GUIDANCE CENTER MIDDLE 484415000000
## 3173                                            MLK A R T Program 170020000000
## 3174                           MN CORRECTIONAL FACILITY-FARIBAULT 270027000000
## 3175                          MN CORRECTIONAL FACILITY-LINO LAKES 270027000000
## 3176                           MN CORRECTIONAL FACILITY-RUSH CITY 270027000000
## 3177                            MN CORRECTIONAL FACILITY-SHAKOPEE 270027000000
## 3178                           MN CORRECTIONAL FACILITY-ST. CLOUD 270027000000
## 3179                          MN CORRECTIONAL FACILITY-STILLWATER 270027000000
## 3180                                 MN ONLINE HIGH SCHOOL - I.S. 270003000000
## 3181                             MN RIVER VALLEY ALC - IND. STUDY 270006000000
## 3182                                MN RIVER VALLEY ALC-SEATBASED 270006000000
## 3183                                   MN RIVER VALLEY ALC-SUMMER 270006000000
## 3184                                    MN SECURITY HOSPITAL YAAP 273387000000
## 3185                            MN SPECIALTY HEALTH SYS-CAMBRIDGE 270741000000
## 3186                                           MOVIP ELEM. SCHOOL 290061000000
## 3187                                            MOVIP HIGH SCHOOL 290061000000
## 3188                                       Moccasin Community Day  69113707914
## 3189                                  Modoc County Juvenile Court  69109309063
## 3190                                                  Mojave High  60001409073
## 3191                                Mokelumne High (Continuation)  63311002535
## 3192                             MOLLY CREEK AREA LEARNING CENTER 273828000000
## 3193                                              MONAHANS ED CTR 483117000000
## 3194                                                      Monarch  69103012496
## 3195                                          Moneta Continuation  62271003190
## 3196                                     Monmouth Regional School 340009000000
## 3197                       Monmouth Transitional Education Center 340009000000
## 3198                           MONROE CO ADVANCED LEARNING CENTER 280294000000
## 3199                                 MONROE CORRECTIONAL FACILITY 362475000000
## 3200                                   Monroe High (Continuation)  63888007886
## 3201                             MONROE JUVENILE DETENTION CENTER 120132000000
## 3202                                Monroe/Randolph Red Brick Sch 170020000000
## 3203                   MONTBELLO CAREER AND TECHNICAL HIGH SCHOOL  80336006591
## 3204                                                  Monte Vista  63684009639
## 3205                                             Monte Vista High  62724008919
## 3206                                  MONTE VISTA ON-LINE ACADEMY  80576001560
## 3207                                     Montebello Community Day  62547008726
## 3208                                Montecito High (Continuation)  63171004906
## 3209                                        Monterey Continuation  62271003197
## 3210                                 Monterey High (Continuation)  60645008120
## 3211                                Monterey Peninsula Unified Sc  62553012178
## 3212     Monterey Peninsula Unified School District Community Day  62553011941
## 3213                                           Montgomery Central 510252000000
## 3214                                      MONTGOMERY CO J J A E P 483126000000
## 3215                                  Montgomery Learning Academy 370306000000
## 3216                               MONTICELLO ALTERNATIVE PROGRAM 272139000000
## 3217                        Montrose Alternative Education Center 262442000000
## 3218                             MORA ALTERNATIVE LEARNING CENTER 272148000000
## 3219                                        MORA MIDDLE LEVEL ALC 272148000000
## 3220                            Morehead Youth Development Center 210510000000
## 3221                                   Moreno High (Continuation)  60483000470
## 3222                                 Moreno Valley Online Academy  62580013683
## 3223                                Morgan County Learning Center  10248001526
## 3224                                            MorganShaw School 260650000000
## 3225                                     Morris Behavior Jr/Sr HS 320006000000
## 3226                                         MORRIS CO  YOUTH CTR 340009000000
## 3227                                       Morris Regional School 340009000000
## 3228                               Morris Sunset East High School 320006000000
## 3229                         Morris Transitional Education Center 340009000000
## 3230                            MORRISON ACADEMIC ADVANCEMENT CTR 280219000000
## 3231                                Morrison Alt Learning Program 170020000000
## 3232                                   Morton Alternative Schools 170022000000
## 3233                                                MORTON SCHOOL 310015000000
## 3234                            Mosaic Home Education Partnership 530033000000
## 3235                                                Mosaic School 260956000000
## 3236                                MOSS POINT ALTERNATIVE SCHOOL 280300000000
## 3237                                            Mossyrock Academy 530525000000
## 3238                                  MOUNDS VIEW ADULT EDUCATION 272295000000
## 3239                                              MOUNDS VIEW ALC 272295000000
## 3240                                          Mount Baker Academy 530531000000
## 3241                                          MOUNT PLEASANT DAEP 483176000000
## 3242                                              Mount Toro High  63398005334
## 3243                                                 Mount Vernon 370472000000
## 3244                                      Mount Vernon Open Doors 530540000000
## 3245                             MOUNT VIEW YOUTH SERVICES CENTER  80028606703
## 3246                                                Mountain High 490021000000
## 3247                                                Mountain High  63261005073
## 3248                                         Mountain High School 320051000000
## 3249                                          Mountain Lakes High  61495001631
## 3250                                        Mountain Rose Academy  40020401962
## 3251                   Mountain Shadows Education Center - Closed  40079002345
## 3252                                      Mountain Valley Academy  63171008945
## 3253                                  Mountain View (Alternative)  61970009385
## 3254                                           Mountain View High 510126000000
## 3255                                           Mountain View High  60001503907
## 3256                                           Mountain View High  63444005692
## 3257                            Mountain View High (Continuation)  61347008137
## 3258                               Mountain View Learning Academy  60210007300
## 3259                                          Mountain Vista High  62334012807
## 3260                                        Mountain Vista School  40564001416
## 3261                         MOUNTAINVIEW ALTERNATIVE HIGH SCHOOL 160180000000
## 3262                           MOUNTAINVIEW CORRECTIONAL FACILITY 340009000000
## 3263                               MOUNTVIEW YOUTH SERVICE CENTER  80480006347
## 3264                               MPLS. H.S. ALTERNATIVE PROGRAM 272124000000
## 3265                                                  MPS METRO C 272124000000
## 3266                                                 MPS METRO HA 272124000000
## 3267                                                 MPS METRO SJ 272124000000
## 3268                                       MT HARRISON JR/SR HIGH 160219000000
## 3269                     Mt Morris Education and Community Center 262472000000
## 3270                                 Mt Vernon Alternative School 170017000000
## 3271                                          Mt. Everest Academy  63432009437
## 3272                               Mt. Lassic High (Continuation)  63763010335
## 3273                                      Mt. Lukens Continuation  62271003201
## 3274                                             Mt. Madonna High  61518001915
## 3275                                                 Mt. McKinley  69100512486
## 3276                     Mt. Olive Innovation and Technology High  61152001286
## 3277                               Mt. Rainier Parent Partnership 530237000000
## 3278                                         Mt. San Jacinto High  62955008931
## 3279                                              Mt. Tallac High  62064002479
## 3280                     Mukilteo Reengagement Academy Open Doors 530543000000
## 3281                                                  MULLIN OAKS 483192000000
## 3282                                               MULLINS SCHOOL 280084000000
## 3283                               KOZMETSKY AT RATHGEBER VILLAGE 480007000000
## 3284                                  Murdock Academy for Success 251308000000
## 3285                                      Murrieta Canyon Academy  60002911241
## 3286                            Muscogee Youth Development Center 130003000000
## 3287                          Muskegon Community Education Center 262484000000
## 3288                   Muskegon County Juvenile Transition Center 268085000000
## 3289                                    Muskegon Covenant Academy 260109000000
## 3290                                         N.A. Chaderjian High  60142207739
## 3291                               N.E. REGIONAL CORRECTION CNTR. 273009000000
## 3292        N.W.  (Northwestern) Regional Juvenile Detention Home 510004000000
## 3293                                          Nachusa Campus RSSP 170020000000
## 3294                                        Nachusa Campus School 170020000000
## 3295                                 NACOGDOCHES CO ALTER ED COOP 481398000000
## 3296                                 NACOGDOCHES CO ALTER ED COOP 482925000000
## 3297                                 NACOGDOCHES CO ALTER ED COOP 483209000000
## 3298                                 NACOGDOCHES COUNTY DAEP COOP 482040000000
## 3299                                        Napa County Community  69102207574
## 3300                              Napa County Juvenile Hall/Court  69102209235
## 3301                                      Napa County Opportunity  69102200721
## 3302                              Napa Valley Independent Studies  62664011271
## 3303                                NAPLES AREA TEENAGE PARENTING 120033000000
## 3304                                        NASHWAUK-KEEWATIN ALP 272331000000
## 3305                          NASSAU CO JUVENILE DETENTION CENTER 363096000000
## 3306                                     NASSAU COMMUNITY ACADEMY 120135000000
## 3307                                  Natural High (Continuation)  62067002486
## 3308                                       NAVARRO COUNTY AEP/ABC 482004000000
## 3309                                      NAVARRO COUNTY DAEP/ABC 481047000000
## 3310                                               NE Metro North 270226000000
## 3311                                              NE Metro Tartan 270226000000
## 3312                    NeavesDavis Detention Center for Children  10180001375
## 3313                                       NEBRASKA YOUTH ACADEMY 310017000000
## 3314                                       NECA INDEPENDENT STUDY 270003000000
## 3315                                        Needles Community Day  62676013912
## 3316                                              Nekoosa Academy 551038000000
## 3317            NELSON R MANDELA/DR HOSEA ZOLLICOFFER HIGH SCHOOL 362010000000
## 3318                                                         NETS 272295000000
## 3319                                  NEVIS AREA LEARNING PROGRAM 272337000000
## 3320                            NEW ALBANY/S.TIPPAH/UNION CO. ALT 280312000000
## 3321                                   NEW AMERICA SCHOOL - LOWRY  80002001882
## 3322                                NEW AMERICA SCHOOL - THORNTON  80002006480
## 3323                                 New Approach Alternative H S 170017000000
## 3324                                               New Beginnings 530237000000
## 3325                                          New Beginnings - 89 460207000000
## 3326                                      NEW BEGINNINGS - NAPLES 120033000000
## 3327                       New Beginnings Alternative High School 260852000000
## 3328                              NEW BEGINNINGS EDUCATION CENTER 120147000000
## 3329                                   NEW BEGINNINGS HIGH SCHOOL 120159000000
## 3330                                     NEW BEGINNINGS IMMOKALEE 120033000000
## 3331                            Gifford St Regional Safe Sch Prog 170019000000
## 3332                                              NEW BOSTON DAEP 482370000000
## 3333                                              NEW BOSTON DAEP 482946000000
## 3334                                              NEW BOSTON DAEP 483675000000
## 3335                                              NEW BOSTON DAEP 483234000000
## 3336                                              NEW BOSTON DAEP 484032000000
## 3337                                   New Bridge Learning Center 510189000000
## 3338                                                   NEW CHANCE 270003000000
## 3339                                              NEW CONNECTIONS 273239000000
## 3340                                  NEW CONNECTIONS DAY PROGRAM 270003000000
## 3341                                                NEW DEAL DAEP 483243000000
## 3342                                                New Direction  10303001418
## 3343                                        NEW DIRECTION LRN CTR 482526000000
## 3344                                               NEW DIRECTIONS 480006000000
## 3345                                      New Directions - Geneva 170019000000
## 3346                  New Directions Alternative Education Center 510313000000
## 3347                      New Directions Alternative H.S. Program 510027000000
## 3348                                        New Directions Center 510300000000
## 3349                                       New Directions Program 170019000000
## 3350                                         NEW DOMINION ACADEMY 270345000000
## 3351           New Dominion Alternative Center/Prince William Co. 510009000000
## 3352                                           NEW FUTURES SCHOOL 350006000000
## 3353                                                     NEW HOPE 480026000000
## 3354                                             New HOPE Academy 510198000000
## 3355                                            NEW HOPE ALT HIGH 350174000000
## 3356                                                 NEW HOPE H S 482703000000
## 3357                               New Horizon Alternative School  10033001264
## 3358                                              NEW HORIZON H S 482493000000
## 3359                                             New Horizon High  60384000352
## 3360                                      NEW HORIZON HIGH SCHOOL 160264000000
## 3361                                                 NEW HORIZONS 480024000000
## 3362                                                 NEW HORIZONS 120159000000
## 3363                                     NEW HORIZONS ALTERNATIVE 292616000000
## 3364                                    New Horizons for Learning 551380000000
## 3365                                     New Horizons High School 530657000000
## 3366                                     New Horizons High School  20010000434
## 3367                                 NEW HORIZONS LEARNING CENTER 482172000000
## 3368                                                NEW J J A E P 482478000000
## 3369                                   NEW JERSEY TRAINING SCHOOL 340009000000
## 3370                                    New Jersey Virtual School 348024000000
## 3371                                              NEW LEAF CENTER 120126000000
## 3372                          New Lisbon Correctional Institution 550004000000
## 3373                                NEW LONDON ALTERNATIVE SCHOOL 272340000000
## 3374                                       New Market High School 530910000000
## 3375                                      New Mission High School 250279000000
## 3376                                      New Options High School 260255000000
## 3377                                                     New Path 551095000000
## 3378                               NEW PATHS AREA LEARNING CENTER 270972000000
## 3379                                          NEW PATHWAYS CENTER 482253000000
## 3380                                   NEW PRAGUE CREDIT RECOVERY 272343000000
## 3381                            NEW PRAGUE SUMMER CREDIT RECOVERY 272343000000
## 3382                     New River Valley Juvenile Detention Home 510004000000
## 3383                                     New School Community Day  62949007436
## 3384                                                    New Start 530354000000
## 3385                         New Start - Basic Alternative Center 510189000000
## 3386                                          New Technology High  62664006081
## 3387                                 New Valley Continuation High  63543006053
## 3388                                              New Vision High  62361011776
## 3389                                       NEW VISION HIGH SCHOOL 160267000000
## 3390                              NEW YORK CITY CHILDREN'S CENTER 360013000000
## 3391                                    NEWARK INNOVATION ACADEMY 341134000000
## 3392                                    NEWARK LEADERSHIP ACADEMY 341134000000
## 3393                               Newberry Correctional Facility 260000000000
## 3394                     NEWBURGH PREPARATORY CHARTER HIGH SCHOOL 360110000000
## 3395                                         ESL Newcomer Academy 210299000000
## 3396                                              NEWCOMER CENTER 480870000000
## 3397                                   Newcomers Community School 261644000000
## 3398                                        NEWESD 101 Open Doors 530001000000
## 3399                       Newman-Crows Landing Independent Study  62720006764
## 3400                         Newport News Juvenile Detention Home 510004000000
## 3401                                      Newport Regional School 210444000000
## 3402                            Newton College and Career Academy 130393000000
## 3403                                        Next Wave Junior High 251089000000
## 3404                                                Nexus Academy  62772013036
## 3405                                              NF Woods Campus 370312000000
## 3406                                          NIAGARA COUNTY JAIL 361767000000
## 3407                                 NICKLAUS CHILDREN'S HOSPITAL 120039000000
## 3408                                              Nidorf Barry J.  69107812665
## 3409                                                    NIGHT SCH 483510000000
## 3410                    NIKOLA TESLA EDUCATION OPPORTUNITY CENTER  80306000232
## 3411                                            Cedar Lane School 262556000000
## 3412                           Niles Comm Schools Adult Education 262556000000
## 3413                                        NISD BEXAR COUNTY JJA 483312000000
## 3414                                            NISD INTERVENTION 483312000000
## 3415                                       NIXON-SMILEY CISD DAEP 483274000000
## 3416                                            NIXON-SMILEY DAEP 483555000000
## 3417                                            NIXON-SMILEY PACE 483274000000
## 3418                                            NLC Day Treatment 270022000000
## 3419                            Noel C. Taylor Academy At Oakland 510330000000
## 3420                                          Nome Youth Facility  20057000332
## 3421                                                NON SCHOOL PK 120105000000
## 3422                                     Norfolk Alternative High 510267000000
## 3423                                   Norfolk Alternative Middle 510267000000
## 3424                            Norfolk Juvenile Detention Center 510004000000
## 3425                                           Normative Services 560001000000
## 3426                                Norris Academy Virtual School 551071000000
## 3427                                         North Area Community  69102711053
## 3428                                  NORTH BRANCH LAB SCHOOL ALC 272382000000
## 3429 ALACHUA MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIES 120003000000
## 3430                                       NORTH CENTRAL REGIONAL 292110000000
## 3431                               North Central Secure Trmnt Unt 420993000000
## 3432                            NORTH CONEJOS ALTERNATIVE PROGRAM  80510006601
## 3433                               North Cook Young Adult Academy 170022000000
## 3434                               NORTH DELTA ALTERNATIVE SCHOOL 280465000000
## 3435                                         NORTH EAST J J A E P 483294000000
## 3436                               NORTH EDUCATION CENTER ACADEMY 270003000000
## 3437                               North Franklin Virtual Academy 530573000000
## 3438                                    NORTH GARDENS HIGH SCHOOL 120039000000
## 3439                                          NORTH HEIGHTS ALTER 480813000000
## 3440                                          NORTH HEIGHTS ALTER 483726000000
## 3441                          NORTH HIGH SCHOOL ENGAGEMENT CENTER  80336006569
## 3442                                       North Lake High School 263267000000
## 3443                                 North Mason Homelink Program 530579000000
## 3444           North Monterey County Center for Independent Study  62759009412
## 3445                                   NORTH NICHOLAS HIGH SCHOOL 120108000000
## 3446                             NORTH PANOLA ACHIEVEMENT ACADEMY 280321000000
## 3447                                 North Park Continuation High  60369000335
## 3448                                       NORTH PARK HIGH SCHOOL 120039000000
## 3449                              NORTH PLAINS OPPORTUNITY CENTER 481761000000
## 3450                                          North Point Academy  62688007794
## 3451                                           North Star Academy 260015000000
## 3452                                           North Star Academy 550213000000
## 3453                                 North Star Independent Study  60245006975
## 3454                                     North Star Online School 320048000000
## 3455                                        Cascade Community Day  60768007441
## 3456                                North State Independence High  63660010676
## 3457                                    NORTH TAMPA EPIC 3 CENTER 120087000000
## 3458                  NORTH TEXAS COLLEGIATE ACADEMY-NORTH CAMPUS 480019000000
## 3459                  NORTH TEXAS COLLEGIATE ACADEMY-SOUTH CAMPUS 480019000000
## 3460                    NORTH TEXAS STATE HOSPITAL - AFP - VERNON 484411000000
## 3461                                        NORTH UNIVERSITY HIGH 120018000000
## 3462                                            North Valley High  60270000197
## 3463                             North Valley High (Continuation)  60004507089
## 3464                                     North Whiteville Academy 370492000000
## 3465               NORTH/CENTRAL AREA ALTERNATIVE LEARNING CENTER 120015000000
## 3466                                       Northeast Academy East 170019000000
## 3467                                      Northeast Academy North 170019000000
## 3468                            NORTHEAST MS REGIONAL ALTERNATIVE 280082000000
## 3469                               NORTHEAST NE JUVENILE SERVICES 310015000000
## 3470                         Northeast Wisconsin Learning Academy 551092000000
## 3471                        NORTHEASTERN NM CORRECTIONAL FACILITY 350001000000
## 3472                                 Northern Ky Youth Dev Center 210309000000
## 3473                                      NORTHERN LIGHTS ACADEMY 270972000000
## 3474                        Northern Neck Regional Alternative Ed 510010000000
## 3475                           NORTHERN PALMS CHARTER HIGH SCHOOL 120108000000
## 3476                    Northern Virginia Juvenile Detention Home 510004000000
## 3477                                    Northern Wisconsin Center 550004000000
## 3478                              NORTHFIELD AREA LEARNING CENTER 272388000000
## 3479                                NORTHLAND LEARNING CENTER 010 270022000000
## 3480                                NORTHLAND LEARNING CENTER 040 270022000000
## 3481                                NORTHLAND LEARNING CENTER 050 270022000000
## 3482                                NORTHLAND LEARNING CENTER 060 270022000000
## 3483                                           Northpoint Academy 210480000000
## 3484                                   Northport Homelink Program 530588000000
## 3485                                          Northshore Networks 530591000000
## 3486                                     Northshore Online School 530591000000
## 3487                                  NORTHSIDE JR/SR HIGH SCHOOL 160159000000
## 3488                                      Northstar Middle School 530423000000
## 3489                            Northview Alternative High School 262595000000
## 3490                            Northwest Alternative High School 262601000000
## 3491                               NORTHWEST AREA LEARNING CENTER 273885000000
## 3492                           Northwest Wyoming Treatment Center 568026000000
## 3493                           Northwestern Evening/Saturday High 240051000000
## 3494                                        WESTERN NM CORRECTION 350001000000
## 3495                                      NOVA ALTERNATIVE SCHOOL 310015000000
## 3496                                      NOVA Discipline Academy 262619000000
## 3497                                        Nova Education Center  62772004199
## 3498                                             Nova High School 530771000000
## 3499              NOVA-Northwest Opportunities Vocational Academy 550960000000
## 3500                                     Noyo High (Continuation)  61407000660
## 3501                                      NSO - Independent Study 270003000000
## 3502                                                 NU Tech High  62688010261
## 3503                                          NUECES CO J J A E P 483537000000
## 3504                                          NUECES CO J J A E P 483744000000
## 3505                                          NUECES CO J J A E P 481938000000
## 3506                                          NUECES CO J J A E P 481527000000
## 3507                                          NUECES CO J J A E P 484335000000
## 3508                                          NUECES CO J J A E P 481242000000
## 3509                                          NUECES CO J J A E P 481026000000
## 3510                                      Nueva Continuation High  61954002351
## 3511                                Nueva Vista Continuation High  61926002315
## 3512                                Nueva Vista Continuation High  60411000375
## 3513                                           NW Learning Center 530267000000
## 3514                                   Nye County Adult Education 320036000000
## 3515                            NYS DEPT OF CORRECTIONS PLACEMENT 360013000000
## 3516                                               O C TAYLOR CTR 480967000000
## 3517                               OAK CLIFF FAITH FAMILY ACADEMY 480011000000
## 3518                                                Oak Glen High  60006908608
## 3519                                        Oak Hills High School 270003000000
## 3520                                        Oak Knoll Alternative  60819005854
## 3521                                     Oak Meadow Community Day  63680507971
## 3522                        Oak Park Alternative Education Center 262619000000
## 3523                                         Oak Park Independent  62785011539
## 3524                                     Oak Park Virtual Academy 262619000000
## 3525                                               Oak Ridge RSSP 170019000000
## 3526                                       Oak Tree Community Day  62958012221
## 3527                                                Oak View High  62785007799
## 3528                      Oak View High School & Education Center  64356011216
## 3529                                                      Oakdale  60837008450
## 3530                                          Oakendell Community  69100311572
## 3531                             Oakhill Correctional Institution 550004000000
## 3532                                          Oakland High School 530870000000
## 3533                                   Oakland International High  62805012049
## 3534                                  Oakland Opportunity Academy 268088000000
## 3535                                              Oakridge Fusion 262622000000
## 3536                                                 OAKS ACADEMY 480140000000
## 3537                                   Oaks Correctional Facility 260000000000
## 3538                                   Oakview High (Alternative)  60270005415
## 3539                                      Oasis Continuation High  61983002384
## 3540                                     Oasis High (Alternative)  61353005258
## 3541                                                   OASIS K-12 530630000000
## 3542                                     OASIS RESIDENTIAL CENTER 120147000000
## 3543                                               OCCS:CHEP/PCHS  69102407578
## 3544                                                        OCEAN 530684000000
## 3545                               Ocean Beach Alternative School 530606000000
## 3546                                         OCEAN CO JUV DET CTR 340009000000
## 3547                                                    OCEAN RGC 340009000000
## 3548                                        Ocean Regional School 340009000000
## 3549                             Ocean Shores High (Continuation)  62825004367
## 3550                                        Ocean Trans Ed Center 340009000000
## 3551                                                  Oceana High  61893002294
## 3552                                     OCEANS BEHAVIORAL HEALTH 480744000000
## 3553                                         Odyssey Continuation  62271003235
## 3554                                    EARLY COLLEGE HIGH SCHOOL  80306006580
## 3555                                    Odyssey MiddleHigh School 263138000000
## 3556                                              OFF CAMPUS DAEP 482412000000
## 3557                        Oglala Lakota County Alternative - 09 466546000000
## 3558                     Ohio County Alternative Learning Program 210450000000
## 3559                                    Ohio County Day Treatment 210450000000
## 3560                                Ojibway Correctional Facility 260000000000
## 3561                                             OKALOOSA ACADEMY 120138000000
## 3562                                  OKALOOSA REGIONAL DETENTION 120138000000
## 3563            OKALOOSA TECHNICAL COLLEGE AND CHOICE HIGH SCHOOL 120138000000
## 3564                                       OKALOOSA YOUTH ACADEMY 120138000000
## 3565                             Okanogan Alternative High School 530615000000
## 3566                         Okanogan Outreach Alternative School 530615000000
## 3567                               OKEECHOBEE ACHIEVEMENT ACADEMY 120141000000
## 3568                           OKEECHOBEE INTENSIVE HALFWAY HOUSE 120141000000
## 3569                          OKEECHOBEE YOUTH DEVELOPMENT CENTER 120201000000
## 3570                                   OLDE COLUMBINE HIGH SCHOOL  80537001374
## 3571                                               Olomana School 150003000000
## 3572                            Olympia Regional Learning Academy 530618000000
## 3573                                    Olympic Continuation High  62637003963
## 3574                                  Olympic High (Continuation)  63570006098
## 3575                                  OMAHA HOME FOR BOYS SCHOOLS 310019000000
## 3576                                                       OMEGON 270003000000
## 3577                                             Omni High School 260807000000
## 3578                                                  one.Charter  69103112462
## 3579                                           ONEIDA HIGH SCHOOL 160249000000
## 3580                                                 Onizuka Camp  69107812747
## 3581                                 ONONDAGA CNTY SHERIFF'S DEPT 362859000000
## 3582                                      Opelika Learning Center  10258002098
## 3583                                                     Open Den 530180000000
## 3584                          Open Door Youth Reengagement Renton 530723000000
## 3585                          Open Doors  Re-Engagement Wenatchee 530966000000
## 3586                      Open Doors - Youth Reengagement Program 530001000000
## 3587                                           Open Doors at LWIT 530031000000
## 3588                                     Open Doors Battle Ground 530038000000
## 3589                                         Open Doors Evergreen 530270000000
## 3590                              Open Doors Reengagement Program 530129000000
## 3591                                         Open Doors Vancouver 530927000000
## 3592                       Open Doors Youth Re-Engagement Spokane 530825000000
## 3593                         Open Doors Youth Reengagement (1418) 530282000000
## 3594                         Open Doors Youth Reengagement Sultan 530855000000
## 3595                                Open Valley Independent Study  63003013962
## 3596                                         OPPORT AWARENESS CTR 482517000000
## 3597                                          Opportunity Charter  69105114090
## 3598                                          Opportunity Academy  10264001385
## 3599                                          Opportunity Academy  10105002426
## 3600                                   Opportunity Middle College 210186000000
## 3601                                          Opportunity Program  63315010029
## 3602                               Opportunity Youth Reengagement 530945000000
## 3603                                OPS VIRTUAL ELEMENTARY SCHOOL 317482000000
## 3604                                      OPS VIRTUAL HIGH SCHOOL 317482000000
## 3605                                    OPS VIRTUAL MIDDLE SCHOOL 317482000000
## 3606                                                      OPTIONS 270003000000
## 3607                                                      OPTIONS 272295000000
## 3608                                                      OPTIONS 484248000000
## 3609                                 OPTIONS AT EDINA HIGH SCHOOL 271125000000
## 3610                                                  OPTIONS H S 484071000000
## 3611                                          Options High School 530042000000
## 3612                                               OPTIONS SCHOOL  80291006563
## 3613                                            Options Secondary  63864007709
## 3614                                            Orange Grove High  60985011708
## 3615                                         ORANGE YOUTH ACADEMY 120144000000
## 3616                               Orangewood High (Continuation)  63207004945
## 3617                                              Orca K-8 School 530771000000
## 3618                                   Orchard Center High School 262415000000
## 3619                         ORCHARD VIEW ALTERNATIVE HIGH SCHOOL 362988000000
## 3620                                   Oregon Correctional Center 550004000000
## 3621                                            Orion Alternative  63213008182
## 3622                                         Orland Community Day  60004508484
## 3623                                  Oroville High Community Day  62913007947
## 3624                                                    Orr Creek  69101911685
## 3625                                                  Ortega High  60002709488
## 3626                                         Orthopaedic Hospital  62271010861
## 3627                                         Osborn Middle School  40567000461
## 3628                OSCEOLA REGIONAL JUVENILE COMMITMENT FACILITY 120147000000
## 3629                                         OSHKI MANIDOO CENTER 270444000000
## 3630                             Oshkosh Correctional Institution 550004000000
## 3631                                       Osprey Learning Center  63759006366
## 3632                         Osprey Learning Center (Alternative)  63759007880
## 3633                               Osseo ALC Alternative Programs 272520000000
## 3634                                   OSSEO AREA LEARNING CENTER 272520000000
## 3635                                                  Oswego GOAL 170018000000
## 3636                               Otsego West Campus High School 262706000000
## 3637                                          Otter Creek Academy 210579000000
## 3638                                                     Our Home 465430000000
## 3639                                           Our Home ASAP - 12 463548000000
## 3640                                    Our Home Rediscovery - 77 463548000000
## 3641                                           OUSD Community Day  62865012123
## 3642                                                OUSD Home Sch  62865012382
## 3643                             Outcomes for Academic Resilience 530420000000
## 3644                                                OUTWARD BOUND 120015000000
## 3645                                      OvidElsie Comm EdAlt HS 262715000000
## 3646                                            OWATONNA ALC 9-12 272805000000
## 3647                                   Owatonna Summer School 6-8 272805000000
## 3648                                  OWATONNA SUMMER SCHOOL 9-12 272805000000
## 3649                                      Owensboro Day Treatment 210147000000
## 3650                                 Owensboro Innovation Academy 210459000000
## 3651                                      Owensmouth Continuation  62271003257
## 3652                   OxBow ACES AcademyAlternative and Adult Ed 260273000000
## 3653                                         Oxford Avenue School 550405000000
## 3654                                   Oxford Bridges High School 262724000000
## 3655                                 Oxford Crossroads Day School 262724000000
## 3656                                       OXFORD LEARNING CENTER 280345000000
## 3657                                       Oxford Virtual Academy 262724000000
## 3658                                  OYA CHARTER MANITOU 6TH-8TH 400079000000
## 3659                                 OYA CHARTER MANITOU 9TH-12TH 400079000000
## 3660                                 OYA CHARTER TECUMSEH 6TH-8TH 400079000000
## 3661                                OYA CHARTER TECUMSEH 9TH-12TH 400079000000
## 3662                                    OZARK CORRECTIONAL CENTER 290003000000
## 3663                               OZARK REGIONAL JUVENILE DET CT 292151000000
## 3664                                                        P A C 481944000000
## 3665                                         P A S S LEARNING CTR 482034000000
## 3666                                         P A S S LEARNING CTR 482142000000
## 3667                                         P A S S LEARNING CTR 483702000000
## 3668                                         P A S S LEARNING CTR 481764000000
## 3669                                         P A S S LEARNING CTR 482325000000
## 3670                                                        P E P 480816000000
## 3671                                                        P E P 483147000000
## 3672                                                        P E P 483189000000
## 3673                                                  P E P ALTER 484176000000
## 3674                                            P E P ALTER CO-OP 484557000000
## 3675                                     P L C-PAMPA LEARNING CTR 483417000000
## 3676                                                         PACE 120003000000
## 3677           Program for Academic and Career Enhancement (PACE) 510189000000
## 3678                                 Pace Alternative High School 530948000000
## 3679                                      PACE Alternative School 170016000000
## 3680                                                  PACE CENTER 483444000000
## 3681                                        PACE CENTER FOR GIRLS 120087000000
## 3682                                        PACE CENTER FOR GIRLS 120123000000
## 3683                                        PACE CENTER FOR GIRLS 120039000000
## 3684                                        PACE CENTER FOR GIRLS 120153000000
## 3685                                        PACE CENTER FOR GIRLS 120156000000
## 3686                                        PACE CENTER FOR GIRLS 120081000000
## 3687                                        PACE CENTER FOR GIRLS 120111000000
## 3688                                        PACE CENTER FOR GIRLS 120159000000
## 3689                                        PACE CENTER FOR GIRLS 120150000000
## 3690                                        PACE CENTER FOR GIRLS 120144000000
## 3691                                        PACE CENTER FOR GIRLS 120192000000
## 3692                                   PACE CENTER FOR GIRLS CLAY 120030000000
## 3693                                   PACE CENTER FOR GIRLS INC. 120126000000
## 3694                                   PACE CENTER FOR GIRLS INC. 120018000000
## 3695                         PACE CENTER FOR GIRLS TREASURE COAST 120177000000
## 3696                                    PACE CENTER FOR GIRLS-JAX 120048000000
## 3697                                                 PACE PROGRAM 120051000000
## 3698                                        PACE SCHOOL FOR GIRLS 120108000000
## 3699                                           Pacific Beach High  63480005878
## 3700                           Pacific Career and Technology High  60133207727
## 3701                            Pacific Coast High (Continuation)  60303007261
## 3702                                          Pacific County Jail 530810000000
## 3703                                                 Pacific High  64098001872
## 3704                                          Pacific High School  20024000035
## 3705                   Pacific Lodge Residential Education Center  69107812649
## 3706                                         South Bend Home Link 530810000000
## 3707                              Pacifica Independent Home Study  62046013922
## 3708                         Packard Children's Hospital/Stanford  62961007813
## 3709                                                  Pal Program 530576000000
## 3710                            Palermo Union Community Day (K-8)  62954007490
## 3711                         Palisade Glacier High (Continuation)  60140909310
## 3712                                Palisades High (Continuation)  60702007657
## 3713                               PALM ACRES CHARTER HIGH SCHOOL 120108000000
## 3714                                       PALM BEACH COUNTY JAIL 120150000000
## 3715                    PALM BEACH JUVENILE CORRECTIONAL FACILITY 120150000000
## 3716                         PALM BEACH REGIONAL DETENTION CENTER 120150000000
## 3717                                       PALMETTO YOUTH ACADEMY 120123000000
## 3718                            PALMSHORES BEHAVIOR HEALTH CENTER 120123000000
## 3719                                            Paloma Creek High  60330006562
## 3720                                                 Palomar High  63864006490
## 3721                                 Palouse Junction High School 530573000000
## 3722                                 PANAMA CITY MARINE INSTITUTE 120009000000
## 3723                                                    PANOLA CS 480021000000
## 3724                                              Panorama School 530163000000
## 3725                                                       PARADE 530456000000
## 3726                          PARADISE CREEK REGIONAL HIGH SCHOOL 160222000000
## 3727                                              Paragon Academy 270003000000
## 3728                              Paramount Unified Community Day  62985007530
## 3729                                  Parent Community Connection 530285000000
## 3730                                            Parent Partnerhip 530802000000
## 3731                                          Parents As Partners 530682000000
## 3732                                                Paris Bridges 170018000000
## 3733                                Paris Cooperative High School 170140000000
## 3734                                Park West High (Continuation)  63132004856
## 3735                                    Parker Alternative School  40598002364
## 3736                                     Parkers Lake High School 270003000000
## 3737                                                     Parkview  63066008754
## 3738                                     Parkview Learning Center 470258000000
## 3739                                  PARKVIEW SCHOOL - LEVELLAND 483192000000
## 3740                                    PARKVIEW SCHOOL - LUBBOCK 483192000000
## 3741                                              Parkway Academy 470378000000
## 3742                                Parnall Correctional Facility 260000000000
## 3743                                              PARRISH PROGRAM 317482000000
## 3744                            Partners for Success-Old Mill Sch 170018000000
## 3745                                          Partnership Academy 370348000000
## 3746                                PASCAGOULA OPPORTUNITY CENTER 280348000000
## 3747                                            PASCO MYCROSCHOOL 120153000000
## 3748           PASEO DEL NORTE ACADEMY-VISTA DEL SOL CHARTER HIGH 480011000000
## 3749                                    Paseo del Rey Fundamental  62271003274
## 3750                      PASO DEL NORTE ACADEMY-MESA CHARTER H S 480011000000
## 3751                         Paso Robles Independent Study Center  60004810395
## 3752                                                 PASS Academy  10123001331
## 3753                                         P A S S LEARNING CTR 483039000000
## 3754                                                 Pass Program 530001000000
## 3755                                                  Passageways 273006000000
## 3756                                      Passaic Regional School 340009000000
## 3757                       PAT DILLARD SPECIAL ACHIEVEMENT CENTER 480789000000
## 3758                                                 PATH ACADEMY 120039000000
## 3759                                PATHFINDER ACHIEVEMENT CENTER 482034000000
## 3760                                              PATHFINDER CAMP 480007000000
## 3761                               PATHFINDER ED PRG-LANCASTER CO 310015000000
## 3762                                        Pathfinder K-8 School 530771000000
## 3763                                   Pathfinders Alternative Ed 261215000000
## 3764                                  Pathway Academy High School 210138000000
## 3765                                        Pathway Community Day  60797012076
## 3766                             Pathway Elementary Community Day  60797013042
## 3767                                    Pathway Independent Study  62316012156
## 3768                                             Pathways  ROE 11 170018000000
## 3769                                           PATHWAYS 3H CAMPUS 480007000000
## 3770                                     PATHWAYS ACADEMIC CAMPUS 482566000000
## 3771                                             PATHWAYS ACADEMY 120036000000
## 3772                                       Pathways Community Day  60133210599
## 3773                            Pathways Elementary (Alternative) 320036000000
## 3774                                       PATHWAYS FUTURE CENTER  80690006550
## 3775                                                 PATHWAYS H S 481671000000
## 3776                                  Pathways High (Alternative) 320036000000
## 3777                                        PATHWAYS LEARNING CTR 480967000000
## 3778                                       PATHWAYS MIDDLE SCHOOL 160210000000
## 3779                         Pathways Middle School (Alternative) 320036000000
## 3780                                  Pathways Program Grades 6-7 279144000000
## 3781                                 Pathways Program Grades 8-12 279144000000
## 3782                          Pathways To Success Academic Campus 260282000000
## 3783                           Redondo Shores High (Continuation)  60003202227
## 3784                               PATRICK J THOMAS JUVENILE CNTR 310016000000
## 3785                                          PATRIOT HIGH SCHOOL  80387006403
## 3786                              PAUL A BROWN ALTERNATIVE CENTER 480967000000
## 3787                                                         PAWS 170019000000
## 3788                                                 PAWS Academy 170019000000
## 3789                              PAYETTE ALTERNATIVE HIGH SCHOOL 160258000000
## 3790                                                Peace Academy 210299000000
## 3791                                                        PEARL 530699000000
## 3792                      Pearl AlternativeAdult Education School 261423000000
## 3793                                              PECAN RIDGE H S 483192000000
## 3794                                          PEGASUS CHARTER H S 480003000000
## 3795                                                 Pegasus High  61182010320
## 3796                                               PEGASUS SCHOOL 480026000000
## 3797                          PELICAN RAPIDS ALT CENTER MID-LEVEL 272817000000
## 3798                           PELICAN RAPIDS ALT LEARNING CENTER 272817000000
## 3799                                    Pend Oreille River School 530561000000
## 3800                                               Peninsula High  63498013476
## 3801                                Peninsula High (Continuation)  63498005925
## 3802                                                 PNM-SANTA FE 350001000000
## 3803                                          Peoria Flex Academy  40625002475
## 3804                                  Peoria Regional High School 170020000000
## 3805                                             PEP ALTER SCHOOL 484185000000
## 3806                        PERFORMANCE BASED PREPARATORY ACADEMY 120177000000
## 3807                                  Performance Learning Center 370053000000
## 3808                                  PERHAM AREA LEARNING CENTER 272823000000
## 3809                                          PERRIN LEARNING CTR 484008000000
## 3810                              Perris Lake High (Continuation)  63021004713
## 3811                              PERRY COUNTY ALTERNATIVE CENTER 280357000000
## 3812                              Perry County Alternative School 210477000000
## 3813                                            Pershing Co Adult 320042000000
## 3814                                   Pershing Continuation High  60797007672
## 3815                                        PETER E HYLAND CENTER 482115000000
## 3816                                              PETERSBURG DAEP 483468000000
## 3817                              Petersburg Regional Alternative 510008000000
## 3818                    Petersen Alternative Center for Education  69104107887
## 3819                                     Peterson Academic Center 320006000000
## 3820                                                Phillips High 370472000000
## 3821                               Center For Innovative Learning 370180000000
## 3822                                              Phoenix Academy 210120000000
## 3823                                              PHOENIX ACADEMY 272385000000
## 3824                                              Phoenix Academy  69101804617
## 3825                                              PHOENIX ACADEMY 480894000000
## 3826                                Phoenix Academy Community Day  61968013809
## 3827                                         Phoenix Academy High 370072000000
## 3828                                     Phoenix Academy Lawrence 250666000000
## 3829                 Phoenix Academy Residential Education Center  69107812742
## 3830                              Phoenix Alternative High School 260801000000
## 3831                              Phoenix Alternative High School 261995000000
## 3832                                   Phoenix Alternative School 263660000000
## 3833                                               Phoenix Center 510084000000
## 3834                                         Phoenix Continuation  62271003279
## 3835                     Phoenix Elementary Academy Community Day  61455010490
## 3836                                                  PHOENIX H S 481836000000
## 3837                                                 Phoenix High  61182010318
## 3838                                  Phoenix High (Continuation)  64214006898
## 3839                                   Phoenix High Community Day  60282005827
## 3840                                          Phoenix High School 130255000000
## 3841                                          Phoenix High School 530393000000
## 3842                                      PHOENIX LEARNING CENTER 270720000000
## 3843                                         Phoenix Prep Academy  40630000148
## 3844                                              Phoenix Project 550732000000
## 3845                                    Phoenix Recovery Programs 279145000000
## 3846                                          Phoenix Rising High  60801013807
## 3847                                               Phoenix School  10297000540
## 3848                                               PHOENIX SCHOOL 273178000000
## 3849                          PHOENIX SCHOOL AT SOUTHWEST SCHOOLS 480013000000
## 3850                                            Phoenix Secondary  61455012434
## 3851                                                   PI Program 530129000000
## 3852                              Picard Community Day Elementary  60658007454
## 3853                                         Piedmont Alternative 510010000000
## 3854                  Piedmont Regional Juvenile Detention Center 510004000000
## 3855                                    PIERZ ALTERNATIVE PROGRAM 272832000000
## 3856                      Pike County Alternative Learning Center  10279002155
## 3857                                    Pike County Day Treatment 210480000000
## 3858                   Pilarcitos Alternative High (Continuation)  60678000602
## 3859                                            Pima Rose Academy  40083903273
## 3860                               PINE CITY AREA LEARNING CENTER 272838000000
## 3861                           Pine Grove Youth Conservation Camp  60142207486
## 3862                                   PINE HILL EDUCATION CENTER 360723000000
## 3863                               Pine Hills Youth Corr Facil El 300009000000
## 3864                               Pine Hills Youth Corr Facil HS 300009000000
## 3865                                  PINE ISLAND HIGH SCHOOL ALP 272895000000
## 3866                                PINE RIDGE ALTERNATIVE CENTER 120018000000
## 3867                             Pine River Correctional Facility 260000000000
## 3868                          PINE RIVER-BACKUS AREA LEARNING CTR 272897000000
## 3869                               PINE RIVER-BACKUS MIDLEVEL ALC 272897000000
## 3870                                               PINE TREE DAEP 483498000000
## 3871                                                    PINELANDS 340009000000
## 3872                                         PINELLAS COUNTY JAIL 120156000000
## 3873                                  PINELLAS GULF COAST ACADEMY 120156000000
## 3874                                 PINELLAS JUVENILE DET CENTER 120156000000
## 3875 PINELLAS MYCROSCHOOL OF INTEGRATED ACADEMICS AND TECHNOLOGIE 120156000000
## 3876                                    PINELLAS SECONDARY SCHOOL 120156000000
## 3877                                          PINELLAS TELESCHOOL 120156000000
## 3878                                           PINES SCHOOL - ACS 270810000000
## 3879                                           PINES SCHOOL - NSP 270810000000
## 3880                                           PINES SCHOOL - RJC 270810000000
## 3881                                     PINES SCHOOL DAY PROGRAM 270810000000
## 3882                                     PINEYWOODS AEC OF CHOICE 481572000000
## 3883                                  SOUTHWESTERN YOUTH SERVICES 271833000000
## 3884                                          Pinnacles Community  69102813911
## 3885                                               Pinnacles High  63705010973
## 3886                            Pioneer (Alternative) High School 320039000000
## 3887                                       PIONEER CAREER ACADEMY 120075000000
## 3888                                        Pioneer Community Day  63918011181
## 3889                                    Pioneer Continuation High  63660008637
## 3890                                  Pioneer High (Continuation)  61632308853
## 3891                                          Pioneer High School 261114000000
## 3892                    Pioneer Secondary Alternative High School 410372000000
## 3893                                     Pioneer Tech High School 261740000000
## 3894                                     Pioneer Technical Center  69101710539
## 3895                                    PIPESTONE LEARNING CENTER 270009000000
## 3896                                                        PLACE 273381000000
## 3897                              Placer County Community Schools  69102510573
## 3898                                  Placer County Court Schools  69102509237
## 3899                               Placer County Pathways Charter  69102513072
## 3900                                        PLANO FAMILY LITERACY 483510000000
## 3901                                                  PLANO JJAEP 483510000000
## 3902                                PLANO SPECIAL PROGRAMS CENTER 481485000000
## 3903                                                PLATO ACADEMY 484668000000
## 3904                          PLATTE VALLEY YOUTH SERVICES CENTER  80441006355
## 3905                          PLATTE VALLEY YOUTH SERVICES CENTER  80028606704
## 3906                               Plaza Robles Continuation High  62223002776
## 3907                         North Sanpete Special Purpose School 490066000000
## 3908                              PLEASANTON ISD SCHOOL OF CHOICE 483519000000
## 3909                            Plum Center For Lifelong Learning 510126000000
## 3910                                      Plumas County Community  69110210576
## 3911                                    Plumas County Opportunity  69110211706
## 3912                             Plymouth Alternative High School  90333001630
## 3913                                        PLYMOUTH YOUTH CENTER 272124000000
## 3914                               Plymouth Youth Center Extended 272124000000
## 3915                     Pocahontas Area Regional Learning Center 192319000000
## 3916                                 POCATELLO JUVENILE DETENTION 160264000000
## 3917                            POGUE OPTIONS ALTERNATIVE ACADEMY 482568000000
## 3918                                     POINT ALTERNATIVE CENTER 482115000000
## 3919                              Point Option Alternative School 510264000000
## 3920                                       Point Rock Alternative 200579000000
## 3921                        POLARIS EXPEDITIONARY LEARNING SCHOOL  80399006334
## 3922                                   Polaris High (Alternative)  60263008115
## 3923                                          Polaris High School 490003000000
## 3924                                    POLK ACCELERATION ACADEMY 120159000000
## 3925                         POLK COUNTY SHERIFF'S CENTRAL CENTER 120159000000
## 3926               POLK COUNTY SHERIFFS REGIONAL DETENTION CENTER 120159000000
## 3927                                           POLK HALFWAY HOUSE 120159000000
## 3928   POLK STATE LAKELAND GATEWAY TO COLLEGE CHARTER HIGH SCHOOL 120159000000
## 3929                                           Pomona Alternative  63132010247
## 3930                               POMPANO YOUTH TREATMENT CENTER 120018000000
## 3931                              PONTOTOC CO ALTERNATIVE PROGRAM 280366000000
## 3932                                 POR VIDA ACADEMY CHARTER H S 480000000000
## 3933                               PORT ARTHUR ALTERNATIVE CENTER 483540000000
## 3934                                                 Port Gardner 530267000000
## 3935                               Portage Academy of Achievement 551206000000
## 3936                                Portage Community High School 262895000000
## 3937                                          Portola Opportunity  69110208554
## 3938                             Portola-Butler Continuation High  61965007734
## 3939                          POSITIVE PATHWAYS TRANSITION CENTER 120144000000
## 3940                                     POSITIVE REDIRECTION CTR 483879000000
## 3941                                   POSITIVE SOLUTIONS CHARTER 480006000000
## 3942                                       Post Secondary Program 240021000000
## 3943                                     POUDRE COMMUNITY ACADEMY  80399001938
## 3944                                        Powell County Academy 210489000000
## 3945                                        Power Learning Center  40497000407
## 3946                             Prairie Care Brooklyn Park - IHP 270003000000
## 3947                           PraIrie Care Brooklyn Park Day Prg 270003000000
## 3948                                     PRAIRIE CARE EDINA - PHP 270003000000
## 3949                                         Prairie Care Mankato 271878000000
## 3950                                PRAIRIE CREEKS CHARTER SCHOOL  80675001669
## 3951                           Prairie du Chien Correctional Inst 550004000000
## 3952                            PRAIRIE HARBOR ALTERNATIVE SCHOOL 484447000000
## 3953                                         PRAIRIE HOUSE SCHOOL 272139000000
## 3954                               PRAIRIE LAKES EDUCATION CENTER 274272000000
## 3955                                      Prairie Phoenix Academy 551464000000
## 3956                                                  PRAIRIECARE 273180000000
## 3957                                           PRAIRIECARE CHASKA 270819000000
## 3958                                        PrairieCare Maplewood 272385000000
## 3959                                PRB PEQUOT LAKES MIDLEVEL ALC 272897000000
## 3960                                       Premier Academy Morris 170018000000
## 3961                                 Premier Academy Morris TAOEP 170018000000
## 3962                              PREMIER H S AMERICAN YOUTHWORKS 480021000000
## 3963                                       PREMIER H S OF ABILENE 480021000000
## 3964                                      PREMIER H S OF AMARILLO 480021000000
## 3965                                     PREMIER H S OF ARLINGTON 480021000000
## 3966                                        PREMIER H S OF AUSTIN 480021000000
## 3967                                   PREMIER H S OF BROWNSVILLE 480021000000
## 3968                                PREMIER H S OF COMANCHE/EARLY 480021000000
## 3969                                        PREMIER H S OF DAYTON 480021000000
## 3970                                       PREMIER H S OF DEL RIO 480021000000
## 3971                                  PREMIER H S OF EAST EL PASO 480021000000
## 3972                                       PREMIER H S OF EL PASO 480021000000
## 3973                                    PREMIER H S OF FORT WORTH 480021000000
## 3974                                      PREMIER H S OF GRANBURY 480021000000
## 3975                                    PREMIER H S OF HUNTSVILLE 480021000000
## 3976                                        PREMIER H S OF LAREDO 480021000000
## 3977                                    PREMIER H S OF LEWISVILLE 480021000000
## 3978                                       PREMIER H S OF LUBBOCK 480021000000
## 3979                                       PREMIER H S OF MIDLAND 480021000000
## 3980                                       PREMIER H S OF MISSION 480021000000
## 3981                                 PREMIER H S OF NEW BRAUNFELS 480021000000
## 3982                                  PREMIER H S OF NORTH AUSTIN 480021000000
## 3983                                 PREMIER H S OF NORTH HOUSTON 480021000000
## 3984                                      PREMIER H S OF PALMVIEW 480021000000
## 3985                                  PREMIER H S OF PFLUGERVILLE 480021000000
## 3986                                         PREMIER H S OF PHARR 480021000000
## 3987                                      PREMIER H S OF SAN JUAN 480021000000
## 3988                                  PREMIER H S OF SOUTH IRVING 480021000000
## 3989                                     PREMIER H S OF TEXARKANA 480021000000
## 3990                                         PREMIER H S OF TYLER 480021000000
## 3991                                          PREMIER H S OF WACO 480021000000
## 3992                               PREMIER H S SAN ANTONIO - WEST 480021000000
## 3993                                 PREMIER H S SAN ANTONIO EAST 480021000000
## 3994            PREMIER HIGH SCHOOLS CAREER & TECHNICAL ED CENTER 480021000000
## 3995                                          PRENGER FAMILY CTR. 291619000000
## 3996                P.R.E.P. (POSITIVE REFOCUS EDUCATION PROGRAM)  80336001795
## 3997                                         Presque Isle Academy 260027000000
## 3998                              PRESSLEY RIDGE AT GRANT GARDENS 540051000000
## 3999                                PRESSLEY RIDGE AT LAUREL PARK 540051000000
## 4000                                               Pressly School 370231000000
## 4001                                  PRETRIAL DETENTION FACILITY 120048000000
## 4002                                          PRICE HALFWAY HOUSE 120108000000
## 4003                                                PRIDE ACADEMY 481128000000
## 4004                                              PRIDE ALTER SCH 482400000000
## 4005                                           Pride Continuation  62181012338
## 4006                                                 PRIDE School 240021000000
## 4007                      PRIEST RIVER EDUCATIONAL PROGRAM (PREP) 160000000000
## 4008                           Prince William Juv. Detention Home 510004000000
## 4009                        PRINCETON ALTERNATIVE LEARNING CENTER 540084000000
## 4010                               Princeton Area Learning Center 273003000000
## 4011                                PRINCETON EDUCATIONAL OPTIONS 273003000000
## 4012                            PRINCETON SPECIAL PROGRAMS CENTER 483585000000
## 4013                                  PRINCETON/FARMERSVILLE DAEP 483585000000
## 4014                                   PRIOR LAKE-SAVAGE AREA ALC 273006000000
## 4015                                PRIORITY INTERVENTION ACADEMY 482850000000
## 4016                                            PRO-VISION MIDDLE 480143000000
## 4017                    Progressive Academy of Creative Education  10243002157
## 4018                                    Project Bridge/Russell Co 510009000000
## 4019                                              PROJECT COMPASS 120144000000
## 4020                                                 Project Echo 170018000000
## 4021                                               Project Indian 170018000000
## 4022                                     Project More High School  40880001508
## 4023                                 Project Renew/Northampton Co 510008000000
## 4024                                              PROJECT RESTORE 483240000000
## 4025                                              PROJECT RESTORE 482874000000
## 4026                                   Project Return/Fluvanna Co 510008000000
## 4027                                   Project Return/Powhatan Co 510008000000
## 4028                                                 Project SOAR 170019000000
## 4029                   Project STAY-Supporting Teachers and Youth 550960000000
## 4030                              Project Success Learning Center  10216001578
## 4031                                     Project TEACH - Atlantic 340009000000
## 4032                                   Project TEACH - Burlington 340009000000
## 4033                                     Project TEACH - Cape May 340009000000
## 4034                                       Project TEACH - Mercer 340009000000
## 4035                                     Project TEACH - Monmouth 340009000000
## 4036                                       Project TEACH - Warren 340009000000
## 4037                                Prospect Community Day School  61389007609
## 4038                                    Prospect Education Center  60006410704
## 4039                                 Prospect High (Continuation)  62913004497
## 4040                                 Prospect High (Continuation)  62637010197
## 4041                                              Prospect School  40593000613
## 4042                                 Prospects High (Alternative)  60285009517
## 4043                       PROSPERITAS LEADERSHIP ACADEMY CHARTER 120144000000
## 4044                                            Prove High School 530420000000
## 4045                                                   Providence  69104709258
## 4046                                      Providence Jr./Sr. High  69101510229
## 4047    PROVIDING URBAN LEARNERS SUCCESS IN EDUCATION HIGH SCHOOL 360009000000
## 4048                                Proviso THSD 209 Dream School 170022000000
## 4049                                        Provo Adult Education 490081000000
## 4050                                        Pruette SCALE Academy 370192000000
## 4051                                   PSJA SONIA M SOTOMAYOR H S 483486000000
## 4052                                        Public Safety Academy  61336013081
## 4053                           Pueblo de Los Angeles Continuation  62271003292
## 4054                                  PUEBLO YOUTH SERVICE CENTER  80612006350
## 4055                                            Puente Hills High  61632509143
## 4056                                      Puget Sound High School 530354000000
## 4057                                Pugsley Correctional Facility 260000000000
## 4058                          Pulaski Day Treatment~Eagle Academy 210495000000
## 4059                                       PUPIL PERSONNEL CAMPUS 483312000000
## 4060                                       Purchase Youth Village 210381000000
## 4061                          PUTNAM COUNTY CORRECTIONAL FACILITY 360657000000
## 4062                                              Phoenix Program 530696000000
## 4063                                          Open Doors Puyallup 530696000000
## 4064                          Puyallup Parent Partnership Program 530696000000
## 4065                                         Pyle (Sarah) Academy 100020000000
## 4066                                          QUANTUM HIGH SCHOOL 120150000000
## 4067                                   QUEENS ACADEMY HIGH SCHOOL 360012000000
## 4068                                                        Quest 530696000000
## 4069                                                Quest Academy  62025012168
## 4070                      Gates - Alternative High School Program 510364000000
## 4071                                                    QUEST H S 481222000000
## 4072                                            Quest High School 261515000000
## 4073                                            Quest High School 262568000000
## 4074                                        Quincy High Tech High 530708000000
## 4075                                   QUITMAN ALTERNATIVE SCHOOL 280378000000
## 4076                                            R E A D Y Program 170017000000
## 4077                                       R T Fisher Alternative 470402000000
## 4078                                              R-5 HIGH SCHOOL  80435000623
## 4079                              R. C. BANNERMAN LEARNING CENTER 120030000000
## 4080                                            R. K. Lloyde High  60792000760
## 4081                                           R. Rex Parris High  60282010514
## 4082                        Raceland-Worthington Schools Campus A 210498000000
## 4083                        Raceland-Worthington Schools Campus B 210498000000
## 4084                             Racine Alternative Learning 6-12 551236000000
## 4085                              Racine Correctional Institution 550004000000
## 4086                   Racine Youthful Offender Warren Young High 550004000000
## 4087                                             RAES East Alt Ed 170019000000
## 4088                                            RAES Night School 170019000000
## 4089                                                    RAES RSSP 170019000000
## 4090                                                    RAES West 170019000000
## 4091                                             RAES West Alt Ed 170019000000
## 4092                                                RAILS ACADEMY 273009000000
## 4093                                Raincross High (Continuation)  63315003613
## 4094                                                   RAINES H S 482517000000
## 4095                                Raisbeck Aviation High School 530354000000
## 4096                                         Ralph J. Bunche High  62805012325
## 4097                                      Ramey-Estep High School 210062000000
## 4098                                  Ramona Community Montessori  63171013846
## 4099                                      Ramona Opportunity High  62271003296
## 4100                                           Ramsey Street High 370001000000
## 4101                                                RANCH ACADEMY 480017000000
## 4102                                       Rancheria Continuation  60273000200
## 4103                           Rancho del Mar High (Continuation)  62970008173
## 4104                         Rancho Learning Center (Alternative)  60297009302
## 4105                                            Rancho Vista High  60002809500
## 4106                           RANDOLPH COUNTY ALTERNATIVE CENTER 540126000000
## 4107                                RANKIN COUNTY LEARNING CENTER 280383000000
## 4108                                                RAP Elizabeth 170017000000
## 4109                                                 RAP Freeport 170017000000
## 4110                                  Rapid City High School - 45 465982000000
## 4111                         Rappahannock Juvenile Detention Home 510004000000
## 4112                               Rare Earth High (Continuation)  63762006372
## 4113                                           Ray Street Academy 370003000000
## 4114                                         Raymond Granite High  60016009210
## 4115    Raymond Lesniak Energy Strength Hope Recovery High School 341804000000
## 4116                                RAYMOND TELLAS ACADEMY - DAEP 480843000000
## 4117                               RAYMOND TELLAS ACADEMY - JJAEP 480843000000
## 4118                        RAYMONDVILLE OPTIONS ACADEMIC ACADEMY 483654000000
## 4119                                       RAYTOWN EDUCATION CTR. 292607000000
## 4120                                                re-engagement 530969000000
## 4121                       Re-Engagement School (Nine Mile Falls) 530564000000
## 4122                                         Re-Entry High School 530141000000
## 4123                                       Re-Entry Middle School 530141000000
## 4124                                                REACH Academy  63531007593
## 4125                                                    REACH H S 481317000000
## 4126             REAL ACADEMY (REACHING EVERY ADOLESCENT LEARNER) 120159000000
## 4127                                REBOUND SCHOOL OF OPPORTUNITY 160210000000
## 4128                                              RECOVERY CAMPUS 484068000000
## 4129                                    RECOVERY EDUCATION CAMPUS 483639000000
## 4130                                      Red Bluff Community Day  63198007464
## 4131                                       RED CANYON HIGH SCHOOL  80354001756
## 4132                                  RED HOOK RESIDENTIAL CENTER 360013000000
## 4133                                RED LAKE ALTERNATIVE LEARNING 273051000000
## 4134                           RED LAKE JUVENILE DETENTION FACLTY 273051000000
## 4135                                    RED LAKE MIDDLE LEVEL ALC 273051000000
## 4136                              Red River ALC - Barnesville 146 272142000000
## 4137                               Red River Area Learning Center 272142000000
## 4138                                             Red Rock Academy 320006000000
## 4139                            RED ROCK RIDGE AREA LEARNING CNTR 270009000000
## 4140                                 Red Rock Ridge Mid-Level ALC 270009000000
## 4141                                              Red Top Meadows 560002000000
## 4142                                  Red Wing HS Credit Recovery 279144000000
## 4143                                        Redding Community Day  63204008385
## 4144                                                REDDIX CENTER 483312000000
## 4145                            Redgranite Correctional Institute 550004000000
## 4146                            Redirection Alternative Education 510282000000
## 4147                               Redondo Beach Learning Academy  60003212165
## 4148                                             REDUCED SERVICES 120042000000
## 4149                                    Redwood Continuation High  60780000744
## 4150                                                 Redwood High  63639006196
## 4151                                   REDWOOD VALLEY ALTERNATIVE 270018000000
## 4152                            Reef-Sunset Primary Community Day  63227008000
## 4153                          Reef-Sunset Secondary Community Day  63227007999
## 4154                                        REESE EDUCATIONAL CTR 481983000000
## 4155                                                 Refugio High  63585007361
## 4156            Regional Alternative Education Center/Buena Vista 510025000000
## 4157               Reg Alternative Plus Self Project/Roanoke City 510008000000
## 4158                             Reg'l Learning Academy Star Winn 170017000000
## 4159                             Reg'l Learning Center Star Boone 170017000000
## 4160                              Reg'l Learning Center Star Winn 170017000000
## 4161                            Reg'l Safe School Program ROE #28 170017000000
## 4162                           REGION 2 JUVENILE DETENTION CENTER 160186000000
## 4163                                         Regional Alop School 170018000000
## 4164                         Regional Alternative Ed/King William 510009000000
## 4165                          Regional Alternative Ed/Stafford Co 510009000000
## 4166                                  Regional Alternative School 170017000000
## 4167                                  Regional Alternative School 348024000000
## 4168                          Regional Alternative/Pittslvania Co 510008000000
## 4169                                Regional Alternative/Wythe Co 510009000000
## 4170                                   Regional Center for Change 170020000000
## 4171                                        REGIONAL DAY SCH DEAF 481674000000
## 4172                                    REGIONAL DAY SCH FOR DEAF 483510000000
## 4173                                      Regional Justice Center 530396000000
## 4174                            Regional Learning Academy/Wise Co 510010000000
## 4175                                     Regional Programs School 210153000000
## 4176                                  Regional/Alternative Center 510366000000
## 4177                              Regl Inst Scholastic Excellence 170019000000
## 4178                              Regl Inst Scholastic Excellence 170019000000
## 4179                             Regl Learning Academy Star Boone 170017000000
## 4180                                                    Reid High  62250002753
## 4181                             Relevant Academy of Eaton County 260098000000
## 4182                                                  Renaissance  60582007095
## 4183                                          Renaissance Academy  60231011446
## 4184                                          Renaissance Academy 490021000000
## 4185                          Renaissance Alternative High School 530066000000
## 4186                          Renaissance Alternative High School 260990000000
## 4187                                       Renaissance at Mathson  60231013126
## 4188                                 Renaissance County Community  69107808010
## 4189                                            Renaissance Court  69101407934
## 4190                                             Renaissance High  60142106113
## 4191                                Renaissance High Continuation  62949004548
## 4192                                      Renaissance High School 262853000000
## 4193                         Renaissance High School for the Arts  62250008720
## 4194                                  Renaissance Learning Center 210195000000
## 4195                                           Renaissance School 530423000000
## 4196                                   Renaissance Virtual School 260990000000
## 4197                                         Renaissance/Scott Co 510008000000
## 4198                                       RENSSELAER COUNTY JAIL 362895000000
## 4199                                               Renton Academy 530723000000
## 4200                                                  REP Academy 210198000000
## 4201                                      Republic Parent Partner 530726000000
## 4202                                RESIDENT STUDENT/OUT OF STATE 273384000000
## 4203                               Resiliency Preparatory Academy 250483000000
## 4204                                   RESPECT ACADEMY AT LINCOLN  80336006590
## 4205                        RESPONSIVE EDUCATION VIRTUAL LEARNING 480016000000
## 4206                                         Reuther Central High 550732000000
## 4207                                    Revilla Jr/Sr High School  20015000048
## 4208                                    Reynolds Learning Academy 411052000000
## 4209                                      RGV YOUTH RECOVERY HOME 483879000000
## 4210                                       RICE CHALLENGE ACADEMY 483697000000
## 4211                              Richard A. Alonzo Community Day  62271010842
## 4212                                 Richard H. Lewis Alternative  62007003176
## 4213          RICHARD MCKENNA CHARTER SCHOOL - ONLINE ALTERNATIVE 160001000000
## 4214                                      RICHARD MILBURN ACADEMY 120192000000
## 4215                             RICHARD MILBURN ACADEMY AMARILLO 480008000000
## 4216                       RICHARD MILBURN ACADEMY CORPUS CHRISTI 480008000000
## 4217                           RICHARD MILBURN ACADEMY FORT WORTH 480008000000
## 4218                   RICHARD MILBURN ACADEMY HOUSTON (SUBURBAN) 480008000000
## 4219                              RICHARD MILBURN ACADEMY LUBBOCK 480008000000
## 4220                        RICHARD MILBURN ACADEMY MIDLAND SOUTH 480008000000
## 4221                               RICHARD MILBURN ACADEMY ODESSA 480008000000
## 4222                             RICHARD MILBURN ACADEMY PASADENA 480008000000
## 4223                          RICHARD MILBURN ALTER H S (KILLEEN) 480008000000
## 4224                                       Richard Yoakley School 470222000000
## 4225                         RICHARDS SCH FOR YOUNG WOMEN LEADERS 480894000000
## 4226                                               RICHEY ACADEMY 484122000000
## 4227                             RICHFIELD COLLEGE EXPERIENCE PRG 273175000000
## 4228                                   Richland Continuation High  62865004448
## 4229                                Richmond Acceleration Program 510324000000
## 4230                                  Richmond Alternative School 510324000000
## 4231                              Richmond County Learning Center 510327000000
## 4232                             Richmond Juvenile Detention Home 510004000000
## 4233                                    RICHMOND PERRINE OPTIMIST 120039000000
## 4234                                    RIDGE TEEN PARENT PROGRAM 120159000000
## 4235                            RIDGE VIEW ACADEMY CHARTER SCHOOL  80336001724
## 4236                                 Ridgedale Alternative School 470222000000
## 4237                                               Ridgeland High 450000000000
## 4238                                Ridgeview High (Continuation)  62982004642
## 4239                                  Ridgway High (Continuation)  63583006130
## 4240                                   Rincon High (Continuation)  60756001445
## 4241                             Rio Cazadero High (Continuation)  61233007702
## 4242                              Rio Del Rey High (Continuation)  69113410212
## 4243                             RIO GRANDE PREPARATORY INSTITUTE 350150000000
## 4244                                     RIO RANCHO CYBER ACADEMY 350001000000
## 4245                                          RIO VISTA ISD JJAEP 483720000000
## 4246                                      Ripperdan Community Day  62334013848
## 4247                                 Rise Academy for Achievement 320048000000
## 4248                                      RISEUP COMMUNITY SCHOOL  80336006647
## 4249                                              Rite of Passage  69100602957
## 4250                                         Rivendell Elementary 210573000000
## 4251                                        Rivendell High School 210573000000
## 4252                              RIVER BEND AREA LEARNING CENTER 279135000000
## 4253                                            River Cities High 551707000000
## 4254                                    River Delta Community Day  63311011075
## 4255                    River Delta High/Elementary (Alternative)  63311009429
## 4256                                            River Oaks Middle 370472000000
## 4257                                         River Valley Academy 263003000000
## 4258                                     RIVER VALLEY ACADEMY ALC 270006000000
## 4259                                            Riverdale Academy 551014000000
## 4260                                      Rivers Edge High School 530732000000
## 4261                                                    RIVERSIDE 273178000000
## 4262                                            Riverside Academy 270741000000
## 4263                                            Riverside Academy 261230000000
## 4264                                         Riverside Academy IS 270741000000
## 4265                                        Riverside Academy MLP 270741000000
## 4266                            Riverside Alternative High School 220005000000
## 4267                                   Riverside County Community  69102610577
## 4268                           Riverside County Education Academy  69102612986
## 4269                              Riverside County Juvenile Court  69102607567
## 4270                                             RIVERSIDE SCHOOL 270003000000
## 4271                                Riverside Youth Corr Facil El 300009000000
## 4272                                Riverside Youth Corr Facil HS 300009000000
## 4273                                   Riverview East High School 261242000000
## 4274                                    RIVERVIEW LEARNING CENTER 120192000000
## 4275                                 Riverview Opportunity Center 210075000000
## 4276                                             Riverview School 551578000000
## 4277                                       RIVERVUE MIDDLE SCHOOL 160060000000
## 4278                            RIVERWOODS SCHOOL NON-RESIDENTIAL 273351000000
## 4279              RIVIERA BEACH PREPARATORY & ACHIEVEMENT ACADEMY 120150000000
## 4280                 Road to Success Academy at Campus Kilpatrick  69107812802
## 4281                       Roanoke Valley Juvenile Detention Home 510004000000
## 4282                          ROBBINSDALE ACADEMIC SUMMER PROGRAM 273178000000
## 4283                                         ROBBINSDALE TASC ALC 273178000000
## 4284                         Robert D. Stethem Educational Center 240027000000
## 4285                          ROBERT DENIER YOUTH SERVICES CENTER  80348006353
## 4286                  Robert Elliott Alternative Education Center  62515003737
## 4287                         Robert Ellsworth Correctional Center 550004000000
## 4288                                 Robert H. Lewis Continuation  62271003134
## 4289                                          Robert Janss School 160002000000
## 4290                                Robert Kupper Learning Center 551491000000
## 4291                              ROBERT L. SHELL JUVENILE CENTER 540051000000
## 4292                                          Roberts High School 411082000000
## 4293                                Robertson High (Continuation)  61440001686
## 4294                                    Rochester Adult Education 262994000000
## 4295                               Rochester ALC Recovery Program 273180000000
## 4296                           ROCHESTER ALTERNATIVE LEARNING CTR 273180000000
## 4297                                               ROCINANTE HIGH 350099000000
## 4298                                             ROCK BEND HS ALC 273387000000
## 4299                                         Rock River Challenge 170020000000
## 4300                          Rockcastle Academy for Academic Ach 210507000000
## 4301                                            Rockey Glenn Camp  69107812637
## 4302                          ROCKLAND COUNTY SHERIFFS DEPARTMENT 362034000000
## 4303                                            Rockridge Academy 271104000000
## 4304                                       ROCKWALL QUEST ACADEMY 483765000000
## 4305                                                   ROCORI ALC 270944000000
## 4306                            ROE 20 Learning Alt Branch School 170018000000
## 4307                                               ROE 53 Academy 170021000000
## 4308                                           ROE 53 Safe School 170021000000
## 4309                                ROE Adult Learning Ctr Jersey 170017000000
## 4310                              ROE Adult Learning Ctr Macoupin 170017000000
## 4311                              ROE Alternative Prog of Lake Co 170019000000
## 4312                                          ROE Safe Sch Greene 170017000000
## 4313                                        ROE Safe Sch Macoupin 170017000000
## 4314                            ROE20 Learning Alternative Branch 170018000000
## 4315                                            Romeo High School 263009000000
## 4316                              Romulus Virtual Learning Center 263012000000
## 4317                        Ron Hockwalt Academies (Continuation)  64128006837
## 4318                      NORTHERN REG. JUVENILE DETENTION CENTER 540051000000
## 4319                                        RONALD MCDONALD HOUSE 272124000000
## 4320                                        Ronald Reagan Academy  60006511370
## 4321                                            ROOSEVELT ACADEMY 120159000000
## 4322                                 ROOSEVELT ALTERNATIVE SCHOOL 483104000000
## 4323                                  Roosevelt High School - SWS 272124000000
## 4324                                Rose City High (Continuation)  62994004669
## 4325                                         ROSE M SINGER CENTER 360010000000
## 4326                                                  Rose School 411071000000
## 4327                           ROSEAU DIST. AREA LEARNING PROGRAM 273225000000
## 4328                                                     ROSEDALE 480894000000
## 4329                                              Rosedale Center 240012000000
## 4330                                                Roselawn High  60015811504
## 4331                               ROSEMOUNT AREA LEARNING CENTER 273239000000
## 4332                                        ROSENWALD HIGH SCHOOL 120009000000
## 4333                                  ROSEVILLE ADULT HIGH SCHOOL 273243000000
## 4334                                          ROSWELL CORRECTIONS 350001000000
## 4335                                           ROUGHRIDER ACADEMY 481332000000
## 4336                                   ROUND ROCK OPPORT CTR DAEP 483808000000
## 4337                                    Round Valley Continuation  63372010257
## 4338                                          ROWAN MIDDLE SCHOOL 280219000000
## 4339                                Rowland Unified Community Day  63375005918
## 4340                       ROY MAAS YOUTH ALTERNATIVES/THE BRIDGE 483873000000
## 4341                                  Royal Sunset (Continuation)  63471005858
## 4342                                        ROYALS Academy Canton 170019000000
## 4343                                      ROYALS Academy Carthage 170019000000
## 4344                                        ROYALS Academy Macomb 170019000000
## 4345                                           ROYALS RSSP Canton 170019000000
## 4346                                         ROYALS RSSP Carthage 170019000000
## 4347                                           ROYALS RSSP Macomb 170019000000
## 4348                                    RRALC: DGF Secondary 2164 272142000000
## 4349                                                        RTC 1 310015000000
## 4350                                                        RTC 2 310015000000
## 4351                                                      RTR ALC 270009000000
## 4352                                                      RTR ALP 270029000000
## 4353                                  Ruben Daniels Adult Ed  ETC 263039000000
## 4354                            Ruben Daniels Community SchoolETC 263039000000
## 4355                                   Ruben Salazar Continuation  61218001383
## 4356                               Ruben Yancy Alternative School  10306201590
## 4357                                        Rudsdale Continuation  62805007326
## 4358                           RUNESTONE REGIONAL LEARNING CENTER 270002000000
## 4359                                        Russo/McEntee Academy  60231012063
## 4360                                  RUTH JONES MCCLENDON MIDDLE 480001000000
## 4361                                Rutherford Opportunity Center 370408000000
## 4362                             S ST. PAUL COMMUNITY LRNG. CNTR. 273327000000
## 4363                                    S. William Abel Community  69100407491
## 4364                                         S.A.V.E. High School  20018000109
## 4365                           S.F. County Civic Center Secondary  69111110647
## 4366                      S.F. County Court Woodside Learning Ctr  69111109270
## 4367                            S.F. County Opportunity (Hilltop)  69111109472
## 4368                                      S.F. International High  63441012494
## 4369                                          Safe Harbor Academy 210600000000
## 4370                                          Safe School Program 170018000000
## 4371                                          Safe School Program 170017000000
## 4372                               Safe School Program  Centralia 170017000000
## 4373                                                 SAGE Academy 370075000000
## 4374                                       Sage Hills High School 530261000000
## 4375                                        Sage Hills Open Doors 530261000000
## 4376                                Saginaw Correctional Facility 260000000000
## 4377                               Saginaw County Juvenile Center 268093000000
## 4378                                Saginaw Learn to Earn Academy 260032000000
## 4379                                        SAI Camp Cassidy Lake 260000000000
## 4380                               Saint Clair Co ROE Safe School 170021000000
## 4381                               Saint Joseph's Children's Home 560001000000
## 4382                                               Saints Academy 273354000000
## 4383                                        Saints Guided Studies 273354000000
## 4384                                   SALAZAR CROSSROADS ACADEMY 483744000000
## 4385               SALAZAR DISTRICT ALTERNATIVE EDUCATION PROGRAM 481305000000
## 4386                                            Salinas Community  69102110557
## 4387                               Saline Alternative High School 263066000000
## 4388                                Salisbury High (Continuation)  63201004924
## 4389                               SALMON ALTERNATIVE HIGH SCHOOL 160285000000
## 4390                                        Salmon Bay K-8 School 530771000000
## 4391                             SALMON JUVENILE DETENTION CENTER 160285000000
## 4392                                           Salt Creek Academy 170021000000
## 4393                                                  Salt School 170019000000
## 4394                                   SAM PERDUE JUVENILE CENTER 540051000000
## 4395                                        Sam Webb Continuation  61743002188
## 4396                                         Samuel Brown Academy 410002000000
## 4397                                San Andreas Continuation High  63414008958
## 4398                                             San Andreas High  63417007344
## 4399                              San Andreas High (Continuation)  63879006524
## 4400                                      SAN ANTONIO CAN ACADEMY 480002000000
## 4401                                     San Antonio Continuation  62271003322
## 4402                              San Antonio High (Continuation)  60876000893
## 4403                              San Antonio High (Continuation)  63025004725
## 4404                        San Benito County Juvenile Hall Court  69102810171
## 4405                                San Benito County Opportunity  69102809240
## 4406                            San Bernardino City Community Day  63417013680
## 4407       San Bernardino Co Juve Detention and Assessment Center  69102909241
## 4408                                   San Diego County Community  69103013682
## 4409                                       San Diego County Court  69103013693
## 4410                              San Diego Metro Career and Tech  63432011154
## 4411                                           SAN ELIZARIO JJAEP 483885000000
## 4412                         San Joaquin Building Futures Academy  69103112662
## 4413                                 San Joaquin County Community  69103110650
## 4414                              San Joaquin High (Continuation)  62423007780
## 4415                                      San Joaquin Valley High  62991013666
## 4416                            San Jose Valley Continuation High  60004206527
## 4417                                 San Luis High (Continuation)  62274003484
## 4418                             San Luis Obispo County Community  69103210655
## 4419                        San Luis Obispo County Juvenile Court  69103209246
## 4420                                          San Pasqual Academy  69103012159
## 4421                               San Pasqual Vocational Academy  63507012475
## 4422                           Sand Ridge Secure Treatment Center 550004000000
## 4423                 Sandersville Regional Youth Detention Center 130003000000
## 4424                                 SANDPOINT JUVENILE DETENTION 160000000000
## 4425                    Sandy Bluffs Alternative Education Center  63680500399
## 4426                             Sangamon County Learning Academy 170021000000
## 4427                                 Sangamon Safe School Program 170021000000
## 4428                                               Sanhedrin High  64256006971
## 4429                               Santa Barbara County Community  69103410658
## 4430                          Santa Barbara County Juvenile Court  69103409249
## 4431                                    Santa Clara Community Day  63543012999
## 4432                                 Santa Clara County Community  69103507782
## 4433                                     Santa Clara County Court  69103509045
## 4434     Santa Cruz City Elementary Alternative Education-Monarch  63559010080
## 4435                                  Santa Cruz County Community  69103610668
## 4436                                      Santa Cruz County Court  69103609251
## 4437                                      Santa Margarita Academy  61350012099
## 4438           SANTA MARIA ACADEMIC ACADEMY-OPTIONS CAMPUS (6-12) 483933000000
## 4439                                             SANTA MARIA DAEP 483933000000
## 4440                                            SANTA MARIA JJAEP 483933000000
## 4441                               Santa Monica Alternative (K-8)  63570007360
## 4442                                      SANTA ROSA ADULT SCHOOL 120165000000
## 4443                                              SANTA ROSA DAEP 483936000000
## 4444                                             SANTA ROSA JJAEP 483936000000
## 4445                                  Santana High (Continuation)  63375005212
## 4446                                           Santee Alternative  63588001222
## 4447                                       Santee Success Program  63588010639
## 4448                                                  SAP Program 210186000000
## 4449                                               Sara Babb High 450000000000
## 4450                                              Saratoga School 530834000000
## 4451                                SATELLITE ACADEMY HIGH SCHOOL 360008000000
## 4452                                             Satterlee School 261716000000
## 4453                                                   SAU CAMPUS 480009000000
## 4454                                             SAUK RAPIDS ECFE 273288000000
## 4455                     Savannah Regional Youth Detention Center 130003000000
## 4456                                     Sawtooth Ridge Community  69105213701
## 4457                                                 SCALE School 370192000000
## 4458                                Scavo Alternative High School 190897000000
## 4459                                                  SCCP Images 530825000000
## 4460                                          Educational Options  63021014047
## 4461                                SCHOOL AGED PARENTING PROGRAM 483312000000
## 4462                                  School District 428 IYC-HRB 170001000000
## 4463         SCHOOL FOR ACCELERATED LEARNING AND TECHNOLOGIES INC 120048000000
## 4464                                   SCHOOL FOR ACCELERATED LRN 484122000000
## 4465                              School Home Partnership Program 530486000000
## 4466 SCHOOL OF ACADEMIC AND BEHAVIORAL LEARNING EXCELLENCE (SABLE 120123000000
## 4467                             School of Engineering & Sciences  63384012139
## 4468                                             SCHOOL ON WHEELS 350006000000
## 4469                                  SCHWETTMAN EDUCATION CENTER 120153000000
## 4470                                                  SCIENCE CTR 484110000000
## 4471                                        SCIENCE FOCUS PROGRAM 317284000000
## 4472                                                  Scobee Camp  69107812775
## 4473                                                SCORE Academy 370472000000
## 4474                                       SCOTT & WHITE HOSPITAL 484233000000
## 4475                                            Scott Joseph Camp  69107812680
## 4476                                             Scott River High  60015904089
## 4477                                   Scott Valley Community Day  60015910426
## 4478                                        SCPS CONSEQUENCE UNIT 120171000000
## 4479                                     Scriber Lake High School 530240000000
## 4480                                          Scudder Kenyon Camp  69107812743
## 4481                                               SEAGULL SCHOOL 120018000000
## 4482                                         Seattle World School 530771000000
## 4483                                                    SECA - IS 270003000000
## 4484                                         Second Avenue School 550405000000
## 4485                                        Second Chance Academy 210033000000
## 4486                    SECOND CHANCE AT GHAZVINI LEARNING CENTER 120111000000
## 4487                                Secondary Academy for Success 530591000000
## 4488                                          SECONDARY ALTER CTR 482253000000
## 4489                          SECONDARY AREA LEARNING CNTR SUMMER 271176000000
## 4490                                               SECONDARY DAEP 482364000000
## 4491                                 Secondary Head Start Centers 510126000000
## 4492                                            Secondary Options 530910000000
## 4493                         SECONDARY STUDENT SUCCESS CENTER 801 120039000000
## 4494                         SECONDARY STUDENT SUCCESS CENTER 802 120039000000
## 4495                         SECONDARY STUDENT SUCCESS CENTER 803 120039000000
## 4496                         SECONDARY STUDENT SUCCESS CENTER-804 120039000000
## 4497                                    SECONDARY SUCCESS PROGRAM 317482000000
## 4498                                       SEIDEL LEARNING CENTER 483873000000
## 4499                                                Selah Academy 530777000000
## 4500                           SELAH ACADEMY REENGAGEMENT PROGRAM 530777000000
## 4501                             Select Community Day (Secondary)  62250011291
## 4502                                            Selma Independent  63627008476
## 4503                                   Sem Yeto Continuation High  61336001526
## 4504                             SEMINOLE COUNTY DETENTION CENTER 120171000000
## 4505                         SEMINOLE HEIGHTS CHARTER HIGH SCHOOL 120087000000
## 4506                                         SEMINOLE SUCCESS CTR 483975000000
## 4507                          SEN./TATE CO. OPTIONAL LEARNING CEN 280393000000
## 4508                                                Sentinel High  60006312193
## 4509                                     Sentinel Tech Alt School 530936000000
## 4510                               Sequel Transition Academy - 07 463171000000
## 4511                                      Sequim Community School 530783000000
## 4512                                                 Sequoia High  62466011689
## 4513                                                 Sequoia High  64116006806
## 4514                                          Sequoia High School 530267000000
## 4515                                                     SEQUOYAH 350002000000
## 4516                           SER YouthBuild High School Academy 261803000000
## 4517                                                SERENITY HIGH 481485000000
## 4518                                                SERENITY HIGH 482985000000
## 4519                                       SERENITY PLACE ACADEMY 481572000000
## 4520                                                   SETON HOME 480007000000
## 4521                                              SETTLEMENT HOME 480007000000
## 4522                                            Shabazz-City High 550852000000
## 4523                                                 Shadow Ridge  60001407287
## 4524                                              SHAKOPEE JR ALC 273300000000
## 4525                                              SHAKOPEE SR ALC 273300000000
## 4526                                                  Shalom High 550960000000
## 4527                                                  SHANNON H S 481023000000
## 4528                                              Shared Journeys 551626000000
## 4529                                                  SHARED TIME 270942000000
## 4530                                 Shasta County Juvenile Court  69103702799
## 4531                                                  Shasta Plus  63660012130
## 4532                                                 Shaw Academy 370420000000
## 4533                                         SHEELER HIGH CHARTER 120144000000
## 4534                                   Shelby Co Education Center 210532000000
## 4535                                          Shelbyville Bridges 170018000000
## 4536                                                SHELDON JJAEP 483999000000
## 4537                                                 Shelter Cove  61407008734
## 4538                    Shenandoah Valley Juvenile Detention Home 510004000000
## 4539                 Shenandoah Valley Reg Alternative Ed/Genesis 510010000000
## 4540                                   SHERIFF'S DETENTION CENTER 120153000000
## 4541                                        SHERIFF'S YOUTH VILLA 120159000000
## 4542                     Sherman Oaks Center for Enriched Studies  62271009151
## 4543                          Shery (Kurt T.) High (Continuation)  63942006572
## 4544                                     Sholund School for Girls 270005000000
## 4545                                            SHORELINE ACADEMY 480016000000
## 4546                                 Shoreline-Monroe High School 530513000000
## 4547                                 Shoshone High (Continuation)  61068007981
## 4548                              SHRINERS HOSPITALS FOR CHILDREN 480007000000
## 4549                                      SHS Graduation Alliance 530867000000
## 4550                                         Siam Learning Center 470051000000
## 4551                                          SIATECH GAINESVILLE 120003000000
## 4552                                   SIDNEY ALTERNATIVE PROGRAM 317671000000
## 4553                                         SIDNEY LANIER CENTER 120003000000
## 4554                                           SIERRA ALTERNATIVE 350006000000
## 4555                                                  Sierra High  63417007345
## 4556                                                  Sierra High  61380007710
## 4557                                                  Sierra High  60360000283
## 4558                                   Sierra High (Continuation)  63877006517
## 4559                                   Sierra High (Continuation)  62353010259
## 4560                                                  Sierra Home  62394006039
## 4561                             Sierra Madre High (Continuation)  60000901478
## 4562                                   Sierra Pass (Continuation)  63678007445
## 4563                                       Sierra View Elementary  60837000830
## 4564                              Sierra Vista High (Alternative)  64248000496
## 4565                             Sierra Vista High (Continuation)  60006501243
## 4566                                     SILVER CREEK HIGH SCHOOL 160030000000
## 4567                       SILVER RIVER MENTORING AND INSTRUCTION 120126000000
## 4568                           Silver Springs High (Continuation)  62688009953
## 4569                                        Silver Valley Academy  63682010616
## 4570                                  Silver Valley Community Day  63682012326
## 4571                                               Silverado High  63386005315
## 4572                                   SIMLEY ALTERNATIVE PROGRAM 271503000000
## 4573                                        SIMMONS CAREER CENTER 120087000000
## 4574                                     Simon Rodia Continuation  62271003313
## 4575                     SIMON YOUTH FOUND ACAD AT OUTLET MKTPLCE 120144000000
## 4576                            SIMPSON COUNTY ACHIEVEMENT CENTER 280399000000
## 4577                           Skagit Family Learning Center MVSD 530540000000
## 4578                                    Skagit River School House 530166000000
## 4579                                                 Skill Source 530966000000
## 4580                                 Skill Source Learning Center 530522000000
## 4581                                  Sky Valley Education Center 530513000000
## 4582                                           Sky Valley Options 530855000000
## 4583                                                 Slate Canyon 490081000000
## 4584                                                  SLATON DAEP 484044000000
## 4585                                              SLATON ISD DAEP 484044000000
## 4586                          Slover Mountain High (Continuation)  60939000956
## 4587                                                     SMEC ALC 270033000000
## 4588                                                   Smith Camp  69107812707
## 4589                              Smokiam Alternative High School 530807000000
## 4590                               Smyrna West Alternative School 470369000000
## 4591                               SNAKE RIVER JUVENILE DETENTION 160324000000
## 4592                                    Snohomish Online Learning 530802000000
## 4593                        Snoqualmie Parent Partnership Program 530804000000
## 4594                                             Snowline Virtual  63697001140
## 4595                                      SNOWY PEAKS HIGH SCHOOL  80681006464
## 4596                                               SNYDER ACADEMY 482304000000
## 4597                                 SO SAN ANTONIO CAREER ED CTR 484068000000
## 4598                                      SOAR Academic Institute 263228000000
## 4599                                                 SOAR ACADEMY  80654006565
## 4600                        SOAR High (Students On Academic Rise)  60282011610
## 4601                           Solano Juvenile Detention Facility  69112209271
## 4602                                      Solano County Community  69112210678
## 4603                                                Solano School  40567000464
## 4604                         Soldier Mountain High (Continuation)  61347007814
## 4605                       Soledad Enrichment Action Charter High  69107807106
## 4606                                                         SOLO 274074000000
## 4607                                        SOLOMON MAGNET SCHOOL 280162000000
## 4608                                                 Somavia High  60004611204
## 4609                                   Somerset Continuation High  60444000408
## 4610                 Sonoma County Alternative Education Programs  69104010682
## 4611                                          Sonoma County Court  69104009253
## 4612                          Sonoma Mountain High (Continuation)  63025001788
## 4613                                        South Academic Center 320006000000
## 4614                                    South Accelerated Academy 550960000000
## 4615                       SOUTH AREA ALTERNATIVE LEARNING CENTER 120015000000
## 4616            SOUTH AREA SECONDARY INTENSIVE TRANSITION PROGRAM 120150000000
## 4617                               SOUTH CENTRAL CORRECTIONAL CTR 290003000000
## 4618                                     South Coast Continuation  63123007331
## 4619                                   SOUTH COUNTY CAREER CENTER 120087000000
## 4620                                   South County Community Day  63694011805
## 4621                               SOUTH EDUCATION CENTER ACADEMY 270003000000
## 4622                                       South Lake High School 530771000000
## 4623                            South Lindhurst Continuation High  62409002879
## 4624                               South Mountain Secure Trmnt Un 420003000000
## 4625                                       SOUTH PALM GARDENS H S 484496000000
## 4626                                SOUTH PIKE ALTERNATIVE SCHOOL 280408000000
## 4627                             SOUTH PLAINS ACADEMY CHARTER H S 480014000000
## 4628                                             South Providence 370462000000
## 4629                South Shores/CSUDH Visual and Performing Arts  62271003366
## 4630                                      South Sound High School 530585000000
## 4631                             South Valley High (Continuation)  64030006663
## 4632                              SOUTH WASHINGTON ALTERNATIVE HS 273381000000
## 4633                                        South Whidbey Academy 530819000000
## 4634                                    Southeast Career Pathways 261644000000
## 4635                                SOUTHEAST CORRECTIONAL CENTER 290003000000
## 4636                                                 Southeastern 550960000000
## 4637                          Southern Desert Correctional Center 320006000000
## 4638                                  Southern Humboldt Community  69100910795
## 4639                                       SOUTHERN NM CORRECTION 350001000000
## 4640                          SOUTHERN PLAINS AREA LEARNING CNTR. 270005000000
## 4641                                                 SOUTHERN RGC 340009000000
## 4642                          Southfield Regional Academic Campus 263231000000
## 4643                                       Southpointe Adult High 490042000000
## 4644                                          SOUTHSIDE ALTER CTR 484092000000
## 4645                            Southside Alternative High School 220005000000
## 4646                      Southside L.I.N.K. Project/Brunswick Co 510009000000
## 4647                                            SOUTHWEST ACADEMY 484095000000
## 4648                                     Southwest Behavior J/SHS 320006000000
## 4649                                Southwest Educational Academy 490039000000
## 4650                  SOUTHWEST FLORIDA JUVENILE DETENTION CENTER 120108000000
## 4651                                               Southwest High 490114000000
## 4652                                  Southwest High School - SWS 272124000000
## 4653                           SOUTHWEST IDAHO JUVENILE DETENTION 160051000000
## 4654                                                SOUTHWEST KEY 482253000000
## 4655                                        SOUTHWEST KEY PROGRAM 482967000000
## 4656                                SOUTHWEST OPEN CHARTER SCHOOL  80309001692
## 4657                                 SOUTHWEST PREPARATORY SCHOOL 480006000000
## 4658                       SOUTHWEST PREPARATORY SCHOOL-NORTHWEST 480006000000
## 4659                       SOUTHWEST PREPARATORY SOUTHEAST CAMPUS 480006000000
## 4660                        SOUTHWEST SCHOOLS BISSONNET EL CAMPUS 480013000000
## 4661                                                  SP ED CO-OP 480000000000
## 4662               Sparta Alternative Independent Learning School 551416000000
## 4663            Spearfish Academy at Canyon Hills Elementary - 09 466693000000
## 4664           Spearfish Academy at Canyon Hills High School - 10 466693000000
## 4665                                   SPECIAL PROG CTR/J J A E P 480834000000
## 4666                                       SPECIAL PROG CTR/JJAEP 482838000000
## 4667                                             Special Services 530870000000
## 4668                                             SPECIAL SERVICES 482855000000
## 4669                                        Spectrum Care Academy 210249000000
## 4670                           SPECTRUM JUNIOR/SENIOR HIGH SCHOOL 120129000000
## 4671                                       SPED PRIVATE/HOMEBOUND 481970000000
## 4672                                          SPICER ALTER ED CTR 480981000000
## 4673                                   Spokane Valley High School 530969000000
## 4674                             Spokane Valley Transition School 530969000000
## 4675                           SPRING CREEK YOUTH SERVICES CENTER  80028606705
## 4676                           SPRING CREEK YOUTH SERVICES CENTER  80453006342
## 4677                              Spring Hill High (Continuation)  62394008895
## 4678                                      Spring Hill Opportunity  69109000651
## 4679                            Spring Lake Alternative Education 263255000000
## 4680                                    SPRING LAKE YOUTH ACADEMY 120042000000
## 4681                                               Spring Meadows 210075000000
## 4682                                        Spring Mountain J/SHS 320006000000
## 4683                                           Springdale Academy 530483000000
## 4684                               SPRINGER CORRECTIONAL FACILITY 350001000000
## 4685                                    Springfield Community Day  60948008428
## 4686                                        SPRINGLAKE-EARTH DAEP 484125000000
## 4687                                    St Charles Virtual School 263264000000
## 4688                         St Clair County Intervention Academy 260032000000
## 4689                                ST CLOUD AREA LEARNING CENTER 273351000000
## 4690                                ST CLOUD EXTENDED DAY PROGRAM 270014000000
## 4691                          ST CLOUD HOSPITAL PROGS-RESIDENTIAL 273351000000
## 4692                                 St Croix Correctional Center 550004000000
## 4693                          ST CROIX VALLEY AREA LEARNING CNTR. 273819000000
## 4694                        St Ignace Juvenile Detention Facility 260001000000
## 4695                         ST JOHNS COUNTY JUVENILE RESIDENTIAL 120174000000
## 4696                                    St Joseph Children's Home 210299000000
## 4697                            ST LAWRENCE CORRECTIONAL FACILITY 360647000000
## 4698                               St Louis Correctional Facility 260000000000
## 4699                    ST MARIES COMMUNITY EDUCATION ALTERNATIVE 160306000000
## 4700                               St Marys Adolescent Ed Program 170020000000
## 4701                                            ST. ANDREW SCHOOL 120009000000
## 4702                              ST. ANTHONY VILLAGE ALTERNATIVE 273342000000
## 4703                                         ST. CLOUD GROUP HOME 273351000000
## 4704                          ST. CLOUD HOSPITAL PROGRAMS NON-RES 273351000000
## 4705                                  ST. JOHNS COUNTY JAIL (DJJ) 120174000000
## 4706                              ST. JOHNS TECHNICAL HIGH SCHOOL 120174000000
## 4707                                ST. LOUIS CHILDREN'S HOSPITAL 292928000000
## 4708               ST. LUCIE COUNTY SCHOOL BOARD-JAIL PROGRAM-ESE 120177000000
## 4709                                   ST. LUCIE DETENTION CENTER 120177000000
## 4710                        St. Mary's County Evening High School 240060000000
## 4711                                                ST. PETER ALC 273387000000
## 4712                                                 STADIUM VIEW 272124000000
## 4713                                   STAFFORD ADJUSTMENT CENTER 484135000000
## 4714                               Stanislaus Alternative Charter  69104113669
## 4715                      Stanislaus County Institute of Learning  69104113818
## 4716                                Stanislaus County West Campus  69104109050
## 4717                             Stanley Correctional Institution 550004000000
## 4718                               Stanly Academy Learning Center 370432000000
## 4719                                              Stanton Academy 531011000000
## 4720                                                 STAR Academy 370201000000
## 4721                                     Star Academy High School 210381000000
## 4722                               STAR at Anderson Community Day  63417007629
## 4723                                         STAR Family Literacy 268010000000
## 4724                                 Starkweather Academy  Fiegel 262856000000
## 4725                                    Starquest Acad RSSP North 170018000000
## 4726                                    Starquest Acad RSSP South 170018000000
## 4727                                        STARS ACCELERATED H S 482139000000
## 4728                                     State Street High School 530774000000
## 4729                                                STEAM Academy 210186000000
## 4730                                                Stella Schola 530423000000
## 4731                                   STELLAR LEADERSHIP ACADEMY 120039000000
## 4732                                      STEM Partnership School 170142000000
## 4733                                                  STEP SCHOOL 318015000000
## 4734                    Step Up to College Open Doors High School 530315000000
## 4735                                          Steps Community Day  61926007211
## 4736                               Steptoe Valley Adult Education 320051000000
## 4737                                   Steptoe Valley High School 320051000000
## 4738                                   Sterling Heights Senior HS 263519000000
## 4739                                Stevens Alternate High School  90126001377
## 4740                                     STEWART TREATMENT CENTER 120192000000
## 4741                                         Stillaguamish School 530024000000
## 4742                                       STILWELL TECH CTR/CATE 483540000000
## 4743                                    Stoney Point Continuation  62271003376
## 4744                                     Strathmore Community Day  63813010702
## 4745                                 Street Academy (Alternative)  62805007804
## 4746                            Structural Alt Confinement School 530001000000
## 4747                             STUBBLEFIELD ALTERNATIVE ACADEMY 484590000000
## 4748                                         STUBBLEFIELD LRN CTR 482855000000
## 4749                                         STUBBLEFIELD LRN CTR 482379000000
## 4750                                         STUBBLEFIELD LRN CTR 481350000000
## 4751                                         STUBBLEFIELD LRN CTR 481704000000
## 4752                                         STUBBLEFIELD LRN CTR 484674000000
## 4753                                           STUDENT ALTER PROG 483486000000
## 4754                                      STUDENT ALTERNATIVE CTR 480831000000
## 4755                                                 Student Link 530930000000
## 4756                                   STUDENT OPPORTUNITY CENTER 482001000000
## 4757                                     STUDENT REASSIGNMENT CTR 482442000000
## 4758                               STUDENT SERV./SPECIAL PROGRAMS 120141000000
## 4759                           Student Success Open Doors Academy 530459000000
## 4760                                       STUDENT SUPPORT CENTER 481527000000
## 4761                                                    Studio 39 240006000000
## 4762                                       STUDY ALTERNATIVE HIGH 292886000000
## 4763                       Sturgis Schools Adult Education Center 263309000000
## 4764                                             Success  Belding 260543000000
## 4765                           Success  EdmoreMontabellaVestaburg 260543000000
## 4766                                            Success  Escanaba 260543000000
## 4767                          SUCCESS  Grand Rapids Alger Heights 260543000000
## 4768                             Success  Grand Rapids Fuller Ave 260543000000
## 4769                               Success  Howard CityTri County 260543000000
## 4770                                        Success  Kenowa Hills 260543000000
## 4771                                            Success  Lakeview 260543000000
## 4772                                           Success  Menominee 260543000000
## 4773                                            Success  St Louis 260543000000
## 4774                             Success  StantonCentral Montcalm 260543000000
## 4775                                        Success  Three Rivers 260543000000
## 4776                                              Success Academy  63384008282
## 4777                                              SUCCESS Academy 170019000000
## 4778                                              SUCCESS ACADEMY 310002000000
## 4779                                              SUCCESS ACADEMY 482913000000
## 4780                                              Success Academy 170019000000
## 4781                                              SUCCESS ACADEMY 120108000000
## 4782                                              Success Academy 210597000000
## 4783                                              Success Academy 210222000000
## 4784                                              Success Academy  10270002414
## 4785                                          Success Academy 4-5 170019000000
## 4786                  SUCCESS ACADEMY AT GHAZVINI LEARNING CENTER 120111000000
## 4787                                           Success Academy HS 170019000000
## 4788                                        Success Academy Lewis  40012001811
## 4789                                   Success Academy Perryville  40012001644
## 4790                                 Success Academy Tucson Adult  40012001643
## 4791                                         Success Academy Yuma  40012001642
## 4792                                                  SUCCESS H S 483808000000
## 4793                                                  SUCCESS H S 481970000000
## 4794                 Success Virtual Learning Centers of Michigan 260110000000
## 4795                               SUFFOLK COUNTY SHERIFFS OFFICE 362469000000
## 4796                     Sugarloaf Mountain Juvenile Hall Program  69102312339
## 4797                                               SUMMIT ACADEMY  80336006491
## 4798                                                  Summit High 490003000000
## 4799                                   Summit High (Continuation)  62637000185
## 4800                                   Summit High (Continuation)  61111012080
## 4801                                       SUMMIT LEARNING CENTER 481764000000
## 4802                                      SUMMIT LEARNING PROGRAM 271428000000
## 4803                                      Summit Oaks-Residential 466627000000
## 4804                                                  Summit View 490120000000
## 4805                                      Summit View High School 530038000000
## 4806                                Summit View Independent Study  63315008183
## 4807                                            Summit View J/SHS 320006000000
## 4808                                          SUMTER PREP ACADEMY 120180000000
## 4809                              Sumter Youth Development Campus 130003000000
## 4810                                 Sun Valley Elementary School  40625001425
## 4811                           SUNED HIGH SCHOOL OF NORTH BROWARD 120018000000
## 4812                                            SUNED HIGH SCHOOL 120018000000
## 4813                                     Sunridge Learning Center  40497000555
## 4814                                              Sunrise Academy 210144000000
## 4815                                              Sunrise Academy 261305000000
## 4816                       Sunrise Children's Services - Morehead 210510000000
## 4817                                  Sunrise High (Continuation)  63227007337
## 4818                                          SUNRISE HIGH SCHOOL 120018000000
## 4819                            SUNRISE PARK AREA LEARNING CENTER 274236000000
## 4820                                                  Sunset High  61077001200
## 4821                                   Sunset High (Continuation)  63438005578
## 4822                                        SUNSHINE HIGH CHARTER 120144000000
## 4823                                             SUPERIOR ACADEMY 271104000000
## 4824                                              Susan H. Nelson  60002810589
## 4825                                   Suttons Bay Virtual School 263336000000
## 4826                               SVI 1418 Re-Engagement Program 530771000000
## 4827                                              SVSD OPEN DOORS 530804000000
## 4828                                Mira Monte High (Alternative)  63386007199
## 4829              SW FL ADDICTION SERVICES-THE VINCE SMITH CENTER 120108000000
## 4830                                                 SW Metro ALC 270042000000
## 4831                                                 SW Metro CCJ 270042000000
## 4832                                       SW Metro Day Treatment 270042000000
## 4833                                   SW Metro Independent Study 270042000000
## 4834                                                 SW Metro JAF 270042000000
## 4835                                          SW Metro Seat Based 270042000000
## 4836                  Swan Valley Adult and Alternative Education 263341000000
## 4837                                         Swartz Creek Academy 263342000000
## 4838                                     Sweetwater Community Day  63864008310
## 4839                                   Swiftwater Learning Center 530135000000
## 4840               T J Loftiss II Regional Youth Detention Center 130003000000
## 4841                                       T R U C E LEARNING CTR 481317000000
## 4842                                             TA Wilson School 261962000000
## 4843                                    TABERG RESIDENTIAL CENTER 360013000000
## 4844                                               Table Mountain  69100209213
## 4845                                       TAC ALTERNATIVE SCHOOL 280288000000
## 4846                                      Tacoma Business Academy 530870000000
## 4847                                              TADPOLE LRN CTR 482649000000
## 4848                                                    Taft High  63525010074
## 4849                                               Tall Oaks High 240051000000
## 4850                              Talladega County Genesis School  10318001206
## 4851                                           Talley High School 530723000000
## 4852                                  Tamiscal High (Alternative)  63879010109
## 4853                                   TAMMANY ALTERNATIVE SCHOOL 160186000000
## 4854                                   TAMPA RESIDENTIAL FACILITY 120087000000
## 4855                         TANTIE JUVENILE RESIDENTIAL FACILITY 120141000000
## 4856                                                TAP PK BABIES 120051000000
## 4857                                                TAPESTRY ALOP 170022000000
## 4858                                            Tar River Academy 370327000000
## 4859                                         TARRANT CO J J A E P 484554000000
## 4860                                         TARRANT CO J J A E P 482550000000
## 4861                                         TARRANT CO J J A E P 482166000000
## 4862                                         TARRANT CO J J A E P 481770000000
## 4863                                         TARRANT CO J J A E P 481591000000
## 4864                                         TARRANT CO J J A E P 481302000000
## 4865                                         TARRANT CO J J A E P 480920000000
## 4866                                         TARRANT CO J J A E P 481023000000
## 4867                                         TARRANT CO J J A E P 480870000000
## 4868                                         TARRANT CO J J A E P 481317000000
## 4869                                         TARRANT CO J J A E P 482406000000
## 4870                                         TARRANT CO J J A E P 482526000000
## 4871                                         TARRANT CO J J A E P 482892000000
## 4872                              TARRANT CO JUVENILE JUSTICE CTR 482649000000
## 4873                                     TARRANT COUNTY J J A E P 481218000000
## 4874                                         TARRANT COUNTY JJAEP 483318000000
## 4875                                  TARRANT COUNTY JJAEP SCHOOL 481881000000
## 4876                                       TARRANT YOUTH RECOVERY 481970000000
## 4877                              Taunton Alternative High School 251152000000
## 4878                          Taycheedah Correctional Institution 550004000000
## 4879                             TAYLOR COUNTY ACCELERATED SCHOOL 120186000000
## 4880                                TAYLOR COUNTY LEARNING CENTER 480744000000
## 4881                                TAYLOR COUNTY LEARNING CENTER 483034000000
## 4882                                TAYLOR COUNTY LEARNING CENTER 484650000000
## 4883                              Taylor Virtual Learning Academy 263354000000
## 4884                                       TCS ALTERNATIVE SCHOOL 280429000000
## 4885                           Teachwell Academy High School - 01 460003000000
## 4886                         Teachwell Academy Middle School - 04 460003000000
## 4887                                                  TEAGUE DAEP 484230000000
## 4888                                          TEAGUE LION ACADEMY 484230000000
## 4889                                             TEAM High School 531005000000
## 4890                                                     TEAM SCH 481431000000
## 4891                                      TECH VALLEY HIGH SCHOOL 368070000000
## 4892                                              Technology High  60994010688
## 4893                                     Tecumseh Virtual Academy 263372000000
## 4894                                       TEEN PARENT PROGRAM PK 120072000000
## 4895                                Teenage Parent Program - TAPP  40880001509
## 4896                                        TEGELER CAREER CENTER 483432000000
## 4897                        Tehama County Juvenile Justice Center  69104309256
## 4898                                       TEJAS SCHOOL OF CHOICE 484668000000
## 4899                                        TEJEDA JUNIOR ACADEMY 482247000000
## 4900                                               TELLES ACADEMY 481830000000
## 4901                                     TELLES ACADEMY J J A E P 481830000000
## 4902                                       TEMPLE CHARTER ACADEMY 480008000000
## 4903                                      Temple City Alternative  63898007145
## 4904                                               Templeton Home  63900008622
## 4905                             Templeton Independent Study High  63900007776
## 4906             TERRELL ALTERNATIVE EDUCATION CENTER/PHOENIX SCH 484245000000
## 4907                                       Tesla STEM High School 530423000000
## 4908                                         TEXAS CITY J J A E P 484251000000
## 4909                                     TEXAS PREPARATORY SCHOOL 480019000000
## 4910                                       TEXAS SERENITY ACADEMY 480015000000
## 4911              THE ACADEMIC RECOVERY CENTER OF SAN LUIS VALLEY  80285002008
## 4912                                                  The Academy  62781008359
## 4913                                                  The Academy 210201000000
## 4914                                                  THE ACADEMY 120024000000
## 4915                                             Horizons Academy 210441000000
## 4916                               THE ACADEMY AT YOUTH CARE LANE 120084000000
## 4917             The Academy of International Studies at Rosemont 510267000000
## 4918                                             VIOLA DEWALT H S 482619000000
## 4919                                THE ALTERNATIVE PROGRAM (TAP) 274216000000
## 4920                                           THE ANICCA PROGRAM 270819000000
## 4921                                             THE BIJOU SCHOOL  80306001888
## 4922                                                   THE BRIDGE 120048000000
## 4923                                           The Bridge Academy 261038000000
## 4924                                       THE BRIDGES ACAD ALTER 482166000000
## 4925                                             The Brook-Dupont 210299000000
## 4926                                                The Brook-KMI 210299000000
## 4927                                          The Central Academy 210271000000
## 4928                                           THE CHILES ACADEMY 120192000000
## 4929                                     Brunswick County Academy 370042000000
## 4930                     The Community Learning Center @ Pinckney 370309000000
## 4931                                                   The Creeks 418018000000
## 4932            THE DOVE (DEVELOPING OPPORTUNITIES THRU VOC. ED.) 120096000000
## 4933                                     THE EINSTEIN SCHOOL INC. 120003000000
## 4934                             Etowah County Alternative School  10138000849
## 4935                                             THE EXCEL CENTER 480145000000
## 4936                                THE EXCEL CENTER (FOR ADULTS) 480145000000
## 4937                             THE FOUNDATION SCHOOL FOR AUTISM 480016000000
## 4938                                        The Georgetown School 510183000000
## 4939                              The Gloria Dusek Compass School  40046102582
## 4940                              The Judy Jester Learning Center  10204000777
## 4941                                        The Lafayette Academy 170016000000
## 4942                                       THE LARRY BROWN SCHOOL 482496000000
## 4943                                          THE LEARNING CENTER 280171000000
## 4944                                             EAST ALTERNATIVE 280019000000
## 4945                                             THE LEARNING CTR 483240000000
## 4946                                          The Life Connection 210318000000
## 4947            THE MARY CATHERINE HARRIS SCHOOL-SCHOOL OF CHOICE 481179000000
## 4948                                    THE NBISD LEARNING CENTER 483237000000
## 4949                                     The New Path High School  20018000399
## 4950                                             The Oaks Academy 370078000000
## 4951                                                  THE OUTPOST 120189000000
## 4952                                             THE PACE PROGRAM 120033000000
## 4953                                                  The Pathway  10237001038
## 4954                                           THE PATRIOT CENTER 160102000000
## 4955                                          THE PHOENIX ACADEMY 482892000000
## 4956                                   THE PHOENIX PROGRAM NAPLES 120033000000
## 4957                                THE PHOENIX PROGRAM-IMMOKALEE 120033000000
## 4958                              The Phoenix School of Discovery 210299000000
## 4959                                             THE PORT ACADEMY 120123000000
## 4960                                               PRO-VISION H S 480143000000
## 4961                                        The Providence School 210303000000
## 4962              The Regional Community Alternative Ed Continuum 510008000000
## 4963                                      The Renaissance Academy 510384000000
## 4964                                       The Renaissance Center 210008000000
## 4965                                             The SCORE Center 370399000000
## 4966                                     THE SEED SCHOOL OF MIAMI 120039000000
## 4967                                                   THE SPRING 120087000000
## 4968                                                  The Stables 210186000000
## 4969                                          The Sterling School 210425000000
## 4970                                          The Success Academy 263039000000
## 4971                                     THE SUMMIT (HIGH SCHOOL) 483432000000
## 4972                                    THE SUMMIT (INTERMEDIATE) 483432000000
## 4973                                          The T.E.C.H. Center 510271000000
## 4974                                                  THE WILLOWS 270226000000
## 4975                                           Theodore Bird High  63726009445
## 4976                                 Therapeutic Academic Program  10162001650
## 4977                                THERAPEUTIC EDUCATION PROGRAM 482574000000
## 4978                     Thirty-Second Street USC Performing Arts  62271003395
## 4979                              THOMAS BUZBEE VOCATIONAL SCHOOL 480005000000
## 4980                                  Thomas E. Mathews Community  69104811993
## 4981                                        Thomas Metcalf School 170010000000
## 4982                                            Thomas Riley High  62271003397
## 4983                                 Thompson Correctional Center 550004000000
## 4984                             Thornton Creek Elementary School 530771000000
## 4985                                                Thornton High  61893001427
## 4986                                       Three Rivers Home Link 530732000000
## 4987                                    Three Springs High School 530123000000
## 4988                                  Thumb Correctional Facility 260000000000
## 4989               Tidewater Juvenile Detention Home - Chesapeake 510004000000
## 4990                    Tidewater Regional Alternative Ed Project 510007000000
## 4991                                Tier III Intervention Academy 262874000000
## 4992                             Tierra Del Sol Continuation High  61954013031
## 4993                                Tinkham Alternative Education 260002000000
## 4994                                              TIOGA Community  69105213710
## 4995                    Tipton County Alternative Learning Center 470408000000
## 4996                             TISHOMINGO CO ALTERNATIVE SCHOOL 280426000000
## 4997                TNC CAMPUS (TEXAS NEUROREHABILITATION CENTER) 480007000000
## 4998                     Todd County Achievement High School - 17 467209000000
## 4999                   Todd County Achievement Middle School - 18 467209000000
## 5000                          Tom Bradley Global Awareness Magnet  62271002967
## 5001                         TOMBALL ALTERNATIVE EDUCATION CENTER 484296000000
## 5002                                     TOMBALL J J A E P CAMPUS 484296000000
## 5003                    TOP OF TEXAS ACCELERATED EDUCATION CENTER 483465000000
## 5004                                              Tops K-8 School 530771000000
## 5005                                                TORNILLO DAEP 484299000000
## 5006                                   TOUSSAINT L'OUVERTURE HIGH 120150000000
## 5007                                                 TOWER SCHOOL 318001000000
## 5008                           TOWER VIEW ALTERNATIVE HIGH SCHOOL 279144000000
## 5009                           TOWN & COUNTRY CHARTER HIGH SCHOOL 120087000000
## 5010                           Tracy (Wilbur) High (Continuation)  60162000028
## 5011                             Transformational Learning Center 210135000000
## 5012                         TRANSFORMING LIVES COOPERATIVE (TLC) 481707000000
## 5013                                               TRANSITION CTR 481970000000
## 5014                                              Transition High 550960000000
## 5015                                           TRANSITION PROGRAM 482406000000
## 5016                   Transition Support Resource Center/Fairfax 510008000000
## 5017                  Transitional Learning Center (Continuation)  62064000301
## 5018                                          Transitions at Bass 470318000000
## 5019                                          TRAVIS CO J J A E P 482889000000
## 5020                                          TRAVIS CO J J A E P 481662000000
## 5021                                          TRAVIS CO J J A E P 482647000000
## 5022                                          TRAVIS CO J J A E P 481776000000
## 5023                                          TRAVIS CO J J A E P 482703000000
## 5024                                          TRAVIS CO J J A E P 483483000000
## 5025                                         Travis Community Day  63963008641
## 5026                                     TRAVIS COUNTY DAY SCHOOL 480894000000
## 5027                                      TRAVIS COUNTY J J A E P 480894000000
## 5028                                          TRAVIS COUNTY JJAEP 482640000000
## 5029                      TRAVIS COUNTY JUVENILE DETENTION CENTER 480894000000
## 5030                                      Travis Education Center  63963006597
## 5031                                         TRAVIS H S OF CHOICE 483429000000
## 5032                                     Travis Independent Study  63963008642
## 5033                                                 Trenton High 450000000000
## 5034                                 Trenton Psychiatric Hospital 340009000000
## 5035                                       TRI CO JUVENILE DETENT 484008000000
## 5036                                Tri County Educational Center 261428000000
## 5037                                          Tri-C Community Day  62271007115
## 5038                                                        TRIAD 120168000000
## 5039                                       TRINITY CHARTER SCHOOL 480026000000
## 5040                                       TRINITY CHARTER SCHOOL 480026000000
## 5041                                     Trinity County Community  69104413934
## 5042                                 Trinity County Juvenile Hall  69104410444
## 5043                                Tristar Acad Safe Sch Program 170017000000
## 5044                                    Trojan Alternative School 530666000000
## 5045                                    Troy Continuing Education 263426000000
## 5046                                               TROY J J A E P 484326000000
## 5047                                   Tsurai High (Continuation)  60303007262
## 5048                                 Tuba City Alternative School  40868001822
## 5049                                    Tulare City Community Day  63987008422
## 5050                                      Tulare County Community  69104510700
## 5051                                          Tulare County Court  69104509053
## 5052                                               Tulare Support  63987012991
## 5053                            Tulare Technical Preparatory High  63993002852
## 5054                                       Tule Continuation High  60201001837
## 5055                                   Tulelake Continuation High  63994003335
## 5056                         TULOSO-MIDWAY ACADEMIC CAREER CENTER 484335000000
## 5057                                Tuolumne County Community/ISP  69104601850
## 5058                                    TUPELO ALTERNATIVE SCHOOL 280432000000
## 5059                                              Turbeville High 450000000000
## 5060                                 Turlington Woods Alternative 510371000000
## 5061                                         TURN AROUND GRADUATE 481396000000
## 5062                               Turner County Specialty School 130519000000
## 5063                                       TURNER/GUILFORD/KNIGHT 120039000000
## 5064                                                Turning Point 320048000000
## 5065                                                TURNING POINT 120099000000
## 5066                                        Turning Point Academy 370090000000
## 5067                                        Turning Point Academy 370297000000
## 5068                          Turning Point Alternative Education 510282000000
## 5069                               TURNING POINT SECONDARY SCHOOL 480870000000
## 5070                                       TURNING POINTS ACADEMY 120150000000
## 5071                          Turquoise Dawn Alternative - Closed  40194001139
## 5072                  Tuscaloosa County Juvenile Detention Center  10339000233
## 5073                                               Tustin Connect  64015007201
## 5074                                                   Twain High  63432005562
## 5075                                      Twin Cedars High School 530166000000
## 5076                                            TWIN OAKS ACADEMY 120120000000
## 5077                                               Twin Oaks High  63488005891
## 5078                                      Twin Palms Continuation  62964004603
## 5079                                              Two Rivers High 490120000000
## 5080                                            Two Rivers School 530804000000
## 5081                                             Tyger River High 450000000000
## 5082                                          U of L PACT Program 210299000000
## 5083                                            UCP Of Mobile Inc  10237001624
## 5084                              UCS Alternative Learning Center 263447000000
## 5085                         Ugrad ? ESD123 Re-Engagement Program 530001000000
## 5086                                            Uintah River High 490001000000
## 5087                              Ukiah Independent Study Academy  64030013714
## 5088                                                  UMDNJ - CTR 340009000000
## 5089                                                UNDERWOOD ALP 274083000000
## 5090                               Unified Middle Virtual Academy 262946000000
## 5091                                                Union Academy 370276000000
## 5092                              Union County Alternative Center 470429000000
## 5093                                Union County Learning Academy 210564000000
## 5094                                            UNION HIGH SCHOOL 160234000000
## 5095            UNION JUVENILE RESIDENTIAL FACILITY-THREE SPRINGS 120189000000
## 5096                                        UNION REGIONAL SCHOOL 340009000000
## 5097                           UNITED HOSPITAL ADOLESCENT PROGRAM 273384000000
## 5098                                          UNITED STEP ACADEMY 484365000000
## 5099                                     Unity Alternative School 262205000000
## 5100                                   UNIVERSAL EDUCATION CENTER 120144000000
## 5101                                 UNIVERSITY BEHAVIORAL CENTER 120144000000
## 5102                                               UNIVERSITY H S 480007000000
## 5103                                              UNIVERSITY HIGH 350225000000
## 5104                                       University High School 170010000000
## 5105                              University of Illinois High Sch 170010000000
## 5106                                  UNLIMITED VISIONS AFTERCARE 480007000000
## 5107                               UNO/OPS MIDDLE COLLEGE PROGRAM 317482000000
## 5108                                                     UnSchool  63462014105
## 5109                                               UPLIFT Academy 341134000000
## 5110                                     Upper Lake Community Day  60144211287
## 5111                               URBAN DOVE TEAM CHARTER SCHOOL 360107000000
## 5112       URCEO-Upper Rogue Center for Educational Opportunities 410450000000
## 5113                 UT - UNIVERSITY CHARTER SCHOOL AT HIGH POINT 480007000000
## 5114                                    UTA HALEE ACADEMY PROGRAM 310017000000
## 5115                                     Vail High (Continuation)  62547003811
## 5116                        VAIL SKI AND SNOWBOARD ACADEMY (VSSA)  80354006422
## 5117                                            Val Verde Academy  69113512749
## 5118                                               Val Verde High  69113510284
## 5119                            Val Verde Student Success Academy  69113511723
## 5120                                  Vallecito Continuation High  60594000538
## 5121                                               Valley Academy  69101013814
## 5122                                   Valley Academy Of Learning 530966000000
## 5123                       Valley Alternative High (Continuation)  61632502069
## 5124                                     Valley Atwater Community  69102010961
## 5125                                           Valley Center Prep  60006910646
## 5126                                         Valley Community Day  60006012334
## 5127                                         Valley Community Day  61632511282
## 5128                                     Valley Elementary School 210147000000
## 5129                                                  Valley High  61086007693
## 5130                                                  Valley High  60001809106
## 5131                                   Valley High (Continuation)  61291001468
## 5132                                   Valley High (Continuation)  60001909274
## 5133                                           Valley High School 210147000000
## 5134                                           Valley High School 490042000000
## 5135                                   Valley Los Banos Community  69102008737
## 5136                                      Valley Merced Community  69102008217
## 5137                                            VALLEY MILLS DAEP 484376000000
## 5138                                 Valley Oak Continuation High  62205009390
## 5139                                              Valley Oak High  62664010563
## 5140                            Valley Oak Junior and Senior High  60006206757
## 5141                         Valley Oaks Elementary (Alternative)  63023005436
## 5142                               Valley Oaks High (Alternative)  63025005439
## 5143                                              Valley Pathways  20051000425
## 5144                              Valley Teen Ranch Community Day  60006811681
## 5145                          VALLEY VIEW ALTERNATIVE HIGH SCHOOL 160309000000
## 5146                              VALLEY VIEW ALTERNATIVE PROGRAM 270006000000
## 5147                                 Valley View Education Center 210165000000
## 5148                                             VALLEY VIEW HIGH 290531000000
## 5149                              Valley View High (Continuation)  60816000797
## 5150                                        VALLEY VIEW J J A E P 484380000000
## 5151                             Valley Vista High (Continuation)  61806002235
## 5152                                             VALLIVUE ACADEMY 160060000000
## 5153                    VAN ZANDT ALTERNATIVE EDUCATION PROG COOP 482145000000
## 5154                         VAN ZANDT CO YOUTH MULTI-SERVICE CTR 482145000000
## 5155                                    Vancouver Home Connection 530927000000
## 5156                           Vancouver Virtual Learning Academy 530927000000
## 5157                           Vandenboom Alternative High School 260001000000
## 5158                              Vandercook Lake Virtual Academy 263465000000
## 5159                                                VANTAGE POINT  80690001172
## 5160                                           Plank Road Complex 551599000000
## 5161                                        Venture (Alternative)  63513008976
## 5162                                              Venture Academy  69103110651
## 5163                                            VENTURE ALTER H S 480870000000
## 5164                                          VENTURE HIGH SCHOOL 160078000000
## 5165                                          Venture High School 261910000000
## 5166                                              Verdugo Academy  61524000440
## 5167                                                VERIBEST DAEP 484404000000
## 5168                                                VERIBEST PPCD 481807000000
## 5169                                                VERIBEST PPCD 481401000000
## 5170                                                VERIBEST PPCD 483398000000
## 5171                                    VERIBEST SPECIAL PROGRAMS 483738000000
## 5172                                                      Veritas 262946000000
## 5173                                                         VICC 292928000000
## 5174                                        Vicente Martinez High  62403001966
## 5175                                VICKI DOUGLAS JUVENILE CENTER 540051000000
## 5176                               Vicksburg Pathways High School 263495000000
## 5177                    VICTORIA REGIONAL JUVENILE JUSTICE CENTER 484415000000
## 5178                            Victory Academy/Ready for Success 510294000000
## 5179                                                 Victory High  60001306176
## 5180                                     VICTORY PLACE AT COPPELL 481521000000
## 5181                                       View Park Continuation  62271003435
## 5182                                       Viking Virtual Academy 261803000000
## 5183                                                      VILLAGE 120144000000
## 5184                   Village Academy High School at Indian Hill  63132008730
## 5185                                                 Village High  60002009280
## 5186                                            Village Oaks High  62169002582
## 5187                            VILLAGE RANCH ALTERNATIVE PROGRAM 270005000000
## 5188                                               VILLAGE SCHOOL 361251000000
## 5189                                  Vincent Accelerated Academy 550960000000
## 5190                                    Vine Street Community Day  60006407905
## 5191                                 Vineland Preparatory Academy 340009000000
## 5192                                         Vineyard Alternative  62211008877
## 5193                       Vintage Math/Science/Technology Magnet  62271003438
## 5194                                          VIOLA M COLEMAN H S 483057000000
## 5195                              Violet Heintz Education Academy  69100710481
## 5196                       Virginia Beach Juvenile Detention Home 510004000000
## 5197                   Virtual Learning Academyof St Clair County 260097000000
## 5198                                 VISION ACADEMY OF EXCELLENCE 481818000000
## 5199                                       VISION CHARTER ACADEMY  80333002024
## 5200                                      VISION QUEST ALT MIDDLE 350006000000
## 5201                                Visions (Seamar Youth Center) 530042000000
## 5202                                          Vista (Alternative)  60561005840
## 5203                                                VISTA ACADEMY  80336006514
## 5204                                            Vista Alternative  61440009369
## 5205                                     Vista Alternative School  40963000157
## 5206                                      Vista Continuation High  61954002355
## 5207                                                   Vista High  62316003540
## 5208                                     Vista High (Alternative)  63255010198
## 5209                                    Vista High (Continuation)  61284008831
## 5210                                        Vista Meadows Academy 260095000000
## 5211                       Vista Nueva Career and Technology High  60133210598
## 5212                                             VISTA NUEVA HIGH 350015000000
## 5213                                        Vista Visions Academy  64119013151
## 5214                                 Vista West Continuation High  61954009145
## 5215                                                   VISTAS H S 482574000000
## 5216                              VOA - Adolescent Treatment - 73 466627000000
## 5217                                              VOA HIGH SCHOOL 272124000000
## 5218                                  Volinia Outcome Base School 262274000000
## 5219                               Volunteers of America Extended 272124000000
## 5220                   VOLUSIA REGIONAL JUVENILE DETENTION CENTER 120192000000
## 5221                                                 VOORHEES RGC 340009000000
## 5222                           VOYAGEURS EXP CHTR-CREDIT RECOVERY 271023000000
## 5223                             VOYAGEURS EXP CHTR-EXTENDED YEAR 271023000000
## 5224                                          W B BIZZELL ACADEMY 483219000000
## 5225                               W ST. PAUL AREA LEARNING CNTR. 274227000000
## 5226                                                     W-ALT-IS 270003000000
## 5227                               W. H. A .  ALTERNATIVE PROGRAM 270291000000
## 5228                        W.A. Bass Alternative Learning Center 470318000000
## 5229                                        W.E.B. DuBois Academy 210299000000
## 5230                       W.W. Moore Jr. Juvenile Detention Home 510004000000
## 5231                                          WACO CHARTER SCHOOL 480002000000
## 5232                                           WACO CTR FOR YOUTH 480915000000
## 5233                                      Waconia Learning Center 274146000000
## 5234                                Waconia Learning Center SS/AS 274146000000
## 5235                                    Wahtonka Community School 410005000000
## 5236                                               WAKAPA ACADEMY 160048000000
## 5237                                            WAKULLA INSTITUTE 120195000000
## 5238                                              Walden III High 551236000000
## 5239                            Walker County Schools 180 Program  10345001225
## 5240                                           Walker High School 530696000000
## 5241                                 WALKER-HACKENSACK-AKELEY ALC 271023000000
## 5242                                                    WALL PPCD 484441000000
## 5243                                                 WALL SP PROG 483738000000
## 5244                                       WALL SP PROG (FLC/BAC) 481401000000
## 5245                                        WALL SPECIAL PROGRAMS 484441000000
## 5246                                        WALL SPECIAL PROGRAMS 484471000000
## 5247                                        WALL SPECIAL PROGRAMS 483357000000
## 5248                                        WALL SPECIAL PROGRAMS 483398000000
## 5249                                        WALL SPECIAL PROGRAMS 484155000000
## 5250                                      WALLACE ACCELERATED H S 481464000000
## 5251                                      WALLACE ACCELERATED H S 480001000000
## 5252                                   WALLACE ALTERNATIVE CAMPUS 482319000000
## 5253                                                  WALLACE H S 483786000000
## 5254                                             WALLER J J A E P 484443000000
## 5255                                          Walnut Creek Campus 193093000000
## 5256                                          WALNUT SPRINGS DAEP 484452000000
## 5257                          Walnutwood High (Independent Study)  61389009821
## 5258                              Walter J. Katnich Community Day  62223012737
## 5259                                          WALTON ACADEMY INC. 120198000000
## 5260                                   WALTON COUNTY JAIL PROGRAM 120198000000
## 5261            WALTON INITIATIVE FOR SUCCESS IN EDUCATION (WISE) 120198000000
## 5262                                       WALTON LEARNING CENTER 120198000000
## 5263                                            Wanaque Preschool 340009000000
##                                                       Agency_Name
## 1                             EASTERN CARVER COUNTY PUBLIC SCHOOL
## 2                             EASTERN CARVER COUNTY PUBLIC SCHOOL
## 3                             EASTERN CARVER COUNTY PUBLIC SCHOOL
## 4                                                Beaumont Unified
## 5                                INTERMEDIATE SCHOOL DISTRICT 287
## 6                                INTERMEDIATE SCHOOL DISTRICT 287
## 7                                INTERMEDIATE SCHOOL DISTRICT 287
## 8                                INTERMEDIATE SCHOOL DISTRICT 287
## 9                                INTERMEDIATE SCHOOL DISTRICT 287
## 10                               INTERMEDIATE SCHOOL DISTRICT 287
## 11                               INTERMEDIATE SCHOOL DISTRICT 287
## 12                               INTERMEDIATE SCHOOL DISTRICT 287
## 13                               INTERMEDIATE SCHOOL DISTRICT 287
## 14                               INTERMEDIATE SCHOOL DISTRICT 287
## 15                               INTERMEDIATE SCHOOL DISTRICT 287
## 16                               INTERMEDIATE SCHOOL DISTRICT 287
## 17                               INTERMEDIATE SCHOOL DISTRICT 287
## 18                               INTERMEDIATE SCHOOL DISTRICT 287
## 19                                           IDAHO FALLS DISTRICT
## 20                                                      DONNA ISD
## 21                               INTERMEDIATE SCHOOL DISTRICT 287
## 22                               INTERMEDIATE SCHOOL DISTRICT 287
## 23                               INTERMEDIATE SCHOOL DISTRICT 287
## 24                                   Kelloggsville Public Schools
## 25                            NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 26                               Pueblo County School District 70
## 27                             Minneapolis Public School District
## 28                             Minneapolis Public School District
## 29                                            NORTHEAST METRO 916
## 30                                ST. PAUL PUBLIC SCHOOL DISTRICT
## 31                                                        ALACHUA
## 32                                 Department of Juvenile Justice
## 33                                                    ABC Unified
## 34                                   ROSEMOUNT-APPLE VALLEY-EAGAN
## 35                                  Aberdeen School District 06-1
## 36                                                  ABERNATHY ISD
## 37                                                    EL PASO ISD
## 38                                                    EL PASO ISD
## 39                                          Southern Kern Unified
## 40                                              Riverside Unified
## 41                                                  Poway Unified
## 42                          Academic and Career Education Academy
## 43                                       HARRIS COUNTY DEPT OF ED
## 44                                       HARRIS COUNTY DEPT OF ED
## 45                              Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 46                                          CABOT SCHOOL DISTRICT
## 47                                                        BROWARD
## 48                                                        BROWARD
## 49                                          San Francisco Unified
## 50                                     Center Line Public Schools
## 51                                      CHESTERFIELD CO PBLC SCHS
## 52                                        SANTA FE PUBLIC SCHOOLS
## 53                                           HENRICO CO PBLC SCHS
## 54                                      ALAMOGORDO PUBLIC SCHOOLS
## 55                                                  Chico Unified
## 56                                                    ACADEMY ISD
## 57                            ACADEMY OF ACCELERATED LEARNING INC
## 58                                              SPRING BRANCH ISD
## 59                                                 NORTH EAST ISD
## 60                                              ACADEMY OF DALLAS
## 61                                           LOUDOUN CO PBLC SCHS
## 62                                             Fortuna Union High
## 63                             INSTITUTIONAL EDUCATIONAL PROGRAMS
## 64                                   BUFFALO CITY SCHOOL DISTRICT
## 65                                       Westwood Heights Schools
## 66                                            Acalanes Union High
## 67                                    Ypsilanti Community Schools
## 68                           Flint School District of the City of
## 69                           DR M L GARZA-GONZALEZ CHARTER SCHOOL
## 70                                                           DADE
## 71                                         Bethel School District
## 72                                                      ST. LUCIE
## 73                                                         ORANGE
## 74                                                            LEE
## 75                                                         ORANGE
## 76                                           OMAHA PUBLIC SCHOOLS
## 77                            SOUTH WASHINGTON COUNTY SCHOOL DIST
## 78                          Orange County Department of Education
## 79                          Orange County Department of Education
## 80                                              ACE Academy (SDA)
## 81   School District No. 1 in the county of Denver and State of C
## 82                                       Mukilteo School District
## 83                                                      WYLIE ISD
## 84                                                          PASCO
## 85                                  Baltimore City Public Schools
## 86                                    Roseville Community Schools
## 87                                           FAIRFAX CO PBLC SCHS
## 88                                               Jefferson County
## 89                                     Napoleon Community Schools
## 90                                                   HILLSBOROUGH
## 91                                     BOISE INDEPENDENT DISTRICT
## 92                               ADA-BORUP PUBLIC SCHOOL DISTRICT
## 93                                                   Adair County
## 94                              Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 95                                            School District 27J
## 96                                     Alum Rock Union Elementary
## 97                                     Alum Rock Union Elementary
## 98                                            Reef-Sunset Unified
## 99                                              Riverbank Unified
## 100                                    Roseville Joint Union High
## 101                                                      OKALOOSA
## 102                                                     ALIEF ISD
## 103                               AZ Dept of Juvenile Corrections
## 104                         Adrian School District of the City of
## 105                                       DANVILLE CITY PBLC SCHS
## 106                            ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 107                                   Vicksburg Community Schools
## 108                                                     PLANO ISD
## 109      OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 110                                               BROWNSVILLE ISD
## 111                                                FORT WORTH ISD
## 112                                   ELKO COUNTY SCHOOL DISTRICT
## 113                                          HENRICO CO PBLC SCHS
## 114                                                   ABILENE ISD
## 115                                       VA BEACH CITY PBLC SCHS
## 116                                                     EANES ISD
## 117                                                    YSLETA ISD
## 118                                          Vance County Schools
## 119                     Hazel Park School District of the City of
## 120                                                      HOWE ISD
## 121                        Los Angeles County Office of Education
## 122                               Baltimore County Public Schools
## 123                             DETROIT LAKES PUBLIC SCHOOL DIST.
## 124                                           Los Angeles Unified
## 125                                              Jefferson County
## 126                                              Yosemite Unified
## 127                                Breckenridge Community Schools
## 128                                                     VIDOR ISD
## 129                                                 GALVESTON ISD
## 130                                     Snohomish School District
## 131                                     Airport Community Schools
## 132                                 AITKIN PUBLIC SCHOOL DISTRICT
## 133                                            South Lane SD 45J3
## 134                                                       ALACHUA
## 135                                                       ALACHUA
## 136                                                       ALACHUA
## 137                            Alameda County Office of Education
## 138                            Alameda County Office of Education
## 139                                               Alameda Unified
## 140                            Alamosa School District No. Re-11J
## 141                                             San Diego Unified
## 142                                   Greater Albany Public SD 8J
## 143      OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 144                                           Los Angeles Unified
## 145                             ALBERT LEA PUBLIC SCHOOL DISTRICT
## 146                                             Yuba City Unified
## 147                              INTERMEDIATE SCHOOL DISTRICT 287
## 148                              INTERMEDIATE SCHOOL DISTRICT 287
## 149                              INTERMEDIATE SCHOOL DISTRICT 287
## 150                              INTERMEDIATE SCHOOL DISTRICT 287
## 151                              INTERMEDIATE SCHOOL DISTRICT 287
## 152                                          FAIRFAX CO PBLC SCHS
## 153                                          FAIRFAX CO PBLC SCHS
## 154                                          FAIRFAX CO PBLC SCHS
## 155                                          FAIRFAX CO PBLC SCHS
## 156                                  OSSEO PUBLIC SCHOOL DISTRICT
## 157                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 158                                  OSSEO PUBLIC SCHOOL DISTRICT
## 159                              INTERMEDIATE SCHOOL DISTRICT 287
## 160                              INTERMEDIATE SCHOOL DISTRICT 287
## 161                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 162                            Minneapolis Public School District
## 163                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 164                                  OSSEO PUBLIC SCHOOL DISTRICT
## 165                                  OSSEO PUBLIC SCHOOL DISTRICT
## 166                               OWATONNA PUBLIC SCHOOL DISTRICT
## 167                                  OSSEO PUBLIC SCHOOL DISTRICT
## 168                                  OSSEO PUBLIC SCHOOL DISTRICT
## 169                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 170                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 171                              INTERMEDIATE SCHOOL DISTRICT 287
## 172                              INTERMEDIATE SCHOOL DISTRICT 287
## 173                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 174                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 175                                  OSSEO PUBLIC SCHOOL DISTRICT
## 176                              ROCHESTER PUBLIC SCHOOL DISTRICT
## 177                              INTERMEDIATE SCHOOL DISTRICT 287
## 178                              INTERMEDIATE SCHOOL DISTRICT 287
## 179                                            ALCORN SCHOOL DIST
## 180                                                    ALDINE ISD
## 181                                                    ALDINE ISD
## 182                                                          LAKE
## 183                                          ALEGENT/IMMANUEL RTC
## 184                                                 Hemet Unified
## 185                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 186                                               Campbell County
## 187                                     Cumberland County Schools
## 188                            Michigan Department of Corrections
## 189                                     DEPARTMENT OF CORRECTIONS
## 190                             Algonac Community School District
## 191                                                FORT WORTH ISD
## 192                             Fresno County Office of Education
## 193                                                    YSLETA ISD
## 194                                                     ALIEF ISD
## 195                                                     ALIEF ISD
## 196                                                     ALIEF ISD
## 197                                                     PLANO ISD
## 198                                        Allegan Public Schools
## 199                        GENESEE VALLEY CENTRAL SCHOOL DISTRICT
## 200                                Northwest Allen County Schools
## 201                                     Allen Park Public Schools
## 202                                                 Blount County
## 203                                                Portland SD 1J
## 204    Falcon School District No. 49 in the county of El Paso and
## 205                              INTERMEDIATE SCHOOL DISTRICT 287
## 206                                     SCHERTZ-CIBOLO-U CITY ISD
## 207                                                Plumas Unified
## 208                                                        ORANGE
## 209                                     Region 06 West Cook ISC 2
## 210                                   HOWARD LAKE-WAVERLY-WINSTED
## 211                                                  MAGNOLIA ISD
## 212                             Alpine County Office of Education
## 213                                         Alpine County Unified
## 214                                          Trinity Alps Unified
## 215                                         Sweetwater Union High
## 216                                         Santa Barbara Unified
## 217                                         Santa Barbara Unified
## 218                            Mountain View-Los Altos Union High
## 219                                                 Vista Unified
## 220                                          EAGLE MT-SAGINAW ISD
## 221                                              ECTOR COUNTY ISD
## 222                                                     BRADY ISD
## 223                                      HURST-EULESS-BEDFORD ISD
## 224                                                NORTH EAST ISD
## 225                                                     HAYS CISD
## 226                                                     KEENE ISD
## 227                                                NORTH EAST ISD
## 228                                                    LUFKIN ISD
## 229                                            FREDERICKSBURG ISD
## 230                                        PORT NECHES-GROVES ISD
## 231                                               ALBA-GOLDEN ISD
## 232                     ALT ED PRGM/BEHAV DISORD YOUTH/MONTGOMERY
## 233                                   LITTLE ROCK SCHOOL DISTRICT
## 234                                                  EDGEWOOD ISD
## 235                                                  INDIAN RIVER
## 236                           Rochester Community School District
## 237                                       DANBURY SCHOOL DISTRICT
## 238              Tucson Youth Development/ACE Charter High School
## 239                                           GREENE CO PBLC SCHS
## 240                                      MECKLENBURG CO PBLC SCHS
## 241                                         FAUQUIER CO PBLC SCHS
## 242                                    Walla Walla Public Schools
## 243                                                  MAGNOLIA ISD
## 244                                                 NEDERLAND ISD
## 245                                                Irvine Unified
## 246               Alternative Educational Academy of Iosco County
## 247              Alternative Educational Academy of Ogemaw County
## 248                                                          LAKE
## 249                                                NORTH EAST ISD
## 250                                          Santa Cruz City High
## 251                                                 NORTHSIDE ISD
## 252                               Paterson Public School District
## 253                                                       WAKULLA
## 254                                             New Haven Unified
## 255                                                     Troy City
## 256                                                    AUSTIN ISD
## 257                                                Russell County
## 258                                                    LAMAR CISD
## 259                                   San Bernardino City Unified
## 260                              YAZOO CITY MUNICIPAL SCHOOL DIST
## 261                                         CYPRESS-FAIRBANKS ISD
## 262                                         CYPRESS-FAIRBANKS ISD
## 263                                      Kalamazoo Public Schools
## 264                                       MARSHALL CO SCHOOL DIST
## 265                  Fairbanks North Star Borough School District
## 266                                                 NORTHSIDE ISD
## 267                 Salem County Special Services School District
## 268                                                 NORTHSIDE ISD
## 269                                                          DADE
## 270                                                    PALM BEACH
## 271                              Montgomery County Public Schools
## 272                                     DIVISION OF YOUTH SERVICE
## 273                                         SOUTH SAN ANTONIO ISD
## 274                                                 STOCKDALE ISD
## 275                               Mason City Comm School District
## 276                                              BARBERS HILL ISD
## 277                                                 Barrow County
## 278                                                 DeKalb County
## 279                                 Methow Valley School District
## 280                            WILLINGBORO PUBLIC SCHOOL DISTRICT
## 281                                        NORFOLK PUBLIC SCHOOLS
## 282                              Mid-Prairie Comm School District
## 283                                                     TYLER ISD
## 284                                                Alvord Unified
## 285                                                Alvord Unified
## 286                                               SAN BENITO CISD
## 287                           TEXAS COLLEGE PREPARATORY ACADEMIES
## 288                                           Los Angeles Unified
## 289                                 AMERICAN FALLS JOINT DISTRICT
## 290                            Minneapolis Public School District
## 291                            Minneapolis Public School District
## 292                                       Sacramento City Unified
## 293                                                      PINELLAS
## 294                                                      OKALOOSA
## 295                                              LOS FRESNOS CISD
## 296                                                  HILLSBOROUGH
## 297                                                          LEON
## 298                                                       ALACHUA
## 299                                                          CLAY
## 300                                                         DUVAL
## 301                                                       MANATEE
## 302                                                          DADE
## 303                                                          DADE
## 304                                                       BROWARD
## 305                                                        ORANGE
## 306                                                           LEE
## 307                                                       VOLUSIA
## 308                                          Desert Sands Unified
## 309                           COLUMBIA HEIGHTS PUBLIC SCHOOL DIST
## 310       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 311                                                BIG SPRING ISD
## 312                                           Anderson Union High
## 313                                                   ANDREWS ISD
## 314                                                       BROWARD
## 315                                           Los Angeles Unified
## 316       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 317                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 318                         Prince George's County Public Schools
## 319                            Anne Arundel County Public Schools
## 320                                                 Anniston City
## 321                 UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 322                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 323                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 324                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 325                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 326                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 327                                                        Boston
## 328                                          Anson County Schools
## 329                                           Antelope Elementary
## 330                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 331                              INTERMEDIATE SCHOOL DISTRICT 917
## 332                           NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 333                            ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 334                                                     ANTON ISD
## 335                             Cochise County Juvenile Detention
## 336                              Graham County Juvenile Detention
## 337                               Pinal County Juvenile Detention
## 338                                          Ray of Light Academy
## 339                        Yavapai County Juvenile Justice Center
## 340                           Yuma County Juvenile Justice Center
## 341                                Gila County Juvenile Detention
## 342                                                       LIBERTY
## 343                                               Anderson County
## 344                                          East Side Union High
## 345                                           Simi Valley Unified
## 346                                 Appleton Area School District
## 347                                  Howard County Public Schools
## 348                                        Atlanta Public Schools
## 349                                              ARANSAS PASS ISD
## 350                        Boulder Valley School District No. Re2
## 351                                          Pierce Joint Unified
## 352                             Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 353                             Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 354                            LE SUEUR-HENDERSON SCHOOL DISTRICT
## 355                               WHITE BEAR LAKE SCHOOL DISTRICT
## 356                                            El Segundo Unified
## 357                                                 Ceres Unified
## 358                                           NORTHEAST METRO 916
## 359                              Sioux Falls School District 49-5
## 360                                          Santa Cruz City High
## 361                                                 ARLINGTON ISD
## 362                                     Arlington School District
## 363                                           Armada Area Schools
## 364                            ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 365                                           Charter Oak Unified
## 366                                 DULUTH PUBLIC SCHOOL DISTRICT
## 367                                           Los Angeles Unified
## 368                                                      KATY ISD
## 369                                        LINCOLN PUBLIC SCHOOLS
## 370                                   West Linn-Wilsonville SD 3J
## 371                                         San Francisco Unified
## 372                                        Lincoln County Schools
## 373                                                       BROWARD
## 374                                        Bad Axe Public Schools
## 375                                                 PLAINVIEW ISD
## 376                           Southgate Community School District
## 377                                              Jessamine County
## 378                                       Richmond County Schools
## 379                                               Uintah District
## 380                             Arizona Department of Corrections
## 381                             Arizona Department of Corrections
## 382                             Arizona Department of Corrections
## 383                             Arizona Department of Corrections
## 384                             Arizona Department of Corrections
## 385                             Arizona Department of Corrections
## 386                             Arizona Department of Corrections
## 387                             Arizona Department of Corrections
## 388                             Arizona Department of Corrections
## 389    Academy School District No. 20 in the county of El Paso an
## 390                                       RICHMOND CITY PBLC SCHS
## 391                                                        ORANGE
## 392                                DOUGLAS COUNTY SCHOOL DISTRICT
## 393                             Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 394                                                 Hemet Unified
## 395                                     Milwaukee School District
## 396                                                FORT WORTH ISD
## 397                               Clay/Cwford/Jsper/Lwrnce/Rhland
## 398                               Clay/Cwford/Jsper/Lwrnce/Rhland
## 399                                            Atascadero Unified
## 400                                                  SOMERSET ISD
## 401                                                PLEASANTON ISD
## 402                                                 CHARLOTTE ISD
## 403                                                    POTEET ISD
## 404                                                    DEVINE ISD
## 405                                                JOURDANTON ISD
## 406                                                  PEARSALL ISD
## 407                                    Atherton Community Schools
## 408               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 409                    Atlantic County Vocational School District
## 410       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 411       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 412                                                     Attleboro
## 413                                            Atwater Elementary
## 414                                                Fayette County
## 415                                Department of Juvenile Justice
## 416                                Department of Juvenile Justice
## 417                                              Calexico Unified
## 418                               Plankinton School District 01-1
## 419                               Plankinton School District 01-1
## 420                                 AUSTIN PUBLIC SCHOOL DISTRICT
## 421                                 AUSTIN PUBLIC SCHOOL DISTRICT
## 422                                          TEXANS CAN ACADEMIES
## 423                 UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 424                                                    AUSTIN ISD
## 425                                                Autauga County
## 426                                     Anchorage School District
## 427                                           Los Angeles Unified
## 428                                       Olympia School District
## 429                                      Avondale School District
## 430                                                    AXTELL ISD
## 431                                           BRUCEVILLE-EDDY ISD
## 432                                           BRUCEVILLE-EDDY ISD
## 433                                                      AZLE ISD
## 434                                        TRINITY CHARTER SCHOOL
## 435                                        TRINITY CHARTER SCHOOL
## 436                                        TRINITY CHARTER SCHOOL
## 437                                              JUVENILE JUSTICE
## 438                                       Beaufort County Schools
## 439                                        B H R A Cooperative HS
## 440                                          Newport-Mesa Unified
## 441                                   South San Francisco Unified
## 442                                         BEEBE SCHOOL DISTRICT
## 443                                 BAGLEY PUBLIC SCHOOL DISTRICT
## 444                                           Los Angeles Unified
## 445                               Baltimore County Public Schools
## 446                             Bangor Public Schools (Van Buren)
## 447                                       Bangor Township Schools
## 448                                     Milwaukee School District
## 449                                               Banning Unified
## 450                                                  BANQUETE ISD
## 451                            Michigan Department of Corrections
## 452                                                    IRVING ISD
## 453                                                   MIDLAND ISD
## 454                                                    DALLAS ISD
## 455                                                    DALLAS ISD
## 456                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 457                                     Parchment School District
## 458                                         Bardstown Independent
## 459                                     Coolidge Unified District
## 460                                Central Kitsap School District
## 461                                                Jackson County
## 462                                                Jackson County
## 463                                         MARION COUNTY SCHOOLS
## 464                                Three Rivers Community Schools
## 465                                  Erlanger-Elsmere Independent
## 466                                                          POLK
## 467                            Minneapolis Public School District
## 468                                         TETON COUNTY DISTRICT
## 469                                                     ELGIN ISD
## 470                                                SMITHVILLE ISD
## 471                                       Bates Technical College
## 472                             Battle Creek Area Learning Center
## 473                                                 Barren County
## 474                                      Bay City School District
## 475                                      Bay City School District
## 476                                      Bay City School District
## 477                                                           BAY
## 478                         Green Bay Area Public School District
## 479                              Bay-Arenac Community High School
## 480                                                         PASCO
## 481                                         Moreno Valley Unified
## 482                                                      PINELLAS
## 483                             Region 6 and 8-SW/WC Service Coop
## 484                               Baltimore County Public Schools
## 485                                            Long Beach Unified
## 486                                                 Warren County
## 487                            BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 488                            BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 489                                                       COLLIER
## 490                                 BECKER PUBLIC SCHOOL DISTRICT
## 491                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 492                                                Plumas Unified
## 493                                   Gull Lake Community Schools
## 494                                          BEDFORD CO PBLC SCHS
## 495                         NEW YORK CITY GEOGRAPHIC DISTRICT #13
## 496                                    BELEN CONSOLIDATED SCHOOLS
## 497                                                    TEMPLE ISD
## 498                                                    BELTON ISD
## 499                                                  BARTLETT ISD
## 500                                                    SALADO ISD
## 501                                                   Bell County
## 502                                                   ACADEMY ISD
## 503                                                    SALADO ISD
## 504                                                    ROGERS ISD
## 505                                                   HOLLAND ISD
## 506                                                  FLORENCE ISD
## 507                                                    ROGERS ISD
## 508                                                   HOLLAND ISD
## 509                            Michigan Department of Corrections
## 510                            Belle Fourche School District 09-1
## 511                                    FORT SMITH SCHOOL DISTRICT
## 512                                      Bellevue School District
## 513                                              Jefferson County
## 514                                            Bellflower Unified
## 515                                    Bellingham School District
## 516                                    Bellingham School District
## 517                           Belmond-Klemme Comm School District
## 518                                        Beloit School District
## 519                                BEMIDJI PUBLIC SCHOOL DISTRICT
## 520                                BEMIDJI PUBLIC SCHOOL DISTRICT
## 521                                BEMIDJI PUBLIC SCHOOL DISTRICT
## 522                            Carman-Ainsworth Community Schools
## 523                                        MOUNTAIN HOME DISTRICT
## 524                                 BENSON PUBLIC SCHOOL DISTRICT
## 525                                 BENSON PUBLIC SCHOOL DISTRICT
## 526                                     Anchorage School District
## 527                             Bentley Community School District
## 528                                 Benzie County Central Schools
## 529               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 530       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 531                                              Berkeley Unified
## 532                                Berrien Springs Public Schools
## 533                                Berrien Springs Public Schools
## 534                                Berrien Springs Public Schools
## 535                                Berrien Springs Public Schools
## 536                                    Berryessa Union Elementary
## 537                                                        ORANGE
## 538                                   Grand Rapids Public Schools
## 539                                 DULUTH PUBLIC SCHOOL DISTRICT
## 540                               Lower Kuskokwim School District
## 541                                                  EDGEWOOD ISD
## 542                                                HARLANDALE ISD
## 543                                                    JUDSON ISD
## 544                                              EAST CENTRAL ISD
## 545                                             ALAMO HEIGHTS ISD
## 546                                         SOUTH SAN ANTONIO ISD
## 547                                                 SOUTHWEST ISD
## 548                                                 SOUTHSIDE ISD
## 549                                             MEDINA VALLEY ISD
## 550                                              EAST CENTRAL ISD
## 551                                               Antioch Unified
## 552                                     Stony Creek Joint Unified
## 553                                      Highline School District
## 554                                     Big Rapids Public Schools
## 555                                                BIG SPRING ISD
## 556                                    BIG SPRINGS CHARTER SCHOOL
## 557                                                 Biggs Unified
## 558                                                          POLK
## 559                                                      WACO ISD
## 560                                              CHINA SPRING ISD
## 561                                    San Pasqual Valley Unified
## 562                                  CLARK COUNTY SCHOOL DISTRICT
## 563                                      Dept of Juvenile Justice
## 564                                                         DUVAL
## 565                                                 Thomas County
## 566                                                Bishop Unified
## 567                                                Bishop Unified
## 568                                                Bishop Unified
## 569                                   EMMETT INDEPENDENT DISTRICT
## 570                                             Pittsburg Unified
## 571                      Black Hills Special Services Cooperative
## 572                      Black Hills Special Services Cooperative
## 573                                Spearfish School District 40-2
## 574                           Wisconsin Department of Corrections
## 575                                               Morongo Unified
## 576                                          OMAHA PUBLIC SCHOOLS
## 577                                        Blaine School District
## 578                                        Blaine School District
## 579                                                BOYS RANCH ISD
## 580                                       SAN FELIPE-DEL RIO CISD
## 581        Blended Learning Academies Credit Recovery High School
## 582                                               Konocti Unified
## 583                                               Tooele District
## 584                          El Dorado County Office of Education
## 585                                          Avery County Schools
## 586                                         DOE SOP EDUC PROGRAMS
## 587                                         MERCER COUNTY SCHOOLS
## 588                                          Eminence Independent
## 589                                                  Rowan County
## 590                                                  Rowan County
## 591                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 592                                Department of Juvenile Justice
## 593                                                    BOERNE ISD
## 594                                        TRINITY CHARTER SCHOOL
## 595                               BIRD ISLAND-OLIVIA-LAKE LILLIAN
## 596                                       Vigo County School Corp
## 597                                                  Boone County
## 598                                     DEPARTMENT OF CORRECTIONS
## 599                                     DEPARTMENT OF CORRECTIONS
## 600                                                        Boston
## 601                                                        Boston
## 602                                                        Boston
## 603                            Phoenix Union High School District
## 604                        Boulder Valley School District No. Re2
## 605                                                FORT WORTH ISD
## 606                                                  HILLSBOROUGH
## 607                                     Bowling Green Independent
## 608                                    William S. Hart Union High
## 609                                                  Boyle County
## 610                                           Los Angeles Unified
## 611                                           Campbell Union High
## 612                                              Jefferson County
## 613                                                BOYS RANCH ISD
## 614                                          Chino Valley Unified
## 615                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 616                                                      SEMINOLE
## 617                                    BOYS TOWN INTERIM PRG SCHS
## 618                                                          DADE
## 619                                                      BRADFORD
## 620                      Jefferson County School District No. R-1
## 621                                            Lee County Schools
## 622                                                  LONGVIEW ISD
## 623                                                  Meade County
## 624                                                  HILLSBOROUGH
## 625                                  Brandywine Community Schools
## 626                                              Woodlake Unified
## 627                                                  ANGLETON ISD
## 628                                                   DANBURY ISD
## 629                                                  PEARLAND ISD
## 630                                         COLUMBIA-BRAZORIA ISD
## 631                                                    SWEENY ISD
## 632                                                     ALVIN ISD
## 633                                                     DAMON ISD
## 634                                                  ANGLETON ISD
## 635                                                     BRYAN ISD
## 636                                                     BRYAN ISD
## 637                                                      WACO ISD
## 638                                   BRAZOS RIVER CHARTER SCHOOL
## 639                        BRAZOS SCHOOL FOR INQUIRY & CREATIVITY
## 640                        BRAZOS SCHOOL FOR INQUIRY & CREATIVITY
## 641                                                BRAZOSPORT ISD
## 642                                           Brea-Olinda Unified
## 643                     BREAKING BARRIERS ALTERNATIVE ED/HENRY CO
## 644                                              Breathitt County
## 645                                              Breathitt County
## 646                                              Breathitt County
## 647                           BRECKENRIDGE PUBLIC SCHOOL DISTRICT
## 648                                              Jefferson County
## 649                                     Bremerton School District
## 650                                               Hayward Unified
## 651  NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 652                                           Los Angeles Unified
## 653                                                       BREVARD
## 654                                                       BREVARD
## 655                                                       BREVARD
## 656                                               SAN ANTONIO ISD
## 657                                      Brewster School District
## 658                                           TWIN FALLS DISTRICT
## 659                                         Brighton Area Schools
## 660                                                FORT WORTH ISD
## 661                                                Newark Unified
## 662                                    Bridgeport School District
## 663                         Roaring Fork School District No. Re-1
## 664                                               Antioch Unified
## 665                                      Lemoore Union Elementary
## 666                                           Charter Oak Unified
## 667                                            Capistrano Unified
## 668                                      Jefferson County SD 509J
## 669                                Carteret County Public Schools
## 670                                           School District 27J
## 671                                              Martinez Unified
## 672                               ST. PAUL PUBLIC SCHOOL DISTRICT
## 673                                              San Jose Unified
## 674                         NEW YORK CITY GEOGRAPHIC DISTRICT #12
## 675                                              Jefferson County
## 676                         NEW YORK CITY GEOGRAPHIC DISTRICT #13
## 677                               BROOKLYN CENTER SCHOOL DISTRICT
## 678                               BROOKLYN CENTER SCHOOL DISTRICT
## 679                               BROOKLYN CENTER SCHOOL DISTRICT
## 680                               BROOKLYN CENTER SCHOOL DISTRICT
## 681                            Michigan Department of Corrections
## 682  NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 683                                                       BROWARD
## 684                                                       BROWARD
## 685                                  Brown City Community Schools
## 686                                                BROWNFIELD ISD
## 687                                               BROWNSVILLE ISD
## 688                         NEW YORK CITY GEOGRAPHIC DISTRICT #17
## 689                                               BROWNSVILLE ISD
## 690                                               BROWNSVILLE ISD
## 691                                                 BROWNWOOD ISD
## 692                                        LINCOLN PUBLIC SCHOOLS
## 693                                       Spokane School District
## 694                                          FAIRFAX CO PBLC SCHS
## 695                                    Buchanan Community Schools
## 696                                                  Perry County
## 697                                                 Oldham County
## 698                                      PHARR-SAN JUAN-ALAMO ISD
## 699                                      Pleasant View Elementary
## 700                                          Chino Valley Unified
## 701                                             Paramount Unified
## 702                                           Geyserville Unified
## 703                                               Taft Union High
## 704                                      HURST-EULESS-BEDFORD ISD
## 705                                                Bullitt County
## 706                                 Bullock Creek School District
## 707                                               Burbank Unified
## 708                                               Burbank Unified
## 709                     Matanuska-Susitna Borough School District
## 710                                  CLARK COUNTY SCHOOL DISTRICT
## 711                            INSTITUTIONAL EDUCATIONAL PROGRAMS
## 712               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 713            BURLINGTON COUNTY SPECIAL SERVICES SCHOOL DISTRICT
## 714       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 715       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 716                             Burlington-Edison School District
## 717                                                 EXCEL ACADEMY
## 718                                      Fall River Joint Unified
## 719                                      Fall River Joint Unified
## 720                                            Harney County SD 3
## 721                             BURNSVILLE PUBLIC SCHOOL DISTRICT
## 722                             BURNSVILLE PUBLIC SCHOOL DISTRICT
## 723                             BURNSVILLE PUBLIC SCHOOL DISTRICT
## 724                            Burr Oak Community School District
## 725                                             Burton Elementary
## 726                                               Barstow Unified
## 727                                                 Butler County
## 728                              Butte County Office of Education
## 729                                             Sutter Union High
## 730                           Monte Vista School District No. C-8
## 731                                                           BAY
## 732                                                  Gadsden City
## 733                                LINCOLN COUNTY SCHOOL DISTRICT
## 734                                                 Monroe County
## 735                                                          DADE
## 736                                CLOQUET PUBLIC SCHOOL DISTRICT
## 737                                       Cabarrus County Schools
## 738                                         CABELL COUNTY SCHOOLS
## 739                                        Woodland Joint Unified
## 740                                                Cache District
## 741                                                 COMMUNITY ISD
## 742                                  Cadillac Area Public Schools
## 743                                            Cajon Valley Union
## 744                                           Los Angeles Unified
## 745                                              Milpitas Unified
## 746                          Calaveras County Office of Education
## 747                                             Calaveras Unified
## 748                                                  CALDWELL ISD
## 749                                          East Side Union High
## 750                                                Calhoun County
## 751                                         Silver Valley Unified
## 752                                            Capistrano Unified
## 753                                               Manteca Unified
## 754                         Red Clay Consolidated School District
## 755                                               Calloway County
## 756                                               Calloway County
## 757                                 Calvert County Public Schools
## 758                                  CALVIN NELMS CHARTER SCHOOLS
## 759                                  CALVIN NELMS CHARTER SCHOOLS
## 760                                             Elk Grove Unified
## 761                                 Battle Ground School District
## 762                                                Fresno Unified
## 763                                        Coalinga-Huron Unified
## 764               OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 765                                           Campbell Union High
## 766       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 767       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 768       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 769                                                      ESCAMBIA
## 770                                       Cameron School District
## 771                                               SAN BENITO CISD
## 772                                                 RIO HONDO ISD
## 773                                                HARLINGEN CISD
## 774                                               BROWNSVILLE ISD
## 775                                               SOUTH TEXAS ISD
## 776                                              LOS FRESNOS CISD
## 777                                              POINT ISABEL ISD
## 778                                               BROWNSVILLE ISD
## 779                                                  LA FERIA ISD
## 780                                              JUVENILE JUSTICE
## 781                          San Mateo County Office of Education
## 782                                   Camp Verde Unified District
## 783                                              Yosemite Unified
## 784                                    Campbellsville Independent
## 785                                       Mountain Empire Unified
## 786                                        HAMPTON CITY PBLC SCHS
## 787                             GOODHUE COUNTY EDUCATION DISTRICT
## 788                             GOODHUE COUNTY EDUCATION DISTRICT
## 789                                     CANTON PUBLIC SCHOOL DIST
## 790                                                 CANUTILLO ISD
## 791                                              Monrovia Unified
## 792                          San Mateo County Office of Education
## 793                                              Hesperia Unified
## 794                                     Canyon Rose Academy  Inc.
## 795                                             CALDWELL DISTRICT
## 796                                   ALBANY CITY SCHOOL DISTRICT
## 797                                     Anacortes School District
## 798                                       Capac Community Schools
## 799       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 800       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 801                                            Capistrano Unified
## 802                                JACKSON PUBLIC SCHOOL DISTRICT
## 803                                       Sacramento City Unified
## 804                          Madison Metropolitan School District
## 805                              Heber-Overgaard Unified District
## 806                                 Klamath-Trinity Joint Unified
## 807                                                  Scott County
## 808                              ROCHESTER PUBLIC SCHOOL DISTRICT
## 809                              ROCHESTER PUBLIC SCHOOL DISTRICT
## 810                     Stevens Point Area Public School District
## 811                                JACKSON PUBLIC SCHOOL DISTRICT
## 812                                   Federal Way School District
## 813                                    Highland Park City Schools
## 814                     ORANGE BOARD OF EDUCATION SCHOOL DISTRICT
## 815                                            Copper Country ISD
## 816                                          OMAHA PUBLIC SCHOOLS
## 817                                         Wayland Union Schools
## 818                               Grand Haven Area Public Schools
## 819                                    ALBUQUERQUE PUBLIC SCHOOLS
## 820                                      Highline School District
## 821                                   GRAND ISLAND PUBLIC SCHOOLS
## 822                                  CENTRAL CONSOLIDATED SCHOOLS
## 823                                Novi Community School District
## 824                                    New Hanover County Schools
## 825                                      LYNCHBURG CITY PBLC SCHS
## 826                                               Konocti Unified
## 827                                              Carlsbad Unified
## 828                                              Carlsbad Unified
## 829                                                Carmel Unified
## 830                                        Caro Community Schools
## 831                                                 Warren County
## 832                                     Petaluma Joint Union High
## 833                                           Carpinteria Unified
## 834                                            Salinas Union High
## 835                                                Carroll County
## 836                                          CARROLL CO PBLC SCHS
## 837                  CARROLL-GALAX REG ALT ED PRGM/THE RAE CENTER
## 838                                   CARSON CITY SCHOOL DISTRICT
## 839                                   CARSON CITY SCHOOL DISTRICT
## 840                            Michigan Department of Corrections
## 841                              Carson City-Crystal Area Schools
## 842                      Carsonville-Port Sanilac School District
## 843                                                Fayette County
## 844                                                       GADSDEN
## 845                                                 Carter County
## 846                                  Indian River School District
## 847                                                SAN ANGELO ISD
## 848                                     CHESTERFIELD CO PBLC SCHS
## 849                                                 Shelby County
## 850                                                    UNITED ISD
## 851                                          Butte Valley Unified
## 852                                     Shoreline School District
## 853                                                  Cascade SD 5
## 854                                        Seattle Public Schools
## 855                         NEW YORK CITY GEOGRAPHIC DISTRICT # 1
## 856                                    Casman Alternative Academy
## 857                                 CASS LAKE-BENA PUBLIC SCHOOLS
## 858                                  CASSIA COUNTY JOINT DISTRICT
## 859                                     Cassopolis Public Schools
## 860                                    New London School District
## 861                                                          CLAY
## 862                                                         DUVAL
## 863                                                          DADE
## 864           Cathedral Home for Children - Administration Office
## 865                               Baltimore County Public Schools
## 866                                                   LYFORD CISD
## 867                                              RAYMONDVILLE ISD
## 868                                           Monroe/Randolph ROE
## 869                                        COEUR D'ALENE DISTRICT
## 870                                           Los Angeles Unified
## 871                                           Los Angeles Unified
## 872                 UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 873                                                    MULLIN ISD
## 874                                               Sevier District
## 875                                Paw Paw Public School District
## 876                             CENTENNIAL PUBLIC SCHOOL DISTRICT
## 877                                              CENTENNIAL BOCES
## 878                                            Corning Union High
## 879                                    Poudre School District R-1
## 880                                         Golden Valley Unified
## 881                                             Centennial SD 28J
## 882                                                     CENTER 58
## 883                                    PEARL RIVER CO SCHOOL DIST
## 884                                      PICAYUNE SCHOOL DISTRICT
## 885                                                 Chico Unified
## 886                                           COLLEGE STATION ISD
## 887                                  VICKSBURG WARREN SCHOOL DIST
## 888                                                 ROCKWOOD R-VI
## 889                                          HENRICO CO PBLC SCHS
## 890                                                   Madison ROE
## 891                                 Harford County Public Schools
## 892                                      Lapeer Community Schools
## 893                            Minneapolis Public School District
## 894                            Minneapolis Public School District
## 895                               Potter Valley Community Unified
## 896                                   Centinela Valley Union High
## 897                                   JOINT SCHOOL DISTRICT NO. 2
## 898                               WHITE BEAR LAKE SCHOOL DISTRICT
## 899                                 North Monterey County Unified
## 900                                    Monterey Peninsula Unified
## 901                                          Davie County Schools
## 902                                MANKATO PUBLIC SCHOOL DISTRICT
## 903                                        Haywood County Schools
## 904                                           Los Angeles Unified
## 905                                MANKATO PUBLIC SCHOOL DISTRICT
## 906                                           Morgan Hill Unified
## 907                                               Barstow Unified
## 908                               Grand Haven Area Public Schools
## 909                                              MADISON DISTRICT
## 910                                                           BAY
## 911                        Los Angeles County Office of Education
## 912                                               Medford SD 549C
## 913                            Michigan Department of Corrections
## 914                                WAYZATA PUBLIC SCHOOL DISTRICT
## 915                                  Iron Mountain Public Schools
## 916                            CENTRAL MINNESOTA JT. POWERS DIST.
## 917                            CENTRAL MINNESOTA JT. POWERS DIST.
## 918                            CENTRAL MINNESOTA JT. POWERS DIST.
## 919                            CENTRAL MINNESOTA JT. POWERS DIST.
## 920                            CENTRAL MINNESOTA JT. POWERS DIST.
## 921                            CENTRAL MINNESOTA JT. POWERS DIST.
## 922                                                NM CORRECTIONS
## 923                                                         PASCO
## 924                                                 Marion County
## 925                                 NATCHEZ-ADAMS SCHOOL DISTRICT
## 926                         Red Clay Consolidated School District
## 927                                               Central Unified
## 928                                                     Kern High
## 929                       Wisconsin Department of Health Services
## 930                             Clintn/Jeffrsn/Marin/Washngtn ROE
## 931                                         Conejo Valley Unified
## 932                                      LOS LUNAS PUBLIC SCHOOLS
## 933                                              Alhambra Unified
## 934                            PARK RAPIDS PUBLIC SCHOOL DISTRICT
## 935                                                    YSLETA ISD
## 936                                                    YSLETA ISD
## 937                               Yolo County Office of Education
## 938                                               Compton Unified
## 939                                              POR VIDA ACADEMY
## 940                                             Santa Ana Unified
## 941                                                Baldwin County
## 942                          Buena Vista School District No. R-31
## 943                                      Chaffey Joint Union High
## 944                                      Chaffey Joint Union High
## 945                                                    AXTELL ISD
## 946                                           BRUCEVILLE-EDDY ISD
## 947                                                      WEST ISD
## 948                                                    RIESEL ISD
## 949                                                  CRAWFORD ISD
## 950                                                    LORENA ISD
## 951                                               BOSQUEVILLE ISD
## 952                                              CHINA SPRING ISD
## 953                                                  CONNALLY ISD
## 954                                                  MCGREGOR ISD
## 955                                                    MIDWAY ISD
## 956                                                      WACO ISD
## 957                                                   LA VEGA ISD
## 958                                                      MART ISD
## 959                                                  ROBINSON ISD
## 960                                       Edmonds School District
## 961                                           IRAAN-SHEFFIELD ISD
## 962                                        Bethel School District
## 963                                  Glendale Elementary District
## 964                                               Barstow Unified
## 965                                                          DADE
## 966                                                        ORANGE
## 967                                        KANAWHA COUNTY SCHOOLS
## 968                                 Chandler Unified District #80
## 969                                                  Ojai Unified
## 970                                        Snowline Joint Unified
## 971                                          Grossmont Union High
## 972                                                Bonita Unified
## 973                                          Charlevoix-Emmet ISD
## 974                                                      PINELLAS
## 975                     Stevens Point Area Public School District
## 976                                            BLOOMFIELD SCHOOLS
## 977                                 CHARLOTTESVILLE CTY PBLC SCHS
## 978                          El Dorado County Office of Education
## 979                          El Dorado County Office of Education
## 980                                              Chattooga County
## 981                       CHAUTAUQUA LAKE CENTRAL SCHOOL DISTRICT
## 982                                           Bear Valley Unified
## 983                                                 NORTHSIDE ISD
## 984                                        Cheboygan Area Schools
## 985                                   Lake Chelan School District
## 986                                        Cheney School District
## 987       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 988       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 989       OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 990                                       Chesaning Union Schools
## 991                                     CHESAPEAKE CITY PBLC SCHS
## 992                                        Coalinga-Huron Unified
## 993                                 DULUTH PUBLIC SCHOOL DISTRICT
## 994                                         DOE SOP EDUC PROGRAMS
## 995                                           Los Angeles Unified
## 996                                      Chewelah School District
## 997                                      Chewelah School District
## 998                                                      PINELLAS
## 999                                                      Chicopee
## 1000                                CHILD GUIDANCE CTR TGH SCHOOL
## 1001                                 CLARK COUNTY SCHOOL DISTRICT
## 1002                                                       ORANGE
## 1003                                               FORT WORTH ISD
## 1004                                              SAN ANTONIO ISD
## 1005                                    Bowling Green Independent
## 1006                                               CHILDRENS PSYC
## 1007                                               Chilton County
## 1008                                         Chino Valley Unified
## 1009                                               GEORGETOWN ISD
## 1010                           Michigan Department of Corrections
## 1011                                      Chippewa Valley Schools
## 1012                                CHISAGO LAKES SCHOOL DISTRICT
## 1013                                CHISAGO LAKES SCHOOL DISTRICT
## 1014                                     Highline School District
## 1015                           BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 1016                           BLOOMINGTON PUBLIC SCHOOL DISTRICT
## 1017                                      Shelton School District
## 1018                                          Paducah Independent
## 1019                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 1020                                               RICHARDSON ISD
## 1021                                             Christian County
## 1022                                             Christian County
## 1023                                              SAN ANTONIO ISD
## 1024                                       TAOS MUNICIPAL SCHOOLS
## 1025                             University Place School District
## 1026                 Public Schools of Calumet Laurium & Keweenaw
## 1027                                            Royal Oak Schools
## 1028                             CHURCHILL COUNTY SCHOOL DISTRICT
## 1029                                             Pasadena Unified
## 1030                                                    CISCO ISD
## 1031                                                       CITRUS
## 1032                                                         DADE
## 1033                                          Porterville Unified
## 1034                                              Fontana Unified
## 1035                                                       CITRUS
## 1036                                              Birmingham City
## 1037                                          Los Angeles Unified
## 1038                                                          LEE
## 1039                                  Clara B. Ford Academy (SDA)
## 1040                                         Clare Public Schools
## 1041                                 CLARK COUNTY SCHOOL DISTRICT
## 1042                                 CLARK COUNTY SCHOOL DISTRICT
## 1043                                 Greater Clark County Schools
## 1044                          Clarkston Community School District
## 1045                          Clarkston Community School District
## 1046                               Department of Juvenile Justice
## 1047                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 1048                                              CLEAR CREEK ISD
## 1049                                                     PINELLAS
## 1050                                              Cleburne County
## 1051                                                       HENDRY
## 1052                              Climax-Scotts Community Schools
## 1053                                                    CLINT ISD
## 1054                                   CLINTON PUBLIC SCHOOL DIST
## 1055                          BEEKMANTOWN CENTRAL SCHOOL DISTRICT
## 1056                                Clintondale Community Schools
## 1057                                    Clio Area School District
## 1058                                    Clio Area School District
## 1059                                    Riverview School District
## 1060                            Clintn/Jeffrsn/Marin/Washngtn ROE
## 1061                               CLOQUET PUBLIC SCHOOL DISTRICT
## 1062                                    BEAR LAKE COUNTY DISTRICT
## 1063                                           Upper Lake Unified
## 1064                      Douglas County School District No. Re 1
## 1065                                               Clovis Unified
## 1066                                               Clovis Unified
## 1067                                                  SABINAL ISD
## 1068                               COLUMBUS MUNICIPAL SCHOOL DIST
## 1069                                         Corona-Norco Unified
## 1070                              PERSHING COUNTY SCHOOL DISTRICT
## 1071                                  Huntington Beach Union High
## 1072                                              CLEAR CREEK ISD
## 1073                                                 SANTA FE ISD
## 1074                                                DICKINSON ISD
## 1075                                               TEXAS CITY ISD
## 1076                                                CODE RVA HIGH
## 1077                                        Tahoe-Truckee Unified
## 1078                                           CORPUS CHRISTI ISD
## 1079                                   ALBUQUERQUE PUBLIC SCHOOLS
## 1080                                     PHARR-SAN JUAN-ALAMO ISD
## 1081                                                  EL PASO ISD
## 1082                                          COLLEGE STATION ISD
## 1083                                                Barren County
## 1084                                                Hardin County
## 1085                                           CORPUS CHRISTI ISD
## 1086                                               HARLANDALE ISD
## 1087                                                      COLLIER
## 1088                                                    ALLEN ISD
## 1089                                                  MELISSA ISD
## 1090                                                   CELINA ISD
## 1091                                                PRINCETON ISD
## 1092                                                  PROSPER ISD
## 1093                                                   FRISCO ISD
## 1094                                             FARMERSVILLE ISD
## 1095                                                    WYLIE ISD
## 1096                                                COMMUNITY ISD
## 1097                                               Hilmar Unified
## 1098 School District No. 1 in the county of Denver and State of C
## 1099                                                WESTBROOK ISD
## 1100    Englewood School District No. 1 in the county of Arapahoe
## 1101                                     Corning Union Elementary
## 1102                          COLUMBIA HEIGHTS PUBLIC SCHOOL DIST
## 1103                                     Columbia School District
## 1104                           Columbia (Stevens) School District
## 1105                          Wisconsin Department of Corrections
## 1106                                             St Helens SD 502
## 1107 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 1108                                     Columbia School District
## 1109                                       Valley School District
## 1110                                 Kettle Falls School District
## 1111                                       Sultan School District
## 1112                                       Orient School District
## 1113                                          Columbia Elementary
## 1114                                               Downey Unified
## 1115                                                 COLUMBUS ISD
## 1116                                                 COLUMBUS ISD
## 1117                                                 HILLSBOROUGH
## 1118                                               Colusa Unified
## 1119                                               Colusa Unified
## 1120                                                    COMAL ISD
## 1121                                                    COMAL ISD
## 1122                         Riverside County Office of Education
## 1123                                            Washington County
## 1124                                     Commonwealth High School
## 1125                        Prince George's County Public Schools
## 1126                                           Fremont Union High
## 1127                                              Benicia Unified
## 1128                                  South San Francisco Unified
## 1129                                               Sanger Unified
## 1130                                            Claremont Unified
## 1131                                              Oakland Unified
## 1132                                              Oakland Unified
## 1133                                               Bishop Unified
## 1134                                                   DENTON ISD
## 1135                                             Moorpark Unified
## 1136                                        Pacific Grove Unified
## 1137                                      Buncombe County Schools
## 1138                                     Ann Arbor Public Schools
## 1139                                         SMITH CO SCHOOL DIST
## 1140   Colorado Springs School District No. 11 in the county of E
## 1141                                             Beaverton SD 48J
## 1142                                                 PASADENA ISD
## 1143                              Lake Washington School District
## 1144                    San Bernardino County Office of Education
## 1145                                                  HOUSTON ISD
## 1146                               Anderson Community School Corp
## 1147                                             JACKSONVILLE ISD
## 1148                                      NEW PRAGUE AREA SCHOOLS
## 1149                                                         POLK
## 1150                           ANOKA-HENNEPIN PUBLIC SCHOOL DIST.
## 1151                                              Compton Unified
## 1152                                              Compton Unified
## 1153                                    Toppenish School District
## 1154                                             COMQUEST ACADEMY
## 1155                                      Comstock Public Schools
## 1156                        NEW YORK CITY GEOGRAPHIC DISTRICT #31
## 1157                                            Oxnard Union High
## 1158                                        Conejo Valley Unified
## 1159                                            Placer Union High
## 1160                                          Wake County Schools
## 1161                                Sedro-Woolley School District
## 1162                     Jefferson County School District No. R-1
## 1163                           CONNETQUOT CENTRAL SCHOOL DISTRICT
## 1164                                Engadine Consolidated Schools
## 1165                           Constantine Public School District
## 1166 School District No. 1 in the county of Denver and State of C
## 1167                                   ALBUQUERQUE PUBLIC SCHOOLS
## 1168                                Clintondale Community Schools
## 1169                                                Mobile County
## 1170                                    Grandview School District
## 1171                              Lake Washington School District
## 1172                                   COOK COUNTY PUBLIC SCHOOLS
## 1173                                                  SHERMAN ISD
## 1174                                              Rock Island ROE
## 1175                                              SAN ANTONIO ISD
## 1176                           Michigan Department of Corrections
## 1177                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 1178                                 ROSEMOUNT-APPLE VALLEY-EAGAN
## 1179                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 1180                                                         DADE
## 1181                          TEXAS COLLEGE PREPARATORY ACADEMIES
## 1182                          Wisconsin Department of Corrections
## 1183                                           Corbin Independent
## 1184                                           Corbin Independent
## 1185                                       Corcoran Joint Unified
## 1186                                            New Haven Unified
## 1187                          TEXAS COLLEGE PREPARATORY ACADEMIES
## 1188                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 1189                                        CAMPBELL CO PBLC SCHS
## 1190                                 CORNING CITY SCHOOL DISTRICT
## 1191                                         Corona-Norco Unified
## 1192                                         Corona-Norco Unified
## 1193                                          West Covina Unified
## 1194                                                          LEE
## 1195                                             POR VIDA ACADEMY
## 1196                                     Ann Arbor Public Schools
## 1197                                                  ATLANTA ISD
## 1198                                                 Eugene SD 4J
## 1199                  CANYON-OWYHEE SCHOOL SERVICE AGENCY (COSSA)
## 1200                                         Santa Cruz City High
## 1201              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1202                           Michigan Department of Corrections
## 1203                                      Mountain Empire Unified
## 1204                                            Vacaville Unified
## 1205                                      Tulare Joint Union High
## 1206                          Mariposa County Office of Education
## 1207                            Amador County Office of Education
## 1208                       EAST MEADOW UNION FREE SCHOOL DISTRICT
## 1209                                                 MCKINNEY ISD
## 1210                                  Warren Consolidated Schools
## 1211                               Covenant House Academy Detroit
## 1212                               Covenant House Academy Detroit
## 1213                               Covenant House Academy Detroit
## 1214                          Covenant House Academy Grand Rapids
## 1215                                   Centreville Public Schools
## 1216                                        Covington Independent
## 1217                                         COVINGTON CO SCHOOLS
## 1218                                 CLARK COUNTY SCHOOL DISTRICT
## 1219                                 CLARK COUNTY SCHOOL DISTRICT
## 1220                                      COZAD COMMUNITY SCHOOLS
## 1221                                  Clover Park School District
## 1222                                                 CRANDALL ISD
## 1223                                                     Cranston
## 1224                                        DOE SOP EDUC PROGRAMS
## 1225                               North Franklin School District
## 1226                                Clintondale Community Schools
## 1227                                Clintondale Community Schools
## 1228                                Clintondale Community Schools
## 1229                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 1230                                        Sonoma Valley Unified
## 1231                                               Irvine Unified
## 1232                                    DEPARTMENT OF CORRECTIONS
## 1233                                          Los Angeles Unified
## 1234                                                     OKALOOSA
## 1235                                       Atlanta Public Schools
## 1236                               Department of Juvenile Justice
## 1237                                                  ABILENE ISD
## 1238                        Prince George's County Public Schools
## 1239                                                   CROSBY ISD
## 1240                                               CROSBYTON CISD
## 1241                        Prince George's County Public Schools
## 1242                                                    ALIEF ISD
## 1243                                    Petaluma Joint Union High
## 1244                                                   PALM BEACH
## 1245                                            Los Banos Unified
## 1246                                      Kentwood Public Schools
## 1247                          CROSSROADS ALTERNATIVE/BRISTOL CITY
## 1248                                 EAST CENTRAL SCHOOL DISTRICT
## 1249                              Baltimore County Public Schools
## 1250                                         Lancaster Elementary
## 1251                                     Quilcene School District
## 1252                                            COPPERAS COVE ISD
## 1253                                                 BURLESON ISD
## 1254                                           Mt. Diablo Unified
## 1255                                               Newark Unified
## 1256                                Granite Falls School District
## 1257                                                    CHARLOTTE
## 1258                                Carroll County Public Schools
## 1259                                  JOINT SCHOOL DISTRICT NO. 2
## 1260                                                  Hoover City
## 1261                                    Anchorage School District
## 1262                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 1263                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 1264                                                Hardin County
## 1265                                         CROSSTIMBERS ACADEMY
## 1266                                            GRAND PRAIRIE ISD
## 1267                        NEW YORK CITY GEOGRAPHIC DISTRICT # 7
## 1268                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 1269                                                  CROWLEY ISD
## 1270                                         NORTH KANSAS CITY 74
## 1271                                               Cullman County
## 1272                                                 Cullman City
## 1273                                          Culver City Unified
## 1274                                          Culver City Unified
## 1275                                           CUMBERLAND ACADEMY
## 1276              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1277                                             Christian County
## 1278      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 1279      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 1280                                       Curlew School District
## 1281                                   Cutler-Orosi Joint Unified
## 1282                                     Onalaska School District
## 1283                                        Lopez School District
## 1284                               Central Valley School District
## 1285                                                       CITRUS
## 1286                                                   OKEECHOBEE
## 1287                                                      BROWARD
## 1288                                        CYPRESS-FAIRBANKS ISD
## 1289                                                   CONROE ISD
## 1290                                           Da Vinci Institute
## 1291                                                         DADE
## 1292                                              SHALLOWATER ISD
## 1293                                                 PROGRESO ISD
## 1294                                               EAGLE PASS ISD
## 1295                                             CHINA SPRING ISD
## 1296                                               CALLISBURG ISD
## 1297                                                    ANTON ISD
## 1298                                                  ABILENE ISD
## 1299                                                NORTHSIDE ISD
## 1300                                                   AUSTIN ISD
## 1301                                             Glendale Unified
## 1302                             INTERMEDIATE SCHOOL DISTRICT 917
## 1303                            FARMINGTON PUBLIC SCHOOL DISTRICT
## 1304                                                    ST. LUCIE
## 1305                                               LEWISVILLE ISD
## 1306                                           Box Elder District
## 1307                                         TEXANS CAN ACADEMIES
## 1308                                         TEXANS CAN ACADEMIES
## 1309                                         TEXANS CAN ACADEMIES
## 1310                                         TEXANS CAN ACADEMIES
## 1311                                         TEXANS CAN ACADEMIES
## 1312                                                   IRVING ISD
## 1313                                                SUNNYVALE ISD
## 1314                                                  COPPELL ISD
## 1315                                CARROLLTON-FARMERS BRANCH ISD
## 1316                                                   DESOTO ISD
## 1317                              ACADEMY FOR ACADEMIC EXCELLENCE
## 1318                                   EAST TEXAS CHARTER SCHOOLS
## 1319                              Yolo County Office of Education
## 1320                      Douglas County School District No. Re 1
## 1321                                            Rutherford County
## 1322                               Danville Ctr Adolescent Female
## 1323                                          Dare County Schools
## 1324                                            Sonora Union High
## 1325                            DASSEL-COKATO PUBLIC SCHOOL DIST.
## 1326                                                    ST. LUCIE
## 1327                                                      BROWARD
## 1328                                                         POLK
## 1329                                      Davidson County Schools
## 1330                                  Transylvania County Schools
## 1331                                      Tucson Unified District
## 1332                                          Davis Joint Unified
## 1333                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 1334                                    Davison Community Schools
## 1335                                                   DAWSON ISD
## 1336                                                  ABILENE ISD
## 1337                                       Tacoma School District
## 1338                                      Spokane School District
## 1339                                            Elk Grove Unified
## 1340                                                      VOLUSIA
## 1341                                                         DCYF
## 1342                                Dearborn City School District
## 1343                                Dearborn City School District
## 1344                                            New Haven Unified
## 1345                                         Farmersville Unified
## 1346                            MINNETONKA PUBLIC SCHOOL DISTRICT
## 1347                                    Deer Park School District
## 1348                            DEER RIVER PUBLIC SCHOOL DISTRICT
## 1349                                                DeKalb County
## 1350                               Department of Juvenile Justice
## 1351                                     San Ramon Valley Unified
## 1352                                          San Gabriel Unified
## 1353                         Del Norte County Office of Education
## 1354                                      Patterson Joint Unified
## 1355                               Livermore Valley Joint Unified
## 1356                                                DEL VALLE ISD
## 1357                                                   AUSTIN ISD
## 1358                                                  EL PASO ISD
## 1359                           Delta County Joint District No. 50
## 1360                                 Santa Maria Joint Union High
## 1361                                 Denison Comm School District
## 1362                                              LAKE DALLAS ISD
## 1363                                               LITTLE ELM ISD
## 1364                                                NORTHWEST ISD
## 1365                                                   PONDER ISD
## 1366                                               LEWISVILLE ISD
## 1367                                                   AUBREY ISD
## 1368                                                   ARGYLE ISD
## 1369                                                   DENTON ISD
## 1370                                              PILOT POINT ISD
## 1371                                                   SANGER ISD
## 1372                                                     KRUM ISD
## 1373                                              VALLEY VIEW ISD
## 1374                                CARROLLTON-FARMERS BRANCH ISD
## 1375                                                NORTHWEST ISD
## 1376 School District No. 1 in the county of Denver and State of C
## 1377                                            WICHITA FALLS ISD
## 1378                                    Department of Corrections
## 1379                                Department of Human Resources
## 1380                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 1381                                                      VOLUSIA
## 1382                                         Palm Springs Unified
## 1383                                           Central Union High
## 1384                                      Othello School District
## 1385                                     Desert Rose Academy Inc.
## 1386                                 CLARK COUNTY SCHOOL DISTRICT
## 1387                                           Brawley Union High
## 1388                                      Keppel Union Elementary
## 1389                                   Antelope Valley Union High
## 1390                                               Tuscumbia City
## 1391                                               Fresno Unified
## 1392                                                   DESOTO ISD
## 1393                                                       DESOTO
## 1394                                        DESOTO CO SCHOOL DIST
## 1395                                                 Wolfe County
## 1396                                                Coos Bay SD 9
## 1397                            Julesburg School District No. Re1
## 1398                                               FORT WORTH ISD
## 1399                                                 HILLSBOROUGH
## 1400                                                       TAYLOR
## 1401                           DeTour Arts and Technology Academy
## 1402                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 1403                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 1404                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 1405                    Detroit Public Schools Community District
## 1406                                                    MEXIA ISD
## 1407                                                       ORANGE
## 1408                                                   DEVERS ISD
## 1409                                                   DEVINE ISD
## 1410                                              Oakland Unified
## 1411                                               Fresno Unified
## 1412                             Dexter Community School District
## 1413                                           Mt. Diablo Unified
## 1414                                PEMISCOT CO. SPEC. SCH. DIST.
## 1415                                             Canyons District
## 1416                                 L'Anse Creuse Public Schools
## 1417                                              Hughson Unified
## 1418                                                DICKINSON ISD
## 1419                                       Winston-Dillard SD 116
## 1420              Harper Woods The School District of the City of
## 1421                                                CLEVELAND ISD
## 1422                                                  ANAHUAC ISD
## 1423                                                    BRYAN ISD
## 1424                                            NEW BRAUNFELS ISD
## 1425                                            SPRING BRANCH ISD
## 1426                                 South Kitsap School District
## 1427                                             Yreka Union High
## 1428                                              Natomas Unified
## 1429  School District No. 3 in the county of El Paso and State of
## 1430                                     Longview School District
## 1431                                     Longview School District
## 1432                                             SOUTHWEST SCHOOL
## 1433                              Lake Washington School District
## 1434                        West Valley School District (Spokane)
## 1435                                                     PINELLAS
## 1436                                                CHARLOTTE ISD
## 1437                            Quillayute Valley School District
## 1438                             INTERMEDIATE SCHOOL DISTRICT 287
## 1439                                               FORT WORTH ISD
## 1440                                       Black Oak Mine Unified
## 1441                            Solano County Office of Education
## 1442                                                        DIXIE
## 1443                                                Dixon Unified
## 1444                                                      BROWARD
## 1445                                                         POLK
## 1446                           Beaver Dam Unified School District
## 1447                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 1448                                                    DONNA ISD
## 1449                                                          LEE
## 1450                                                         DADE
## 1451                                          Los Angeles Unified
## 1452                                          Palmdale Elementary
## 1453                               DOUGLAS COUNTY SCHOOL DISTRICT
## 1454                               DOUGLAS CO WEST COMMUNITY SCHS
## 1455                               DOUGLAS COUNTY SCHOOL DISTRICT
## 1456                                  DOUGLAS COUNTY YOUTH CENTER
## 1457                                         Ionia Public Schools
## 1458                                         LOUDOUN CO PBLC SCHS
## 1459              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1460                                        Ecorse Public Schools
## 1461                                      Tucson Unified District
## 1462                                          Los Angeles Unified
## 1463                                        San Francisco Unified
## 1464                                              Antioch Unified
## 1465                                               Lompoc Unified
## 1466                                                  EL PASO ISD
## 1467                                                  EL PASO ISD
## 1468                         DR M L GARZA-GONZALEZ CHARTER SCHOOL
## 1469                        Green Bay Area Public School District
## 1470                                          Temple City Unified
## 1471                                                         DADE
## 1472                        Adrian School District of the City of
## 1473                                                 DRAW ACADEMY
## 1474                              ACADEMY FOR ACADEMIC EXCELLENCE
## 1475                                                     Kane ROE
## 1476                                                     PINELLAS
## 1477                    Mesa County Valley School District No. 51
## 1478                                DULUTH PUBLIC SCHOOL DISTRICT
## 1479                                          Tracy Joint Unified
## 1480                           West Ottawa Public School District
## 1481                                    Dunsmuir Joint Union High
## 1482                                                   DuPage ROE
## 1483                                              Birmingham City
## 1484                              Durango School District No. 9-R
## 1485                            Maricopa County Regional District
## 1486                                       Tigard-Tualatin SD 23J
## 1487                                        Durham Public Schools
## 1488                                                        DUVAL
## 1489                                                        DUVAL
## 1490                                                        DUVAL
## 1491                                                    PLANO ISD
## 1492                             Eagle Butte School District 20-1
## 1493                             Eagle Butte School District 20-1
## 1494                                Baltimore City Public Schools
## 1495                      Douglas County School District No. Re 1
## 1496                                  JOINT SCHOOL DISTRICT NO. 2
## 1497                                            Templeton Unified
## 1498                                                  Baker SD 5J
## 1499                                           Cloverdale Unified
## 1500                            Bainbridge Island School District
## 1501                                      Spokane School District
## 1502                                  LYON COUNTY SCHOOL DISTRICT
## 1503                                       Snowline Joint Unified
## 1504                                          Los Angeles Unified
## 1505                                     Hanford Joint Union High
## 1506                            Nevada County Office of Education
## 1507                                         Earlimart Elementary
## 1508                          BELLE PLAINE PUBLIC SCHOOL DISTRICT
## 1509                                   ALBUQUERQUE PUBLIC SCHOOLS
## 1510                                         Newport-Mesa Unified
## 1511                                          Salem-Keizer SD 24J
## 1512                                                  ABILENE ISD
## 1513                                                   HUMBLE ISD
## 1514                                                     Kane ROE
## 1515                                          San Lorenzo Unified
## 1516                                NEWTON COUNTY SCHOOL DISTRICT
## 1517                                             EAST CENTRAL ISD
## 1518                                         Elma School District
## 1519                                         Elma School District
## 1520                                           Fortuna Union High
## 1521                                   East Jordan Public Schools
## 1522                                   Godfrey-Lee Public Schools
## 1523                       Los Angeles County Office of Education
## 1524                               WAYZATA PUBLIC SCHOOL DISTRICT
## 1525                                    DEPARTMENT OF CORRECTIONS
## 1526                                    DEPARTMENT OF CORRECTIONS
## 1527                                        Oakdale Joint Unified
## 1528                                          NORTHEAST METRO 916
## 1529                                            San Diego Unified
## 1530   Colorado Springs School District No. 11 in the county of E
## 1531                                                 EASTLAND ISD
## 1532                               Department of Juvenile Justice
## 1533                               Department of Juvenile Justice
## 1534                                     Eastmont School District
## 1535                                           Washington Unified
## 1536                                           Washington Unified
## 1537                                    Eastside Union Elementary
## 1538                                    Eau Claire Public Schools
## 1539                            Frankln/Johnsn/Massc/Willimsn ROE
## 1540                                                       ORANGE
## 1541                                             ECTOR COUNTY ISD
## 1542                                          Kelseyville Unified
## 1543                                             EDCOUCH-ELSA ISD
## 1544                          EDEN VALLEY-WATKINS SCHOOL DISTRICT
## 1545                                       Edge School  Inc.  The
## 1546                                                EDINBURG CISD
## 1547                           Minneapolis Public School District
## 1548                                      Edmonds School District
## 1549                                      Edmonds School District
## 1550                                      Edmonds School District
## 1551                                                     EDNA ISD
## 1552     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 1553                                               HARLINGEN CISD
## 1554                             INTERMEDIATE SCHOOL DISTRICT 917
## 1555                                               ST. LOUIS CITY
## 1556                                  GALLUP-MCKINLEY CTY SCHOOLS
## 1557                                    Clarkston School District
## 1558                                    Clarkston School District
## 1559                                           Long Beach Unified
## 1560                                  EDUCATIONAL SERVICE UNIT 05
## 1561                                                   PALM BEACH
## 1562                                                   PALM BEACH
## 1563                                              Needles Unified
## 1564                        NEW YORK CITY GEOGRAPHIC DISTRICT # 3
## 1565                                             Stockton Unified
## 1566                          Humboldt County Office of Education
## 1567                           Michigan Department of Corrections
## 1568                             INTERMEDIATE SCHOOL DISTRICT 287
## 1569                                                  KILLEEN ISD
## 1570                                              Ventura Unified
## 1571                                  Cotati-Rohnert Park Unified
## 1572                                    Norwalk-La Mirada Unified
## 1573                                Placentia-Yorba Linda Unified
## 1574                        Sacramento County Office of Education
## 1575                                                FORT BEND ISD
## 1576                                                  HOUSTON ISD
## 1577                                               ROUND ROCK ISD
## 1578                                                 EDGEWOOD ISD
## 1579                                          El Monte Union High
## 1580                                              EL PASO ACADEMY
## 1581                                              EL PASO ACADEMY
## 1582                                           Salinas Union High
## 1583                                 Firebaugh-Las Deltas Unified
## 1584                                             San Juan Unified
## 1585                                                  Bibb County
## 1586                               Department of Juvenile Justice
## 1587                                                  KILGORE ISD
## 1588                            WEST RUSK COUNTY CONSOLIDATED ISD
## 1589                                                 Union County
## 1590                                                   DALLAS ISD
## 1591                        Sacramento County Office of Education
## 1592                               Iowa City Comm School District
## 1593                         Del Norte County Office of Education
## 1594                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 1595                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 1596                                                  ELKHART ISD
## 1597                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 1598                                             Hamilton Unified
## 1599                                          Los Angeles Unified
## 1600                                           Washington Unified
## 1601                                         EAGLE MT-SAGINAW ISD
## 1602                                     PHARR-SAN JUAN-ALAMO ISD
## 1603                                          Twin Rivers Unified
## 1604                                                     OKALOOSA
## 1605                                         IDAHO FALLS DISTRICT
## 1606                              Lake Washington School District
## 1607                              Lake Washington School District
## 1608 School District No. 1 in the county of Denver and State of C
## 1609                           ST. LOUIS PARK PUBLIC SCHOOL DIST.
## 1610                           HINCKLEY-FINLAYSON SCHOOL DISTRICT
## 1611                                         HENRICO CO PBLC SCHS
## 1612                                             SOUTHWEST SCHOOL
## 1613                                   Osborn Elementary District
## 1614                                                     HERNANDO
## 1615                                                Ceres Unified
## 1616                                              CHANNELVIEW ISD
## 1617                                       Wausau School District
## 1618                         ENTERPRISE ACADEMY/NEWPORT NEWS CITY
## 1619                                               Clovis Unified
## 1620                                                     PINELLAS
## 1621                                               Kerman Unified
## 1622                                            Shasta Union High
## 1623                      Madera County Superintendent of Schools
## 1624                                        Conejo Valley Unified
## 1625                              Lake Washington School District
## 1626                             INTERMEDIATE SCHOOL DISTRICT 287
## 1627                                              Fontana Unified
## 1628                                 BUFFALO CITY SCHOOL DISTRICT
## 1629                                                     ESCAMBIA
## 1630                                                     ESCAMBIA
## 1631                                              Escambia County
## 1632                                                     ESCAMBIA
## 1633                                                     ESCAMBIA
## 1634                                 Escanaba Area Public Schools
## 1635                             Educational Service District 112
## 1636                                         OMAHA PUBLIC SCHOOLS
## 1637                                   Cutler-Orosi Joint Unified
## 1638                                              Gridley Unified
## 1639               ESSEX REGIONAL EDUCATIONAL SERVICES COMMISSION
## 1640              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1641               ESSEX REGIONAL EDUCATIONAL SERVICES COMMISSION
## 1642              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1643      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 1644                                                       ORANGE
## 1645                               Estes Park School District R-3
## 1646                                                Estill County
## 1647                                              SAN ANTONIO ISD
## 1648                                        Galt Joint Union High
## 1649                                          Etiwanda Elementary
## 1650                                                 Eugene SD 4J
## 1651                          Humboldt County Office of Education
## 1652                        East Valley School District (Spokane)
## 1653                        East Valley School District (Spokane)
## 1654                                                  EVADALE ISD
## 1655                                     Dept of Juvenile Justice
## 1656                              EVELETH-GILBERT SCHOOL DISTRICT
## 1657                                                Mobile County
## 1658                            Washingtion County Public Schools
## 1659                                         HENRICO CO PBLC SCHS
## 1660                                      Everett School District
## 1661                                           HARRISONVILLE R-IX
## 1662                                                   PALM BEACH
## 1663                                                  McHenry ROE
## 1664                                              Evergreen Union
## 1665                                              Evergreen Union
## 1666                                          Los Angeles Unified
## 1667                                           Washington Unified
## 1668                                             Yosemite Unified
## 1669                                           Washington Unified
## 1670                                                  EVERMAN ISD
## 1671                             EVOLUTION ACADEMY CHARTER SCHOOL
## 1672                             EVOLUTION ACADEMY CHARTER SCHOOL
## 1673                             EVOLUTION ACADEMY CHARTER SCHOOL
## 1674                                                     PINELLAS
## 1675                                                     PINELLAS
## 1676 School District No. 1 in the county of Denver and State of C
## 1677                                                  HUFFMAN ISD
## 1678                                                 PASADENA ISD
## 1679                                             GOOSE CREEK CISD
## 1680                                Baltimore City Public Schools
## 1681                                                EXCEL ACADEMY
## 1682                                             THE EXCEL CENTER
## 1683                                                PINE TREE ISD
## 1684                                                   WASKOM ISD
## 1685                                               Exeter Unified
## 1686                                               Exeter Unified
## 1687                                 South Kitsap School District
## 1688                              Lake Washington School District
## 1689                                Waterloo Comm School District
## 1690                              Baltimore County Public Schools
## 1691                                                   LAREDO ISD
## 1692                                Charles County Public Schools
## 1693                                                   FABENS ISD
## 1694                                                Chico Unified
## 1695                                         FAIRFAX CO PBLC SCHS
## 1696                                        DOE SOP EDUC PROGRAMS
## 1697                                               Fairfield City
## 1698                                     Fairfield-Suisun Unified
## 1699                                        Covina-Valley Unified
## 1700                                              GRAPE CREEK ISD
## 1701                                            STERLING CITY ISD
## 1702                                               ROBERT LEE ISD
## 1703                                                     WALL ISD
## 1704                                                BALLINGER ISD
## 1705                                                 VERIBEST ISD
## 1706                                               CHRISTOVAL ISD
## 1707                                                    MILES ISD
## 1708                                                BALLINGER ISD
## 1709                                                     WALL ISD
## 1710                                               PAINT ROCK ISD
## 1711                                             WATER VALLEY ISD
## 1712                             ROSEVILLE PUBLIC SCHOOL DISTRICT
## 1713                                              GRAPE CREEK ISD
## 1714                                               CHRISTOVAL ISD
## 1715                                             WATER VALLEY ISD
## 1716                                                    EDEN CISD
## 1717                                                    MILES ISD
## 1718                                               ROBERT LEE ISD
## 1719                                            STERLING CITY ISD
## 1720                                CHISAGO LAKES SCHOOL DISTRICT
## 1721                          NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 1722                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 1723                                               PAINT ROCK ISD
## 1724                                               CHRISTOVAL ISD
## 1725                                             WATER VALLEY ISD
## 1726                                                    OLFEN ISD
## 1727                                               ROBERT LEE ISD
## 1728                                            STERLING CITY ISD
## 1729                                               CHRISTOVAL ISD
## 1730                              WAXAHACHIE FAITH FAMILY ACADEMY
## 1731                                                 HILLSBOROUGH
## 1732                                     Fall River Joint Unified
## 1733                                     Fall River Joint Unified
## 1734                                   Fallbrook Union Elementary
## 1735                            West Central School District 49-7
## 1736                                             MARBLE FALLS ISD
## 1737                                               Fayette County
## 1738                                              Birmingham City
## 1739                                              Birmingham City
## 1740                                       ARLINGTON CO PBLC SCHS
## 1741                                Vashon Island School District
## 1742                                                MACON CO. R-I
## 1743                                                 Eugene SD 4J
## 1744                                                Hemet Unified
## 1745                                   Fenton Area Public Schools
## 1746                             FARIBAULT PUBLIC SCHOOL DISTRICT
## 1747                             FARIBAULT PUBLIC SCHOOL DISTRICT
## 1748                            Farmington Public School District
## 1749                                    DEPARTMENT OF CORRECTIONS
## 1750                                    DEPARTMENT OF CORRECTIONS
## 1751                                         Vallejo City Unified
## 1752                                         Farwell Area Schools
## 1753                                            Fast Forward High
## 1754                                               Fayette County
## 1755                                               Fayette County
## 1756                            Sutter County Office of Education
## 1757                          Wisconsin Department of Corrections
## 1758                                               HARLANDALE ISD
## 1759                                               HARLANDALE ISD
## 1760                                                       Boston
## 1761                          FERGUS FALLS PUBLIC SCHOOL DISTRICT
## 1762                                          El Monte Union High
## 1763                                     Ferndale School District
## 1764                                                FORT BEND ISD
## 1765                                             FILLMORE CENTRAL
## 1766 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 1767                                 Firebaugh-Las Deltas Unified
## 1768                               BEMIDJI PUBLIC SCHOOL DISTRICT
## 1769                        Red Clay Consolidated School District
## 1770                                                   KENEDY ISD
## 1771                                                   KENEDY ISD
## 1772                                                  FIT Academy
## 1773                                    Fitzgerald Public Schools
## 1774                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 1775                                FREMONT COUNTY JOINT DISTRICT
## 1776                                                      BROWARD
## 1777                          Wisconsin Department of Corrections
## 1778                                           Grundy/Kendall ROE
## 1779                                Carroll County Public Schools
## 1780                             FLOODWOOD PUBLIC SCHOOL DISTRICT
## 1781 School District No. 1 in the county of Denver and State of C
## 1782                                                Florence City
## 1783                                 CLARK COUNTY SCHOOL DISTRICT
## 1784                                              FLORESVILLE ISD
## 1785                                                     POTH ISD
## 1786                                                    RUNGE ISD
## 1787                                                    RUNGE ISD
## 1788                                                LA VERNIA ISD
## 1789                                                   PALM BEACH
## 1790                                            Tangipahoa Parish
## 1791                                                     SUWANNEE
## 1792                                                 FLOYDADA ISD
## 1793                                     CHATFIELD PUBLIC SCHOOLS
## 1794                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 1795                                       Folsom-Cordova Unified
## 1796                                          Carpinteria Unified
## 1797                                 Newman-Crows Landing Unified
## 1798                                         East Side Union High
## 1799                                             JUVENILE JUSTICE
## 1800                                            Shasta Union High
## 1801                                               Clinton County
## 1802                                      McDowell County Schools
## 1803                                           San Marcos Unified
## 1804                           FOREST LAKE PUBLIC SCHOOL DISTRICT
## 1805                                       ROANOKE CITY PBLC SCHS
## 1806                            Quillayute Valley School District
## 1807                                                   FORNEY ISD
## 1808                                                 STAFFORD MSD
## 1809                                                NEEDVILLE ISD
## 1810                                                FORT BEND ISD
## 1811                                                     KATY ISD
## 1812                                                   LAMAR CISD
## 1813                                               Lincoln County
## 1814                                         TEXANS CAN ACADEMIES
## 1815                                         TEXANS CAN ACADEMIES
## 1816                                       Jackson Public Schools
## 1817                                               Fowler Unified
## 1818                                               Fowler Unified
## 1819                                               Fowler Unified
## 1820                                               Fowler Unified
## 1821                                Fowlerville Community Schools
## 1822                          Wisconsin Department of Corrections
## 1823                                         FRANCIS HOWELL R-III
## 1824                                          Los Angeles Unified
## 1825                                   BOISE INDEPENDENT DISTRICT
## 1826                             NEW FRONTIERS PUBLIC SCHOOLS INC
## 1827                                               HARLANDALE ISD
## 1828                                                     FRANKLIN
## 1829                                       PRESTON JOINT DISTRICT
## 1830                                            Corvallis SD 509J
## 1831                                               Simpson County
## 1832                                                   DENTON ISD
## 1833                                                   TEMPLE ISD
## 1834                                                   DAYTON ISD
## 1835                                                CLEVELAND ISD
## 1836                              Frederick County Public Schools
## 1837                                                  COLUMBIA 93
## 1838                             Southwest Metro Intermediate 288
## 1839                                            Holtville Unified
## 1840                                   ALBUQUERQUE PUBLIC SCHOOLS
## 1841                                            Shasta Union High
## 1842                                        Golden Valley Unified
## 1843                            Carroll/Jo Daviess/Stephenson ROE
## 1844                                       FREMONT PUBLIC SCHOOLS
## 1845                                       Tacoma School District
## 1846                                     SOUTHAMPTON CO PBLC SCHS
## 1847                                         FRESHWATER ED. DIST.
## 1848                             Bass Lake Joint Union Elementary
## 1849                                          Los Angeles Unified
## 1850                               FRIDLEY PUBLIC SCHOOL DISTRICT
## 1851                               FRIDLEY PUBLIC SCHOOL DISTRICT
## 1852                                            Oxnard Union High
## 1853                                          Whittier Union High
## 1854  School District No. C-1 in the county of Elbert and State o
## 1855                                           FRUITLAND DISTRICT
## 1856                                  Fruitport Community Schools
## 1857                                             FT. ZUMWALT R-II
## 1858                                                   Somerville
## 1859                                               Fulton Schools
## 1860                                    DEPARTMENT OF CORRECTIONS
## 1861                                               Madera Unified
## 1862                                          Ramona City Unified
## 1863                                   Boone Comm School District
## 1864                              Lake Washington School District
## 1865                                              Macon/Piatt ROE
## 1866                                    Centralia School District
## 1867                                               FORT WORTH ISD
## 1868                                                     WACO ISD
## 1869                                                   SHINER ISD
## 1870                                            HALLETTSVILLE ISD
## 1871                                                  MOULTON ISD
## 1872                                                 Gadsden City
## 1873                                                    ST. JOHNS
## 1874                               Department of Juvenile Justice
## 1875                          Galesburg-Augusta Community Schools
## 1876                                  GALLUP-MCKINLEY CTY SCHOOLS
## 1877                                                DICKINSON ISD
## 1878                                              FRIENDSWOOD ISD
## 1879                                                DICKINSON ISD
## 1880                                                 SANTA FE ISD
## 1881                                                HITCHCOCK ISD
## 1882                                                GALVESTON ISD
## 1883                                              CLEAR CREEK ISD
## 1884     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 1885                                                      Gardner
## 1886                              GARFIELD PUBLIC SCHOOL DISTRICT
## 1887                                            San Diego Unified
## 1888                                                  GARLAND ISD
## 1889                                         TEXANS CAN ACADEMIES
## 1890                                                  KAUFMAN ISD
## 1891                                                     POST ISD
## 1892                                                   AUSTIN ISD
## 1893                                        Gaston County Schools
## 1894                              Franklin Pierce School District
## 1895                                      Tukwila School District
## 1896                                                 MALAKOFF ISD
## 1897                                        Owensboro Independent
## 1898                                                Graves County
## 1899                             GATEWAY ACADEMY CHARTER DISTRICT
## 1900                             GATEWAY ACADEMY CHARTER DISTRICT
## 1901                                      MARSHALL COUNTY SCHOOLS
## 1902                         San Mateo County Office of Education
## 1903                                            Montgomery County
## 1904                           Ventura County Office of Education
## 1905                                              Gateway Unified
## 1906                                                        DUVAL
## 1907                                             WARRENSBURG R-VI
## 1908                                              Gateway Unified
## 1909                                                  KILLEEN ISD
## 1910                                               Clovis Unified
## 1911                                        Chowchilla Union High
## 1912                                           Mt. Diablo Unified
## 1913                                                  KILLEEN ISD
## 1914                                                  BASTROP ISD
## 1915                                Carroll County Public Schools
## 1916                                      Caldwell County Schools
## 1917                                              BURKBURNETT ISD
## 1918                                        ORENDA CHARTER SCHOOL
## 1919                                                     Uxbridge
## 1920                                         OMAHA PUBLIC SCHOOLS
## 1921                                     Highline School District
## 1922                             INTERMEDIATE SCHOOL DISTRICT 287
## 1923                                              Oakland Unified
## 1924                                                  Springfield
## 1925                         Flint School District of the City of
## 1926                                              SAN BENITO CISD
## 1927                                   Gateway To Success Academy
## 1928                                                         POLK
## 1929                                    Gaylord Community Schools
## 1930                         DR M L GARZA-GONZALEZ CHARTER SCHOOL
## 1931                                             Torrance Unified
## 1932                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 1933                                         HENRICO CO PBLC SCHS
## 1934                                         HENRICO CO PBLC SCHS
## 1935                              Mt. Morris Consolidated Schools
## 1936                              Mt. Morris Consolidated Schools
## 1937                                                  BASTROP ISD
## 1938                                               Conecuh County
## 1939                                                Warren County
## 1940                                          Tracy Joint Unified
## 1941                                        GEORGE CO SCHOOL DIST
## 1942                                        GEORGE GERVIN ACADEMY
## 1943                                     GEORGE I SANCHEZ CHARTER
## 1944                                     GEORGE I SANCHEZ CHARTER
## 1945                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 1946                                Redfield School District 56-4
## 1947                                Redfield School District 56-4
## 1948                                          Los Angeles Unified
## 1949              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 1950                                                Marietta City
## 1951                                          Ogden City District
## 1952                                               GEORGETOWN ISD
## 1953                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 1954                                             Jefferson County
## 1955                        Sacramento County Office of Education
## 1956                                           Anaheim Union High
## 1957 School District No. 1 in the county of Denver and State of C
## 1958                                    Gladwin Community Schools
## 1959                                    Elizabethtown Independent
## 1960                                             Beaumont Unified
## 1961                          Glendale Union High School District
## 1962                                  Caledonia Community Schools
## 1963                                 CLARK COUNTY SCHOOL DISTRICT
## 1964   Falcon School District No. 49 in the county of El Paso and
## 1965                                               Carroll County
## 1966                                               ROUND ROCK ISD
## 1967                                                 NORDHEIM ISD
## 1968                                                   GODLEY ISD
## 1969                                Godwin Heights Public Schools
## 1970                      Ironwood Area Schools of Gogebic County
## 1971                    Tuolumne County Superintendent of Schools
## 1972                                            Calaveras Unified
## 1973                      Contra Costa County Office of Education
## 1974                 Fairbanks North Star Borough School District
## 1975                         El Dorado County Office of Education
## 1976                       Los Angeles County Office of Education
## 1977                            GOODHUE COUNTY EDUCATION DISTRICT
## 1978                                     Victor Valley Union High
## 1979                          Wisconsin Department of Corrections
## 1980                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 1981 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 1982                                     Bellevue School District
## 1983                                                       HOLMES
## 1984                                                   AUSTIN ISD
## 1985                                                   AUSTIN ISD
## 1986                                                    Cambridge
## 1987                                                   GRAHAM ISD
## 1988                                          Le Grand Union High
## 1989                              Grand Haven Area Public Schools
## 1990                                   BOYS TOWN INTERIM PRG SCHS
## 1991  Plateau Valley School District No. 50 in the county of Mesa
## 1992                                   DIVISION OF YOUTH SERVICES
## 1993                    Mesa County Valley School District No. 51
## 1994                                                        DUVAL
## 1995                          GRAND RAPIDS PUBLIC SCHOOL DISTRICT
## 1996                                  Grand Rapids Public Schools
## 1997                                                GRANDVIEW C-4
## 1998                                    Milwaukee School District
## 1999                                                GRANDVIEW ISD
## 2000                                             Granite District
## 2001                                Granite Falls School District
## 2002                                 Grant Public School District
## 2003                                 Grant Public School District
## 2004                                                        DUVAL
## 2005                                 Gravenstein Union Elementary
## 2006                                       Capital Region ESD 113
## 2007                                                     HOWE ISD
## 2008                                               WHITESBORO ISD
## 2009                                               Grayson County
## 2010                                                   GUNTER ISD
## 2011                                     Crawford AuSable Schools
## 2012                                      Ovid-Elsie Area Schools
## 2013                                                   Monroe ISD
## 2014                                                   Peoria ROE
## 2015                          Wisconsin Department of Corrections
## 2016              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 2017                                                Butler County
## 2018                                                         DADE
## 2019                        Prince George's County Public Schools
## 2020                               Yucaipa-Calimesa Joint Unified
## 2021                               Yucaipa-Calimesa Joint Unified
## 2022                                                Sevier County
## 2023                                             Greenfield Union
## 2024                      Waverly-Shell Rock Comm School District
## 2025                                               GREENVILLE ISD
## 2026                                    Greenville Public Schools
## 2027                                    West Contra Costa Unified
## 2028                                              SPRING HILL ISD
## 2029                                          GRENADA SCHOOL DIST
## 2030                                  Eaton Rapids Public Schools
## 2031      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 2032                              San Juan Island School District
## 2033                                CARROLLTON-FARMERS BRANCH ISD
## 2034                                               ST. LOUIS CITY
## 2035                                     GRISWOLD SCHOOL DISTRICT
## 2036                                    Milwaukee School District
## 2037                                         Grossmont Union High
## 2038                                 VICKSBURG WARREN SCHOOL DIST
## 2039                          Wisconsin Department of Corrections
## 2040                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 2041                                               NM CORRECTIONS
## 2042                                        Beechwood Independent
## 2043                                                 PASADENA ISD
## 2044                                  Gull Lake Community Schools
## 2045                                  Gull Lake Community Schools
## 2046                           Michigan Department of Corrections
## 2047                                              Gwinnett County
## 2048                     Elizabeth City-Pasquotank Public Schools
## 2049                                                  HOUSTON ISD
## 2050                                                DEER PARK ISD
## 2051                                    Rochester School District
## 2052                                       Renton School District
## 2053                                               HARLANDALE ISD
## 2054                                               HARLANDALE ISD
## 2055                                              HALE CENTER ISD
## 2056                                               PETERSBURG ISD
## 2057                                                   WILSON ISD
## 2058                                                PLAINVIEW ISD
## 2059                                         HALIFAX CO PBLC SCHS
## 2060                                                   ALDINE ISD
## 2061                                               HALLSVILLE ISD
## 2062                                         Burke County Schools
## 2063                                               Hamblen County
## 2064                                             Hamilton Unified
## 2065                                   Hamilton Community Schools
## 2066                           Michigan Department of Corrections
## 2067                                     Hanford Joint Union High
## 2068                                           Hanford Elementary
## 2069                                     Hanford Joint Union High
## 2070                               Hanover-Horton School District
## 2071                                Happy Valley Union Elementary
## 2072                                          Glasgow Independent
## 2073                                    Region 06 West Cook ISC 2
## 2074                              HASTINGS PUBLIC SCHOOL DISTRICT
## 2075                                         Huron Valley Schools
## 2076                                    West Contra Costa Unified
## 2077                                                LUMBERTON ISD
## 2078                                                  KOUNTZE ISD
## 2079                                                  SILSBEE ISD
## 2080                                      WEST HARDIN COUNTY CISD
## 2081                                         HARDIN-JEFFERSON ISD
## 2082                                                     BUNA ISD
## 2083                                                Hardin County
## 2084                                               HARLANDALE ISD
## 2085                                               HARLANDALE ISD
## 2086                        NEW YORK CITY GEOGRAPHIC DISTRICT # 5
## 2087                                  EDUCATIONAL SERVICE UNIT 13
## 2088                                            SPRING BRANCH ISD
## 2089                                Thompson School District R-2J
## 2090                                          Los Angeles Unified
## 2091              Harper Woods The School District of the City of
## 2092                                                  HOUSTON ISD
## 2093              Harper Woods The School District of the City of
## 2094                                            WICHITA FALLS ISD
## 2095                                                DEER PARK ISD
## 2096                                                  HOUSTON ISD
## 2097                                            SPRING BRANCH ISD
## 2098                                                    KLEIN ISD
## 2099                                              CLEAR CREEK ISD
## 2100                                                     KATY ISD
## 2101                                                EXCEL ACADEMY
## 2102                                                EXCEL ACADEMY
## 2103                                          Los Angeles Unified
## 2104                                   Harrison Community Schools
## 2105                              Port Huron Area School District
## 2106                                      HARRISON COUNTY SCHOOLS
## 2107                                      HARRISON COUNTY SCHOOLS
## 2108                                      HARRISON CO SCHOOL DIST
## 2109                                              Harrison County
## 2110                              Yuba County Office of Education
## 2111                                      Hartford Public Schools
## 2112                                                Ripon Unified
## 2113                              HASTINGS PUBLIC SCHOOL DISTRICT
## 2114                                                    ST. JOHNS
## 2115                                                   CONROE ISD
## 2116                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 2117                                              Pendleton SD 16
## 2118                                                    HAYS CISD
## 2119                    Hazel Park School District of the City of
## 2120                    Hazel Park School District of the City of
## 2121                    Hazel Park School District of the City of
## 2122                    Hazel Park School District of the City of
## 2123                    Hazel Park School District of the City of
## 2124                                       ARLINGTON CO PBLC SCHS
## 2125                                                   CROSBY ISD
## 2126                                                    PLANO ISD
## 2127                           PARK RAPIDS PUBLIC SCHOOL DISTRICT
## 2128                             INTERMEDIATE SCHOOL DISTRICT 287
## 2129                             INTERMEDIATE SCHOOL DISTRICT 287
## 2130                                              SAN ANTONIO ISD
## 2131                                BENSON PUBLIC SCHOOL DISTRICT
## 2132                                                Selma Unified
## 2133                        MCCALL-DONNELLY JOINT SCHOOL DISTRICT
## 2134                              Frederick County Public Schools
## 2135                              Frederick County Public Schools
## 2136                                                Hemet Unified
## 2137                                                Multnomah ESD
## 2138                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 2139                               Hemlock Public School District
## 2140                                                HEMPSTEAD ISD
## 2141                                                 Lodi Unified
## 2142                                    Peninsula School District
## 2143                                     Henderson County Schools
## 2144                                      Rowan-Salisbury Schools
## 2145                             HENDRICKS PUBLIC SCHOOL DISTRICT
## 2146                             HENDRICKS PUBLIC SCHOOL DISTRICT
## 2147                             INTERMEDIATE SCHOOL DISTRICT 287
## 2148                                        DOE SOP EDUC PROGRAMS
## 2149                                                 Henry County
## 2150                                                      BROWARD
## 2151                                          Los Angeles Unified
## 2152                           Minneapolis Public School District
## 2153                                    Airport Community Schools
## 2154                                                         DADE
## 2155                                                 HEREFORD ISD
## 2156                                             HERITAGE ACADEMY
## 2157                           Minneapolis Public School District
## 2158                                             HERITAGE ACADEMY
## 2159                                             HERITAGE ACADEMY
## 2160                                             HERITAGE ACADEMY
## 2161                                  Thermalito Union Elementary
## 2162                                               Daviess County
## 2163                                             Fillmore Unified
## 2164                            HERMANTOWN PUBLIC SCHOOL DISTRICT
## 2165                                                     HERNANDO
## 2166                                             Hesperia Unified
## 2167                                              SAN BENITO CISD
## 2168                                                  HIDALGO ISD
## 2169                                              SOUTH TEXAS ISD
## 2170                                                  WESLACO ISD
## 2171                                                 PROGRESO ISD
## 2172                                                 MISSION CISD
## 2173                                               MONTE ALTO ISD
## 2174                                                    DONNA ISD
## 2175                                             EDCOUCH-ELSA ISD
## 2176                                                  WESLACO ISD
## 2177                                                SHARYLAND ISD
## 2178                                                  HIDALGO ISD
## 2179                                      SHOSHONE JOINT DISTRICT
## 2180                                          Modoc Joint Unified
## 2181                                 CLARK COUNTY SCHOOL DISTRICT
## 2182                                         Apple Valley Unified
## 2183                                 CLARK COUNTY SCHOOL DISTRICT
## 2184                            Chester Area School District 39-1
## 2185                                                  SHELDON ISD
## 2186                                             GOOSE CREEK CISD
## 2187                        NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 2188                                    Snohomish School District
## 2189                                       LINCOLN PUBLIC SCHOOLS
## 2190                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 2191                                                      VOLUSIA
## 2192                                            HIGHLAND PARK ISD
## 2193                                          Los Angeles Unified
## 2194 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 2195                                              Konocti Unified
## 2196                                                    HIGHLANDS
## 2197                                         Omak School District
## 2198                                        DOE SOP EDUC PROGRAMS
## 2199                                                         POLK
## 2200                                     Highline School District
## 2201                                     Highline School District
## 2202                                                   ALDINE ISD
## 2203                                             BARBERS HILL ISD
## 2204                                                 LA PORTE ISD
## 2205                                                   HUMBLE ISD
## 2206                                     HARRIS COUNTY DEPT OF ED
## 2207                                                   CROSBY ISD
## 2208                                              GALENA PARK ISD
## 2209                                     HARRIS COUNTY DEPT OF ED
## 2210                                                   PALM BEACH
## 2211                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 2212                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 2213                                                   ITASCA ISD
## 2214                                                   ABBOTT ISD
## 2215                                                  AQUILLA ISD
## 2216                                                HILLSBORO ISD
## 2217                                                  HUBBARD ISD
## 2218                                                  WHITNEY ISD
## 2219                                                    BYNUM ISD
## 2220                                                KERRVILLE ISD
## 2221                                   BIG SPRINGS CHARTER SCHOOL
## 2222                                                 PENELOPE ISD
## 2223                                                     BLUM ISD
## 2224                                               MOUNT CALM ISD
## 2225                                                   MALONE ISD
## 2226                                                COVINGTON ISD
## 2227                 Union County Educational Services Commission
## 2228                 Union County Educational Services Commission
## 2229                         San Mateo County Office of Education
## 2230                                                LEBANON R-III
## 2231                                            Montgomery County
## 2232                                      Kenosha School District
## 2233                                                 HILLSBOROUGH
## 2234                                               Upland Unified
## 2235                                      Mountain Empire Unified
## 2236                                           LEE'S SUMMIT R-VII
## 2237                                               Spencer County
## 2238                                               Tustin Unified
## 2239                                                         DADE
## 2240                                  HOWARD LAKE-WAVERLY-WINSTED
## 2241                             ST. PETER PUBLIC SCHOOL DISTRICT
## 2242                                 Holland City School District
## 2243                                       HOLLANDALE SCHOOL DIST
## 2244                                        HOLMES CO SCHOOL DIST
## 2245                                                NORTHSIDE ISD
## 2246                            Holyoke School District No. Re-1J
## 2247                              Baltimore County Public Schools
## 2248                              Baltimore County Public Schools
## 2249                            Evergreen School District (Clark)
## 2250                                    Shoreline School District
## 2251                                  Grand Rapids Public Schools
## 2252                                             Jefferson County
## 2253                                             Jefferson County
## 2254                                Methow Valley School District
## 2255                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 2256                                               NORTH EAST ISD
## 2257                                                NORTHSIDE ISD
## 2258                                               KINGSVILLE ISD
## 2259                                                BIRDVILLE ISD
## 2260                                     HURST-EULESS-BEDFORD ISD
## 2261                                   Oak Harbor School District
## 2262                                     Crescent School District
## 2263                                 Lake Stevens School District
## 2264                                Battle Ground School District
## 2265                      Kenai Peninsula Borough School District
## 2266                                              Ventura Unified
## 2267                                 Howard County Public Schools
## 2268                                       Cheney School District
## 2269                                             Paradise Unified
## 2270                                             Paradise Unified
## 2271                                                Chico Unified
## 2272                                                 Eufaula City
## 2273              Northern Region Educational Services Commission
## 2274                                                      GADSDEN
## 2275                                         HOPE SCHOOL DISTRICT
## 2276                                                  LA JOYA ISD
## 2277                                           CALHOUN COUNTY ISD
## 2278                                               Houston County
## 2279                                            Montgomery County
## 2280                                                      JACKSON
## 2281                  Navajo County School Superintendents Office
## 2282                                               Hopkins County
## 2283                                               Hopkins County
## 2284                                         Desert Sands Unified
## 2285                                      Riverdale Joint Unified
## 2286                     Hamtramck School District of the City of
## 2287                                                 Decatur City
## 2288                                                      MANATEE
## 2289                                      Caldwell County Schools
## 2290                              Salida School District No. R-32
## 2291                                                  Todd County
## 2292                       Boulder Valley School District No. Re2
## 2293                                           Mt. Diablo Unified
## 2294                                           Salt Lake District
## 2295                                                  Clay County
## 2296                                                  WESLACO ISD
## 2297                                                    PLANO ISD
## 2298                                                   DALLAS ISD
## 2299                              Houghton Lake Community Schools
## 2300                                         HOUSTON  SCHOOL DIST
## 2301                                         TEXANS CAN ACADEMIES
## 2302                                         TEXANS CAN ACADEMIES
## 2303                                         TEXANS CAN ACADEMIES
## 2304                                               Houston County
## 2305                                  HOUSTON HEIGHTS HIGH SCHOOL
## 2306                        Prince George's County Public Schools
## 2307                                    Cumberland County Schools
## 2308                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 2309                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 2310                                                 HUCKABAY ISD
## 2311              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 2312      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 2313                                          Hudson Area Schools
## 2314                                                Marion County
## 2315                                CARROLLTON-FARMERS BRANCH ISD
## 2316                                                   HUMBLE ISD
## 2317                              HUMBOLDT COUNTY SCHOOL DISTRICT
## 2318                              HUMBOLDT COUNTY SCHOOL DISTRICT
## 2319                          Humboldt County Office of Education
## 2320                          Humboldt County Office of Education
## 2321                                                     Brockton
## 2322                                         Huron Valley Schools
## 2323                           Michigan Department of Corrections
## 2324                                     ERATH EXCELS ACADEMY INC
## 2325                                       Seattle Public Schools
## 2326                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 2327                            HUTCHINSON PUBLIC SCHOOL DISTRICT
## 2328                                        Iroquois/Kankakee ROE
## 2329                               Central Valley School District
## 2330                        IDAHO VIRTUAL EDUCATION PARTNERS INC.
## 2331                                   IDAHO VIRTUAL ACADEMY INC.
## 2332                                       OROFINO JOINT DISTRICT
## 2333                                       OROFINO JOINT DISTRICT
## 2334                                         Grossmont Union High
## 2335                                         Kent School District
## 2336                                   Oak Harbor School District
## 2337                                            San Diego Unified
## 2338                                       Dept of Human Services
## 2339                                            IDJJ Sch Dist 428
## 2340                                               Carroll County
## 2341                             Il Mathematics & Science Academy
## 2342                                            IDJJ Sch Dist 428
## 2343                                            IDJJ Sch Dist 428
## 2344                                                 Boone County
## 2345                                 Iron Mountain Public Schools
## 2346                                                      COLLIER
## 2347                                                        DUVAL
## 2348                                       Lynden School District
## 2349                                             Imperial Unified
## 2350                          Imperial County Office of Education
## 2351                                                 Lodi Unified
## 2352                                              INDEPENDENCE 30
## 2353                                           BLACKFOOT DISTRICT
## 2354                                          Los Angeles Unified
## 2355                                         El Dorado Union High
## 2356                                        Golden Valley Unified
## 2357                                           Liberty Union High
## 2358                                        San Francisco Unified
## 2359                                               Provo District
## 2360                                    Paso Robles Joint Unified
## 2361                                   Roseville Joint Union High
## 2362                                             Alhambra Unified
## 2363                                            Merced Union High
## 2364                                        Amador County Unified
## 2365                        NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 2366                                                Fulton County
## 2367                                 CORRECTIONAL SCHOOL DISTRICT
## 2368                                    RIO RANCHO PUBLIC SCHOOLS
## 2369                                    Riverside School District
## 2370                                         OMAHA PUBLIC SCHOOLS
## 2371                                              Oakland Unified
## 2372                                         Las Virgenes Unified
## 2373                                              WEISER DISTRICT
## 2374                                   SUNFLOWER CONS SCHOOL DIST
## 2375                                 Le Mars Comm School District
## 2376 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 2377                               Lansing Public School District
## 2378                               Lansing Public School District
## 2379                                        Leslie Public Schools
## 2380                                            Inglewood Unified
## 2381                                          KUNA JOINT DISTRICT
## 2382                                          Palmdale Elementary
## 2383                                WASHOE COUNTY SCHOOL DISTRICT
## 2384                                                       ORANGE
## 2385                         Madison Metropolitan School District
## 2386                         Madison Metropolitan School District
## 2387                                   Insight School of Michigan
## 2388                            Quillayute Valley School District
## 2389                                    McFarland School District
## 2390                                               FORT WORTH ISD
## 2391                                                  HOUSTON ISD
## 2392                                                  MCALLEN ISD
## 2393                                                     ROMA ISD
## 2394                                               FORT WORTH ISD
## 2395                          EASTERN CARVER COUNTY PUBLIC SCHOOL
## 2396                                         FAIRFAX CO PBLC SCHS
## 2397                                       Seattle Public Schools
## 2398                                       Seattle Public Schools
## 2399                              Lake Washington School District
## 2400                                                   AUSTIN ISD
## 2401                                            GRAND PRAIRIE ISD
## 2402                       Los Angeles County Office of Education
## 2403                                     Bellevue School District
## 2404                                  Federal Way School District
## 2405                                        Pasco School District
## 2406                                        Tempe School District
## 2407                                       Cheboygan Area Schools
## 2408                    Hazel Park School District of the City of
## 2409                           Michigan Department of Corrections
## 2410                                               IOWA PARK CISD
## 2411                                               Hilmar Unified
## 2412                               WAYZATA PUBLIC SCHOOL DISTRICT
## 2413                                         PREMIER HIGH SCHOOLS
## 2414                              BRAINERD PUBLIC SCHOOL DISTRICT
## 2415                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 2416                                    NORTHLAND LEARNING CENTER
## 2417                                         HENRICO CO PBLC SCHS
## 2418                       Ishpeming Public School District No. 1
## 2419                                 Kingsburg Elementary Charter
## 2420                                              Alameda Unified
## 2421                                                          LEE
## 2422                                  ISLE PUBLIC SCHOOL DISTRICT
## 2423                          GRAND RAPIDS PUBLIC SCHOOL DISTRICT
## 2424                                  ITAWAMBA COUNTY SCHOOL DIST
## 2425                                                    PLANO ISD
## 2426                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 2427                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 2428                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 2429                             ELK RIVER PUBLIC SCHOOL DISTRICT
## 2430                                         Fallbrook Union High
## 2431                                            IDJJ Sch Dist 428
## 2432                                            IDJJ Sch Dist 428
## 2433                                                 MCKINNEY ISD
## 2434                                                 CLEBURNE ISD
## 2435                                                EDINBURG CISD
## 2436                                                  LA JOYA ISD
## 2437                                          Hoke County Schools
## 2438                             Kings County Office of Education
## 2439                                   New Hanover County Schools
## 2440                                               Fresno Unified
## 2441                          Siskiyou County Office of Education
## 2442                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 2443                                          Los Angeles Unified
## 2444                                          Los Angeles Unified
## 2445                                                     ESCAMBIA
## 2446                                                Warren County
## 2447                                                Warren County
## 2448                                                      JACKSON
## 2449                                  Brownstown Cnt Com Sch Corp
## 2450                                Jackson County Public Schools
## 2451                          Wisconsin Department of Corrections
## 2452                                               Jackson County
## 2453                                       Jackson Public Schools
## 2454                                       Jackson Public Schools
## 2455                                                         DADE
## 2456                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 2457                               DOUGLAS COUNTY SCHOOL DISTRICT
## 2458                                  Gila County Sheriffs Office
## 2459                          Graham County School Superintendent
## 2460                              Greenlee County Sheriffs Office
## 2461                              Maricopa County Sheriffs Office
## 2462                            Santa Cruz County Sheriffs Office
## 2463                                  North Mason School District
## 2464                    West Allis-West Milwaukee School District
## 2465                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 2466                                                        PASCO
## 2467                                                NORTHWEST ISD
## 2468                                                 Meade County
## 2469                                           Lemoore Union High
## 2470                              Mono County Office of Education
## 2471                                          Los Angeles Unified
## 2472                                             Stockton Unified
## 2473                                                         DADE
## 2474                       Los Angeles County Office of Education
## 2475                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 2476                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 2477                     IDAHO DEPARTMENT OF JUVENILE CORRECTIONS
## 2478                                             Jefferson County
## 2479                                                   GODLEY ISD
## 2480                                                LANCASTER ISD
## 2481                                         JEAN MASSIEU ACADEMY
## 2482                              Lake Mills Area School District
## 2483                               Adams Township School District
## 2484                                         HAMSHIRE-FANNETT ISD
## 2485                                       PORT NECHES-GROVES ISD
## 2486                                              SABINE PASS ISD
## 2487                                                NEDERLAND ISD
## 2488                                              PORT ARTHUR ISD
## 2489                                                 BEAUMONT ISD
## 2490                                     JEFFERSON CO SCHOOL DIST
## 2491                                             Jefferson County
## 2492                                             Jefferson County
## 2493                                             Jefferson County
## 2494                                          Siskiyou Union High
## 2495                              JEFFERSON COUNTY JOINT DISTRICT
## 2496   GreeleySchool District No. 6 in the county of Weld and Sta
## 2497                                 LAMAR COUNTY SCHOOL DISTRICT
## 2498                                 CLARK COUNTY SCHOOL DISTRICT
## 2499                                       Jenison Public Schools
## 2500                                             Glendale Unified
## 2501                                            INSPIRE ACADEMIES
## 2502                                            INSPIRE ACADEMIES
## 2503                                            INSPIRE ACADEMIES
## 2504                                            INSPIRE ACADEMIES
## 2505                                            INSPIRE ACADEMIES
## 2506                                            INSPIRE ACADEMIES
## 2507                                            INSPIRE ACADEMIES
## 2508                                            INSPIRE ACADEMIES
## 2509                                            INSPIRE ACADEMIES
## 2510                              Inyo County Office of Education
## 2511                                                   WILLIS ISD
## 2512                                                    LYTLE ISD
## 2513                                               CEDAR HILL ISD
## 2514                                                  SOCORRO ISD
## 2515                                                    WEBB CISD
## 2516                                                   CONROE ISD
## 2517                                              SAN ANTONIO ISD
## 2518                                                   HUMBLE ISD
## 2519                                                 LA PORTE ISD
## 2520                                              CHANNELVIEW ISD
## 2521                                                 MERCEDES ISD
## 2522                                               FORT WORTH ISD
## 2523                                                      MADISON
## 2524                                                   DENTON ISD
## 2525            California Education Authority (CEA) Headquarters
## 2526                                           Cloverdale Unified
## 2527                        Stanislaus County Office of Education
## 2528                          Wisconsin Department of Corrections
## 2529                       San Joaquin County Office of Education
## 2530                                         Corona-Norco Unified
## 2531                                         Vallejo City Unified
## 2532                                          Los Angeles Unified
## 2533                                              Lindsay Unified
## 2534                                    SPOTSYLVANIA CO PBLC SCHS
## 2535                                                   DALLAS ISD
## 2536                                                     SEMINOLE
## 2537                                               BLUE RIDGE ISD
## 2538                                          Los Angeles Unified
## 2539                JOHN V LINDSAY WILDCAT ACADEMY CHARTER SCHOOL
## 2540                                        Bret Harte Union High
## 2541                                               Bossier Parish
## 2542                                               Johnson County
## 2543                                                   JOSHUA ISD
## 2544                                                 BURLESON ISD
## 2545                               Juneau Borough School District
## 2546                                         JONES CO SCHOOL DIST
## 2547                                 Jonesville Community Schools
## 2548                                        San Francisco Unified
## 2549                                      MANASSAS CITY PBLC SCHS
## 2550                                               JOURDANTON ISD
## 2551                                                     SEMINOLE
## 2552                                               SWEETWATER ISD
## 2553                                              SAN ANTONIO ISD
## 2554                                            JUBILEE ACADEMIES
## 2555                                            JUBILEE ACADEMIES
## 2556                                            JUBILEE ACADEMIES
## 2557                             Dorchester County Public Schools
## 2558                                                   JUDSON ISD
## 2559                                                   JUDSON ISD
## 2560                                                 LONGVIEW ISD
## 2561                                                     ESCAMBIA
## 2562                                           Capistrano Unified
## 2563                                                      MANATEE
## 2564                                                      MANATEE
## 2565                       Boulder Valley School District No. Re2
## 2566                                             BLOOMFIELD R-XIV
## 2567                                                   LAMAR CISD
## 2568                                                   LUFKIN ISD
## 2569                                              SAN ANTONIO ISD
## 2570                                                 LONGVIEW ISD
## 2571                                  ELKO COUNTY SCHOOL DISTRICT
## 2572                                 CLARK COUNTY SCHOOL DISTRICT
## 2573                    Stevens Point Area Public School District
## 2574                                                       ORANGE
## 2575                                 CLARK COUNTY SCHOOL DISTRICT
## 2576                                           Champaign/Ford ROE
## 2577                                                      MANATEE
## 2578                                                  ABILENE ISD
## 2579                                              Ottawa Area ISD
## 2580                                                        PASCO
## 2581                                                   SEGUIN ISD
## 2582                                      SAN FELIPE-DEL RIO CISD
## 2583                                                   CONROE ISD
## 2584                                                   SINTON ISD
## 2585                                                EDINBURG CISD
## 2586                               SPECL. SCH. DST. ST. LOUIS CO.
## 2587                                             FARMINGTON R-VII
## 2588                                              HILLSBORO R-III
## 2589              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 2590                      Madera County Superintendent of Schools
## 2591                                                   DALLAS ISD
## 2592                                              GALENA PARK ISD
## 2593                                                 ALVARADO ISD
## 2594                                               FORT WORTH ISD
## 2595                                                    VENUS ISD
## 2596                                                SPLENDORA ISD
## 2597                             South Bend Community School Corp
## 2598                                                         DADE
## 2599                                            SPRINGFIELD R-XII
## 2600                                                   LIBERTY 53
## 2601                                                  COLUMBIA 93
## 2602                                              CAMDENTON R-III
## 2603              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 2604              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 2605                                                       ORANGE
## 2606                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 2607                                          Noblesville Schools
## 2608                                                   UNITED ISD
## 2609                                                   KENEDY ISD
## 2610                                                KERRVILLE ISD
## 2611                                   Ellensburg School District
## 2612                                     Kalamazoo Public Schools
## 2613                                     Kalamazoo Public Schools
## 2614                                                 Bethel SD 52
## 2615                                      Kalkaska Public Schools
## 2616                                              KARNES CITY ISD
## 2617                                                  SHELDON ISD
## 2618                                 KATHERINE ANNE PORTER SCHOOL
## 2619                                               Exeter Unified
## 2620                                              KARNES CITY ISD
## 2621                                                  De Kalb ROE
## 2622                                                    KEENE ISD
## 2623                                               Bishop Unified
## 2624                                       MILLARD PUBLIC SCHOOLS
## 2625                                        Lake Elsinore Unified
## 2626                                          Kelseyville Unified
## 2627                                                     KEMP ISD
## 2628                                Chandler Unified District #80
## 2629                      Kenai Peninsula Borough School District
## 2630                                                KENNEDALE ISD
## 2631                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 2632                                  Kenowa Hills Public Schools
## 2633                                         Kent School District
## 2634                                         Kent School District
## 2635                             KENYON-WANAMINGO SCHOOL DISTRICT
## 2636                            GOODHUE COUNTY EDUCATION DISTRICT
## 2637                                                   Bellingham
## 2638                              Kern County Office of Education
## 2639                              Kern County Office of Education
## 2640                                                KERRVILLE ISD
## 2641                          Wisconsin Department of Corrections
## 2642                                                  SOCORRO ISD
## 2643                                               HARLINGEN CISD
## 2644                                                       MONROE
## 2645                                                  SOCORRO ISD
## 2646                                     HURST-EULESS-BEDFORD ISD
## 2647                                           KI CHARTER ACADEMY
## 2648                          North Slope Borough School District
## 2649                                                  KILLEEN ISD
## 2650                                          Davis Joint Unified
## 2651                                                    Cambridge
## 2652                                          Los Angeles Unified
## 2653                                   Kings Canyon Joint Unified
## 2654                                       Corcoran Joint Unified
## 2655                                               Sanger Unified
## 2656                                   Kingsburg Joint Union High
## 2657                       Winston Salem / Forsyth County Schools
## 2658                                       Folsom-Cordova Unified
## 2659                                           POCATELLO DISTRICT
## 2660                           Michigan Department of Corrections
## 2661                       Los Angeles County Office of Education
## 2662                                   Klamath Falls City Schools
## 2663                                                    KLEIN ISD
## 2664                                                    KLEIN ISD
## 2665                                                    KLEIN ISD
## 2666                            Region 6 and 8-SW/WC Service Coop
## 2667                          ST. MICHAEL-ALBERTVILLE SCHOOL DIST
## 2668                                                  Knox County
## 2669                                                  Knox County
## 2670                                                  Knox County
## 2671                                                  Knox County
## 2672                                ONAMIA PUBLIC SCHOOL DISTRICT
## 2673                                              Konocti Unified
## 2674                             THE KOOTENAI BRIDGE ACADEMY INC.
## 2675                                    KOSCIUSKO SCHOOL DISTRICT
## 2676                              Lower Kuskokwim School District
## 2677                                   Kyrene Elementary District
## 2678                                           LUBBOCK-COOPER ISD
## 2679                                                LANCASTER ISD
## 2680                       Los Angeles County Office of Education
## 2681                                    La Center School District
## 2682                                        Santa Barbara Unified
## 2683                                             San Juan Unified
## 2684                                Placentia-Yorba Linda Unified
## 2685                                     Coachella Valley Unified
## 2686                                                 LA FERIA ISD
## 2687                                           Liberty Union High
## 2688                                   Fullerton Joint Union High
## 2689                                                 LA VILLA ISD
## 2690                                   Fullerton Joint Union High
## 2691                                                       HENDRY
## 2692                                    Milwaukee School District
## 2693                                             Lafourche Parish
## 2694                                West Sonoma County Union High
## 2695                                                 HILLSBOROUGH
## 2696                                                         LAKE
## 2697                                                         LAKE
## 2698                                          Los Angeles Unified
## 2699                               Lake City Area School District
## 2700                            GOODHUE COUNTY EDUCATION DISTRICT
## 2701                                                     Lake ROE
## 2702                                                         LAKE
## 2703                                                 Wayne County
## 2704                                   New Hanover County Schools
## 2705                                  New Haven Community Schools
## 2706                               WILLMAR PUBLIC SCHOOL DISTRICT
## 2707                            LAKE PEND OREILLE SCHOOL DISTRICT
## 2708                             Grand Coulee Dam School District
## 2709                           Michigan Department of Corrections
## 2710                                             Lakeport Unified
## 2711                                             Lakeport Unified
## 2712                                  MEADOWLAND CHARTER DISTRICT
## 2713                          REGION 4-LAKES COUNTRY SERVICE COOP
## 2714                                    Gibraltar School District
## 2715                             Southwest Metro Intermediate 288
## 2716                                DULUTH PUBLIC SCHOOL DISTRICT
## 2717                                      Lakeside Charter School
## 2718                                              LAKESIDE SCHOOL
## 2719                                                     ESCAMBIA
## 2720                               WILLMAR PUBLIC SCHOOL DISTRICT
## 2721                                        Durham Public Schools
## 2722                             LAKEVILLE PUBLIC SCHOOL DISTRICT
## 2723                                     Lakewood School District
## 2724                                                  MCALLEN ISD
## 2725                                              NORTH LAMAR ISD
## 2726                                            BORDEN COUNTY ISD
## 2727                                                   LAMESA ISD
## 2728                                         Lancaster Elementary
## 2729                                LANDER COUNTY SCHOOL DISTRICT
## 2730                                                Nebo District
## 2731                                       ARLINGTON CO PBLC SCHS
## 2732                                                      BROWARD
## 2733                                 L'Anse Creuse Public Schools
## 2734                               Lansing Public School District
## 2735                                                    PLANO ISD
## 2736                                                  HOUSTON ISD
## 2737                                            Elk Grove Unified
## 2738                                           Bellflower Unified
## 2739                                 La Salle/Marshall/Putnam ROE
## 2740                                            Lassen Union High
## 2741                                    LAUDERDALE CO SCHOOL DIST
## 2742                                                      BROWARD
## 2743                                                Laurel County
## 2744                                                Laurel County
## 2745                                       LAUREL SCHOOL DISTRICT
## 2746                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 2747                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 2748                             Lawton Community School District
## 2749                                          Laytonville Unified
## 2750                                                 LONGVIEW ISD
## 2751                                                    PARK HILL
## 2752                           Lead-Deadwood School District 40-1
## 2753                                       Monroe School District
## 2754                                                EXCEL ACADEMY
## 2755                                                   AUSTIN ISD
## 2756                                                     PINELLAS
## 2757                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 2758                            BURNSVILLE PUBLIC SCHOOL DISTRICT
## 2759                                                 Perry County
## 2760                                   BLOOMFIELD SCHOOL DISTRICT
## 2761                                                   SANTA ROSA
## 2762                                               LEWISVILLE ISD
## 2763                                 Lake Orion Community Schools
## 2764                                   William S. Hart Union High
## 2765                                                          LEE
## 2766                                   LEE COUNTY SCHOOL DISTRICT
## 2767                                               NM CORRECTIONS
## 2768                                                          LEE
## 2769                                       Dept Of Correction N04
## 2770                                         Corona-Norco Unified
## 2771                                                Coast Unified
## 2772                                       LEFLORE CO SCHOOL DIST
## 2773                                          Napa Valley Unified
## 2774                                Hartland Consolidated Schools
## 2775                                    Kennewick School District
## 2776                            Evergreen School District (Clark)
## 2777 School District No. 1 in the county of Denver and State of C
## 2778                                                      VOLUSIA
## 2779                                  ITHACA CITY SCHOOL DISTRICT
## 2780                              HUMBOLDT COUNTY SCHOOL DISTRICT
## 2781                                                       Lennox
## 2782                                 Lenoir County Public Schools
## 2783                                                         LEON
## 2784                                                         LEON
## 2785                            Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 2786                                                 HILLSBOROUGH
## 2787                                                   DENTON ISD
## 2788 School District N. 14 in the county of Adams & State of Colo
## 2789                                               Letcher County
## 2790                              ACADEMY FOR ACADEMIC EXCELLENCE
## 2791                                                         LEVY
## 2792                                               FORT OSAGE R-I
## 2793                                     Chehalis School District
## 2794                                              Santa Rosa High
## 2795                                     Woodland School District
## 2796                                                   LIBERTY 53
## 2797                                                 VICTORIA ISD
## 2798                                                  HOUSTON ISD
## 2799                                             Jefferson County
## 2800                                                 Lodi Unified
## 2801                                              Benicia Unified
## 2802                                             San Jose Unified
## 2803                                    Paso Robles Joint Unified
## 2804                        NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 2805                                                      LIBERTY
## 2806                                                      LIBERTY
## 2807                                       Seattle Public Schools
## 2808                               MANKATO PUBLIC SCHOOL DISTRICT
## 2809                                Life Skills Center of Pontiac
## 2810                                                    ST. LUCIE
## 2811                             ROSEVILLE PUBLIC SCHOOL DISTRICT
## 2812                                                Warren County
## 2813                                           Lighthouse Academy
## 2814                                           Lighthouse Academy
## 2815                                           Lighthouse Academy
## 2816                                           Lighthouse Academy
## 2817                                           Lighthouse Academy
## 2818                                           Fort Bragg Unified
## 2819                                              Carbon District
## 2820                                               BRAZOSPORT ISD
## 2821                                               BRAZOSPORT ISD
## 2822                                                GROESBECK ISD
## 2823                              Stanwood-Camano School District
## 2824                               LINCOLN COUNTY SCHOOL DISTRICT
## 2825                                        Owosso Public Schools
## 2826                               LINCOLN COUNTY SCHOOL DISTRICT
## 2827                                        Golden Valley Unified
## 2828                               LINCOLN COUNTY SCHOOL DISTRICT
## 2829                              BRAINERD PUBLIC SCHOOL DISTRICT
## 2830                                          San Leandro Unified
## 2831                         School District No. Re-3 Fort Morgan
## 2832                                    BONNEVILLE JOINT DISTRICT
## 2833                                   Walla Walla Public Schools
## 2834                                 Port Angeles School District
## 2835                              Stanwood-Camano School District
## 2836                          Wisconsin Department of Corrections
## 2837                                     CLOVIS MUNICIPAL SCHOOLS
## 2838                                              BROWNSVILLE ISD
## 2839                                                     Will ROE
## 2840                                                     Will ROE
## 2841                                                     Will ROE
## 2842                                                Hardin County
## 2843                                                   SANGER ISD
## 2844                                              Lindsay Unified
## 2845                            LITCHFIELD PUBLIC SCHOOL DISTRICT
## 2846                          LITTLE FALLS PUBLIC SCHOOL DISTRICT
## 2847                                  NORTHLAND COMMUNITY SCHOOLS
## 2848                                                    HAYS CISD
## 2849                                             Live Oak Unified
## 2850                                              Antioch Unified
## 2851                              GENESEO CENTRAL SCHOOL DISTRICT
## 2852                                               LIVINGSTON ISD
## 2853                                                   SEGUIN ISD
## 2854                              Lake County Office of Education
## 2855                                 La Salle/Marshall/Putnam ROE
## 2856                                 La Salle/Marshall/Putnam ROE
## 2857                                                 LOCKHART ISD
## 2858                                                  LOCKNEY ISD
## 2859                                           Middletown Unified
## 2860                                               Sierra Unified
## 2861                                                 Logan County
## 2862                                          Los Angeles Unified
## 2863                                                        DUVAL
## 2864                                       Summerville Union High
## 2865                                                 Decatur City
## 2866                           Minneapolis Public School District
## 2867                           Minneapolis Public School District
## 2868                                   Osborn Elementary District
## 2869                     Jefferson County School District No. R-1
## 2870                                   DIVISION OF YOUTH SERVICES
## 2871                                    Loon Lake School District
## 2872                                        Kelso School District
## 2873                                            Lucia Mar Unified
## 2874                                    BILOXI PUBLIC SCHOOL DIST
## 2875                                            Santa Ana Unified
## 2876                           Minneapolis Public School District
## 2877                           Minneapolis Public School District
## 2878                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 2879                                          Palmdale Elementary
## 2880                                          Los Angeles Unified
## 2881                                          Los Molinos Unified
## 2882                       Los Angeles County Office of Education
## 2883                                   Ravenswood City Elementary
## 2884                                                  JARRELL ISD
## 2885                                                   TAYLOR ISD
## 2886                                         LOUDOUN CO PBLC SCHS
## 2887                                        DOE SOP EDUC PROGRAMS
## 2888                                             Jefferson County
## 2889                                             Jefferson County
## 2890                                                  LOVEJOY ISD
## 2891                                   Cutler-Orosi Joint Unified
## 2892                        NEW YORK CITY GEOGRAPHIC DISTRICT # 1
## 2893                                       LOWNDES CO SCHOOL DIST
## 2894                                      Loysville Youth Dev Ctr
## 2895                                       LINCOLN PUBLIC SCHOOLS
## 2896                                   Alum Rock Union Elementary
## 2897                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 2898                           LE SUEUR-HENDERSON SCHOOL DISTRICT
## 2899                                                   IDALOU ISD
## 2900                                                 NEW DEAL ISD
## 2901                                                  LUBBOCK ISD
## 2902                                                   SLATON ISD
## 2903                                                 FRENSHIP ISD
## 2904                                                  LUBBOCK ISD
## 2905                                                ROOSEVELT ISD
## 2906                                              SHALLOWATER ISD
## 2907                                           LUBBOCK-COOPER ISD
## 2908                                       Lucerne Valley Unified
## 2909                          District of Columbia Public Schools
## 2910                               LUVERNE PUBLIC SCHOOL DISTRICT
## 2911                         LYNCHBURG CITY SECONDARY ALTERNATIVE
## 2912                                        DOE SOP EDUC PROGRAMS
## 2913                                       Lynden School District
## 2914                                            GRAND PRAIRIE ISD
## 2915                                              Lynwood Unified
## 2916                                  LYON COUNTY SCHOOL DISTRICT
## 2917                                                    LYTLE ISD
## 2918      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 2919                                             MARTINS MILL ISD
## 2920                                       Mabton School District
## 2921 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 2922                                      MACCRAY SCHOOL DISTRICT
## 2923                                       Dept Of Correction N04
## 2924                                          Albany City Unified
## 2925                           Saginaw Township Community Schools
## 2926                           Michigan Department of Corrections
## 2927                               Department of Juvenile Justice
## 2928                               Department of Juvenile Justice
## 2929                      Madera County Superintendent of Schools
## 2930                                                     Kane ROE
## 2931                                       NORFOLK CITY PBLC SCHS
## 2932                                       MADISON CO SCHOOL DIST
## 2933                                              Esparto Unified
## 2934                                               Madison County
## 2935                                               Madison County
## 2936                                                      MADISON
## 2937                              Madison District Public Schools
## 2938                                                      MADISON
## 2939                                      Edmonds School District
## 2940                                         San Rafael City High
## 2941                                          TWIN FALLS DISTRICT
## 2942                              MAHNOMEN PUBLIC SCHOOL DISTRICT
## 2943                                            Placer Union High
## 2944                                   Fallbrook Union Elementary
## 2945                       Winston Salem / Forsyth County Schools
## 2946                                         HINDS CO SCHOOL DIST
## 2947                                                      OSCEOLA
## 2948                                                Dixon Unified
## 2949                                                Vista Unified
## 2950                                                 MALAKOFF ISD
## 2951                                 Millington Community Schools
## 2952                                Sault Ste. Marie Area Schools
## 2953                                              NACOGDOCHES ISD
## 2954                                      Manistique Area Schools
## 2955                               MANKATO PUBLIC SCHOOL DISTRICT
## 2956                               MANKATO PUBLIC SCHOOL DISTRICT
## 2957                                       Dept Of Correction N04
## 2958                                                    MANOR ISD
## 2959                                              Manteca Unified
## 2960                                              Manteca Unified
## 2961                                           Chawanakee Unified
## 2962                         Woodhaven-Brownstown School District
## 2963                                               Lompoc Unified
## 2964                                         Maple Valley Schools
## 2965                                      Edmonds School District
## 2966                      Kenai Peninsula Borough School District
## 2967                                            Caruthers Unified
## 2968                                           Healdsburg Unified
## 2969                                        Moreno Valley Unified
## 2970                                        Moreno Valley Unified
## 2971                         San Mateo County Office of Education
## 2972                                         Garden Grove Unified
## 2973                               Department of Juvenile Justice
## 2974                             Marin County Office of Education
## 2975                                               Novato Unified
## 2976                             Marin County Office of Education
## 2977                                                        DUVAL
## 2978                                                   MARION ISD
## 2979                                                Marion County
## 2980                                      MERIDIAN PUBLIC SCHOOLS
## 2981                                                       MARION
## 2982                                                       MARION
## 2983                                                       MARION
## 2984                                         Las Virgenes Unified
## 2985                                                   RIESEL ISD
## 2986                                                  CHILTON ISD
## 2987                           Michigan Department of Corrections
## 2988                                              Marshall County
## 2989                              Bend-LaPine Administrative SD 1
## 2990                                      Marshall Public Schools
## 2991                                      Marshall Public Schools
## 2992                                                     MART ISD
## 2993                               Department of Juvenile Justice
## 2994                                                       MARTIN
## 2995                                                       MARTIN
## 2996                                               Fayette County
## 2997   Cherry Creek School District No. 5 in the county of Arapah
## 2998            California Education Authority (CEA) Headquarters
## 2999                               HATTIESBURG PUBLIC SCHOOL DIST
## 3000                                              DUNCANVILLE ISD
## 3001                                             Jefferson County
## 3002                                      Tucson Unified District
## 3003                           Anne Arundel County Public Schools
## 3004                                  Mary Walker School District
## 3005                                  Mary Walker School District
## 3006                                     Marysville Joint Unified
## 3007                                   Marysville School District
## 3008                                   Marysville School District
## 3009                                    DEPARTMENT OF CORRECTIONS
## 3010                               CARLTON PUBLIC SCHOOL DISTRICT
## 3011                                         MASON COUNTY SCHOOLS
## 3012                          Mason Consolidated Schools (Monroe)
## 3013                    Matanuska-Susitna Borough School District
## 3014                              MARSHALL PUBLIC SCHOOL DISTRICT
## 3015                                                  LUBBOCK ISD
## 3016                                                        DUVAL
## 3017                                                   PALM BEACH
## 3018                                                         DYRS
## 3019                                                   DALLAS ISD
## 3020                                             Maya Angelou PCS
## 3021                                              Alameda Unified
## 3022                                                Graves County
## 3023                                       MC COOK PUBLIC SCHOOLS
## 3024                     Jefferson County School District No. R-1
## 3025                            McBain Rural Agricultural Schools
## 3026                                                Fulton County
## 3027                                         Center Joint Unified
## 3028                                             McCracken County
## 3029                                             McCracken County
## 3030                                              McCreary County
## 3031                                                Laurel County
## 3032                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3033                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3034                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3035                                            McFarland Unified
## 3036                              MCGREGOR PUBLIC SCHOOL DISTRICT
## 3037                                            Montgomery County
## 3038                                        Mesa Unified District
## 3039                                    Manitowoc School District
## 3040                              Eau Claire Area School District
## 3041                     Jefferson County School District No. R-1
## 3042                                    Anchorage School District
## 3043                                                    MOODY ISD
## 3044                                                HALLSBURG ISD
## 3045                                             VALLEY MILLS ISD
## 3046                                                  GHOLSON ISD
## 3047                       Los Angeles County Office of Education
## 3048                          Wisconsin Department of Corrections
## 3049                                                       MARION
## 3050                                                       MARION
## 3051                                         Mead School District
## 3052                                         Mead School District
## 3053                                         Mead School District
## 3054                                        Stokes County Schools
## 3055                                             Yosemite Unified
## 3056                                             Right of Passage
## 3057                              Baltimore County Public Schools
## 3058                        Red Clay Consolidated School District
## 3059                                 Medical Lake School District
## 3060                              ACADEMY FOR ACADEMIC EXCELLENCE
## 3061                                                      BREVARD
## 3062                           ST. LOUIS PARK PUBLIC SCHOOL DIST.
## 3063                                                      BROWARD
## 3064                                                  GARLAND ISD
## 3065                       Los Angeles County Office of Education
## 3066                                            Mendocino Unified
## 3067                         Mendocino County Office of Education
## 3068                                            Mendocino Unified
## 3069                                              Mendota Unified
## 3070                                              Mendota Unified
## 3071                      Wisconsin Department of Health Services
## 3072                           Minneapolis Public School District
## 3073                           Minneapolis Public School District
## 3074                           Minneapolis Public School District
## 3075                           Minneapolis Public School District
## 3076                                       Merced City Elementary
## 3077                            Merced County Office of Education
## 3078                                                 MERCEDES ISD
## 3079                                                 MERCEDES ISD
## 3080                                                 MERCEDES ISD
## 3081                                                   SEGUIN ISD
## 3082                                                Mercer County
## 3083                                                Mercer County
## 3084      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3085                                  JOINT SCHOOL DISTRICT NO. 2
## 3086                                     Meridian School District
## 3087                                     Meridian School District
## 3088                                 Merrill Area School District
## 3089                                DULUTH PUBLIC SCHOOL DISTRICT
## 3090                            Maricopa County Regional District
## 3091                               HIBBING PUBLIC SCHOOL DISTRICT
## 3092                                                 MESQUITE ISD
## 3093                                         Sierra Sands Unified
## 3094                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 3095                                          NORTHEAST METRO 916
## 3096                            Cedar Rapids Comm School District
## 3097                                               FORT WORTH ISD
## 3098                               Department of Juvenile Justice
## 3099                                METRO RICHMOND ALTERNATIVE ED
## 3100                         Madison Metropolitan School District
## 3101                                                         DADE
## 3102                                                  KILLEEN ISD
## 3103                                          Los Angeles Unified
## 3104                                               Portland SD 1J
## 3105                                                         DADE
## 3106                                                         DADE
## 3107                                                         DADE
## 3108                                                         DADE
## 3109                               Central Valley School District
## 3110                                                  Saginaw ISD
## 3111                    Hazel Park School District of the City of
## 3112                           Michigan Department of Corrections
## 3113                                      Marshall Public Schools
## 3114                               Davenport Comm School District
## 3115                                             Williams Unified
## 3116                                          Los Angeles Unified
## 3117                                    Kennewick School District
## 3118                           MIDVALLEY ACADEMY CHARTER DISTRICT
## 3119                          GRAND RAPIDS PUBLIC SCHOOL DISTRICT
## 3120                                                  HOUSTON ISD
## 3121                                                  HOUSTON ISD
## 3122                                            Santa Ana Unified
## 3123                                  San Bernardino City Unified
## 3124                              BRAINERD PUBLIC SCHOOL DISTRICT
## 3125                                  RUNESTONE AREA ED. DISTRICT
## 3126                                               FORT WORTH ISD
## 3127                                        DOE SOP EDUC PROGRAMS
## 3128                             ROSEVILLE PUBLIC SCHOOL DISTRICT
## 3129                                                Vermilion ROE
## 3130                                      Middlesboro Independent
## 3131              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3132                                           MIDDLETON DISTRICT
## 3133                               MIDLAND ACADEMY CHARTER SCHOOL
## 3134                                                  MIDLAND ISD
## 3135                                             MIDVALE DISTRICT
## 3136                           MIDVALLEY ACADEMY CHARTER DISTRICT
## 3137                           MIDVALLEY ACADEMY CHARTER DISTRICT
## 3138                           MIDVALLEY ACADEMY CHARTER DISTRICT
## 3139                                                   CANYON ISD
## 3140                                             FT. ZUMWALT R-II
## 3141                                MILACA PUBLIC SCHOOL DISTRICT
## 3142                                           Milan Area Schools
## 3143                                       Coalinga-Huron Unified
## 3144                                          Washington District
## 3145                                ONAMIA PUBLIC SCHOOL DISTRICT
## 3146                                        Piedmont City Unified
## 3147                       Los Angeles County Office of Education
## 3148                                              Macon/Piatt ROE
## 3149                                               Rialto Unified
## 3150                                        Wilson County Schools
## 3151                              Franklin Public School District
## 3152                                    Milwaukee School District
## 3153                          Wisconsin Department of Corrections
## 3154                               MINERAL COUNTY SCHOOL DISTRICT
## 3155                               MINERAL COUNTY SCHOOL DISTRICT
## 3156                                       MINERAL COUNTY SCHOOLS
## 3157                                            MINERAL WELLS ISD
## 3158                                                   STRAWN ISD
## 3159                                         MINGO COUNTY SCHOOLS
## 3160                               MINIDOKA COUNTY JOINT DISTRICT
## 3161                                   MINNEWASKA SCHOOL DISTRICT
## 3162                                   MINNEWASKA SCHOOL DISTRICT
## 3163                                             Jefferson County
## 3164                                       Corcoran Joint Unified
## 3165                                          Los Angeles Unified
## 3166                                          Santa Clara Unified
## 3167                                 CLARK COUNTY SCHOOL DISTRICT
## 3168                                               Lompoc Unified
## 3169                                                Vista Unified
## 3170                                    DEPARTMENT OF CORRECTIONS
## 3171                                                 VICTORIA ISD
## 3172                                                 VICTORIA ISD
## 3173                                              Rock Island ROE
## 3174                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3175                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3176                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3177                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3178                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3179                          MINNESOTA DEPARTMENT OF CORRECTIONS
## 3180                             INTERMEDIATE SCHOOL DISTRICT 287
## 3181                           MN RIVER VALLEY EDUCATION DISTRICT
## 3182                           MN RIVER VALLEY EDUCATION DISTRICT
## 3183                           MN RIVER VALLEY EDUCATION DISTRICT
## 3184                             ST. PETER PUBLIC SCHOOL DISTRICT
## 3185                          CAMBRIDGE-ISANTI PUBLIC SCHOOL DIST
## 3186                               MO VIRTUAL INSTRUCTION PROGRAM
## 3187                               MO VIRTUAL INSTRUCTION PROGRAM
## 3188                               Big Oak Flat-Groveland Unified
## 3189                             Modoc County Office of Education
## 3190                                             Hesperia Unified
## 3191                                    River Delta Joint Unified
## 3192                             SWANVILLE PUBLIC SCHOOL DISTRICT
## 3193                                   MONAHANS-WICKETT-PYOTE ISD
## 3194                         San Diego County Office of Education
## 3195                                          Los Angeles Unified
## 3196      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3197      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3198                                        MONROE CO SCHOOL DIST
## 3199                               ROCHESTER CITY SCHOOL DISTRICT
## 3200                                            Tehachapi Unified
## 3201                                                       MONROE
## 3202                                          Monroe/Randolph ROE
## 3203 School District No. 1 in the county of Denver and State of C
## 3204                                          Simi Valley Unified
## 3205                                         Newport-Mesa Unified
## 3206                          Monte Vista School District No. C-8
## 3207                                           Montebello Unified
## 3208                                          Ramona City Unified
## 3209                                          Los Angeles Unified
## 3210                                              Burbank Unified
## 3211                                   Monterey Peninsula Unified
## 3212                                   Monterey Peninsula Unified
## 3213                                      MONTGOMERY CO PBLC SCHS
## 3214                                               MONTGOMERY ISD
## 3215                                    Montgomery County Schools
## 3216                            MONTICELLO PUBLIC SCHOOL DISTRICT
## 3217                                   Montrose Community Schools
## 3218                                  MORA PUBLIC SCHOOL DISTRICT
## 3219                                  MORA PUBLIC SCHOOL DISTRICT
## 3220                                                 Rowan County
## 3221                                        Beverly Hills Unified
## 3222                                        Moreno Valley Unified
## 3223                                                Morgan County
## 3224                                    Boyne City Public Schools
## 3225                                 CLARK COUNTY SCHOOL DISTRICT
## 3226              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3227      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3228                                 CLARK COUNTY SCHOOL DISTRICT
## 3229      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3230                               JACKSON PUBLIC SCHOOL DISTRICT
## 3231                                       Lee/Ogle/Whiteside ROE
## 3232                                    Region 06 West Cook ISC 2
## 3233                                                MORTON SCHOOL
## 3234                            Bainbridge Island School District
## 3235                               Chippewa Hills School District
## 3236                              MOSS POINT SEPARATE SCHOOL DIST
## 3237                                    Mossyrock School District
## 3238                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 3239                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 3240                                  Mount Baker School District
## 3241                                           MOUNT PLEASANT ISD
## 3242                                           Salinas Union High
## 3243                                          Wake County Schools
## 3244                                 Mount Vernon School District
## 3245                                   DIVISION OF YOUTH SERVICES
## 3246                                               Davis District
## 3247                                     Rim of the World Unified
## 3248                            WHITE PINE COUNTY SCHOOL DISTRICT
## 3249                                              Gateway Unified
## 3250                                  Mountain Rose Academy  Inc.
## 3251                             Apache Junction Unified District
## 3252                                          Ramona City Unified
## 3253                                   Kings Canyon Joint Unified
## 3254                                         FAIRFAX CO PBLC SCHS
## 3255                                       Lucerne Valley Unified
## 3256                                          San Jacinto Unified
## 3257                                     Fall River Joint Unified
## 3258                                      Alpine Union Elementary
## 3259                                               Madera Unified
## 3260                                   Oracle Elementary District
## 3261                                            LAKELAND DISTRICT
## 3262     OFFICE OF EDUCATIONAL SERVICES DEPARTMENT OF CORRECTIONS
## 3263                     Jefferson County School District No. R-1
## 3264                           Minneapolis Public School District
## 3265                           Minneapolis Public School District
## 3266                           Minneapolis Public School District
## 3267                           Minneapolis Public School District
## 3268                               MINIDOKA COUNTY JOINT DISTRICT
## 3269                              Mt. Morris Consolidated Schools
## 3270                            Clintn/Jeffrsn/Marin/Washngtn ROE
## 3271                                            San Diego Unified
## 3272                               Southern Trinity Joint Unified
## 3273                                          Los Angeles Unified
## 3274                                               Gilroy Unified
## 3275                      Contra Costa County Office of Education
## 3276                                               Duarte Unified
## 3277                                   Eatonville School District
## 3278                                         Palm Springs Unified
## 3279                                           Lake Tahoe Unified
## 3280                                     Mukilteo School District
## 3281                                                   MULLIN ISD
## 3282                                       BROOKHAVEN SCHOOL DIST
## 3283                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 3284                                                   Winchendon
## 3285                                      Murrieta Valley Unified
## 3286                               Department of Juvenile Justice
## 3287                       Muskegon Public Schools of the City of
## 3288                                            Muskegon Area ISD
## 3289                                    Muskegon Covenant Academy
## 3290            California Education Authority (CEA) Headquarters
## 3291                               PROCTOR PUBLIC SCHOOL DISTRICT
## 3292                                        DOE SOP EDUC PROGRAMS
## 3293                                       Lee/Ogle/Whiteside ROE
## 3294                                       Lee/Ogle/Whiteside ROE
## 3295                                                  CHIRENO ISD
## 3296                                             MARTINSVILLE ISD
## 3297                                              NACOGDOCHES ISD
## 3298                                                 GARRISON ISD
## 3299                              Napa County Office of Education
## 3300                              Napa County Office of Education
## 3301                              Napa County Office of Education
## 3302                                          Napa Valley Unified
## 3303                                                      COLLIER
## 3304                            NASHWAUK-KEEWATIN SCHOOL DISTRICT
## 3305                          WESTBURY UNION FREE SCHOOL DISTRICT
## 3306                                                       NASSAU
## 3307                                             Lakeport Unified
## 3308                                                    FROST ISD
## 3309                                           BLOOMING GROVE ISD
## 3310                                          NORTHEAST METRO 916
## 3311                                          NORTHEAST METRO 916
## 3312                                              Huntsville City
## 3313                                       NEBRASKA YOUTH ACADEMY
## 3314                             INTERMEDIATE SCHOOL DISTRICT 287
## 3315                                              Needles Unified
## 3316                                      Nekoosa School District
## 3317                                 MOUNT VERNON SCHOOL DISTRICT
## 3318                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 3319                                 NEVIS PUBLIC SCHOOL DISTRICT
## 3320                                    NEW ALBANY PUBLIC SCHOOLS
## 3321                               State Charter School Institute
## 3322                               State Charter School Institute
## 3323                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 3324                                   Eatonville School District
## 3325                                Aberdeen School District 06-1
## 3326                                                      COLLIER
## 3327                                 Cedar Springs Public Schools
## 3328                                                      OSCEOLA
## 3329                                                         POLK
## 3330                                                      COLLIER
## 3331                                                     Kane ROE
## 3332                                                  HUBBARD ISD
## 3333                                                     MAUD ISD
## 3334                                                 REDWATER ISD
## 3335                                               NEW BOSTON ISD
## 3336                                                    SIMMS ISD
## 3337                                         HENRICO CO PBLC SCHS
## 3338                             INTERMEDIATE SCHOOL DISTRICT 917
## 3339                                 ROSEMOUNT-APPLE VALLEY-EAGAN
## 3340                             INTERMEDIATE SCHOOL DISTRICT 287
## 3341                                                 NEW DEAL ISD
## 3342                                                Shelby County
## 3343                                                   KELLER ISD
## 3344                                 SOUTHWEST PREPARATORY SCHOOL
## 3345                                                     Kane ROE
## 3346                                  PRINCE WILLIAM CO PBLC SCHS
## 3347                                       ARLINGTON CO PBLC SCHS
## 3348                                    PORTSMOUTH CITY PBLC SCHS
## 3349                                                     Kane ROE
## 3350                                AUSTIN PUBLIC SCHOOL DISTRICT
## 3351                    NEW DOMINION ALT. CTR./PRINCE WILLIAM CO.
## 3352                                   ALBUQUERQUE PUBLIC SCHOOLS
## 3353                                       TRINITY CHARTER SCHOOL
## 3354                                      HOPEWELL CITY PBLC SCHS
## 3355                                  LOVINGTON MUNICIPAL SCHOOLS
## 3356                                                  LEANDER ISD
## 3357                                                Bessemer City
## 3358                                                   JOSHUA ISD
## 3359                                              Banning Unified
## 3360                                           POCATELLO DISTRICT
## 3361                                        ORENDA CHARTER SCHOOL
## 3362                                                         POLK
## 3363                                            REEDS SPRING R-IV
## 3364                                    Shorewood School District
## 3365                                        Pasco School District
## 3366                                 Delta-Greely School District
## 3367                                               GREENVILLE ISD
## 3368                                                 JIM NED CISD
## 3369              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3370               Monmouth-Ocean Educational Services Commission
## 3371                                                       MARION
## 3372                          Wisconsin Department of Corrections
## 3373                            NEW LONDON-SPICER SCHOOL DISTRICT
## 3374                                     Tumwater School District
## 3375                                                       Boston
## 3376                                     Allendale Public Schools
## 3377                          Oconto Falls Public School District
## 3378                             CROOKSTON PUBLIC SCHOOL DISTRICT
## 3379                                               HARLINGEN CISD
## 3380                                      NEW PRAGUE AREA SCHOOLS
## 3381                                      NEW PRAGUE AREA SCHOOLS
## 3382                                        DOE SOP EDUC PROGRAMS
## 3383                                        Pajaro Valley Unified
## 3384                                     Highline School District
## 3385                                         HENRICO CO PBLC SCHS
## 3386                                          Napa Valley Unified
## 3387                                          Santa Clara Unified
## 3388                                              Manteca Unified
## 3389                                          POST FALLS DISTRICT
## 3390                    NEW YORK STATE OFFICE MENTAL HEALTH (OMH)
## 3391                                NEWARK PUBLIC SCHOOL DISTRICT
## 3392                                NEWARK PUBLIC SCHOOL DISTRICT
## 3393                           Michigan Department of Corrections
## 3394                     NEWBURGH PREPARATORY CHARTER HIGH SCHOOL
## 3395                                             Jefferson County
## 3396                                                ARLINGTON ISD
## 3397                                  Grand Rapids Public Schools
## 3398                             Educational Service District 101
## 3399                                 Newman-Crows Landing Unified
## 3400                                        DOE SOP EDUC PROGRAMS
## 3401                                          Newport Independent
## 3402                                                Newton County
## 3403                                                   Somerville
## 3404                                               Novato Unified
## 3405                           Mooresville Graded School District
## 3406                                LOCKPORT CITY SCHOOL DISTRICT
## 3407                                                         DADE
## 3408                       Los Angeles County Office of Education
## 3409                                                    PLANO ISD
## 3410   Colorado Springs School District No. 11 in the county of E
## 3411                                      Niles Community Schools
## 3412                                      Niles Community Schools
## 3413                                                NORTHSIDE ISD
## 3414                                                NORTHSIDE ISD
## 3415                                            NIXON-SMILEY CISD
## 3416                                                     POTH ISD
## 3417                                            NIXON-SMILEY CISD
## 3418                                    NORTHLAND LEARNING CENTER
## 3419                                       ROANOKE CITY PBLC SCHS
## 3420                                          Nome Public Schools
## 3421                                                         LAKE
## 3422                                       NORFOLK CITY PBLC SCHS
## 3423                                       NORFOLK CITY PBLC SCHS
## 3424                                        DOE SOP EDUC PROGRAMS
## 3425                   Normative Services - Administration Office
## 3426                                       Norris School District
## 3427                        Sacramento County Office of Education
## 3428                                  NORTH BRANCH PUBLIC SCHOOLS
## 3429                                                      ALACHUA
## 3430                                                      MOBERLY
## 3431                               North Central Secure Trmnt Unt
## 3432                       North Conejos School District No. Re1J
## 3433                                   Region 05 North Cook ISC 1
## 3434                            WEST TALLAHATCHIE SCHOOL DISTRICT
## 3435                                               NORTH EAST ISD
## 3436                             INTERMEDIATE SCHOOL DISTRICT 287
## 3437                               North Franklin School District
## 3438                                                         DADE
## 3439                                                 AMARILLO ISD
## 3440                                               RIVER ROAD ISD
## 3441 School District No. 1 in the county of Denver and State of C
## 3442                           Lake Shore Public Schools (Macomb)
## 3443                                  North Mason School District
## 3444                                North Monterey County Unified
## 3445                                                          LEE
## 3446                                 NORTH PANOLA SCHOOL DISTRICT
## 3447                                         Baldwin Park Unified
## 3448                                                         DADE
## 3449                                                    DUMAS ISD
## 3450                                      Nevada Joint Union High
## 3451                                           North Star Academy
## 3452                                      Cameron School District
## 3453                                        Amador County Unified
## 3454                                WASHOE COUNTY SCHOOL DISTRICT
## 3455                                     Cascade Union Elementary
## 3456                                            Shasta Union High
## 3457                                                 HILLSBOROUGH
## 3458                               NORTH TEXAS COLLEGIATE ACADEMY
## 3459                               NORTH TEXAS COLLEGIATE ACADEMY
## 3460                                                   VERNON ISD
## 3461                                                      BROWARD
## 3462                                          Anderson Union High
## 3463                                         Orland Joint Unified
## 3464                                      Whiteville City Schools
## 3465                                                      BREVARD
## 3466                                                     Kane ROE
## 3467                                                     Kane ROE
## 3468                                       BOONEVILLE SCHOOL DIST
## 3469                               NORTHEAST NE JUVENILE SERVICES
## 3470                               Oconto Unified School District
## 3471                                               NM CORRECTIONS
## 3472                                                Kenton County
## 3473                             CROOKSTON PUBLIC SCHOOL DISTRICT
## 3474                        NORTHERN NECK REGIONAL ALTERNATIVE ED
## 3475                                                          LEE
## 3476                                        DOE SOP EDUC PROGRAMS
## 3477                      Wisconsin Department of Health Services
## 3478                            NORTHFIELD PUBLIC SCHOOL DISTRICT
## 3479                                    NORTHLAND LEARNING CENTER
## 3480                                    NORTHLAND LEARNING CENTER
## 3481                                    NORTHLAND LEARNING CENTER
## 3482                                    NORTHLAND LEARNING CENTER
## 3483                                                  Pike County
## 3484                                    Northport School District
## 3485                                   Northshore School District
## 3486                                   Northshore School District
## 3487                                        JEROME JOINT DISTRICT
## 3488                              Lake Washington School District
## 3489                                     Northview Public Schools
## 3490                                  Northwest Community Schools
## 3491                            THIEF RIVER FALLS SCHOOL DISTRICT
## 3492                           Northwest Wyoming Treatment Center
## 3493                        Prince George's County Public Schools
## 3494                                               NM CORRECTIONS
## 3495                                      NOVA ALTERNATIVE SCHOOL
## 3496                      Oak Park School District of the City of
## 3497                                               Novato Unified
## 3498                                       Seattle Public Schools
## 3499                                    Milwaukee School District
## 3500                                           Fort Bragg Unified
## 3501                             INTERMEDIATE SCHOOL DISTRICT 287
## 3502                                      Nevada Joint Union High
## 3503                                             PORT ARANSAS ISD
## 3504                                                 ROBSTOWN ISD
## 3505                                              FLOUR BLUFF ISD
## 3506                                           CORPUS CHRISTI ISD
## 3507                                            TULOSO-MIDWAY ISD
## 3508                                                 CALALLEN ISD
## 3509                                                  BISHOP CISD
## 3510                                                    Kern High
## 3511                                               Jurupa Unified
## 3512                                              Bassett Unified
## 3513                                      Everett School District
## 3514                                   NYE COUNTY SCHOOL DISTRICT
## 3515                     NEW YORK STATE DEPARTMENT OF CORRECTIONS
## 3516                                                 BEAUMONT ISD
## 3517                              WAXAHACHIE FAITH FAMILY ACADEMY
## 3518                                  Valley Center-Pauma Unified
## 3519                             INTERMEDIATE SCHOOL DISTRICT 287
## 3520                                          Charter Oak Unified
## 3521                                               Sierra Unified
## 3522                      Oak Park School District of the City of
## 3523                                             Oak Park Unified
## 3524                      Oak Park School District of the City of
## 3525                                                     Kane ROE
## 3526                                          Palmdale Elementary
## 3527                                             Oak Park Unified
## 3528                               Yucaipa-Calimesa Joint Unified
## 3529                                                Chico Unified
## 3530                         Calaveras County Office of Education
## 3531                          Wisconsin Department of Corrections
## 3532                                       Tacoma School District
## 3533                                              Oakland Unified
## 3534                                              Oakland Schools
## 3535                                      Oakridge Public Schools
## 3536                                  MEADOWLAND CHARTER DISTRICT
## 3537                           Michigan Department of Corrections
## 3538                                          Anderson Union High
## 3539                                   Kingsburg Joint Union High
## 3540                                         Fallbrook Union High
## 3541                                 Orcas Island School District
## 3542                                                      OSCEOLA
## 3543                        Orange County Department of Education
## 3544                                Port Townsend School District
## 3545                                  Ocean Beach School District
## 3546              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3547              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3548      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3549                                            Oceanside Unified
## 3550      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3551                                         Jefferson Union High
## 3552                                                  ABILENE ISD
## 3553                                          Los Angeles Unified
## 3554   Colorado Springs School District No. 11 in the county of E
## 3555                                      Shepherd Public Schools
## 3556                                                   IDALOU ISD
## 3557                                    Oglala Lakota County 65-1
## 3558                                                  Ohio County
## 3559                                                  Ohio County
## 3560                           Michigan Department of Corrections
## 3561                                                     OKALOOSA
## 3562                                                     OKALOOSA
## 3563                                                     OKALOOSA
## 3564                                                     OKALOOSA
## 3565                                     Okanogan School District
## 3566                                     Okanogan School District
## 3567                                                   OKEECHOBEE
## 3568                                                   OKEECHOBEE
## 3569                                                   WASHINGTON
## 3570                    St. Vrain Valley School District No. Re1J
## 3571                               Hawaii Department of Education
## 3572                                      Olympia School District
## 3573                                           Mt. Diablo Unified
## 3574                                  Santa Monica-Malibu Unified
## 3575                                   OMAHA HOME FOR BOYS SCHOOL
## 3576                             INTERMEDIATE SCHOOL DISTRICT 287
## 3577                                    Carrollton Public Schools
## 3578                       San Joaquin County Office of Education
## 3579                                       ONEIDA COUNTY DISTRICT
## 3580                       Los Angeles County Office of Education
## 3581                                SYRACUSE CITY SCHOOL DISTRICT
## 3582                                                 Opelika City
## 3583                                   Coupeville School District
## 3584                                       Renton School District
## 3585                                    Wenatchee School District
## 3586                   Northwest Educational Service District 189
## 3587                      Lake Washington Institute of Technology
## 3588                                Battle Ground School District
## 3589                            Evergreen School District (Clark)
## 3590                                     Chimacum School District
## 3591                                    Vancouver School District
## 3592                                      Spokane School District
## 3593                                  Federal Way School District
## 3594                                       Sultan School District
## 3595                                      Patterson Joint Unified
## 3596                                                     KATY ISD
## 3597                           Alameda County Office of Education
## 3598                                                   Ozark City
## 3599                                                  Dale County
## 3600                                               Fayette County
## 3601                                            Riverside Unified
## 3602                                   Walla Walla Public Schools
## 3603                                         OMAHA PUBLIC SCHOOLS
## 3604                                         OMAHA PUBLIC SCHOOLS
## 3605                                         OMAHA PUBLIC SCHOOLS
## 3606                             INTERMEDIATE SCHOOL DISTRICT 917
## 3607                           MOUNDS VIEW PUBLIC SCHOOL DISTRICT
## 3608                                                TEXARKANA ISD
## 3609                                 EDINA PUBLIC SCHOOL DISTRICT
## 3610                                                  SOCORRO ISD
## 3611                                   Bellingham School District
## 3612   Cherry Creek School District No. 5 in the county of Arapah
## 3613                                        Sweetwater Union High
## 3614                                         Corona-Norco Unified
## 3615                                                       ORANGE
## 3616                                             Redlands Unified
## 3617                                       Seattle Public Schools
## 3618                                        Monroe Public Schools
## 3619                           WAPPINGERS CENTRAL SCHOOL DISTRICT
## 3620                          Wisconsin Department of Corrections
## 3621                                      Redwood City Elementary
## 3622                                         Orland Joint Unified
## 3623                                          Oroville Union High
## 3624                         Mendocino County Office of Education
## 3625                                        Lake Elsinore Unified
## 3626                                          Los Angeles Unified
## 3627                                   Osborn Elementary District
## 3628                                                      OSCEOLA
## 3629                               BEMIDJI PUBLIC SCHOOL DISTRICT
## 3630                          Wisconsin Department of Corrections
## 3631                              Southern Humboldt Joint Unified
## 3632                              Southern Humboldt Joint Unified
## 3633                                 OSSEO PUBLIC SCHOOL DISTRICT
## 3634                                 OSSEO PUBLIC SCHOOL DISTRICT
## 3635                                           Grundy/Kendall ROE
## 3636                                        Otsego Public Schools
## 3637                                                 Wayne County
## 3638                                Parkston School District 33-3
## 3639                                   Huron School District 02-2
## 3640                                   Huron School District 02-2
## 3641                                               Orange Unified
## 3642                                               Orange Unified
## 3643                                 Lake Stevens School District
## 3644                                                      BREVARD
## 3645                                      Ovid-Elsie Area Schools
## 3646                              OWATONNA PUBLIC SCHOOL DISTRICT
## 3647                              OWATONNA PUBLIC SCHOOL DISTRICT
## 3648                              OWATONNA PUBLIC SCHOOL DISTRICT
## 3649                                               Daviess County
## 3650                                        Owensboro Independent
## 3651                                          Los Angeles Unified
## 3652                                        Alpena Public Schools
## 3653                              Eau Claire Area School District
## 3654                                     Oxford Community Schools
## 3655                                     Oxford Community Schools
## 3656                                       OXFORD SCHOOL DISTRICT
## 3657                                     Oxford Community Schools
## 3658                                       OKLAHOMA YOUTH ACADEMY
## 3659                                       OKLAHOMA YOUTH ACADEMY
## 3660                                       OKLAHOMA YOUTH ACADEMY
## 3661                                       OKLAHOMA YOUTH ACADEMY
## 3662                                    DEPARTMENT OF CORRECTIONS
## 3663                                         MOUNTAIN GROVE R-III
## 3664                                                 FLOYDADA ISD
## 3665                                                  GARLAND ISD
## 3666                                            GRAND PRAIRIE ISD
## 3667                                               RICHARDSON ISD
## 3668                                              DUNCANVILLE ISD
## 3669                                            HIGHLAND PARK ISD
## 3670                                                  AMHERST ISD
## 3671                                                   MORTON ISD
## 3672                                                 MULESHOE ISD
## 3673                                                    SUDAN ISD
## 3674                                               WHITEFACE CISD
## 3675                                                    PAMPA ISD
## 3676                                                      ALACHUA
## 3677                                         HENRICO CO PBLC SCHS
## 3678                                       Wapato School District
## 3679                            Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 3680                                                 PEARLAND ISD
## 3681                                                 HILLSBOROUGH
## 3682                                                      MANATEE
## 3683                                                         DADE
## 3684                                                        PASCO
## 3685                                                     PINELLAS
## 3686                                                     HERNANDO
## 3687                                                         LEON
## 3688                                                         POLK
## 3689                                                   PALM BEACH
## 3690                                                       ORANGE
## 3691                                                      VOLUSIA
## 3692                                                         CLAY
## 3693                                                       MARION
## 3694                                                      BROWARD
## 3695                                                    ST. LUCIE
## 3696                                                        DUVAL
## 3697                                                     ESCAMBIA
## 3698                                                          LEE
## 3699                                     San Luis Coastal Unified
## 3700                                          Twin Rivers Unified
## 3701                                 Northern Humboldt Union High
## 3702                                   South Bend School District
## 3703                                              Ventura Unified
## 3704                                        Sitka School District
## 3705                       Los Angeles County Office of Education
## 3706                                   South Bend School District
## 3707                                                     Pacifica
## 3708                                            Palo Alto Unified
## 3709                                 North Kitsap School District
## 3710                                     Palermo Union Elementary
## 3711                                               Bishop Unified
## 3712                                      Calistoga Joint Unified
## 3713                                                          LEE
## 3714                                                   PALM BEACH
## 3715                                                   PALM BEACH
## 3716                                                   PALM BEACH
## 3717                                                      MANATEE
## 3718                                                      MANATEE
## 3719                                           Atascadero Unified
## 3720                                        Sweetwater Union High
## 3721                               North Franklin School District
## 3722                                                          BAY
## 3723                                        PANOLA CHARTER SCHOOL
## 3724                                     Colville School District
## 3725                                    Riverview School District
## 3726                                              MOSCOW DISTRICT
## 3727                             INTERMEDIATE SCHOOL DISTRICT 287
## 3728                                            Paramount Unified
## 3729                                     Ferndale School District
## 3730                                    Snohomish School District
## 3731                                 Port Angeles School District
## 3732                            Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 3733                                Paris Cooperative High School
## 3734                                               Pomona Unified
## 3735                               Parker Unified School District
## 3736                             INTERMEDIATE SCHOOL DISTRICT 287
## 3737                                Placentia-Yorba Linda Unified
## 3738                                               Madison County
## 3739                                                   MULLIN ISD
## 3740                                                   MULLIN ISD
## 3741                                                Sevier County
## 3742                           Michigan Department of Corrections
## 3743                                         OMAHA PUBLIC SCHOOLS
## 3744                                                   DuPage ROE
## 3745                                        Orange County Schools
## 3746                           PASCAGOULA-GAUTIER SCHOOL DISTRICT
## 3747                                                        PASCO
## 3748                      PASO DEL NORTE ACADEMY CHARTER DISTRICT
## 3749                                          Los Angeles Unified
## 3750                      PASO DEL NORTE ACADEMY CHARTER DISTRICT
## 3751                                    Paso Robles Joint Unified
## 3752                                                  Dothan City
## 3753                                                 MESQUITE ISD
## 3754                   Northwest Educational Service District 189
## 3755                               PRIOR LAKE-SAVAGE AREA SCHOOLS
## 3756      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 3757                                                    ALLEN ISD
## 3758                                                         DADE
## 3759                                                  GARLAND ISD
## 3760                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 3761                               PATHFINDER ED PRG-LANCASTER CO
## 3762                                       Seattle Public Schools
## 3763                               Dowagiac Union School District
## 3764                                            Crittenden County
## 3765                                              Central Unified
## 3766                                              Central Unified
## 3767                                              Lynwood Unified
## 3768                            Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 3769                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 3770                                                  KILLEEN ISD
## 3771                                                     COLUMBIA
## 3772                                          Twin Rivers Unified
## 3773                                   NYE COUNTY SCHOOL DISTRICT
## 3774                                   Adams 12 Five Star Schools
## 3775                                                  DENISON ISD
## 3776                                   NYE COUNTY SCHOOL DISTRICT
## 3777                                                 BEAUMONT ISD
## 3778                                  JOINT SCHOOL DISTRICT NO. 2
## 3779                                   NYE COUNTY SCHOOL DISTRICT
## 3780                            GOODHUE COUNTY EDUCATION DISTRICT
## 3781                            GOODHUE COUNTY EDUCATION DISTRICT
## 3782                                     Ann Arbor Public Schools
## 3783                                        Redondo Beach Unified
## 3784                       PATRICK J THOMAS JUVENILE JUSTICE CNTR
## 3785   Falcon School District No. 49 in the county of El Paso and
## 3786                                                 BEAUMONT ISD
## 3787                                                     Kane ROE
## 3788                                                     Kane ROE
## 3789                                       PAYETTE JOINT DISTRICT
## 3790                                             Jefferson County
## 3791                                     Quilcene School District
## 3792                                     Fennville Public Schools
## 3793                                                   MULLIN ISD
## 3794                  PEGASUS SCHOOL OF LIBERAL ARTS AND SCIENCES
## 3795                                         East Side Union High
## 3796                                       TRINITY CHARTER SCHOOL
## 3797                           PELICAN RAPIDS PUBLIC SCHOOL DIST.
## 3798                           PELICAN RAPIDS PUBLIC SCHOOL DIST.
## 3799                                      Newport School District
## 3800                                         San Mateo Union High
## 3801                                         San Mateo Union High
## 3802                                               NM CORRECTIONS
## 3803                               Peoria Unified School District
## 3804                                                   Peoria ROE
## 3805                                                  SUNDOWN ISD
## 3806                                                    ST. LUCIE
## 3807                                      Cabarrus County Schools
## 3808                           PERHAM-DENT PUBLIC SCHOOL DISTRICT
## 3809                                                  SHERMAN ISD
## 3810                                            Perris Union High
## 3811                                         PERRY CO SCHOOL DIST
## 3812                                                 Perry County
## 3813                              PERSHING COUNTY SCHOOL DISTRICT
## 3814                                              Central Unified
## 3815                                             GOOSE CREEK CISD
## 3816                                               PETERSBURG ISD
## 3817                              PETERSBURG REGIONAL ALTERNATIVE
## 3818                        Stanislaus County Office of Education
## 3819                                 CLARK COUNTY SCHOOL DISTRICT
## 3820                                          Wake County Schools
## 3821                                     Granville County Schools
## 3822                                                 Clark County
## 3823                          NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 3824                             Marin County Office of Education
## 3825                                                   AUSTIN ISD
## 3826                                              King City Union
## 3827                            Chapel Hill-Carrboro City Schools
## 3828                                                     Lawrence
## 3829                       Los Angeles County Office of Education
## 3830                                 Carney-Nadeau Public Schools
## 3831                                     Kalamazoo Public Schools
## 3832                                          Yale Public Schools
## 3833                                    CHESTERFIELD CO PBLC SCHS
## 3834                                          Los Angeles Unified
## 3835                                               Fresno Unified
## 3836                                                    ELGIN ISD
## 3837                                         East Side Union High
## 3838                                       Western Placer Unified
## 3839                                   Antelope Valley Union High
## 3840                                              Gwinnett County
## 3841                                    Kennewick School District
## 3842                          BUFFALO-HANOVER-MONTROSE PUBLIC SCH
## 3843                                  Phoenix Elementary District
## 3844                                      Kenosha School District
## 3845                                 JANESVILLE-WALDORF-PEMBERTON
## 3846                                           Central Union High
## 3847                                                   Selma City
## 3848                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 3849                                             SOUTHWEST SCHOOL
## 3850                                               Fresno Unified
## 3851                                     Chimacum School District
## 3852                                         Butte Valley Unified
## 3853                                  PIEDMONT ALTERNATIVE SCHOOL
## 3854                                        DOE SOP EDUC PROGRAMS
## 3855                                 PIERZ PUBLIC SCHOOL DISTRICT
## 3856                                                  Pike County
## 3857                                                  Pike County
## 3858                                             Cabrillo Unified
## 3859                                      Pima Rose Academy  Inc.
## 3860                             PINE CITY PUBLIC SCHOOL DISTRICT
## 3861            California Education Authority (CEA) Headquarters
## 3862                          CHEEKTOWAGA CENTRAL SCHOOL DISTRICT
## 3863                                    Dept of Corrections-Youth
## 3864                                    Dept of Corrections-Youth
## 3865                              PINE ISLAND PUBLIC SCHOOL DIST.
## 3866                                                      BROWARD
## 3867                           Michigan Department of Corrections
## 3868                            PINE RIVER-BACKUS SCHOOL DISTRICT
## 3869                            PINE RIVER-BACKUS SCHOOL DISTRICT
## 3870                                                PINE TREE ISD
## 3871              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 3872                                                     PINELLAS
## 3873                                                     PINELLAS
## 3874                                                     PINELLAS
## 3875                                                     PINELLAS
## 3876                                                     PINELLAS
## 3877                                                     PINELLAS
## 3878                            CENTENNIAL PUBLIC SCHOOL DISTRICT
## 3879                            CENTENNIAL PUBLIC SCHOOL DISTRICT
## 3880                            CENTENNIAL PUBLIC SCHOOL DISTRICT
## 3881                            CENTENNIAL PUBLIC SCHOOL DISTRICT
## 3882                                                 CROCKETT ISD
## 3883                               LUVERNE PUBLIC SCHOOL DISTRICT
## 3884                        San Benito County Office of Education
## 3885                                              Soledad Unified
## 3886                                  CARSON CITY SCHOOL DISTRICT
## 3887                                                       HARDEE
## 3888                                  Thermalito Union Elementary
## 3889                                            Shasta Union High
## 3890                                              Gustine Unified
## 3891                         Croswell-Lexington Community Schools
## 3892                                              Crook County SD
## 3893                                   Hamilton Community Schools
## 3894                      Madera County Superintendent of Schools
## 3895                            Region 6 and 8-SW/WC Service Coop
## 3896                          SOUTH WASHINGTON COUNTY SCHOOL DIST
## 3897                            Placer County Office of Education
## 3898                            Placer County Office of Education
## 3899                            Placer County Office of Education
## 3900                                                    PLANO ISD
## 3901                                                    PLANO ISD
## 3902                                                COMMUNITY ISD
## 3903                                                   YSLETA ISD
## 3904   GreeleySchool District No. 6 in the county of Weld and Sta
## 3905                                   DIVISION OF YOUTH SERVICES
## 3906                                                 Lodi Unified
## 3907                                       North Sanpete District
## 3908                                               PLEASANTON ISD
## 3909                                         FAIRFAX CO PBLC SCHS
## 3910                            Plumas County Office of Education
## 3911                            Plumas County Office of Education
## 3912                                     PLYMOUTH SCHOOL DISTRICT
## 3913                           Minneapolis Public School District
## 3914                           Minneapolis Public School District
## 3915                         Pocahontas Area Comm School District
## 3916                                           POCATELLO DISTRICT
## 3917                                               KINGSVILLE ISD
## 3918                                             GOOSE CREEK CISD
## 3919                                  NEWPORT NEWS CITY PBLC SCHS
## 3920                                                      Elkhart
## 3921                                   Poudre School District R-1
## 3922                                           Anaheim Union High
## 3923                                              Alpine District
## 3924                                                         POLK
## 3925                                                         POLK
## 3926                                                         POLK
## 3927                                                         POLK
## 3928                                                         POLK
## 3929                                               Pomona Unified
## 3930                                                      BROWARD
## 3931                                      PONTOTOC CO SCHOOL DIST
## 3932                                             POR VIDA ACADEMY
## 3933                                              PORT ARTHUR ISD
## 3934                                      Everett School District
## 3935                            Portage Community School District
## 3936                                       Portage Public Schools
## 3937                            Plumas County Office of Education
## 3938                       South Monterey County Joint Union High
## 3939                                                       ORANGE
## 3940                                              SAN BENITO CISD
## 3941                            POSITIVE SOLUTIONS CHARTER SCHOOL
## 3942                                Carroll County Public Schools
## 3943                                   Poudre School District R-1
## 3944                                                Powell County
## 3945                                        Mesa Unified District
## 3946                             INTERMEDIATE SCHOOL DISTRICT 287
## 3947                             INTERMEDIATE SCHOOL DISTRICT 287
## 3948                             INTERMEDIATE SCHOOL DISTRICT 287
## 3949                               MANKATO PUBLIC SCHOOL DISTRICT
## 3950                                Strasburg School District 31J
## 3951                          Wisconsin Department of Corrections
## 3952                                                   BRAZOS ISD
## 3953                            MONTICELLO PUBLIC SCHOOL DISTRICT
## 3954                               WILLMAR PUBLIC SCHOOL DISTRICT
## 3955                             Sun Prairie Area School District
## 3956                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 3957                          EASTERN CARVER COUNTY PUBLIC SCHOOL
## 3958                          NORTH ST PAUL-MAPLEWOOD OAKDALE DIS
## 3959                            PINE RIVER-BACKUS SCHOOL DISTRICT
## 3960                                           Grundy/Kendall ROE
## 3961                                           Grundy/Kendall ROE
## 3962                                         PREMIER HIGH SCHOOLS
## 3963                                         PREMIER HIGH SCHOOLS
## 3964                                         PREMIER HIGH SCHOOLS
## 3965                                         PREMIER HIGH SCHOOLS
## 3966                                         PREMIER HIGH SCHOOLS
## 3967                                         PREMIER HIGH SCHOOLS
## 3968                                         PREMIER HIGH SCHOOLS
## 3969                                         PREMIER HIGH SCHOOLS
## 3970                                         PREMIER HIGH SCHOOLS
## 3971                                         PREMIER HIGH SCHOOLS
## 3972                                         PREMIER HIGH SCHOOLS
## 3973                                         PREMIER HIGH SCHOOLS
## 3974                                         PREMIER HIGH SCHOOLS
## 3975                                         PREMIER HIGH SCHOOLS
## 3976                                         PREMIER HIGH SCHOOLS
## 3977                                         PREMIER HIGH SCHOOLS
## 3978                                         PREMIER HIGH SCHOOLS
## 3979                                         PREMIER HIGH SCHOOLS
## 3980                                         PREMIER HIGH SCHOOLS
## 3981                                         PREMIER HIGH SCHOOLS
## 3982                                         PREMIER HIGH SCHOOLS
## 3983                                         PREMIER HIGH SCHOOLS
## 3984                                         PREMIER HIGH SCHOOLS
## 3985                                         PREMIER HIGH SCHOOLS
## 3986                                         PREMIER HIGH SCHOOLS
## 3987                                         PREMIER HIGH SCHOOLS
## 3988                                         PREMIER HIGH SCHOOLS
## 3989                                         PREMIER HIGH SCHOOLS
## 3990                                         PREMIER HIGH SCHOOLS
## 3991                                         PREMIER HIGH SCHOOLS
## 3992                                         PREMIER HIGH SCHOOLS
## 3993                                         PREMIER HIGH SCHOOLS
## 3994                                         PREMIER HIGH SCHOOLS
## 3995                                               JEFFERSON CITY
## 3996 School District No. 1 in the county of Denver and State of C
## 3997                                      Presque Isle Academy II
## 3998                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 3999                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 4000                                  Iredell-Statesville Schools
## 4001                                                        DUVAL
## 4002                                                          LEE
## 4003                                                  BRENHAM ISD
## 4004                                               HUNTINGTON ISD
## 4005                                               Linden Unified
## 4006                                Carroll County Public Schools
## 4007                                  WEST BONNER COUNTY DISTRICT
## 4008                                        DOE SOP EDUC PROGRAMS
## 4009                                        MERCER COUNTY SCHOOLS
## 4010                             PRINCETON PUBLIC SCHOOL DISTRICT
## 4011                             PRINCETON PUBLIC SCHOOL DISTRICT
## 4012                                                PRINCETON ISD
## 4013                                                PRINCETON ISD
## 4014                               PRIOR LAKE-SAVAGE AREA SCHOOLS
## 4015                                                  LUBBOCK ISD
## 4016                                       THE PRO-VISION ACADEMY
## 4017                                            Montgomery County
## 4018                                    PROJECT BRIDGE/RUSSELL CO
## 4019                                                       ORANGE
## 4020                            Frankln/Johnsn/Massc/Willimsn ROE
## 4021                                           Grundy/Kendall ROE
## 4022                                      Tucson Unified District
## 4023                                 PROJECT RENEW/NORTHAMPTON CO
## 4024                                                NEW CANEY ISD
## 4025                                                 MAGNOLIA ISD
## 4026                                   PROJECT RETURN/FLUVANNA CO
## 4027                                   PROJECT RETURN/POWHATAN CO
## 4028                            Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 4029                                    Milwaukee School District
## 4030                                               Lowndes County
## 4031      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4032      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4033      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4034      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4035      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4036      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 4037                                       Folsom-Cordova Unified
## 4038                                          Porterville Unified
## 4039                                          Oroville Union High
## 4040                                           Mt. Diablo Unified
## 4041                             Paradise Valley Unified District
## 4042                                              Antioch Unified
## 4043                                                       ORANGE
## 4044                                 Lake Stevens School District
## 4045                           Ventura County Office of Education
## 4046                            Lassen County Office of Education
## 4047                        NEW YORK CITY GEOGRAPHIC DISTRICT #10
## 4048                                    Region 06 West Cook ISC 2
## 4049                                               Provo District
## 4050                                      Guilford County Schools
## 4051                                     PHARR-SAN JUAN-ALAMO ISD
## 4052                                     Fairfield-Suisun Unified
## 4053                                          Los Angeles Unified
## 4054    Pueblo School District No. 60 in the county of Pueblo and
## 4055                                   Hacienda la Puente Unified
## 4056                                     Highline School District
## 4057                           Michigan Department of Corrections
## 4058                                               Pulaski County
## 4059                                                NORTHSIDE ISD
## 4060                                              Marshall County
## 4061                               CARMEL CENTRAL SCHOOL DISTRICT
## 4062                                     Puyallup School District
## 4063                                     Puyallup School District
## 4064                                     Puyallup School District
## 4065                                    Christina School District
## 4066                                                   PALM BEACH
## 4067                        NEW YORK CITY GEOGRAPHIC DISTRICT #25
## 4068                                     Puyallup School District
## 4069                                        La Mesa-Spring Valley
## 4070                                    SPOTSYLVANIA CO PBLC SCHS
## 4071                                                  BURNET CISD
## 4072                               Fremont Public School District
## 4073                                    North Branch Area Schools
## 4074                                       Quincy School District
## 4075                                          QUITMAN SCHOOL DIST
## 4076                                           Champaign/Ford ROE
## 4077                                                Sumner County
## 4078                    Mesa County Valley School District No. 51
## 4079                                                         CLAY
## 4080                                  Centinela Valley Union High
## 4081                                   Antelope Valley Union High
## 4082                             Raceland-Worthington Independent
## 4083                             Raceland-Worthington Independent
## 4084                               Racine Unified School District
## 4085                          Wisconsin Department of Corrections
## 4086                          Wisconsin Department of Corrections
## 4087                             Henderson/Knox/Mercer/Warren ROE
## 4088                             Henderson/Knox/Mercer/Warren ROE
## 4089                             Henderson/Knox/Mercer/Warren ROE
## 4090                             Henderson/Knox/Mercer/Warren ROE
## 4091                             Henderson/Knox/Mercer/Warren ROE
## 4092                               PROCTOR PUBLIC SCHOOL DISTRICT
## 4093                                            Riverside Unified
## 4094                                                     KATY ISD
## 4095                                     Highline School District
## 4096                                              Oakland Unified
## 4097                                                  Boyd County
## 4098                                          Ramona City Unified
## 4099                                          Los Angeles Unified
## 4100                                    Cumberland County Schools
## 4101                                                RANCH ACADEMY
## 4102                                      Anderson Valley Unified
## 4103                               Palos Verdes Peninsula Unified
## 4104                                              Arcadia Unified
## 4105                                      Temecula Valley Unified
## 4106                                      RANDOLPH COUNTY SCHOOLS
## 4107                                        RANKIN CO SCHOOL DIST
## 4108                            Carroll/Jo Daviess/Stephenson ROE
## 4109                            Carroll/Jo Daviess/Stephenson ROE
## 4110                         Rapid City Area School District 51-4
## 4111                                        DOE SOP EDUC PROGRAMS
## 4112                                        Southern Kern Unified
## 4113                                  Alamance-Burlington Schools
## 4114                                             Yosemite Unified
## 4115            Union County Vocational-Technical School District
## 4116                                                  ANTHONY ISD
## 4117                                                  ANTHONY ISD
## 4118                                             RAYMONDVILLE ISD
## 4119                                                  RAYTOWN C-2
## 4120                        West Valley School District (Spokane)
## 4121                              Nine Mile Falls School District
## 4122                                  Clover Park School District
## 4123                                  Clover Park School District
## 4124                                            Santa Ana Unified
## 4125                                              CASTLEBERRY ISD
## 4126                                                         POLK
## 4127                                  JOINT SCHOOL DISTRICT NO. 2
## 4128                                        SOUTH SAN ANTONIO ISD
## 4129                                                    RALLS ISD
## 4130                                   Red Bluff Union Elementary
## 4131                       Eagle County School District No. Re 50
## 4132 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 4133                              RED LAKE PUBLIC SCHOOL DISTRICT
## 4134                              RED LAKE PUBLIC SCHOOL DISTRICT
## 4135                              RED LAKE PUBLIC SCHOOL DISTRICT
## 4136                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 4137                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 4138                                 CLARK COUNTY SCHOOL DISTRICT
## 4139                            Region 6 and 8-SW/WC Service Coop
## 4140                            Region 6 and 8-SW/WC Service Coop
## 4141                      Red Top Meadows - Administration Office
## 4142                            GOODHUE COUNTY EDUCATION DISTRICT
## 4143                                           Redding Elementary
## 4144                                                NORTHSIDE ISD
## 4145                          Wisconsin Department of Corrections
## 4146                                          ORANGE CO PBLC SCHS
## 4147                                        Redondo Beach Unified
## 4148                                                       DESOTO
## 4149                                        Castro Valley Unified
## 4150                                           Sequoia Union High
## 4151                                 REDWOOD AREA SCHOOL DISTRICT
## 4152                                          Reef-Sunset Unified
## 4153                                          Reef-Sunset Unified
## 4154                                                 FRENSHIP ISD
## 4155                                 Santa Ynez Valley Union High
## 4156                                REG ALT ED CENTER/BUENA VISTA
## 4157               REG ALTERNATIVE PLUS SELF PROJECT/ROANOKE CITY
## 4158                                          Boone/Winnebago ROE
## 4159                                          Boone/Winnebago ROE
## 4160                                          Boone/Winnebago ROE
## 4161                                       Bureau/Henry/Stark ROE
## 4162                                LEWISTON INDEPENDENT DISTRICT
## 4163                            DeWitt/Livingstn/Logan/McLean ROE
## 4164                         REGIONAL ALTERNATIVE ED/KING WILLIAM
## 4165                          REGIONAL ALTERNATIVE ED/STAFFORD CO
## 4166                                          Boone/Winnebago ROE
## 4167               Monmouth-Ocean Educational Services Commission
## 4168                          REGIONAL ALTERNATIVE/PITTSLVANIA CO
## 4169                                REGIONAL ALTERNATIVE/WYTHE CO
## 4170                                       Lee/Ogle/Whiteside ROE
## 4171                                                   DENTON ISD
## 4172                                                    PLANO ISD
## 4173                                         Kent School District
## 4174                            REGIONAL LEARNING ACADEMY/WISE CO
## 4175                                           Dayton Independent
## 4176                                        STAFFORD CO PBLC SCHS
## 4177                                   Region 07 South Cook ISC 4
## 4178                                   Region 07 South Cook ISC 4
## 4179                                          Boone/Winnebago ROE
## 4180                                           Long Beach Unified
## 4181                             Relevant Academy of Eaton County
## 4182                                           Brawley Union High
## 4183                                   Alum Rock Union Elementary
## 4184                                               Davis District
## 4185                                    Bremerton School District
## 4186                          Clarkston Community School District
## 4187                                   Alum Rock Union Elementary
## 4188                       Los Angeles County Office of Education
## 4189                              Lake County Office of Education
## 4190                                          Santa Paula Unified
## 4191                                        Pajaro Valley Unified
## 4192                                  Plainwell Community Schools
## 4193                                           Long Beach Unified
## 4194                                                 Floyd County
## 4195                              Lake Washington School District
## 4196                          Clarkston Community School District
## 4197                                         RENAISSANCE/SCOTT CO
## 4198                                    TROY CITY SCHOOL DISTRICT
## 4199                                       Renton School District
## 4200                                        Frankfort Independent
## 4201                                     Republic School District
## 4202                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 4203                                                   Fall River
## 4204 School District No. 1 in the county of Denver and State of C
## 4205                          TEXAS COLLEGE PREPARATORY ACADEMIES
## 4206                                      Kenosha School District
## 4207                    Ketchikan Gateway Borough School District
## 4208                                                Reynolds SD 7
## 4209                                              SAN BENITO CISD
## 4210                                                    RICE CISD
## 4211                                          Los Angeles Unified
## 4212                                              Konocti Unified
## 4213                               IDAHO VIRTUAL HIGH SCHOOL INC.
## 4214                                                      VOLUSIA
## 4215                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4216                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4217                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4218                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4219                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4220                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4221                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4222                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4223                  RICHARD MILBURN ALTER HIGH SCHOOL (KILLEEN)
## 4224                                                  Knox County
## 4225                                                   AUSTIN ISD
## 4226                                                   SPRING ISD
## 4227                             RICHFIELD PUBLIC SCHOOL DISTRICT
## 4228                                               Orange Unified
## 4229                                      RICHMOND CITY PBLC SCHS
## 4230                                      RICHMOND CITY PBLC SCHS
## 4231                                        RICHMOND CO PBLC SCHS
## 4232                                        DOE SOP EDUC PROGRAMS
## 4233                                                         DADE
## 4234                                                         POLK
## 4235 School District No. 1 in the county of Denver and State of C
## 4236                                                  Knox County
## 4237                                       Dept Of Correction N04
## 4238                                             Paradise Unified
## 4239                                              Santa Rosa High
## 4240                                          Carpinteria Unified
## 4241                                            Elk Grove Unified
## 4242                                        Golden Plains Unified
## 4243                                    LAS CRUCES PUBLIC SCHOOLS
## 4244                                    RIO RANCHO PUBLIC SCHOOLS
## 4245                                                RIO VISTA ISD
## 4246                                               Madera Unified
## 4247                                WASHOE COUNTY SCHOOL DISTRICT
## 4248 School District No. 1 in the county of Denver and State of C
## 4249                         El Dorado County Office of Education
## 4250                                                Warren County
## 4251                                                Warren County
## 4252                                RIVER BEND EDUCATION DISTRICT
## 4253                             Wisconsin Rapids School District
## 4254                                    River Delta Joint Unified
## 4255                                    River Delta Joint Unified
## 4256                                          Wake County Schools
## 4257                                      Rockford Public Schools
## 4258                                 HIAWATHA VALLEY ED. DISTRICT
## 4259                                    Riverdale School District
## 4260                                     Richland School District
## 4261                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 4262                          CAMBRIDGE-ISANTI PUBLIC SCHOOL DIST
## 4263                                     Dundee Community Schools
## 4264                          CAMBRIDGE-ISANTI PUBLIC SCHOOL DIST
## 4265                          CAMBRIDGE-ISANTI PUBLIC SCHOOL DIST
## 4266                                   Office of Juvenile Justice
## 4267                         Riverside County Office of Education
## 4268                         Riverside County Office of Education
## 4269                         Riverside County Office of Education
## 4270                             INTERMEDIATE SCHOOL DISTRICT 917
## 4271                                    Dept of Corrections-Youth
## 4272                                    Dept of Corrections-Youth
## 4273                                   East China School District
## 4274                                                      VOLUSIA
## 4275                                               Bullitt County
## 4276                                     Waukesha School District
## 4277                                     VALLIVUE SCHOOL DISTRICT
## 4278                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 4279                                                   PALM BEACH
## 4280                       Los Angeles County Office of Education
## 4281                                        DOE SOP EDUC PROGRAMS
## 4282                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 4283                           ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 4284                                Charles County Public Schools
## 4285                              Durango School District No. 9-R
## 4286                                            Modesto City High
## 4287                          Wisconsin Department of Corrections
## 4288                                          Los Angeles Unified
## 4289                              IDAHO DEPARTMENT OF CORRECTIONS
## 4290                                   Tomah Area School District
## 4291                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 4292                                          Salem-Keizer SD 24J
## 4293                                              Fremont Unified
## 4294                          Rochester Community School District
## 4295                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 4296                             ROCHESTER PUBLIC SCHOOL DISTRICT
## 4297                                 FARMINGTON MUNICIPAL SCHOOLS
## 4298                             ST. PETER PUBLIC SCHOOL DISTRICT
## 4299                                       Lee/Ogle/Whiteside ROE
## 4300                                            Rockcastle County
## 4301                       Los Angeles County Office of Education
## 4302                           CLARKSTOWN CENTRAL SCHOOL DISTRICT
## 4303                                DULUTH PUBLIC SCHOOL DISTRICT
## 4304                                                 ROCKWALL ISD
## 4305                                ROCORI PUBLIC SCHOOL DISTRICT
## 4306                            Edw/Glt/Hlt/Hdn/Pop/Sln/Wbh/Wn/Wh
## 4307                                  Mason/Tazewell/Woodford ROE
## 4308                                  Mason/Tazewell/Woodford ROE
## 4309                            Calhoun/Greene/Jersy/Macoupin ROE
## 4310                            Calhoun/Greene/Jersy/Macoupin ROE
## 4311                                                     Lake ROE
## 4312                            Calhoun/Greene/Jersy/Macoupin ROE
## 4313                            Calhoun/Greene/Jersy/Macoupin ROE
## 4314                            Edw/Glt/Hlt/Hdn/Pop/Sln/Wbh/Wn/Wh
## 4315                                      Romeo Community Schools
## 4316                                    Romulus Community Schools
## 4317                                        Walnut Valley Unified
## 4318                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 4319                           Minneapolis Public School District
## 4320                                               Dinuba Unified
## 4321                                                         POLK
## 4322                                                 MISSION CISD
## 4323                           Minneapolis Public School District
## 4324                                             Pasadena Unified
## 4325                        NEW YORK CITY GEOGRAPHIC DISTRICT #24
## 4326                                          Douglas County SD 4
## 4327                                ROSEAU PUBLIC SCHOOL DISTRICT
## 4328                                                   AUSTIN ISD
## 4329                              Baltimore County Public Schools
## 4330                                              Turlock Unified
## 4331                                 ROSEMOUNT-APPLE VALLEY-EAGAN
## 4332                                                          BAY
## 4333                             ROSEVILLE PUBLIC SCHOOL DISTRICT
## 4334                                               NM CORRECTIONS
## 4335                                                   CENTER ISD
## 4336                                               ROUND ROCK ISD
## 4337                                         Round Valley Unified
## 4338                               JACKSON PUBLIC SCHOOL DISTRICT
## 4339                                              Rowland Unified
## 4340                                              SAN ANTONIO ISD
## 4341                                          San Lorenzo Unified
## 4342                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4343                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4344                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4345                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4346                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4347                            Hancck/Fultn/Schuylr/McDonogh ROE
## 4348                              MOORHEAD PUBLIC SCHOOL DISTRICT
## 4349                                   BOYS TOWN INTERIM PRG SCHS
## 4350                                   BOYS TOWN INTERIM PRG SCHS
## 4351                            Region 6 and 8-SW/WC Service Coop
## 4352                                           RTR PUBLIC SCHOOLS
## 4353                       Saginaw School District of the City of
## 4354                       Saginaw School District of the City of
## 4355                                            El Rancho Unified
## 4356                                              St Clair County
## 4357                                              Oakland Unified
## 4358                                  RUNESTONE AREA ED. DISTRICT
## 4359                                   Alum Rock Union Elementary
## 4360                                        GEORGE GERVIN ACADEMY
## 4361                                    Rutherford County Schools
## 4362                           SOUTH ST. PAUL PUBLIC SCHOOL DIST.
## 4363                            Colusa County Office of Education
## 4364                                    Anchorage School District
## 4365                     San Francisco County Office of Education
## 4366                     San Francisco County Office of Education
## 4367                     San Francisco County Office of Education
## 4368                                        San Francisco Unified
## 4369                                              Woodford County
## 4370                            DeWitt/Livingstn/Logan/McLean ROE
## 4371                            Clintn/Jeffrsn/Marin/Washngtn ROE
## 4372                            Clintn/Jeffrsn/Marin/Washngtn ROE
## 4373                                       Chatham County Schools
## 4374                                      Ephrata School District
## 4375                                      Ephrata School District
## 4376                           Michigan Department of Corrections
## 4377                                                  Saginaw ISD
## 4378                                Saginaw Learn to Earn Academy
## 4379                           Michigan Department of Corrections
## 4380                                              Saint Clair ROE
## 4381       Saint Joseph's Children's Home - Administration Office
## 4382                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 4383                           ST. FRANCIS PUBLIC SCHOOL DISTRICT
## 4384                                                 ROBSTOWN ISD
## 4385                                CARROLLTON-FARMERS BRANCH ISD
## 4386                          Monterey County Office of Education
## 4387                                          Saline Area Schools
## 4388                                   Red Bluff Joint Union High
## 4389                                              SALMON DISTRICT
## 4390                                       Seattle Public Schools
## 4391                                              SALMON DISTRICT
## 4392                                          Menard/Sangamon ROE
## 4393                                        Iroquois/Kankakee ROE
## 4394                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 4395                                            Holtville Unified
## 4396                                                 Gervais SD 1
## 4397                                              San Benito High
## 4398                                  San Bernardino City Unified
## 4399                                         Tamalpais Union High
## 4400                                         TEXANS CAN ACADEMIES
## 4401                                          Los Angeles Unified
## 4402                                            Claremont Unified
## 4403                                    Petaluma Joint Union High
## 4404                        San Benito County Office of Education
## 4405                        San Benito County Office of Education
## 4406                                  San Bernardino City Unified
## 4407                    San Bernardino County Office of Education
## 4408                         San Diego County Office of Education
## 4409                         San Diego County Office of Education
## 4410                                            San Diego Unified
## 4411                                             SAN ELIZARIO ISD
## 4412                       San Joaquin County Office of Education
## 4413                       San Joaquin County Office of Education
## 4414                                            McFarland Unified
## 4415                                              Parlier Unified
## 4416                                               Warner Unified
## 4417                                            Los Banos Unified
## 4418                   San Luis Obispo County Office of Education
## 4419                   San Luis Obispo County Office of Education
## 4420                         San Diego County Office of Education
## 4421                                   San Pasqual Valley Unified
## 4422                      Wisconsin Department of Health Services
## 4423                               Department of Juvenile Justice
## 4424                            LAKE PEND OREILLE SCHOOL DISTRICT
## 4425                                               Sierra Unified
## 4426                                          Menard/Sangamon ROE
## 4427                                          Menard/Sangamon ROE
## 4428                                              Willits Unified
## 4429                     Santa Barbara County Office of Education
## 4430                     Santa Barbara County Office of Education
## 4431                                          Santa Clara Unified
## 4432                       Santa Clara County Office of Education
## 4433                       Santa Clara County Office of Education
## 4434                                   Santa Cruz City Elementary
## 4435                        Santa Cruz County Office of Education
## 4436                        Santa Cruz County Office of Education
## 4437                                   Fallbrook Union Elementary
## 4438                                              SANTA MARIA ISD
## 4439                                              SANTA MARIA ISD
## 4440                                              SANTA MARIA ISD
## 4441                                  Santa Monica-Malibu Unified
## 4442                                                   SANTA ROSA
## 4443                                               SANTA ROSA ISD
## 4444                                               SANTA ROSA ISD
## 4445                                              Rowland Unified
## 4446                                                       Santee
## 4447                                                       Santee
## 4448                                               Fayette County
## 4449                                       Dept Of Correction N04
## 4450                              Stanwood-Camano School District
## 4451                        NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 4452                                    Greenville Public Schools
## 4453                              ACADEMY FOR ACADEMIC EXCELLENCE
## 4454                              SAUK RAPIDS-RICE PUBLIC SCHOOLS
## 4455                               Department of Juvenile Justice
## 4456                              Mono County Office of Education
## 4457                                      Guilford County Schools
## 4458                  Des Moines Independent Comm School District
## 4459                                      Spokane School District
## 4460                                            Perris Union High
## 4461                                                NORTHSIDE ISD
## 4462                                            IDJJ Sch Dist 428
## 4463                                                        DUVAL
## 4464                                                   SPRING ISD
## 4465                                   Marysville School District
## 4466                                                      MANATEE
## 4467                                      Sacramento City Unified
## 4468                                   ALBUQUERQUE PUBLIC SCHOOLS
## 4469                                                        PASCO
## 4470                                            SPRING BRANCH ISD
## 4471                                       LINCOLN PUBLIC SCHOOLS
## 4472                       Los Angeles County Office of Education
## 4473                                          Wake County Schools
## 4474                                                   TEMPLE ISD
## 4475                       Los Angeles County Office of Education
## 4476                                         Scott Valley Unified
## 4477                                         Scott Valley Unified
## 4478                                                     SEMINOLE
## 4479                                      Edmonds School District
## 4480                       Los Angeles County Office of Education
## 4481                                                      BROWARD
## 4482                                       Seattle Public Schools
## 4483                             INTERMEDIATE SCHOOL DISTRICT 287
## 4484                              Eau Claire Area School District
## 4485                                                  Bath County
## 4486                                                         LEON
## 4487                                   Northshore School District
## 4488                                               HARLINGEN CISD
## 4489                             FARIBAULT PUBLIC SCHOOL DISTRICT
## 4490                                                  HOUSTON ISD
## 4491                                         FAIRFAX CO PBLC SCHS
## 4492                                     Tumwater School District
## 4493                                                         DADE
## 4494                                                         DADE
## 4495                                                         DADE
## 4496                                                         DADE
## 4497                                         OMAHA PUBLIC SCHOOLS
## 4498                                              SAN ANTONIO ISD
## 4499                                        Selah School District
## 4500                                        Selah School District
## 4501                                           Long Beach Unified
## 4502                                                Selma Unified
## 4503                                     Fairfield-Suisun Unified
## 4504                                                     SEMINOLE
## 4505                                                 HILLSBOROUGH
## 4506                                                 SEMINOLE ISD
## 4507                              SENATOBIA MUNICIPAL SCHOOL DIST
## 4508                                            Waterford Unified
## 4509                                      Wahluke School District
## 4510                            West Central School District 49-7
## 4511                                       Sequim School District
## 4512                                            Merced Union High
## 4513                                              Visalia Unified
## 4514                                      Everett School District
## 4515                                                     SEQUOYAH
## 4516                    Hazel Park School District of the City of
## 4517                                                COMMUNITY ISD
## 4518                                                 MCKINNEY ISD
## 4519                                                 CROCKETT ISD
## 4520                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 4521                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 4522                         Madison Metropolitan School District
## 4523                                             Hesperia Unified
## 4524                              SHAKOPEE PUBLIC SCHOOL DISTRICT
## 4525                              SHAKOPEE PUBLIC SCHOOL DISTRICT
## 4526                                    Milwaukee School District
## 4527                                                BIRDVILLE ISD
## 4528                    West Allis-West Milwaukee School District
## 4529                               CLOQUET PUBLIC SCHOOL DISTRICT
## 4530                            Shasta County Office of Education
## 4531                                            Shasta Union High
## 4532                                      Scotland County Schools
## 4533                                                       ORANGE
## 4534                                                Shelby County
## 4535                            Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 4536                                                  SHELDON ISD
## 4537                                           Fort Bragg Unified
## 4538                                        DOE SOP EDUC PROGRAMS
## 4539                 SHENANDOAH VALLEY REG ALTERNATIVE ED/GENESIS
## 4540                                                        PASCO
## 4541                                                         POLK
## 4542                                          Los Angeles Unified
## 4543                                             Torrance Unified
## 4544                          MEEKER AND WRIGHT SPECIAL EDUCATION
## 4545                                     ERATH EXCELS ACADEMY INC
## 4546                                       Monroe School District
## 4547                                         Death Valley Unified
## 4548                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 4549                                    Sunnyside School District
## 4550                                                Carter County
## 4551                                                      ALACHUA
## 4552                                        SIDNEY PUBLIC SCHOOLS
## 4553                                                      ALACHUA
## 4554                                   ALBUQUERQUE PUBLIC SCHOOLS
## 4555                                  San Bernardino City Unified
## 4556                                             Fillmore Unified
## 4557                                                Azusa Unified
## 4558                                        Tahoe-Truckee Unified
## 4559                                              Mammoth Unified
## 4560                                      Mariposa County Unified
## 4561                                         Cuyama Joint Unified
## 4562                                  Sierra-Plumas Joint Unified
## 4563                                                Chico Unified
## 4564                                          Whittier Union High
## 4565                                               Dinuba Unified
## 4566                                       BLAINE COUNTY DISTRICT
## 4567                                                       MARION
## 4568                                      Nevada Joint Union High
## 4569                                        Silver Valley Unified
## 4570                                        Silver Valley Unified
## 4571                                    Saddleback Valley Unified
## 4572                                  INVER GROVE HEIGHTS SCHOOLS
## 4573                                                 HILLSBOROUGH
## 4574                                          Los Angeles Unified
## 4575                                                       ORANGE
## 4576                                       SIMPSON CO SCHOOL DIST
## 4577                                 Mount Vernon School District
## 4578                                     Concrete School District
## 4579                                    Wenatchee School District
## 4580                                   Moses Lake School District
## 4581                                       Monroe School District
## 4582                                       Sultan School District
## 4583                                               Provo District
## 4584                                                   SLATON ISD
## 4585                                                   SLATON ISD
## 4586                                         Colton Joint Unified
## 4587                             SOUTHERN MN EDUCATION CONSORTIUM
## 4588                       Los Angeles County Office of Education
## 4589                                    Soap Lake School District
## 4590                                            Rutherford County
## 4591                                          TWIN FALLS DISTRICT
## 4592                                    Snohomish School District
## 4593                            Snoqualmie Valley School District
## 4594                                       Snowline Joint Unified
## 4595                              Summit School District No. Re 1
## 4596                                                HERMLEIGH ISD
## 4597                                        SOUTH SAN ANTONIO ISD
## 4598                                South Redford School District
## 4599                               Sheridan School District No. 2
## 4600                                   Antelope Valley Union High
## 4601                            Solano County Office of Education
## 4602                            Solano County Office of Education
## 4603                                   Osborn Elementary District
## 4604                                     Fall River Joint Unified
## 4605                       Los Angeles County Office of Education
## 4606                            LAKE SUPERIOR PUBLIC SCHOOL DIST.
## 4607                                    GREENVILLE PUBLIC SCHOOLS
## 4608                                             Gonzales Unified
## 4609                                           Bellflower Unified
## 4610                            Sonoma County Office of Education
## 4611                            Sonoma County Office of Education
## 4612                                    Petaluma Joint Union High
## 4613                                 CLARK COUNTY SCHOOL DISTRICT
## 4614                                    Milwaukee School District
## 4615                                                      BREVARD
## 4616                                                   PALM BEACH
## 4617                                    DEPARTMENT OF CORRECTIONS
## 4618                                 Point Arena Joint Union High
## 4619                                                 HILLSBOROUGH
## 4620                                          Siskiyou Union High
## 4621                             INTERMEDIATE SCHOOL DISTRICT 287
## 4622                                       Seattle Public Schools
## 4623                                     Marysville Joint Unified
## 4624                             South Mountain Secure Trmnt Unit
## 4625                                                  WESLACO ISD
## 4626                                       SOUTH PIKE SCHOOL DIST
## 4627                        SOUTH PLAINS ACADEMY CHARTER DISTRICT
## 4628                                  Union County Public Schools
## 4629                                          Los Angeles Unified
## 4630                                North Thurston Public Schools
## 4631                                                Ukiah Unified
## 4632                          SOUTH WASHINGTON COUNTY SCHOOL DIST
## 4633                                South Whidbey School District
## 4634                                  Grand Rapids Public Schools
## 4635                                    DEPARTMENT OF CORRECTIONS
## 4636                                    Milwaukee School District
## 4637                                 CLARK COUNTY SCHOOL DISTRICT
## 4638                          Humboldt County Office of Education
## 4639                                               NM CORRECTIONS
## 4640                              SOUTHERN PLAINS EDUCATION COOP.
## 4641              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 4642                            Southfield Public School District
## 4643                                              Jordan District
## 4644                                                SOUTHSIDE ISD
## 4645                                   Office of Juvenile Justice
## 4646                      SOUTHSIDE L.I.N.K. PROJECT/BRUNSWICK CO
## 4647                                                SOUTHWEST ISD
## 4648                                 CLARK COUNTY SCHOOL DISTRICT
## 4649                                                Iron District
## 4650                                                          LEE
## 4651                                          Washington District
## 4652                           Minneapolis Public School District
## 4653                                            CALDWELL DISTRICT
## 4654                                               HARLINGEN CISD
## 4655                                                  MCALLEN ISD
## 4656                    Montezuma-Cortez School District No. Re-1
## 4657                                 SOUTHWEST PREPARATORY SCHOOL
## 4658                                 SOUTHWEST PREPARATORY SCHOOL
## 4659                                 SOUTHWEST PREPARATORY SCHOOL
## 4660                                             SOUTHWEST SCHOOL
## 4661                                               CROSBYTON CISD
## 4662                                  Sparta Area School District
## 4663                               Spearfish School District 40-2
## 4664                               Spearfish School District 40-2
## 4665                                                     ANNA ISD
## 4666                                                  LOVEJOY ISD
## 4667                                       Tacoma School District
## 4668                                                   LUFKIN ISD
## 4669                                                Hardin County
## 4670                                                       MARTIN
## 4671                                               FORT WORTH ISD
## 4672                                                BELLVILLE ISD
## 4673                        West Valley School District (Spokane)
## 4674                        West Valley School District (Spokane)
## 4675                                   DIVISION OF YOUTH SERVICES
## 4676   Harrison School District No. 2 in the county of El Paso an
## 4677                                      Mariposa County Unified
## 4678                          Mariposa County Office of Education
## 4679                                   Spring Lake Public Schools
## 4680                                                       DESOTO
## 4681                                               Bullitt County
## 4682                                 CLARK COUNTY SCHOOL DISTRICT
## 4683                                  Mary Walker School District
## 4684                                               NM CORRECTIONS
## 4685                                               Columbia Union
## 4686                                         SPRINGLAKE-EARTH ISD
## 4687                                St. Charles Community Schools
## 4688                        St. Clair County Intervention Academy
## 4689                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 4690                           CENTRAL MINNESOTA JT. POWERS DIST.
## 4691                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 4692                          Wisconsin Department of Corrections
## 4693                          STILLWATER AREA PUBLIC SCHOOL DIST.
## 4694                                      St. Ignace Area Schools
## 4695                                                    ST. JOHNS
## 4696                                             Jefferson County
## 4697                               CANTON CENTRAL SCHOOL DISTRICT
## 4698                           Michigan Department of Corrections
## 4699                                     ST MARIES JOINT DISTRICT
## 4700                                              Macon/Piatt ROE
## 4701                                                          BAY
## 4702                             ST. ANTHONY-NEW BRIGHTON SCHOOLS
## 4703                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 4704                             ST. CLOUD PUBLIC SCHOOL DISTRICT
## 4705                                                    ST. JOHNS
## 4706                                                    ST. JOHNS
## 4707                                               ST. LOUIS CITY
## 4708                                                    ST. LUCIE
## 4709                                                    ST. LUCIE
## 4710                             St. Mary's County Public Schools
## 4711                             ST. PETER PUBLIC SCHOOL DISTRICT
## 4712                           Minneapolis Public School District
## 4713                                                 STAFFORD MSD
## 4714                        Stanislaus County Office of Education
## 4715                        Stanislaus County Office of Education
## 4716                        Stanislaus County Office of Education
## 4717                          Wisconsin Department of Corrections
## 4718                                        Stanly County Schools
## 4719                                       Yakima School District
## 4720                                       Harnett County Schools
## 4721                                              Marshall County
## 4722                                  San Bernardino City Unified
## 4723                      Allegan Area Educational Service Agency
## 4724                            Plymouth-Canton Community Schools
## 4725                            Frankln/Johnsn/Massc/Willimsn ROE
## 4726                            Frankln/Johnsn/Massc/Willimsn ROE
## 4727                                                 GRANBURY ISD
## 4728                                Sedro-Woolley School District
## 4729                                               Fayette County
## 4730                              Lake Washington School District
## 4731                                                         DADE
## 4732                                      STEM Partnership School
## 4733                                  EDUCATIONAL SERVICE UNIT 15
## 4734                                    Grandview School District
## 4735                                               Jurupa Unified
## 4736                            WHITE PINE COUNTY SCHOOL DISTRICT
## 4737                            WHITE PINE COUNTY SCHOOL DISTRICT
## 4738                                  Warren Consolidated Schools
## 4739                                EAST HARTFORD SCHOOL DISTRICT
## 4740                                                      VOLUSIA
## 4741                                    Arlington School District
## 4742                                              PORT ARTHUR ISD
## 4743                                          Los Angeles Unified
## 4744                                  Strathmore Union Elementary
## 4745                                              Oakland Unified
## 4746                             Educational Service District 101
## 4747                                                   WILLIS ISD
## 4748                                                   LUFKIN ISD
## 4749                                                   HUDSON ISD
## 4750                                                  CENTRAL ISD
## 4751                                                   DIBOLL ISD
## 4752                                                  ZAVALLA ISD
## 4753                                     PHARR-SAN JUAN-ALAMO ISD
## 4754                                                 ANGLETON ISD
## 4755                                Vashon Island School District
## 4756                                                   FRISCO ISD
## 4757                                                   IRVING ISD
## 4758                                                   OKEECHOBEE
## 4759                                         Lyle School District
## 4760                                           CORPUS CHRISTI ISD
## 4761                           Anne Arundel County Public Schools
## 4762                                            SPRINGFIELD R-XII
## 4763                                       Sturgis Public Schools
## 4764                               Berrien Springs Public Schools
## 4765                               Berrien Springs Public Schools
## 4766                               Berrien Springs Public Schools
## 4767                               Berrien Springs Public Schools
## 4768                               Berrien Springs Public Schools
## 4769                               Berrien Springs Public Schools
## 4770                               Berrien Springs Public Schools
## 4771                               Berrien Springs Public Schools
## 4772                               Berrien Springs Public Schools
## 4773                               Berrien Springs Public Schools
## 4774                               Berrien Springs Public Schools
## 4775                               Berrien Springs Public Schools
## 4776                                      Sacramento City Unified
## 4777                                                     Kane ROE
## 4778                                  GRAND ISLAND PUBLIC SCHOOLS
## 4779                                                   MARLIN ISD
## 4780                                                     Kane ROE
## 4781                                                          LEE
## 4782                                                 Wolfe County
## 4783                                          Glasgow Independent
## 4784                                                  Phenix City
## 4785                                                     Kane ROE
## 4786                                                         LEON
## 4787                                                     Kane ROE
## 4788                            Arizona Department of Corrections
## 4789                            Arizona Department of Corrections
## 4790                            Arizona Department of Corrections
## 4791                            Arizona Department of Corrections
## 4792                                               ROUND ROCK ISD
## 4793                                               FORT WORTH ISD
## 4794                 Success Virtual Learning Centers of Michigan
## 4795                            RIVERHEAD CENTRAL SCHOOL DISTRICT
## 4796                            Nevada County Office of Education
## 4797 School District No. 1 in the county of Denver and State of C
## 4798                                              Alpine District
## 4799                                           Mt. Diablo Unified
## 4800                                         Desert Sands Unified
## 4801                                              DUNCANVILLE ISD
## 4802                               HOUSTON PUBLIC SCHOOL DISTRICT
## 4803                             Sioux Falls School District 49-5
## 4804                                               Weber District
## 4805                                Battle Ground School District
## 4806                                            Riverside Unified
## 4807                                 CLARK COUNTY SCHOOL DISTRICT
## 4808                                                       SUMTER
## 4809                               Department of Juvenile Justice
## 4810                               Peoria Unified School District
## 4811                                                      BROWARD
## 4812                                                      BROWARD
## 4813                                        Mesa Unified District
## 4814                                         Danville Independent
## 4815                                           Elk Rapids Schools
## 4816                                                 Rowan County
## 4817                                          Reef-Sunset Unified
## 4818                                                      BROWARD
## 4819                              WHITE BEAR LAKE SCHOOL DISTRICT
## 4820                                     Del Norte County Unified
## 4821                                      San Dieguito Union High
## 4822                                                       ORANGE
## 4823                                DULUTH PUBLIC SCHOOL DISTRICT
## 4824                                      Temecula Valley Unified
## 4825                                   Suttons Bay Public Schools
## 4826                                       Seattle Public Schools
## 4827                            Snoqualmie Valley School District
## 4828                                    Saddleback Valley Unified
## 4829                                                          LEE
## 4830                             Southwest Metro Intermediate 288
## 4831                             Southwest Metro Intermediate 288
## 4832                             Southwest Metro Intermediate 288
## 4833                             Southwest Metro Intermediate 288
## 4834                             Southwest Metro Intermediate 288
## 4835                             Southwest Metro Intermediate 288
## 4836                                  Swan Valley School District
## 4837                               Swartz Creek Community Schools
## 4838                                        Sweetwater Union High
## 4839                              Cle Elum-Roslyn School District
## 4840                               Department of Juvenile Justice
## 4841                                              CASTLEBERRY ISD
## 4842                                       Jackson Public Schools
## 4843 NEW YORK STATE OFFICE OF CHILDREN AND FAMILY SERVICES (OCFS)
## 4844                             Butte County Office of Education
## 4845                                       MCCOMB SCHOOL DISTRICT
## 4846                                       Tacoma School District
## 4847                                               LAKE WORTH ISD
## 4848                                               Sanger Unified
## 4849                        Prince George's County Public Schools
## 4850                                             Talladega County
## 4851                                       Renton School District
## 4852                                         Tamalpais Union High
## 4853                                LEWISTON INDEPENDENT DISTRICT
## 4854                                                 HILLSBOROUGH
## 4855                                                   OKEECHOBEE
## 4856                                                     ESCAMBIA
## 4857                                    Region 06 West Cook ISC 2
## 4858                                     Nash-Rocky Mount Schools
## 4859                                         WHITE SETTLEMENT ISD
## 4860                                                KENNEDALE ISD
## 4861                                    GRAPEVINE-COLLEYVILLE ISD
## 4862                                         EAGLE MT-SAGINAW ISD
## 4863                                                  CROWLEY ISD
## 4864                                                  CARROLL ISD
## 4865                                                     AZLE ISD
## 4866                                                BIRDVILLE ISD
## 4867                                                ARLINGTON ISD
## 4868                                              CASTLEBERRY ISD
## 4869                                     HURST-EULESS-BEDFORD ISD
## 4870                                                   KELLER ISD
## 4871                                                MANSFIELD ISD
## 4872                                               LAKE WORTH ISD
## 4873                                                 BURLESON ISD
## 4874                                                NORTHWEST ISD
## 4875                                                  EVERMAN ISD
## 4876                                               FORT WORTH ISD
## 4877                                                      Taunton
## 4878                          Wisconsin Department of Corrections
## 4879                                                       TAYLOR
## 4880                                                  ABILENE ISD
## 4881                                                   MERKEL ISD
## 4882                                                    WYLIE ISD
## 4883                                       Taylor School District
## 4884                                TUNICA COUNTY SCHOOL DISTRICT
## 4885                          East Dakota Educational Cooperative
## 4886                          East Dakota Educational Cooperative
## 4887                                                   TEAGUE ISD
## 4888                                                   TEAGUE ISD
## 4889                                     Woodland School District
## 4890                                                 CLEBURNE ISD
## 4891                             RENSSELAER-COLUMBIA-GREENE BOCES
## 4892                                  Cotati-Rohnert Park Unified
## 4893                                      Tecumseh Public Schools
## 4894                                                     HAMILTON
## 4895                                      Tucson Unified District
## 4896                                                 PASADENA ISD
## 4897                        Tehama County Department of Education
## 4898                                                   YSLETA ISD
## 4899                                               HARLANDALE ISD
## 4900                                                  EL PASO ISD
## 4901                                                  EL PASO ISD
## 4902                                     PRIORITY CHARTER SCHOOLS
## 4903                                          Temple City Unified
## 4904                                            Templeton Unified
## 4905                                            Templeton Unified
## 4906                                                  TERRELL ISD
## 4907                              Lake Washington School District
## 4908                                               TEXAS CITY ISD
## 4909                                     TEXAS PREPARATORY SCHOOL
## 4910                                       TEXAS SERENITY ACADEMY
## 4911  Center Consolidated School District No. 26 Jt. of the count
## 4912                                         Oak Grove Elementary
## 4913                                              Franklin County
## 4914                                                    CHARLOTTE
## 4915                                                Nelson County
## 4916                                                    HIGHLANDS
## 4917                                       NORFOLK CITY PBLC SCHS
## 4918                                                 LA PORTE ISD
## 4919                               WAYZATA PUBLIC SCHOOL DISTRICT
## 4920                          EASTERN CARVER COUNTY PUBLIC SCHOOL
## 4921   Colorado Springs School District No. 11 in the county of E
## 4922                                                        DUVAL
## 4923                                     Coloma Community Schools
## 4924                                    GRAPEVINE-COLLEYVILLE ISD
## 4925                                             Jefferson County
## 4926                                             Jefferson County
## 4927                                             Henderson County
## 4928                                                      VOLUSIA
## 4929                                     Brunswick County Schools
## 4930                                         Moore County Schools
## 4931                                                Multnomah ESD
## 4932                                                      JACKSON
## 4933                                                      ALACHUA
## 4934                                                Etowah County
## 4935                                             THE EXCEL CENTER
## 4936                                THE EXCEL CENTER (FOR ADULTS)
## 4937                          TEXAS COLLEGE PREPARATORY ACADEMIES
## 4938                                         HANOVER CO PBLC SCHS
## 4939                             Mohave County Juvenile Detention
## 4940                                              Lawrence County
## 4941                            Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 4942                                               JOURDANTON ISD
## 4943                                         GULFPORT SCHOOL DIST
## 4944                              STARKVILLE- OKTIBBEHA CONS DIST
## 4945                                                NEW CANEY ISD
## 4946                                                 LaRue County
## 4947                                                    BRYAN ISD
## 4948                                            NEW BRAUNFELS ISD
## 4949                                    Anchorage School District
## 4950                                      Cherokee County Schools
## 4951                                                        UNION
## 4952                                                      COLLIER
## 4953                                                Mobile County
## 4954                                  EMMETT INDEPENDENT DISTRICT
## 4955                                                MANSFIELD ISD
## 4956                                                      COLLIER
## 4957                                                      COLLIER
## 4958                                             Jefferson County
## 4959                                                      MANATEE
## 4960                                       THE PRO-VISION ACADEMY
## 4961                                             Jessamine County
## 4962              THE REGIONAL COMMUNITY ALTERNATIVE ED CONTINUUM
## 4963                                      VA BEACH CITY PBLC SCHS
## 4964                                            Muhlenberg County
## 4965                                    Rockingham County Schools
## 4966                                                         DADE
## 4967                                                 HILLSBOROUGH
## 4968                                               Fayette County
## 4969                                            Montgomery County
## 4970                       Saginaw School District of the City of
## 4971                                                 PASADENA ISD
## 4972                                                 PASADENA ISD
## 4973                                     NORTHAMPTON CO PBLC SCHS
## 4974                                          NORTHEAST METRO 916
## 4975                                            Sonora Union High
## 4976                                                 Gadsden City
## 4977                                                    KLEIN ISD
## 4978                                          Los Angeles Unified
## 4979                                                 RAVEN SCHOOL
## 4980                              Yuba County Office of Education
## 4981                                      ISU  Laboratory Schools
## 4982                                          Los Angeles Unified
## 4983                          Wisconsin Department of Corrections
## 4984                                       Seattle Public Schools
## 4985                                         Jefferson Union High
## 4986                                     Richland School District
## 4987                                       Cheney School District
## 4988                           Michigan Department of Corrections
## 4989                                        DOE SOP EDUC PROGRAMS
## 4990                    TIDEWATER REGIONAL ALTERNATIVE ED PROJECT
## 4991                                 Pontiac City School District
## 4992                                                    Kern High
## 4993                     Wayne-Westland Community School District
## 4994                              Mono County Office of Education
## 4995                                                Tipton County
## 4996                                TISHOMINGO CO SP MUN SCH DIST
## 4997                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 4998                             Todd County School District 66-1
## 4999                             Todd County School District 66-1
## 5000                                          Los Angeles Unified
## 5001                                                  TOMBALL ISD
## 5002                                                  TOMBALL ISD
## 5003                                                 PERRYTON ISD
## 5004                                       Seattle Public Schools
## 5005                                                 TORNILLO ISD
## 5006                                                   PALM BEACH
## 5007                                  EDUCATIONAL SERVICE UNIT 01
## 5008                            GOODHUE COUNTY EDUCATION DISTRICT
## 5009                                                 HILLSBOROUGH
## 5010                                                  ABC Unified
## 5011                                        Covington Independent
## 5012                                                DICKINSON ISD
## 5013                                               FORT WORTH ISD
## 5014                                    Milwaukee School District
## 5015                                     HURST-EULESS-BEDFORD ISD
## 5016                      TRANSITION SUPPORT RESOURCE CTR/FAIRFAX
## 5017                                           Lake Tahoe Unified
## 5018                                              Davidson County
## 5019                                                    MANOR ISD
## 5020                                                DEL VALLE ISD
## 5021                                              LAKE TRAVIS ISD
## 5022                                                    EANES ISD
## 5023                                                  LEANDER ISD
## 5024                                             PFLUGERVILLE ISD
## 5025                                               Travis Unified
## 5026                                                   AUSTIN ISD
## 5027                                                   AUSTIN ISD
## 5028                                               LAGO VISTA ISD
## 5029                                                   AUSTIN ISD
## 5030                                               Travis Unified
## 5031                                                    PARIS ISD
## 5032                                               Travis Unified
## 5033                                       Dept Of Correction N04
## 5034      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 5035                                                  SHERMAN ISD
## 5036                                      Ferndale Public Schools
## 5037                                          Los Angeles Unified
## 5038                                                     SARASOTA
## 5039                                       TRINITY CHARTER SCHOOL
## 5040                                       TRINITY CHARTER SCHOOL
## 5041                           Trinity County Office of Education
## 5042                           Trinity County Office of Education
## 5043                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 5044                                       Pe Ell School District
## 5045                                         Troy School District
## 5046                                                     TROY ISD
## 5047                                 Northern Humboldt Union High
## 5048                        Tuba City Unified School District #15
## 5049                                                  Tulare City
## 5050                            Tulare County Office of Education
## 5051                            Tulare County Office of Education
## 5052                                                  Tulare City
## 5053                                      Tulare Joint Union High
## 5054                                              Alpaugh Unified
## 5055                                 Tulelake Basin Joint Unified
## 5056                                            TULOSO-MIDWAY ISD
## 5057                    Tuolumne County Superintendent of Schools
## 5058                                    TUPELO PUBLIC SCHOOL DIST
## 5059                                       Dept Of Correction N04
## 5060                                       SUFFOLK CITY PBLC SCHS
## 5061                                             CHINA SPRING ISD
## 5062                                                Turner County
## 5063                                                         DADE
## 5064                                WASHOE COUNTY SCHOOL DISTRICT
## 5065                                                    JEFFERSON
## 5066                                     Cleveland County Schools
## 5067                                Charlotte-Mecklenburg Schools
## 5068                                          ORANGE CO PBLC SCHS
## 5069                                                ARLINGTON ISD
## 5070                                                   PALM BEACH
## 5071                                      Chinle Unified District
## 5072                                            Tuscaloosa County
## 5073                                               Tustin Unified
## 5074                                            San Diego Unified
## 5075                                     Concrete School District
## 5076                                                      MADISON
## 5077                                           San Marcos Unified
## 5078                                           Palo Verde Unified
## 5079                                               Weber District
## 5080                            Snoqualmie Valley School District
## 5081                                       Dept Of Correction N04
## 5082                                             Jefferson County
## 5083                                                Mobile County
## 5084                                      Utica Community Schools
## 5085                             Educational Service District 123
## 5086                                            Uintah River High
## 5087                                                Ukiah Unified
## 5088      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 5089                             UNDERWOOD PUBLIC SCHOOL DISTRICT
## 5090                         Redford Union Schools District No. 1
## 5091                                         Macon County Schools
## 5092                                                 Union County
## 5093                                                 Union County
## 5094                                        NAMPA SCHOOL DISTRICT
## 5095                                                        UNION
## 5096      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
## 5097                              ST. PAUL PUBLIC SCHOOL DISTRICT
## 5098                                                   UNITED ISD
## 5099                                          Lowell Area Schools
## 5100                                                       ORANGE
## 5101                                                       ORANGE
## 5102                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 5103                                  ROSWELL INDEPENDENT SCHOOLS
## 5104                                      ISU  Laboratory Schools
## 5105                                 University of Ill Lab School
## 5106                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 5107                                         OMAHA PUBLIC SCHOOLS
## 5108                                             San Juan Unified
## 5109                                NEWARK PUBLIC SCHOOL DISTRICT
## 5110                                           Upper Lake Unified
## 5111                               URBAN DOVE TEAM CHARTER SCHOOL
## 5112                                             Eagle Point SD 9
## 5113                UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 5114                                    UTA HALEE ACADEMY PROGRAM
## 5115                                           Montebello Unified
## 5116                       Eagle County School District No. Re 50
## 5117                                            Val Verde Unified
## 5118                                            Val Verde Unified
## 5119                                            Val Verde Unified
## 5120                                        Bret Harte Union High
## 5121                          Imperial County Office of Education
## 5122                                    Wenatchee School District
## 5123                                   Hacienda la Puente Unified
## 5124                            Merced County Office of Education
## 5125                                  Valley Center-Pauma Unified
## 5126                                              Hughson Unified
## 5127                                   Hacienda la Puente Unified
## 5128                                               Daviess County
## 5129                                      Delano Joint Union High
## 5130                                      Mountain Valley Unified
## 5131                                         Escondido Union High
## 5132                                               Dublin Unified
## 5133                                               Daviess County
## 5134                                              Jordan District
## 5135                            Merced County Office of Education
## 5136                            Merced County Office of Education
## 5137                                             VALLEY MILLS ISD
## 5138                                             Live Oak Unified
## 5139                                          Napa Valley Unified
## 5140                                        Oakdale Joint Unified
## 5141                                     Petaluma City Elementary
## 5142                                    Petaluma Joint Union High
## 5143                    Matanuska-Susitna Borough School District
## 5144                                        Golden Valley Unified
## 5145                                   SUGAR-SALEM JOINT DISTRICT
## 5146                                 HIAWATHA VALLEY ED. DISTRICT
## 5147                                    Elizabethtown Independent
## 5148                                            BLUE SPRINGS R-IV
## 5149                                     Chaffey Joint Union High
## 5150                                              VALLEY VIEW ISD
## 5151                                  Huntington Beach Union High
## 5152                                     VALLIVUE SCHOOL DISTRICT
## 5153                                             GRAND SALINE ISD
## 5154                                             GRAND SALINE ISD
## 5155                                    Vancouver School District
## 5156                                    Vancouver School District
## 5157                                Marquette Area Public Schools
## 5158                               Vandercook Lake Public Schools
## 5159                                   Adams 12 Five Star Schools
## 5160                                    Wauwatosa School District
## 5161                                     San Ramon Valley Unified
## 5162                       San Joaquin County Office of Education
## 5163                                                ARLINGTON ISD
## 5164                                       COEUR D'ALENE DISTRICT
## 5165                                 Imlay City Community Schools
## 5166                                             Glendale Unified
## 5167                                                 VERIBEST ISD
## 5168                                                    EDEN CISD
## 5169                                               CHRISTOVAL ISD
## 5170                                               PAINT ROCK ISD
## 5171                                               ROBERT LEE ISD
## 5172                         Redford Union Schools District No. 1
## 5173                                               ST. LOUIS CITY
## 5174                                             Martinez Unified
## 5175                           INSTITUTIONAL EDUCATIONAL PROGRAMS
## 5176                                  Vicksburg Community Schools
## 5177                                                 VICTORIA ISD
## 5178                                    PITTSYLVANIA CO PBLC SCHS
## 5179                                              Rocklin Unified
## 5180                                                  COPPELL ISD
## 5181                                          Los Angeles Unified
## 5182                    Hazel Park School District of the City of
## 5183                                                       ORANGE
## 5184                                               Pomona Unified
## 5185                                           Pleasanton Unified
## 5186                                              Lincoln Unified
## 5187                          MEEKER AND WRIGHT SPECIAL EDUCATION
## 5188                        GREAT NECK UNION FREE SCHOOL DISTRICT
## 5189                                    Milwaukee School District
## 5190                                          Porterville Unified
## 5191              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 5192                               Livermore Valley Joint Unified
## 5193                                          Los Angeles Unified
## 5194                                                  MIDLAND ISD
## 5195                            Fresno County Office of Education
## 5196                                        DOE SOP EDUC PROGRAMS
## 5197                 Virtual Learning Academy of St. Clair County
## 5198                                                EDINBURG CISD
## 5199                           Delta County Joint District No. 50
## 5200                                   ALBUQUERQUE PUBLIC SCHOOLS
## 5201                                   Bellingham School District
## 5202                                               Bonita Unified
## 5203 School District No. 1 in the county of Denver and State of C
## 5204                                              Fremont Unified
## 5205                              Yuma Union High School District
## 5206                                                    Kern High
## 5207                                              Lynwood Unified
## 5208                                    West Contra Costa Unified
## 5209                                              Escalon Unified
## 5210                                        Vista Meadows Academy
## 5211                                          Twin Rivers Unified
## 5212                                      AZTEC MUNICIPAL SCHOOLS
## 5213                                                Vista Unified
## 5214                                                    Kern High
## 5215                                                    KLEIN ISD
## 5216                             Sioux Falls School District 49-5
## 5217                           Minneapolis Public School District
## 5218                                  Marcellus Community Schools
## 5219                           Minneapolis Public School District
## 5220                                                      VOLUSIA
## 5221              OFFICE OF EDUCATION JUVENILE JUSTICE COMMISSION
## 5222                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 5223                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 5224                                                 NAVASOTA ISD
## 5225                             WEST ST. PAUL-MENDOTA HTS.-EAGAN
## 5226                             INTERMEDIATE SCHOOL DISTRICT 287
## 5227                          WALKER-HACKENSACK-AKELEY SCHL. DIST
## 5228                                              Davidson County
## 5229                                             Jefferson County
## 5230                                        DOE SOP EDUC PROGRAMS
## 5231                                          WACO CHARTER SCHOOL
## 5232                                                   AXTELL ISD
## 5233                               WACONIA PUBLIC SCHOOL DISTRICT
## 5234                               WACONIA PUBLIC SCHOOL DISTRICT
## 5235                                     North Wasco County SD 21
## 5236                                          BUHL JOINT DISTRICT
## 5237                                                      WAKULLA
## 5238                               Racine Unified School District
## 5239                                                Walker County
## 5240                                     Puyallup School District
## 5241                            DETROIT LAKES PUBLIC SCHOOL DIST.
## 5242                                                     WALL ISD
## 5243                                               ROBERT LEE ISD
## 5244                                               CHRISTOVAL ISD
## 5245                                                     WALL ISD
## 5246                                             WATER VALLEY ISD
## 5247                                                    OLFEN ISD
## 5248                                               PAINT ROCK ISD
## 5249                                            STERLING CITY ISD
## 5250                                                 COLORADO ISD
## 5251                                               BLACKWELL CISD
## 5252                                                 HIGHLAND ISD
## 5253                                        ROSCOE COLLEGIATE ISD
## 5254                                                   WALLER ISD
## 5255                         West Des Moines Comm School District
## 5256                                           WALNUT SPRINGS ISD
## 5257                                       Folsom-Cordova Unified
## 5258                                                 Lodi Unified
## 5259                                                       WALTON
## 5260                                                       WALTON
## 5261                                                       WALTON
## 5262                                                       WALTON
## 5263      OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES
##                          County_Name COUNTY.ID Urban.centric.Locale Latitude
## 1                      Carver County     27019     21-Suburb: Large 44.84528
## 2                      Carver County     27019     21-Suburb: Large 44.84161
## 3                      Carver County     27019     21-Suburb: Large 44.84280
## 4                   Riverside County      6065     21-Suburb: Large 33.93428
## 5                    Hennepin County     27053     21-Suburb: Large 44.95820
## 6                    Hennepin County     27053     21-Suburb: Large 44.95825
## 7                    Hennepin County     27053     21-Suburb: Large 44.93413
## 8                    Hennepin County     27053     21-Suburb: Large 44.95458
## 9                    Hennepin County     27053     21-Suburb: Large 44.93300
## 10                   Hennepin County     27053       13-City: Small 44.85706
## 11                   Hennepin County     27053     21-Suburb: Large 44.90960
## 12                   Hennepin County     27053     21-Suburb: Large 44.90940
## 13                   Hennepin County     27053     21-Suburb: Large 44.90941
## 14                   Hennepin County     27053     41-Rural: Fringe 44.95491
## 15                   Hennepin County     27053     21-Suburb: Large 44.94423
## 16                   Hennepin County     27053     21-Suburb: Large 44.94308
## 17                   Hennepin County     27053     21-Suburb: Large 44.94355
## 18                   Hennepin County     27053     21-Suburb: Large 44.94316
## 19                 Bonneville County     16019       13-City: Small 43.51568
## 20                    Hidalgo County     48215     21-Suburb: Large 26.17206
## 21                   Hennepin County     27053     21-Suburb: Large 44.88420
## 22                   Hennepin County     27053     21-Suburb: Large 44.90035
## 23                   Hennepin County     27053     21-Suburb: Large 45.06620
## 24                       Kent County     26081       13-City: Small 42.86821
## 25                     Ramsey County     27123     21-Suburb: Large 45.01615
## 26                     Pueblo County      8101  22-Suburb: Mid-size 38.24570
## 27                   Hennepin County     27053       11-City: Large 44.99950
## 28                   Hennepin County     27053       11-City: Large 44.99950
## 29                     Ramsey County     27123     21-Suburb: Large 45.03684
## 30                     Ramsey County     27123       11-City: Large 44.95742
## 31                    Alachua County     12001    12-City: Mid-size 29.65799
## 32                   Muscogee County     13215     41-Rural: Fringe 32.52715
## 33                Los Angeles County      6037     21-Suburb: Large 33.88105
## 34                     Dakota County     27037     21-Suburb: Large 44.74159
## 35                      Brown County     46013      33-Town: Remote 45.45153
## 36                       Hale County     48189      33-Town: Remote 34.19360
## 37                    El Paso County     48141       11-City: Large 31.85850
## 38                    El Paso County     48141       11-City: Large 31.77666
## 39                       Kern County      6029      31-Town: Fringe 34.86467
## 40                  Riverside County      6065       11-City: Large 33.97107
## 41                  San Diego County      6073     21-Suburb: Large 32.97425
## 42                    Midland County     26111     41-Rural: Fringe 43.61185
## 43                     Harris County     48201       11-City: Large 29.69950
## 44                     Harris County     48201       11-City: Large 29.72512
## 45                      Adams County     17001      33-Town: Remote 39.93156
## 46                     Lonoke County      5085     21-Suburb: Large 34.94076
## 47                    Broward County     12011    12-City: Mid-size 26.18719
## 48                    Broward County     12011     21-Suburb: Large 26.17503
## 49              San Francisco County      6075       11-City: Large 37.74510
## 50                     Macomb County     26099     21-Suburb: Large 42.48813
## 51               Chesterfield County     51041     21-Suburb: Large 37.40821
## 52                   Santa Fe County     35049       13-City: Small 35.63779
## 53                    Henrico County     51087     21-Suburb: Large 37.66158
## 54                      Otero County     35035      33-Town: Remote 32.90218
## 55                      Butte County      6007       13-City: Small 39.75938
## 56                       Bell County     48027     41-Rural: Fringe 30.98193
## 57                     Harris County     48201       11-City: Large 29.66805
## 58                     Harris County     48201     21-Suburb: Large 29.79496
## 59                      Bexar County     48029       11-City: Large 29.53848
## 60                     Dallas County     48113       11-City: Large 32.68794
## 61                    Loudoun County     51107     41-Rural: Fringe 39.13212
## 62                   Humboldt County      6023     41-Rural: Fringe 40.69959
## 63                     Marion County     54049     32-Town: Distant 39.44825
## 64                       Erie County     36029       11-City: Large 42.87136
## 65                    Genesee County     26049     21-Suburb: Large 43.05783
## 66               Contra Costa County      6013       13-City: Small 37.87626
## 67                  Washtenaw County     26161     21-Suburb: Large 42.23372
## 68                    Genesee County     26049       13-City: Small 43.07656
## 69                     Nueces County     48355       11-City: Large 27.75790
## 70                 Miami-Dade County     12086     21-Suburb: Large 25.92714
## 71                     Pierce County     53053     21-Suburb: Large 47.10905
## 72                  St. Lucie County     12111    12-City: Mid-size 27.27350
## 73                     Orange County     12095       11-City: Large 28.51784
## 74                        Lee County     12071       13-City: Small 26.65919
## 75                     Orange County     12095     21-Suburb: Large 28.58006
## 76                    Douglas County     31055       11-City: Large 41.27293
## 77                 Washington County     27163     21-Suburb: Large 44.81839
## 78                     Orange County      6059    12-City: Mid-size 33.67348
## 79                     Orange County      6059       11-City: Large 33.73242
## 80                      Wayne County     26163     21-Suburb: Large 42.39645
## 81                     Denver County      8031       11-City: Large 39.73153
## 82                  Snohomish County     53061    12-City: Mid-size 47.91071
## 83                     Collin County     48085     21-Suburb: Large 33.00341
## 84                      Pasco County     12101     41-Rural: Fringe 28.32513
## 85                    Baltimore city     24510       11-City: Large 39.36573
## 86                     Macomb County     26099     21-Suburb: Large 42.52028
## 87                    Fairfax County     51059     21-Suburb: Large 38.76375
## 88                  Jefferson County     21111       11-City: Large 38.24778
## 89                    Jackson County     26075     41-Rural: Fringe 42.19776
## 90               Hillsborough County     12057     21-Suburb: Large 28.05212
## 91                        Ada County     16001    12-City: Mid-size 43.61063
## 92                     Norman County     27107     43-Rural: Remote 47.29756
## 93                      Adair County     21001     41-Rural: Fringe 37.08518
## 94                      Adams County     17001      33-Town: Remote 39.93156
## 95                      Adams County      8001     21-Suburb: Large 39.98868
## 96                Santa Clara County      6085       11-City: Large 37.34548
## 97                Santa Clara County      6085       11-City: Large 37.34446
## 98                      Kings County      6031    42-Rural: Distant 36.00798
## 99                 Stanislaus County      6099     21-Suburb: Large 37.73118
## 100                    Placer County      6061    12-City: Mid-size 38.75256
## 101                  Okaloosa County     12091     41-Rural: Fringe 30.69897
## 102                    Harris County     48201       11-City: Large 29.71133
## 103                  Maricopa County      4013       11-City: Large 33.70220
## 104                   Lenawee County     26091     32-Town: Distant 41.89710
## 105                    Danville city     51590     32-Town: Distant 36.58843
## 106                  Hennepin County     27053     21-Suburb: Large 45.05302
## 107                 Kalamazoo County     26077  22-Suburb: Mid-size 42.11704
## 108                    Collin County     48085       11-City: Large 33.02492
## 109                 Middlesex County     34023     21-Suburb: Large 40.58997
## 110                   Cameron County     48061    12-City: Mid-size 25.93614
## 111                   Tarrant County     48439       11-City: Large 32.73648
## 112                      Elko County     32007      33-Town: Remote 40.84223
## 113                   Henrico County     51087     21-Suburb: Large 37.54413
## 114                    Taylor County     48441    12-City: Mid-size 32.43700
## 115              Virginia Beach city     51810       11-City: Large 36.84404
## 116                    Travis County     48453       11-City: Large 30.27296
## 117                   El Paso County     48141       11-City: Large 31.69399
## 118                     Vance County     37181     32-Town: Distant 36.32765
## 119                   Oakland County     26125     21-Suburb: Large 42.45131
## 120                   Grayson County     48181     41-Rural: Fringe 33.50831
## 121               Los Angeles County      6037     21-Suburb: Large 34.15301
## 122                 Baltimore County     24005       13-City: Small 39.39939
## 123                    Becker County     27005      33-Town: Remote 46.81919
## 124               Los Angeles County      6037       11-City: Large 34.24230
## 125                 Jefferson County     21111       11-City: Large 38.25035
## 126                    Madera County      6039     32-Town: Distant 37.32557
## 127                   Gratiot County     26057    42-Rural: Distant 43.41463
## 128                    Orange County     48361  22-Suburb: Mid-size 30.12343
## 129                 Galveston County     48167      31-Town: Fringe 29.28671
## 130                 Snohomish County     53061  22-Suburb: Mid-size 47.93120
## 131                    Monroe County     26115     41-Rural: Fringe 42.04007
## 132                    Aitkin County     27001    42-Rural: Distant 46.53095
## 133                      Lane County     41039     41-Rural: Fringe 43.83377
## 134                   Alachua County     12001    12-City: Mid-size 29.68022
## 135                   Alachua County     12001    12-City: Mid-size 29.68002
## 136                   Alachua County     12001    12-City: Mid-size 29.68301
## 137                   Alameda County      6001    12-City: Mid-size 37.65835
## 138                   Alameda County      6001     21-Suburb: Large 37.71595
## 139                   Alameda County      6001     21-Suburb: Large 37.77990
## 140                   Alamosa County      8003      33-Town: Remote 37.47617
## 141                 San Diego County      6073       11-City: Large 32.75097
## 142                      Linn County     41043       13-City: Small 44.62384
## 143                Burlington County     34005     21-Suburb: Large 40.15992
## 144               Los Angeles County      6037       11-City: Large 34.23903
## 145                  Freeborn County     27047      33-Town: Remote 43.67742
## 146                    Sutter County      6101       13-City: Small 39.16199
## 147                  Hennepin County     27053       13-City: Small 44.87209
## 148                  Hennepin County     27053     21-Suburb: Large 45.09659
## 149                  Hennepin County     27053     21-Suburb: Large 45.05369
## 150                  Hennepin County     27053     21-Suburb: Large 44.86805
## 151                  Hennepin County     27053     21-Suburb: Large 44.90105
## 152                   Fairfax County     51059     21-Suburb: Large 38.76426
## 153                   Fairfax County     51059     21-Suburb: Large 38.78385
## 154                   Fairfax County     51059     21-Suburb: Large 38.81504
## 155                   Fairfax County     51059     21-Suburb: Large 38.83727
## 156                  Hennepin County     27053     21-Suburb: Large 45.08865
## 157                    Ramsey County     27123       11-City: Large 44.91334
## 158                  Hennepin County     27053     21-Suburb: Large 45.08796
## 159                  Hennepin County     27053       13-City: Small 44.87208
## 160                  Hennepin County     27053     21-Suburb: Large 44.88261
## 161                    Ramsey County     27123       11-City: Large 44.95532
## 162                  Hennepin County     27053       11-City: Large 44.99904
## 163                    Ramsey County     27123       11-City: Large 44.94843
## 164                  Hennepin County     27053     21-Suburb: Large 45.08796
## 165                  Hennepin County     27053     21-Suburb: Large 45.08127
## 166                    Steele County     27147     32-Town: Distant 44.08431
## 167                  Hennepin County     27053     21-Suburb: Large 45.07832
## 168                  Hennepin County     27053     21-Suburb: Large 45.12261
## 169                    Ramsey County     27123       11-City: Large 44.98727
## 170                    Ramsey County     27123       11-City: Large 44.95532
## 171                  Hennepin County     27053     21-Suburb: Large 44.87519
## 172                  Hennepin County     27053     21-Suburb: Large 44.87595
## 173                    Ramsey County     27123       11-City: Large 44.91336
## 174                    Ramsey County     27123       11-City: Large 44.91329
## 175                  Hennepin County     27053     21-Suburb: Large 45.08796
## 176                   Olmsted County     27109    12-City: Mid-size 43.98899
## 177                  Hennepin County     27053     41-Rural: Fringe 44.95503
## 178                  Hennepin County     27053     41-Rural: Fringe 44.99481
## 179                    Alcorn County     28003      33-Town: Remote 34.91210
## 180                    Harris County     48201     21-Suburb: Large 29.91379
## 181                    Harris County     48201       11-City: Large 29.75884
## 182                      Lake County     12069     41-Rural: Fringe 28.87539
## 183                   Douglas County     31055       11-City: Large 41.32225
## 184                 Riverside County      6065  22-Suburb: Mid-size 33.73169
## 185                     Anoka County     27003     21-Suburb: Large 45.20893
## 186                  Campbell County     21037     21-Suburb: Large 38.96387
## 187                Cumberland County     37051    12-City: Mid-size 35.08331
## 188                     Alger County     26003      33-Town: Remote 46.37847
## 189                      Cole County     29051       13-City: Small 38.59254
## 190                 St. Clair County     26147     21-Suburb: Large 42.62790
## 191                   Tarrant County     48439       11-City: Large 32.71216
## 192                    Fresno County      6019     41-Rural: Fringe 36.66022
## 193                   El Paso County     48141       11-City: Large 31.70504
## 194                    Harris County     48201       11-City: Large 29.68441
## 195                    Harris County     48201       11-City: Large 29.70662
## 196                    Harris County     48201       11-City: Large 29.70660
## 197                    Collin County     48085       11-City: Large 33.02519
## 198                   Allegan County     26005     32-Town: Distant 42.52301
## 199                  Allegany County     36003    42-Rural: Distant 42.22487
## 200                     Allen County     18003       11-City: Large 41.18921
## 201                     Wayne County     26163     21-Suburb: Large 42.23930
## 202                    Blount County      1009     32-Town: Distant 33.90548
## 203                 Multnomah County     41051       11-City: Large 45.55861
## 204                   El Paso County      8041       11-City: Large 38.90601
## 205                  Hennepin County     27053       13-City: Small 45.01137
## 206                 Guadalupe County     48187     21-Suburb: Large 29.55279
## 207                    Plumas County      6063     43-Rural: Remote 40.30907
## 208                    Orange County     12095     21-Suburb: Large 28.60385
## 209                      Cook County     17031     21-Suburb: Large 41.89010
## 210                    Wright County     27171    42-Rural: Distant 45.05892
## 211                Montgomery County     48339      31-Town: Fringe 30.20363
## 212                    Alpine County      6003    42-Rural: Distant 38.76656
## 213                    Alpine County      6003    42-Rural: Distant 38.81001
## 214                   Trinity County      6105     43-Rural: Remote 40.73965
## 215                 San Diego County      6073     21-Suburb: Large 32.61832
## 216             Santa Barbara County      6083       13-City: Small 34.42134
## 217             Santa Barbara County      6083       13-City: Small 34.42130
## 218               Santa Clara County      6085       13-City: Small 37.36009
## 219                 San Diego County      6073     21-Suburb: Large 33.22232
## 220                   Tarrant County     48439       11-City: Large 32.86327
## 221                     Ector County     48135     41-Rural: Fringe 31.91427
## 222                 McCulloch County     48307      33-Town: Remote 31.12811
## 223                   Tarrant County     48439     21-Suburb: Large 32.82177
## 224                     Bexar County     48029       11-City: Large 29.51467
## 225                      Hays County     48209     41-Rural: Fringe 30.09688
## 226                   Johnson County     48251      31-Town: Fringe 32.39386
## 227                     Bexar County     48029       11-City: Large 29.51480
## 228                  Angelina County     48005     41-Rural: Fringe 31.40919
## 229                 Gillespie County     48171      33-Town: Remote 30.25833
## 230                 Jefferson County     48245  22-Suburb: Mid-size 29.99085
## 231                      Wood County     48499    42-Rural: Distant 32.75804
## 232                Montgomery County     51121       13-City: Small 37.13210
## 233                   Pulaski County      5119    12-City: Mid-size 34.73933
## 234                     Bexar County     48029       11-City: Large 29.41767
## 235              Indian River County     12061  22-Suburb: Mid-size 27.67895
## 236                   Oakland County     26125     21-Suburb: Large 42.66023
## 237                 Fairfield County      9001       13-City: Small 41.40151
## 238                      Pima County      4019       11-City: Large 32.24576
## 239                    Greene County     51079      31-Town: Fringe 38.29359
## 240               Mecklenburg County     51117    42-Rural: Distant 36.66467
## 241                  Fauquier County     51061    42-Rural: Distant 38.62387
## 242               Walla Walla County     53071       13-City: Small 46.07812
## 243                Montgomery County     48339      31-Town: Fringe 30.20363
## 244                 Jefferson County     48245  22-Suburb: Mid-size 29.97297
## 245                    Orange County      6059       11-City: Large 33.68962
## 246                     Iosco County     26069    42-Rural: Distant 44.28016
## 247                    Ogemaw County     26129     43-Rural: Remote 44.26520
## 248                      Lake County     12069     21-Suburb: Large 28.53889
## 249                     Bexar County     48029       11-City: Large 29.48781
## 250                Santa Cruz County      6087       13-City: Small 36.98085
## 251                     Bexar County     48029       11-City: Large 29.43764
## 252                   Passaic County     34031     21-Suburb: Large 40.91705
## 253                   Wakulla County     12129     32-Town: Distant 30.17628
## 254                   Alameda County      6001    12-City: Mid-size 37.61477
## 255                      Pike County      1109      33-Town: Remote 31.81303
## 256                    Travis County     48453       11-City: Large 30.26935
## 257                   Russell County      1113    42-Rural: Distant 32.31697
## 258                 Fort Bend County     48157     21-Suburb: Large 29.55284
## 259            San Bernardino County      6071    12-City: Mid-size 34.12931
## 260                     Yazoo County     28163     32-Town: Distant 32.85641
## 261                    Harris County     48201     21-Suburb: Large 29.86947
## 262                    Harris County     48201     21-Suburb: Large 29.93432
## 263                 Kalamazoo County     26077       13-City: Small 42.25827
## 264                  Marshall County     28093     32-Town: Distant 34.76805
## 265     Fairbanks North Star Borough      2090       13-City: Small 64.84217
## 266                     Bexar County     48029       11-City: Large 29.55459
## 267                     Salem County     34033     21-Suburb: Large 39.70125
## 268                     Bexar County     48029       11-City: Large 29.45465
## 269                Miami-Dade County     12086     21-Suburb: Large 25.83277
## 270                Palm Beach County     12099    12-City: Mid-size 26.75404
## 271                Montgomery County     24031       13-City: Small 39.09507
## 272                   Jackson County     29095       11-City: Large 39.07072
## 273                     Bexar County     48029       11-City: Large 29.34114
## 274                    Wilson County     48493     41-Rural: Fringe 29.15300
## 275               Cerro Gordo County     19033      33-Town: Remote 43.15153
## 276                  Chambers County     48071     41-Rural: Fringe 29.84301
## 277                    Barrow County     13013      31-Town: Fringe 33.93115
## 278                    DeKalb County      1049     32-Town: Distant 34.46020
## 279                  Okanogan County     53047     43-Rural: Remote 48.36346
## 280                Burlington County     34005     21-Suburb: Large 40.02862
## 281                   Madison County     31119      33-Town: Remote 42.04174
## 282                Washington County     19183    42-Rural: Distant 41.46830
## 283                     Smith County     48423    12-City: Mid-size 32.33563
## 284                 Riverside County      6065       11-City: Large 33.93558
## 285                 Riverside County      6065       11-City: Large 33.89137
## 286                   Cameron County     48061       13-City: Small 26.16342
## 287                   Randall County     48381    12-City: Mid-size 35.14734
## 288               Los Angeles County      6037       11-City: Large 34.16810
## 289                     Power County     16077     32-Town: Distant 42.77319
## 290                  Hennepin County     27053       11-City: Large 44.96196
## 291                  Hennepin County     27053       11-City: Large 44.96189
## 292                Sacramento County      6067       11-City: Large 38.54788
## 293                  Pinellas County     12103     21-Suburb: Large 27.70548
## 294                  Okaloosa County     12091       13-City: Small 30.41073
## 295                   Cameron County     48061    42-Rural: Distant 26.16089
## 296              Hillsborough County     12057     41-Rural: Fringe 27.65430
## 297                      Leon County     12073    12-City: Mid-size 30.46676
## 298                   Alachua County     12001  22-Suburb: Mid-size 29.59987
## 299                      Clay County     12019     21-Suburb: Large 29.98275
## 300                     Duval County     12031       11-City: Large 30.28812
## 301                   Manatee County     12081     21-Suburb: Large 27.53870
## 302                Miami-Dade County     12086     21-Suburb: Large 25.91819
## 303                Miami-Dade County     12086     21-Suburb: Large 25.73900
## 304                   Broward County     12011    12-City: Mid-size 26.08331
## 305                    Orange County     12095     21-Suburb: Large 28.65653
## 306                       Lee County     12071     21-Suburb: Large 26.46039
## 307                   Volusia County     12127       13-City: Small 29.21339
## 308                 Riverside County      6065     21-Suburb: Large 33.72532
## 309                     Anoka County     27003     21-Suburb: Large 45.05516
## 310                    Camden County     34007     21-Suburb: Large 39.68230
## 311                    Howard County     48227     32-Town: Distant 32.23412
## 312                    Shasta County      6089     41-Rural: Fringe 40.44007
## 313                   Andrews County     48003     32-Town: Distant 32.32137
## 314                   Broward County     12011    12-City: Mid-size 26.27335
## 315               Los Angeles County      6037       11-City: Large 33.71346
## 316                    Mercer County     34021       13-City: Small 40.24666
## 317                    Ramsey County     27123       11-City: Large 44.98075
## 318           Prince George's County     24033     21-Suburb: Large 38.83677
## 319              Anne Arundel County     24003     21-Suburb: Large 39.07662
## 320                   Calhoun County      1015       13-City: Small 33.70818
## 321                Williamson County     48491     41-Rural: Fringe 30.71523
## 322                     Anoka County     27003     21-Suburb: Large 45.15291
## 323                     Anoka County     27003     21-Suburb: Large 45.15286
## 324                     Anoka County     27003     21-Suburb: Large 45.15284
## 325                     Anoka County     27003     21-Suburb: Large 45.20900
## 326                     Anoka County     27003     21-Suburb: Large 45.21669
## 327                   Suffolk County     25025       11-City: Large 42.26517
## 328                     Anson County     37007     32-Town: Distant 34.96147
## 329                    Tehama County      6103     32-Town: Distant 40.18617
## 330                Greenbrier County     54025     43-Rural: Remote 37.96326
## 331                    Dakota County     27037     21-Suburb: Large 44.78424
## 332                Washington County     27163     21-Suburb: Large 44.94778
## 333                     Anoka County     27003     21-Suburb: Large 45.18448
## 334                   Cochran County     48079     43-Rural: Remote 33.72175
## 335                   Cochise County      4003     41-Rural: Fringe 31.55394
## 336                    Graham County      4009      33-Town: Remote 32.83373
## 337                     Pinal County      4021     41-Rural: Fringe 33.02686
## 338                Santa Cruz County      4023      33-Town: Remote 31.35531
## 339                   Yavapai County      4025       13-City: Small 34.55906
## 340                      Yuma County      4027       13-City: Small 32.67760
## 341                      Gila County      4007      33-Town: Remote 33.39457
## 342                   Liberty County     12077     43-Rural: Remote 30.18617
## 343                  Anderson County     21005     32-Town: Distant 38.02344
## 344               Santa Clara County      6085       11-City: Large 37.33079
## 345                   Ventura County      6111  22-Suburb: Mid-size 34.26952
## 346                 Outagamie County     55087       13-City: Small 44.25923
## 347                    Howard County     24027       13-City: Small 39.23523
## 348                    Fulton County     13121       11-City: Large 33.67516
## 349              San Patricio County     48409      31-Town: Fringe 27.90316
## 350                   Boulder County      8013  22-Suburb: Mid-size 40.01342
## 351                    Colusa County      6011     32-Town: Distant 39.01002
## 352                    Morgan County     17137     32-Town: Distant 39.73754
## 353                   Douglas County     17041     32-Town: Distant 39.68161
## 354                  Le Sueur County     27079     41-Rural: Fringe 44.45141
## 355                    Ramsey County     27123     21-Suburb: Large 45.04410
## 356               Los Angeles County      6037     21-Suburb: Large 33.92471
## 357                Stanislaus County      6099     21-Suburb: Large 37.59042
## 358                Washington County     27163     21-Suburb: Large 44.92410
## 359                 Minnehaha County     46099    12-City: Mid-size 43.57764
## 360                Santa Cruz County      6087       13-City: Small 36.98097
## 361                   Tarrant County     48439       11-City: Large 32.64247
## 362                 Snohomish County     53061  22-Suburb: Mid-size 48.15591
## 363                    Macomb County     26099    42-Rural: Distant 42.84631
## 364                  Hennepin County     27053       13-City: Small 45.02008
## 365               Los Angeles County      6037     21-Suburb: Large 34.11174
## 366                 St. Louis County     27137       13-City: Small 46.81672
## 367               Los Angeles County      6037       11-City: Large 34.10195
## 368                    Harris County     48201     21-Suburb: Large 29.79579
## 369                 Lancaster County     31109       11-City: Large 40.80726
## 370                 Clackamas County     41005     21-Suburb: Large 45.30397
## 371             San Francisco County      6075       11-City: Large 37.74508
## 372                   Lincoln County     37109      31-Town: Fringe 35.47823
## 373                   Broward County     12011     21-Suburb: Large 26.24604
## 374                     Huron County     26063      33-Town: Remote 43.80422
## 375                      Hale County     48189      33-Town: Remote 34.19059
## 376                     Wayne County     26163     21-Suburb: Large 42.19084
## 377                 Jessamine County     21113     41-Rural: Fringe 37.94680
## 378                  Richmond County     37153     41-Rural: Fringe 34.89705
## 379                    Uintah County     49047     41-Rural: Fringe 40.46372
## 380                     Pinal County      4021      31-Town: Fringe 33.03898
## 381                      Pima County      4019     41-Rural: Fringe 32.41775
## 382                  Maricopa County      4013       11-City: Large 33.43255
## 383                   Cochise County      4003    42-Rural: Distant 31.46073
## 384                    Graham County      4009    42-Rural: Distant 32.83042
## 385                     Pinal County      4021     41-Rural: Fringe 33.03410
## 386                     Pinal County      4021      31-Town: Fringe 33.03068
## 387                      Gila County      4007    42-Rural: Distant 33.41671
## 388                    Navajo County      4017      33-Town: Remote 34.98474
## 389                   El Paso County      8041       11-City: Large 38.95136
## 390                    Richmond city     51760    12-City: Mid-size 37.57908
## 391                    Orange County     12095     21-Suburb: Large 28.60853
## 392                   Douglas County     32005     41-Rural: Fringe 38.95932
## 393                 Effingham County     17049      33-Town: Remote 39.11982
## 394                 Riverside County      6065  22-Suburb: Mid-size 33.73180
## 395                 Milwaukee County     55079       11-City: Large 43.10210
## 396                   Tarrant County     48439       11-City: Large 32.76041
## 397                    Jasper County     17079    42-Rural: Distant 38.99028
## 398                    Jasper County     17079    42-Rural: Distant 38.99028
## 399           San Luis Obispo County      6079     23-Suburb: Small 35.51344
## 400                  Atascosa County     48013     32-Town: Distant 28.92054
## 401                  Atascosa County     48013     32-Town: Distant 28.92075
## 402                  Atascosa County     48013     32-Town: Distant 28.92152
## 403                  Atascosa County     48013     32-Town: Distant 28.92051
## 404                  Atascosa County     48013     32-Town: Distant 28.92083
## 405                  Atascosa County     48013     32-Town: Distant 28.92053
## 406                  Atascosa County     48013     32-Town: Distant 28.92051
## 407                   Genesee County     26049     21-Suburb: Large 42.99292
## 408                  Atlantic County     34001     41-Rural: Fringe 39.53658
## 409                  Atlantic County     34001  22-Suburb: Mid-size 39.43825
## 410                  Atlantic County     34001  22-Suburb: Mid-size 39.42053
## 411                  Atlantic County     34001  22-Suburb: Mid-size 39.42045
## 412                   Bristol County     25005     21-Suburb: Large 41.93772
## 413                    Merced County      6047  22-Suburb: Mid-size 37.35520
## 414                   Fayette County     21067       11-City: Large 38.04717
## 415                  Richmond County     13245    12-City: Mid-size 33.39154
## 416                  Richmond County     13245    12-City: Mid-size 33.39139
## 417                  Imperial County      6025  22-Suburb: Mid-size 32.68074
## 418                    Aurora County     46003     43-Rural: Remote 43.72486
## 419                    Aurora County     46003     43-Rural: Remote 43.72486
## 420                     Mower County     27099     32-Town: Distant 43.66903
## 421                     Mower County     27099     32-Town: Distant 43.66900
## 422                    Travis County     48453       11-City: Large 30.27221
## 423                    Travis County     48453       11-City: Large 30.21163
## 424                    Travis County     48453       11-City: Large 30.27207
## 425                   Autauga County      1001     21-Suburb: Large 32.45506
## 426           Anchorage Municipality      2020       11-City: Large 61.21796
## 427               Los Angeles County      6037       11-City: Large 33.79191
## 428                  Thurston County     53067       13-City: Small 47.04349
## 429                   Oakland County     26125     21-Suburb: Large 42.63445
## 430                  McLennan County     48309    42-Rural: Distant 31.65878
## 431                  McLennan County     48309    42-Rural: Distant 31.30622
## 432                  McLennan County     48309    42-Rural: Distant 31.30622
## 433                   Tarrant County     48439     21-Suburb: Large 32.91393
## 434                    Upshur County     48459    42-Rural: Distant 32.56835
## 435                     Smith County     48423     41-Rural: Fringe 32.34694
## 436                     Smith County     48423    12-City: Mid-size 32.34891
## 437               Doña Ana County     35013     41-Rural: Fringe 32.26805
## 438                  Beaufort County     37013     32-Town: Distant 35.54421
## 439                 Vermilion County     17183     41-Rural: Fringe 40.26311
## 440                    Orange County      6059    12-City: Mid-size 33.65356
## 441                 San Mateo County      6081       13-City: Small 37.64997
## 442                     White County      5145      31-Town: Fringe 35.06537
## 443                Clearwater County     27029     43-Rural: Remote 47.52347
## 444               Los Angeles County      6037       11-City: Large 34.24833
## 445                 Baltimore County     24005       13-City: Small 39.39939
## 446                 Van Buren County     26159    42-Rural: Distant 42.30802
## 447                       Bay County     26017     23-Suburb: Small 43.60386
## 448                 Milwaukee County     55079       11-City: Large 43.04316
## 449                 Riverside County      6065     21-Suburb: Large 33.93032
## 450                    Nueces County     48355       11-City: Large 27.79597
## 451                    Baraga County     26013     43-Rural: Remote 46.76262
## 452                    Dallas County     48113    12-City: Mid-size 32.82182
## 453                   Midland County     48329    12-City: Mid-size 32.03823
## 454                    Dallas County     48113       11-City: Large 32.70410
## 455                    Dallas County     48113       11-City: Large 32.70419
## 456                    Cabell County     54011     41-Rural: Fringe 38.38908
## 457                 Kalamazoo County     26077  22-Suburb: Mid-size 42.31814
## 458                    Nelson County     21179     32-Town: Distant 37.82519
## 459                     Pinal County      4021      31-Town: Fringe 32.98032
## 460                    Kitsap County     53035  22-Suburb: Mid-size 47.62234
## 461                   Jackson County     21109     43-Rural: Remote 37.31934
## 462                   Jackson County     21109     43-Rural: Remote 37.31934
## 463                    Marion County     54049     32-Town: Distant 39.50113
## 464                St. Joseph County     26149      31-Town: Fringe 41.94604
## 465                    Kenton County     21117     21-Suburb: Large 39.01852
## 466                      Polk County     12105     21-Suburb: Large 27.88061
## 467                  Hennepin County     27053       11-City: Large 44.99951
## 468                     Teton County     16081     43-Rural: Remote 43.73030
## 469                   Bastrop County     48021      31-Town: Fringe 30.34785
## 470                   Bastrop County     48021     32-Town: Distant 30.11315
## 471                    Pierce County     53053    12-City: Mid-size 47.25196
## 472                   Calhoun County     26025       13-City: Small 42.30351
## 473                    Barren County     21009     32-Town: Distant 36.99586
## 474                       Bay County     26017     23-Suburb: Small 43.61861
## 475                       Bay County     26017       13-City: Small 43.60583
## 476                       Bay County     26017     23-Suburb: Small 43.60533
## 477                       Bay County     12005       13-City: Small 30.16733
## 478                     Brown County     55009    12-City: Mid-size 44.51182
## 479                       Bay County     26017     23-Suburb: Small 43.61253
## 480                     Pasco County     12101     21-Suburb: Large 28.27426
## 481                 Riverside County      6065     21-Suburb: Large 33.90903
## 482                  Pinellas County     12103     21-Suburb: Large 27.90315
## 483                   Stearns County     27145     43-Rural: Remote 45.50223
## 484                 Baltimore County     24005       13-City: Small 39.39944
## 485               Los Angeles County      6037       11-City: Large 33.80542
## 486                    Warren County     21227       13-City: Small 37.00708
## 487                  Hennepin County     27053       13-City: Small 44.82794
## 488                  Hennepin County     27053       13-City: Small 44.82792
## 489                   Collier County     12021     21-Suburb: Large 26.14108
## 490                 Sherburne County     27141     32-Town: Distant 45.39998
## 491                   Raleigh County     54081     41-Rural: Fringe 37.82514
## 492                    Plumas County      6063     41-Rural: Fringe 39.80173
## 493                   Calhoun County     26025     41-Rural: Fringe 42.39787
## 494                   Bedford County     51019     32-Town: Distant 37.32720
## 495                     Kings County     36047       11-City: Large 40.68482
## 496                  Valencia County     35061     23-Suburb: Small 34.65895
## 497                      Bell County     48027       13-City: Small 31.10259
## 498                      Bell County     48027    12-City: Mid-size 31.11439
## 499                      Bell County     48027     32-Town: Distant 30.79712
## 500                      Bell County     48027    12-City: Mid-size 31.11439
## 501                      Bell County     21013    42-Rural: Distant 36.72918
## 502                      Bell County     48027     41-Rural: Fringe 30.97678
## 503                      Bell County     48027     41-Rural: Fringe 30.97678
## 504                      Bell County     48027    42-Rural: Distant 30.92921
## 505                      Bell County     48027     41-Rural: Fringe 30.97678
## 506                Williamson County     48491    42-Rural: Distant 30.84527
## 507                      Bell County     48027    42-Rural: Distant 30.92921
## 508                      Bell County     48027    42-Rural: Distant 30.88030
## 509                     Ionia County     26067     32-Town: Distant 42.97852
## 510                     Butte County     46019      33-Town: Remote 44.66396
## 511                 Sebastian County      5131       13-City: Small 35.37294
## 512                      King County     53033    12-City: Mid-size 47.59211
## 513                 Jefferson County     21111     21-Suburb: Large 38.26827
## 514               Los Angeles County      6037     21-Suburb: Large 33.88254
## 515                   Whatcom County     53073       13-City: Small 48.71896
## 516                   Whatcom County     53073       13-City: Small 48.75927
## 517                    Wright County     19197    42-Rural: Distant 42.84935
## 518                      Rock County     55105       13-City: Small 42.50852
## 519                  Beltrami County     27007      33-Town: Remote 47.46354
## 520                  Beltrami County     27007     41-Rural: Fringe 47.48736
## 521                  Beltrami County     27007     41-Rural: Fringe 47.46542
## 522                   Genesee County     26049     21-Suburb: Large 42.99377
## 523                    Elmore County     16039     32-Town: Distant 43.13352
## 524                     Swift County     27151      33-Town: Remote 45.31943
## 525                     Swift County     27151      33-Town: Remote 45.31947
## 526           Anchorage Municipality      2020     41-Rural: Fringe 61.17955
## 527                   Genesee County     26049     21-Suburb: Large 43.02303
## 528                    Benzie County     26019     43-Rural: Remote 44.58902
## 529                    Bergen County     34003     21-Suburb: Large 40.95576
## 530                    Bergen County     34003     21-Suburb: Large 40.95512
## 531                   Alameda County      6001    12-City: Mid-size 37.85941
## 532                   Berrien County     26021      31-Town: Fringe 41.94467
## 533                   Berrien County     26021      31-Town: Fringe 41.94466
## 534                   Berrien County     26021      31-Town: Fringe 41.94355
## 535                   Berrien County     26021      31-Town: Fringe 41.94355
## 536               Santa Clara County      6085       11-City: Large 37.40271
## 537                    Orange County     12095       11-City: Large 28.53792
## 538                      Kent County     26081    12-City: Mid-size 42.97950
## 539                 St. Louis County     27137       13-City: Small 46.84935
## 540               Bethel Census Area      2050      33-Town: Remote 60.78694
## 541                     Bexar County     48029       11-City: Large 29.43681
## 542                     Bexar County     48029       11-City: Large 29.43681
## 543                     Bexar County     48029       11-City: Large 29.43681
## 544                     Bexar County     48029       11-City: Large 29.43681
## 545                     Bexar County     48029     21-Suburb: Large 29.49245
## 546                     Bexar County     48029       11-City: Large 29.43681
## 547                     Bexar County     48029     41-Rural: Fringe 29.30872
## 548                     Bexar County     48029       11-City: Large 29.43681
## 549                     Bexar County     48029       11-City: Large 29.43681
## 550                     Bexar County     48029     41-Rural: Fringe 29.31156
## 551              Contra Costa County      6013     21-Suburb: Large 37.99990
## 552                     Glenn County      6021     43-Rural: Remote 39.60696
## 553                      King County     53033     21-Suburb: Large 47.43700
## 554                   Mecosta County     26107     41-Rural: Fringe 43.68505
## 555                    Howard County     48227     32-Town: Distant 32.23808
## 556                      Real County     48385     43-Rural: Remote 29.82900
## 557                     Butte County      6007    42-Rural: Distant 39.41531
## 558                      Polk County     12105     21-Suburb: Large 27.99753
## 559                  McLennan County     48309    12-City: Mid-size 31.60153
## 560                  McLennan County     48309    12-City: Mid-size 31.60155
## 561                  Imperial County      6025     41-Rural: Fringe 32.75203
## 562                     Clark County     32003       11-City: Large 36.17985
## 563                  Richland County     45079     41-Rural: Fringe 34.07480
## 564                     Duval County     12031       11-City: Large 30.43323
## 565                    Thomas County     13275     32-Town: Distant 30.85911
## 566                      Inyo County      6027     43-Rural: Remote 37.15245
## 567                      Inyo County      6027      33-Town: Remote 37.36021
## 568                      Inyo County      6027      33-Town: Remote 37.36447
## 569                       Gem County     16045     32-Town: Distant 43.87269
## 570              Contra Costa County      6013     21-Suburb: Large 38.00454
## 571                  Lawrence County     46081     32-Town: Distant 44.48446
## 572                  Lawrence County     46081     32-Town: Distant 44.48446
## 573                  Lawrence County     46081     32-Town: Distant 44.47484
## 574                   Jackson County     55053    42-Rural: Distant 44.35789
## 575            San Bernardino County      6071     41-Rural: Fringe 34.12740
## 576                   Douglas County     31055       11-City: Large 41.27293
## 577                   Whatcom County     53073      31-Town: Fringe 48.99970
## 578                   Whatcom County     53073       13-City: Small 48.76570
## 579                    Oldham County     48359     43-Rural: Remote 35.53070
## 580                 Val Verde County     48465      33-Town: Remote 29.35763
## 581                   Clinton County     26037     41-Rural: Fringe 42.81204
## 582                      Lake County      6033     32-Town: Distant 38.91475
## 583                    Tooele County     49045     41-Rural: Fringe 40.52622
## 584                 El Dorado County      6017     32-Town: Distant 38.93367
## 585                     Avery County     37011    42-Rural: Distant 36.06764
## 586                 Albemarle County     51003     23-Suburb: Small 38.00531
## 587                    Mercer County     54055     32-Town: Distant 37.25183
## 588                     Meade County     21163       13-City: Small 37.90017
## 589                     Rowan County     21205      33-Town: Remote 38.17860
## 590                     Rowan County     21205      33-Town: Remote 38.17768
## 591                  Berkeley County     54003  22-Suburb: Mid-size 39.53200
## 592                     Floyd County     13115       13-City: Small 34.27853
## 593                   Kendall County     48259      31-Town: Fringe 29.79498
## 594                    Nueces County     48355       11-City: Large 27.71758
## 595                  Renville County     27129     43-Rural: Remote 44.76982
## 596                      Vigo County     18167       13-City: Small 39.42656
## 597                     Boone County     21015     21-Suburb: Large 39.00091
## 598                    Cooper County     29053     32-Town: Distant 38.97695
## 599                    Cooper County     29053     32-Town: Distant 38.97696
## 600                   Suffolk County     25025       11-City: Large 42.34867
## 601                   Suffolk County     25025       11-City: Large 42.34608
## 602                   Suffolk County     25025       11-City: Large 42.28308
## 603                  Maricopa County      4013       11-City: Large 33.48880
## 604                   Boulder County      8013    12-City: Mid-size 40.06689
## 605                   Tarrant County     48439       11-City: Large 32.73703
## 606              Hillsborough County     12057     21-Suburb: Large 28.07102
## 607                    Warren County     21227       13-City: Small 36.98534
## 608               Los Angeles County      6037     21-Suburb: Large 34.41139
## 609                     Boyle County     21021     32-Town: Distant 37.64984
## 610               Los Angeles County      6037       11-City: Large 34.03768
## 611               Santa Clara County      6085       11-City: Large 37.31038
## 612                 Jefferson County     21111       11-City: Large 38.21130
## 613                    Oldham County     48359     43-Rural: Remote 35.53177
## 614            San Bernardino County      6071     21-Suburb: Large 33.99543
## 615                    Ramsey County     27123       11-City: Large 44.92685
## 616                  Seminole County     12117     41-Rural: Fringe 28.68469
## 617                   Douglas County     31055     21-Suburb: Large 41.25970
## 618                Miami-Dade County     12086     21-Suburb: Large 25.59544
## 619                  Bradford County     12007     32-Town: Distant 29.95158
## 620                 Jefferson County      8059    12-City: Mid-size 39.70148
## 621                       Lee County     37105     32-Town: Distant 35.48049
## 622                     Gregg County     48183       13-City: Small 32.51291
## 623                     Meade County     21163    42-Rural: Distant 37.99565
## 624              Hillsborough County     12057     21-Suburb: Large 28.00779
## 625                   Berrien County     26021     21-Suburb: Large 41.79948
## 626                    Tulare County      6107      31-Town: Fringe 36.42303
## 627                  Brazoria County     48039     41-Rural: Fringe 29.17540
## 628                  Brazoria County     48039     41-Rural: Fringe 29.22462
## 629                  Brazoria County     48039     41-Rural: Fringe 29.17544
## 630                  Brazoria County     48039     32-Town: Distant 29.13729
## 631                  Brazoria County     48039     32-Town: Distant 29.04838
## 632                  Brazoria County     48039     21-Suburb: Large 29.41939
## 633                  Brazoria County     48039    42-Rural: Distant 29.28912
## 634                  Brazoria County     48039     41-Rural: Fringe 29.17536
## 635                    Brazos County     48041       13-City: Small 30.67600
## 636                    Brazos County     48041       13-City: Small 30.67600
## 637                  McLennan County     48309    12-City: Mid-size 31.56974
## 638                 Somervell County     48425    42-Rural: Distant 32.25967
## 639                    Brazos County     48041       13-City: Small 30.65816
## 640                    Harris County     48201       11-City: Large 29.84136
## 641                  Brazoria County     48039     23-Suburb: Small 29.04431
## 642                    Orange County      6059     41-Rural: Fringe 33.92993
## 643                     Henry County     51089     41-Rural: Fringe 36.74228
## 644                 Breathitt County     21025     41-Rural: Fringe 37.53787
## 645                 Breathitt County     21025     41-Rural: Fringe 37.53790
## 646                 Breathitt County     21025     41-Rural: Fringe 37.52565
## 647                    Wilkin County     27167     32-Town: Distant 46.27063
## 648                 Jefferson County     21111       11-City: Large 38.24386
## 649                    Kitsap County     53035       13-City: Small 47.57549
## 650                   Alameda County      6001    12-City: Mid-size 37.67259
## 651                   Suffolk County     36103     21-Suburb: Large 40.78922
## 652               Los Angeles County      6037       11-City: Large 34.05072
## 653                   Brevard County     12009     21-Suburb: Large 28.44938
## 654                   Brevard County     12009     21-Suburb: Large 28.44932
## 655                   Brevard County     12009     21-Suburb: Large 28.41787
## 656                     Bexar County     48029       11-City: Large 29.40907
## 657                  Okanogan County     53047     43-Rural: Remote 48.09940
## 658                Twin Falls County     16083      33-Town: Remote 42.55613
## 659                Livingston County     26093  22-Suburb: Mid-size 42.52906
## 660                   Tarrant County     48439       11-City: Large 32.76006
## 661                   Alameda County      6001     21-Suburb: Large 37.54869
## 662                   Douglas County     53017     43-Rural: Remote 48.00749
## 663                  Garfield County      8045      33-Town: Remote 39.39731
## 664              Contra Costa County      6013     21-Suburb: Large 38.00599
## 665                     Kings County      6031     23-Suburb: Small 36.30717
## 666               Los Angeles County      6037     21-Suburb: Large 34.11174
## 667                    Orange County      6059     21-Suburb: Large 33.50489
## 668                 Jefferson County     41031     32-Town: Distant 44.62995
## 669                  Carteret County     37031     32-Town: Distant 34.73853
## 670                     Adams County      8001     21-Suburb: Large 39.98619
## 671              Contra Costa County      6013     21-Suburb: Large 38.00058
## 672                    Ramsey County     27123       11-City: Large 44.96721
## 673               Santa Clara County      6085       11-City: Large 37.26163
## 674                     Bronx County     36005       11-City: Large 40.82341
## 675                 Jefferson County     21111       11-City: Large 38.20850
## 676                     Kings County     36047       11-City: Large 40.68482
## 677                  Hennepin County     27053     21-Suburb: Large 45.06266
## 678                  Hennepin County     27053     21-Suburb: Large 45.07377
## 679                  Hennepin County     27053     21-Suburb: Large 45.07469
## 680                  Hennepin County     27053     21-Suburb: Large 45.07469
## 681                  Muskegon County     26121       13-City: Small 43.20978
## 682                  Columbia County     36021     41-Rural: Fringe 42.21146
## 683                   Broward County     12011    12-City: Mid-size 26.12436
## 684                   Broward County     12011     21-Suburb: Large 25.99814
## 685                   Sanilac County     26151    42-Rural: Distant 43.21491
## 686                     Terry County     48445     32-Town: Distant 33.18183
## 687                   Cameron County     48061    12-City: Mid-size 25.95902
## 688                     Kings County     36047       11-City: Large 40.66624
## 689                   Cameron County     48061    12-City: Mid-size 25.91398
## 690                   Cameron County     48061    12-City: Mid-size 25.95988
## 691                     Brown County     48049      33-Town: Remote 31.69095
## 692                 Lancaster County     31109       11-City: Large 40.81076
## 693                   Spokane County     53063    12-City: Mid-size 47.66537
## 694                   Fairfax County     51059     21-Suburb: Large 38.76379
## 695                   Berrien County     26021     21-Suburb: Large 41.82441
## 696                     Perry County     21193     43-Rural: Remote 37.34881
## 697                    Oldham County     21185     21-Suburb: Large 38.38943
## 698                   Hidalgo County     48215     21-Suburb: Large 26.19768
## 699                    Tulare County      6107     41-Rural: Fringe 36.04389
## 700            San Bernardino County      6071       13-City: Small 34.00759
## 701               Los Angeles County      6037     21-Suburb: Large 33.85789
## 702                    Sonoma County      6097     41-Rural: Fringe 38.72026
## 703                      Kern County      6029     32-Town: Distant 35.14994
## 704                   Tarrant County     48439     21-Suburb: Large 32.83769
## 705                   Bullitt County     21029     21-Suburb: Large 38.00140
## 706                   Midland County     26111     41-Rural: Fringe 43.61176
## 707               Los Angeles County      6037    12-City: Mid-size 34.17852
## 708               Los Angeles County      6037    12-City: Mid-size 34.17835
## 709        Matanuska-Susitna Borough      2170     32-Town: Distant 61.57981
## 710                     Clark County     32003    12-City: Mid-size 36.10894
## 711                   Mineral County     54057    42-Rural: Distant 39.33682
## 712                Burlington County     34005     41-Rural: Fringe 39.96834
## 713                Burlington County     34005     21-Suburb: Large 39.97182
## 714                Burlington County     34005     21-Suburb: Large 40.01398
## 715                Burlington County     34005     21-Suburb: Large 40.01299
## 716                    Skagit County     53057     23-Suburb: Small 48.47788
## 717                    Harris County     48201       11-City: Large 29.71212
## 718                    Shasta County      6089      33-Town: Remote 40.87982
## 719                    Shasta County      6089      33-Town: Remote 40.87982
## 720                    Harney County     41025      33-Town: Remote 43.59027
## 721                    Dakota County     27037       13-City: Small 44.80565
## 722                    Dakota County     27037     21-Suburb: Large 44.77242
## 723                    Dakota County     27037       13-City: Small 44.80562
## 724                St. Joseph County     26149    42-Rural: Distant 41.84678
## 725                    Tulare County      6107       13-City: Small 36.07057
## 726            San Bernardino County      6071     32-Town: Distant 34.90162
## 727                    Butler County     21031    42-Rural: Distant 37.21550
## 728                     Butte County      6007     23-Suburb: Small 39.71740
## 729                    Sutter County      6101     41-Rural: Fringe 39.16702
## 730                Rio Grande County      8105      33-Town: Remote 37.58236
## 731                       Bay County     12005       13-City: Small 30.16614
## 732                    Etowah County      1055       13-City: Small 34.00464
## 733                   Lincoln County     32017     43-Rural: Remote 37.61902
## 734                    Monroe County      1099     41-Rural: Fringe 31.48350
## 735                Miami-Dade County     12086     21-Suburb: Large 25.92462
## 736                   Carlton County     27017      31-Town: Fringe 46.71732
## 737                  Cabarrus County     37025       13-City: Small 35.41221
## 738                    Cabell County     54011       13-City: Small 38.42725
## 739                      Yolo County      6113     41-Rural: Fringe 38.73176
## 740                     Cache County     49005       13-City: Small 41.75510
## 741                      Hunt County     48231    42-Rural: Distant 33.07955
## 742                   Wexford County     26165      33-Town: Remote 44.24046
## 743                 San Diego County      6073     21-Suburb: Large 32.80802
## 744               Los Angeles County      6037       11-City: Large 34.21756
## 745               Santa Clara County      6085       13-City: Small 37.43647
## 746                 Calaveras County      6009    42-Rural: Distant 38.18941
## 747                 Calaveras County      6009    42-Rural: Distant 38.20280
## 748                  Burleson County     48051     32-Town: Distant 30.52399
## 749               Santa Clara County      6085       11-City: Large 37.24173
## 750                   Calhoun County      1015       13-City: Small 33.80193
## 751            San Bernardino County      6071    42-Rural: Distant 34.86076
## 752                    Orange County      6059     21-Suburb: Large 33.48393
## 753               San Joaquin County      6077     23-Suburb: Small 37.79722
## 754                New Castle County     10003       13-City: Small 39.75369
## 755                  Calloway County     21035      33-Town: Remote 36.61605
## 756                  Calloway County     21035      33-Town: Remote 36.61625
## 757                   Calvert County     24009     41-Rural: Fringe 38.55349
## 758                    Harris County     48201     21-Suburb: Large 29.82922
## 759                    Harris County     48201     21-Suburb: Large 29.82924
## 760                Sacramento County      6067     21-Suburb: Large 38.45332
## 761                     Clark County     53011     21-Suburb: Large 45.79096
## 762                    Fresno County      6019       11-City: Large 36.73322
## 763                    Fresno County      6019     32-Town: Distant 36.14579
## 764                    Camden County     34007     21-Suburb: Large 39.78396
## 765               Santa Clara County      6085       11-City: Large 37.26483
## 766                    Camden County     34007       13-City: Small 39.92894
## 767                    Camden County     34007       13-City: Small 39.92894
## 768                    Camden County     34007       13-City: Small 39.92894
## 769                  Escambia County     12033     21-Suburb: Large 30.39322
## 770                    Barron County     55005     41-Rural: Fringe 45.40669
## 771                   Cameron County     48061       13-City: Small 26.16365
## 772                   Cameron County     48061      31-Town: Fringe 26.23654
## 773                   Cameron County     48061       13-City: Small 26.19228
## 774                   Cameron County     48061  22-Suburb: Mid-size 26.16261
## 775                   Cameron County     48061       13-City: Small 26.16342
## 776                   Cameron County     48061  22-Suburb: Mid-size 26.16267
## 777                   Cameron County     48061     32-Town: Distant 26.07085
## 778                   Cameron County     48061    12-City: Mid-size 25.90809
## 779                   Cameron County     48061  22-Suburb: Mid-size 26.15791
## 780                Bernalillo County     35001     21-Suburb: Large 35.12011
## 781                 San Mateo County      6081     41-Rural: Fringe 37.30833
## 782                   Yavapai County      4025     32-Town: Distant 34.56278
## 783                    Madera County      6039     41-Rural: Fringe 37.32881
## 784                    Taylor County     21217     32-Town: Distant 37.33801
## 785                 San Diego County      6073    42-Rural: Distant 32.73406
## 786                     Hampton city     51650    12-City: Mid-size 37.01993
## 787                   Goodhue County     27049     32-Town: Distant 44.51040
## 788                   Goodhue County     27049     32-Town: Distant 44.51263
## 789                   Madison County     28089      31-Town: Fringe 32.62094
## 790                   El Paso County     48141       11-City: Large 31.88292
## 791               Los Angeles County      6037     21-Suburb: Large 34.14302
## 792                 San Mateo County      6081     21-Suburb: Large 37.47279
## 793            San Bernardino County      6071     41-Rural: Fringe 34.41283
## 794                      Pima County      4019       11-City: Large 32.19378
## 795                    Canyon County     16027  22-Suburb: Mid-size 43.66738
## 796                    Albany County     36001     21-Suburb: Large 42.75319
## 797                    Skagit County     53057      31-Town: Fringe 48.50740
## 798                 St. Clair County     26147    42-Rural: Distant 43.01864
## 799                  Cape May County     34009     41-Rural: Fringe 39.09891
## 800                  Cape May County     34009     41-Rural: Fringe 39.09899
## 801                    Orange County      6059     21-Suburb: Large 33.47991
## 802                     Hinds County     28049    12-City: Mid-size 32.35927
## 803                Sacramento County      6067       11-City: Large 38.49370
## 804                      Dane County     55025       11-City: Large 43.08585
## 805                    Navajo County      4017     43-Rural: Remote 34.42635
## 806                  Humboldt County      6023     43-Rural: Remote 41.04894
## 807                     Scott County     21209      31-Town: Fringe 38.23159
## 808                   Olmsted County     27109    12-City: Mid-size 43.99929
## 809                   Olmsted County     27109    12-City: Mid-size 43.99929
## 810                   Portage County     55097     32-Town: Distant 44.49826
## 811                     Hinds County     28049    12-City: Mid-size 32.33621
## 812                      King County     53033     21-Suburb: Large 47.31936
## 813                     Wayne County     26163     21-Suburb: Large 42.39723
## 814                     Essex County     34013     21-Suburb: Large 40.77609
## 815                  Houghton County     26061      33-Town: Remote 47.12695
## 816                   Douglas County     31055       11-City: Large 41.26758
## 817                   Allegan County     26005      31-Town: Fringe 42.67149
## 818                    Ottawa County     26139  22-Suburb: Mid-size 43.06088
## 819                Bernalillo County     35001       11-City: Large 35.09445
## 820                      King County     53033       11-City: Large 47.54723
## 821                      Hall County     31079       13-City: Small 40.90868
## 822                  San Juan County     35045     41-Rural: Fringe 36.77439
## 823                   Oakland County     26125       13-City: Small 42.47569
## 824               New Hanover County     37129    12-City: Mid-size 34.24357
## 825                   Lynchburg city     51680       13-City: Small 37.39989
## 826                      Lake County      6033     32-Town: Distant 38.91545
## 827                 San Diego County      6073    12-City: Mid-size 33.15791
## 828                 San Diego County      6073    12-City: Mid-size 33.15707
## 829                  Monterey County      6053      31-Town: Fringe 36.52938
## 830                   Tuscola County     26157     32-Town: Distant 43.50183
## 831                    Warren County     21227       13-City: Small 36.98701
## 832                    Sonoma County      6097     23-Suburb: Small 38.22662
## 833             Santa Barbara County      6083  22-Suburb: Mid-size 34.40389
## 834                  Monterey County      6053    12-City: Mid-size 36.68633
## 835                   Carroll County     21041     32-Town: Distant 38.68066
## 836                   Carroll County     51035    42-Rural: Distant 36.75707
## 837                   Carroll County     51035    42-Rural: Distant 36.76781
## 838                      Carson City     32510       13-City: Small 39.17252
## 839                      Carson City     32510       13-City: Small 39.17252
## 840                  Montcalm County     26117     43-Rural: Remote 43.16136
## 841                  Montcalm County     26117     43-Rural: Remote 43.17674
## 842                   Sanilac County     26151    42-Rural: Distant 43.43153
## 843                   Fayette County     21067       11-City: Large 38.05166
## 844                   Gadsden County     12039      31-Town: Fringe 30.58056
## 845                    Carter County     21043    42-Rural: Distant 38.31152
## 846                    Sussex County     10005     41-Rural: Fringe 38.52022
## 847                 Tom Green County     48451    12-City: Mid-size 31.46903
## 848              Chesterfield County     51041     21-Suburb: Large 37.34822
## 849                    Shelby County     47157       11-City: Large 35.10448
## 850                      Webb County     48479       11-City: Large 27.45140
## 851                  Siskiyou County      6093     43-Rural: Remote 41.96374
## 852                      King County     53033     21-Suburb: Large 47.77441
## 853                    Marion County     41047     41-Rural: Fringe 44.78866
## 854                      King County     53033       11-City: Large 47.64639
## 855                  New York County     36061       11-City: Large 40.72241
## 856                  Manistee County     26101      33-Town: Remote 44.23687
## 857                      Cass County     27021     43-Rural: Remote 47.37993
## 858                    Cassia County     16031      33-Town: Remote 42.53218
## 859                      Cass County     26027    42-Rural: Distant 41.91520
## 860                   Waupaca County     55135     32-Town: Distant 44.38717
## 861                      Clay County     12019     21-Suburb: Large 30.17017
## 862                     Duval County     12031       11-City: Large 30.30856
## 863                Miami-Dade County     12086     21-Suburb: Large 25.47553
## 864                    Albany County     56001     41-Rural: Fringe 41.35622
## 865                 Baltimore County     24005     21-Suburb: Large 39.25261
## 866                   Willacy County     48489     32-Town: Distant 26.41078
## 867                   Willacy County     48489     32-Town: Distant 26.46822
## 868                    Monroe County     17133    42-Rural: Distant 38.29051
## 869                  Kootenai County     16055       13-City: Small 47.72217
## 870               Los Angeles County      6037       11-City: Large 34.25327
## 871               Los Angeles County      6037       11-City: Large 34.03367
## 872                      Bell County     48027     41-Rural: Fringe 31.02141
## 873                   Coryell County     48099     32-Town: Distant 31.48800
## 874                    Sevier County     49041      33-Town: Remote 38.76909
## 875                 Van Buren County     26159      31-Town: Fringe 42.22146
## 876                     Anoka County     27003     21-Suburb: Large 45.13914
## 877                      Weld County      8123    12-City: Mid-size 40.40573
## 878                    Tehama County      6103     32-Town: Distant 39.92095
## 879                   Larimer County      8069    12-City: Mid-size 40.57840
## 880                    Madera County      6039     41-Rural: Fringe 36.92528
## 881                 Multnomah County     41051     21-Suburb: Large 45.51299
## 882                   Jackson County     29095       11-City: Large 38.97350
## 883               Pearl River County     28109     41-Rural: Fringe 30.61023
## 884               Pearl River County     28109     32-Town: Distant 30.52570
## 885                     Butte County      6007       13-City: Small 39.75938
## 886                    Brazos County     48041    12-City: Mid-size 30.61191
## 887                    Warren County     28149     32-Town: Distant 32.34686
## 888                 St. Louis County     29189     21-Suburb: Large 38.58308
## 889                   Henrico County     51087     21-Suburb: Large 37.66192
## 890                   Madison County     17119     21-Suburb: Large 38.73010
## 891                   Harford County     24025  22-Suburb: Mid-size 39.51806
## 892                    Lapeer County     26087      31-Town: Fringe 43.05510
## 893                  Hennepin County     27053       11-City: Large 44.95831
## 894                  Hennepin County     27053       11-City: Large 44.95829
## 895                 Mendocino County      6045    42-Rural: Distant 39.32155
## 896               Los Angeles County      6037     21-Suburb: Large 33.91821
## 897                       Ada County     16001     21-Suburb: Large 43.65998
## 898                    Ramsey County     27123     21-Suburb: Large 45.08935
## 899                  Monterey County      6053  22-Suburb: Mid-size 36.77553
## 900                  Monterey County      6053  22-Suburb: Mid-size 36.67537
## 901                     Davie County     37059      31-Town: Fringe 35.90772
## 902                Blue Earth County     27013       13-City: Small 44.15740
## 903                   Haywood County     37087     21-Suburb: Large 35.53458
## 904               Los Angeles County      6037       11-City: Large 34.03165
## 905                Blue Earth County     27013       13-City: Small 44.15740
## 906               Santa Clara County      6085     23-Suburb: Small 37.15457
## 907            San Bernardino County      6071     32-Town: Distant 34.90202
## 908                    Ottawa County     26139  22-Suburb: Mid-size 43.06059
## 909                   Madison County     16065     32-Town: Distant 43.81785
## 910                       Bay County     12005       13-City: Small 30.17951
## 911               Los Angeles County      6037       11-City: Large 34.06409
## 912                   Jackson County     41029       13-City: Small 42.31606
## 913                   Gratiot County     26057     32-Town: Distant 43.41392
## 914                  Hennepin County     27053       13-City: Small 44.98171
## 915                 Dickinson County     26043      33-Town: Remote 45.81812
## 916                   Stearns County     27145       13-City: Small 45.57095
## 917                   Stearns County     27145    42-Rural: Distant 45.73443
## 918                   Stearns County     27145    42-Rural: Distant 45.31398
## 919                   Stearns County     27145  22-Suburb: Mid-size 45.62261
## 920                    Benton County     27009    42-Rural: Distant 45.67209
## 921                    Benton County     27009     41-Rural: Fringe 45.60965
## 922                  Valencia County     35061     23-Suburb: Small 34.78735
## 923                     Pasco County     12101     21-Suburb: Large 28.20174
## 924                    Marion County     47115     32-Town: Distant 35.08324
## 925                     Adams County     28001      33-Town: Remote 31.56277
## 926                New Castle County     10003     21-Suburb: Large 39.71209
## 927                    Fresno County      6019       11-City: Large 36.77799
## 928                      Kern County      6029      31-Town: Fringe 35.50824
## 929                      Dane County     55025       11-City: Large 43.13953
## 930                    Marion County     17121      33-Town: Remote 38.55000
## 931                   Ventura County      6111    12-City: Mid-size 34.20526
## 932                  Valencia County     35061     23-Suburb: Small 34.79700
## 933               Los Angeles County      6037     21-Suburb: Large 34.09055
## 934                   Hubbard County     27057     41-Rural: Fringe 46.92744
## 935                   El Paso County     48141       11-City: Large 31.72898
## 936                   El Paso County     48141       11-City: Large 31.72898
## 937                      Yolo County      6113     23-Suburb: Small 38.68444
## 938               Los Angeles County      6037     21-Suburb: Large 33.91887
## 939                    Nueces County     48355       11-City: Large 27.71589
## 940                    Orange County      6059       11-City: Large 33.71871
## 941                   Baldwin County      1003      31-Town: Fringe 30.55251
## 942                   Chaffee County      8015      33-Town: Remote 38.84367
## 943            San Bernardino County      6071    12-City: Mid-size 34.08804
## 944            San Bernardino County      6071    12-City: Mid-size 34.08756
## 945                  McLennan County     48309    12-City: Mid-size 31.58472
## 946                  McLennan County     48309    42-Rural: Distant 31.30622
## 947                  McLennan County     48309    12-City: Mid-size 31.58472
## 948                  McLennan County     48309    12-City: Mid-size 31.58472
## 949                  McLennan County     48309    12-City: Mid-size 31.58472
## 950                  McLennan County     48309    12-City: Mid-size 31.52700
## 951                  McLennan County     48309    12-City: Mid-size 31.52700
## 952                  McLennan County     48309    12-City: Mid-size 31.56847
## 953                  McLennan County     48309    12-City: Mid-size 31.52700
## 954                  McLennan County     48309    12-City: Mid-size 31.58472
## 955                  McLennan County     48309    12-City: Mid-size 31.52700
## 956                  McLennan County     48309    12-City: Mid-size 31.56847
## 957                  McLennan County     48309    12-City: Mid-size 31.52700
## 958                  McLennan County     48309    12-City: Mid-size 31.58472
## 959                  McLennan County     48309    12-City: Mid-size 31.58472
## 960                 Snohomish County     53061     21-Suburb: Large 47.79290
## 961                     Pecos County     48371     43-Rural: Remote 30.90932
## 962                    Pierce County     53053     21-Suburb: Large 47.09241
## 963                  Maricopa County      4013     21-Suburb: Large 33.53031
## 964            San Bernardino County      6071     32-Town: Distant 34.90187
## 965                Miami-Dade County     12086     21-Suburb: Large 25.47487
## 966                    Orange County     12095     21-Suburb: Large 28.46454
## 967                   Kanawha County     54039       13-City: Small 38.38008
## 968                  Maricopa County      4013     21-Suburb: Large 33.32705
## 969                   Ventura County      6111     21-Suburb: Large 34.44841
## 970            San Bernardino County      6071      31-Town: Fringe 34.41783
## 971                 San Diego County      6073     21-Suburb: Large 32.81728
## 972               Los Angeles County      6037     21-Suburb: Large 34.11782
## 973                Charlevoix County     26029      33-Town: Remote 45.21144
## 974                  Pinellas County     12103       11-City: Large 27.74531
## 975                   Portage County     55097     32-Town: Distant 44.52214
## 976                  San Juan County     35045      31-Town: Fringe 36.70188
## 977             Charlottesville city     51540       13-City: Small 38.03711
## 978                 El Dorado County      6017      31-Town: Fringe 38.68081
## 979                 El Dorado County      6017     41-Rural: Fringe 38.72074
## 980                 Chattooga County     13055     32-Town: Distant 34.46497
## 981                Chautauqua County     36013    42-Rural: Distant 42.25448
## 982            San Bernardino County      6071     32-Town: Distant 34.25154
## 983                     Bexar County     48029       11-City: Large 29.55497
## 984                 Cheboygan County     26031    42-Rural: Distant 45.57148
## 985                    Chelan County     53007     32-Town: Distant 47.84142
## 986                   Spokane County     53063      31-Town: Fringe 47.49814
## 987                    Camden County     34007     21-Suburb: Large 39.86064
## 988                    Camden County     34007     21-Suburb: Large 39.86062
## 989                    Camden County     34007     21-Suburb: Large 39.86064
## 990                   Saginaw County     26145    42-Rural: Distant 43.19328
## 991                  Chesapeake city     51550     21-Suburb: Large 36.80235
## 992                    Fresno County      6019     32-Town: Distant 36.20939
## 993                 St. Louis County     27137       13-City: Small 46.81472
## 994              Chesterfield County     51041     21-Suburb: Large 37.38157
## 995               Los Angeles County      6037       11-City: Large 34.03557
## 996                   Stevens County     53065     43-Rural: Remote 48.28137
## 997                   Stevens County     53065     43-Rural: Remote 48.28137
## 998                  Pinellas County     12103    12-City: Mid-size 28.03114
## 999                   Hampden County     25013     21-Suburb: Large 42.19765
## 1000                Lancaster County     31109       11-City: Large 40.79624
## 1001                    Clark County     32003       11-City: Large 36.17472
## 1002                   Orange County     12095     21-Suburb: Large 28.61742
## 1003                  Tarrant County     48439       11-City: Large 32.76019
## 1004                    Bexar County     48029       11-City: Large 29.45734
## 1005                   Warren County     21227       13-City: Small 36.99530
## 1006               Bernalillo County     35001       11-City: Large 35.09235
## 1007                  Chilton County      1021     32-Town: Distant 32.84090
## 1008           San Bernardino County      6071     21-Suburb: Large 33.96907
## 1009               Williamson County     48491     21-Suburb: Large 30.66436
## 1010                 Chippewa County     26033      33-Town: Remote 46.25775
## 1011                   Macomb County     26099     21-Suburb: Large 42.60908
## 1012                  Chisago County     27025     32-Town: Distant 45.39037
## 1013                  Chisago County     27025     41-Rural: Fringe 45.37443
## 1014                     King County     53033     21-Suburb: Large 47.43701
## 1015                 Hennepin County     27053       13-City: Small 44.84367
## 1016                 Hennepin County     27053       13-City: Small 44.84351
## 1017                    Mason County     53045     32-Town: Distant 47.21564
## 1018                McCracken County     21145      33-Town: Remote 37.07099
## 1019               Montgomery County     17135     32-Town: Distant 39.30017
## 1020                   Dallas County     48113    12-City: Mid-size 32.93702
## 1021                Christian County     21047     32-Town: Distant 36.81823
## 1022                Christian County     21047     32-Town: Distant 36.86609
## 1023                    Bexar County     48029       11-City: Large 29.42751
## 1024                     Taos County     35055      33-Town: Remote 36.39282
## 1025                   Pierce County     53053     21-Suburb: Large 47.22427
## 1026                 Keweenaw County     26083    42-Rural: Distant 47.30549
## 1027                  Oakland County     26125     21-Suburb: Large 42.51443
## 1028                Churchill County     32001      33-Town: Remote 39.47218
## 1029              Los Angeles County      6037    12-City: Mid-size 34.16203
## 1030                 Eastland County     48133      33-Town: Remote 32.38603
## 1031                   Citrus County     12017     41-Rural: Fringe 28.81849
## 1032               Miami-Dade County     12086     21-Suburb: Large 25.85979
## 1033                   Tulare County      6107       13-City: Small 36.08325
## 1034           San Bernardino County      6071     21-Suburb: Large 34.07410
## 1035                   Citrus County     12017     41-Rural: Fringe 28.81845
## 1036                Jefferson County      1073    12-City: Mid-size 33.51578
## 1037              Los Angeles County      6037     21-Suburb: Large 34.03394
## 1038                      Lee County     12071       13-City: Small 26.60399
## 1039                    Wayne County     26163     21-Suburb: Large 42.34301
## 1040                    Clare County     26035     41-Rural: Fringe 43.82620
## 1041                    Clark County     32003       11-City: Large 36.14833
## 1042                    Clark County     32003       11-City: Large 36.17472
## 1043                    Clark County     18019     21-Suburb: Large 38.31749
## 1044                  Oakland County     26125     21-Suburb: Large 42.73918
## 1045                  Oakland County     26125     21-Suburb: Large 42.72791
## 1046                    Evans County     13109     32-Town: Distant 32.14200
## 1047                     Clay County     27027     41-Rural: Fringe 46.84864
## 1048                Galveston County     48167     21-Suburb: Large 29.50982
## 1049                 Pinellas County     12103    12-City: Mid-size 27.97604
## 1050                 Cleburne County      1029    42-Rural: Distant 33.59728
## 1051                   Hendry County     12051      33-Town: Remote 26.75611
## 1052                Kalamazoo County     26077     41-Rural: Fringe 42.23209
## 1053                  El Paso County     48141       11-City: Large 31.72898
## 1054                    Hinds County     28049     21-Suburb: Large 32.33130
## 1055                  Clinton County     36019     41-Rural: Fringe 44.72010
## 1056                   Macomb County     26099     21-Suburb: Large 42.55577
## 1057                  Genesee County     26049     21-Suburb: Large 43.18101
## 1058                  Genesee County     26049     21-Suburb: Large 43.18103
## 1059                     King County     53033     21-Suburb: Large 47.65240
## 1060                Jefferson County     17081     32-Town: Distant 38.31658
## 1061                  Carlton County     27017      31-Town: Fringe 46.71733
## 1062                Bear Lake County     16007     43-Rural: Remote 42.32917
## 1063                     Lake County      6033     32-Town: Distant 39.16522
## 1064                  Douglas County      8035     21-Suburb: Large 39.37308
## 1065                   Fresno County      6019     21-Suburb: Large 36.83424
## 1066                   Fresno County      6019     21-Suburb: Large 36.83424
## 1067                   Uvalde County     48463     43-Rural: Remote 29.32528
## 1068                  Lowndes County     28087      33-Town: Remote 33.50629
## 1069                Riverside County      6065     21-Suburb: Large 33.91729
## 1070                 Pershing County     32027     43-Rural: Remote 40.22278
## 1071                   Orange County      6059     21-Suburb: Large 33.72073
## 1072                Galveston County     48167  22-Suburb: Mid-size 29.39923
## 1073                Galveston County     48167  22-Suburb: Mid-size 29.37865
## 1074                Galveston County     48167  22-Suburb: Mid-size 29.37865
## 1075                Galveston County     48167  22-Suburb: Mid-size 29.37865
## 1076                   Richmond city     51760    12-City: Mid-size 37.56809
## 1077                   Nevada County      6057     32-Town: Distant 39.32375
## 1078                   Nueces County     48355       11-City: Large 27.79979
## 1079               Bernalillo County     35001       11-City: Large 35.07534
## 1080                  Hidalgo County     48215     21-Suburb: Large 26.19279
## 1081                  El Paso County     48141       11-City: Large 31.78568
## 1082                   Brazos County     48041    12-City: Mid-size 30.59305
## 1083                   Barren County     21009     32-Town: Distant 36.99194
## 1084                   Hardin County     21093       13-City: Small 37.68824
## 1085                   Nueces County     48355       11-City: Large 27.79603
## 1086                    Bexar County     48029       11-City: Large 29.36712
## 1087                  Collier County     12021     21-Suburb: Large 26.12849
## 1088                   Collin County     48085     21-Suburb: Large 33.10107
## 1089                   Collin County     48085  22-Suburb: Mid-size 33.19556
## 1090                   Collin County     48085  22-Suburb: Mid-size 33.24889
## 1091                   Collin County     48085  22-Suburb: Mid-size 33.17725
## 1092                   Collin County     48085  22-Suburb: Mid-size 33.24897
## 1093                   Collin County     48085  22-Suburb: Mid-size 33.24882
## 1094                   Collin County     48085      31-Town: Fringe 33.17090
## 1095                   Collin County     48085     21-Suburb: Large 33.00328
## 1096                   Collin County     48085     41-Rural: Fringe 33.06352
## 1097                   Merced County      6047     41-Rural: Fringe 37.40169
## 1098                   Denver County      8031       11-City: Large 39.73488
## 1099                 Mitchell County     48335    42-Rural: Distant 32.36012
## 1100                 Arapahoe County      8005     21-Suburb: Large 39.67248
## 1101                   Tehama County      6103     41-Rural: Fringe 39.89148
## 1102                    Anoka County     27003     21-Suburb: Large 45.05617
## 1103                  Jackson County     26075     41-Rural: Fringe 42.12511
## 1104                  Stevens County     53065     43-Rural: Remote 48.11972
## 1105                 Columbia County     55021     32-Town: Distant 43.56635
## 1106                 Columbia County     41009      31-Town: Fringe 45.86572
## 1107                 Columbia County     36021     41-Rural: Fringe 42.21340
## 1108                  Jackson County     26075     41-Rural: Fringe 42.12615
## 1109                  Stevens County     53065     43-Rural: Remote 48.16965
## 1110                  Stevens County     53065    42-Rural: Distant 48.60258
## 1111                Snohomish County     53061      31-Town: Fringe 47.86635
## 1112                    Ferry County     53019     43-Rural: Remote 48.86806
## 1113                   Shasta County      6089       13-City: Small 40.60245
## 1114              Los Angeles County      6037     21-Suburb: Large 33.91957
## 1115                 Colorado County     48089      33-Town: Remote 29.70241
## 1116                   Austin County     48015     43-Rural: Remote 29.90531
## 1117             Hillsborough County     12057     21-Suburb: Large 27.96757
## 1118                   Colusa County      6011     32-Town: Distant 39.20062
## 1119                   Colusa County      6011     32-Town: Distant 39.20032
## 1120                    Comal County     48091       13-City: Small 29.70729
## 1121                    Comal County     48091       13-City: Small 29.70680
## 1122                Riverside County      6065       11-City: Large 33.97891
## 1123               Washington County     21229    42-Rural: Distant 37.68196
## 1124              Mecklenburg County     37119       11-City: Large 35.20971
## 1125          Prince George's County     24033     21-Suburb: Large 38.94013
## 1126              Santa Clara County      6085    12-City: Mid-size 37.35100
## 1127                   Solano County      6095  22-Suburb: Mid-size 38.04961
## 1128                San Mateo County      6081       13-City: Small 37.65186
## 1129                   Fresno County      6019      31-Town: Fringe 36.70512
## 1130              Los Angeles County      6037     21-Suburb: Large 34.08378
## 1131                  Alameda County      6001       11-City: Large 37.78799
## 1132                  Alameda County      6001       11-City: Large 37.78792
## 1133                     Inyo County      6027      33-Town: Remote 37.36219
## 1134                   Denton County     48121    12-City: Mid-size 33.22504
## 1135                  Ventura County      6111  22-Suburb: Mid-size 34.27081
## 1136                 Monterey County      6053  22-Suburb: Mid-size 36.60569
## 1137                 Buncombe County     37021     21-Suburb: Large 35.60277
## 1138                Washtenaw County     26161    12-City: Mid-size 42.28395
## 1139                    Smith County     28129     43-Rural: Remote 31.99452
## 1140                  El Paso County      8041       11-City: Large 38.84267
## 1141               Washington County     41067       13-City: Small 45.50612
## 1142                   Harris County     48201     21-Suburb: Large 29.68214
## 1143                     King County     53033     21-Suburb: Large 47.66381
## 1144           San Bernardino County      6071    12-City: Mid-size 34.11053
## 1145                   Harris County     48201       11-City: Large 29.73223
## 1146                  Madison County     18095       13-City: Small 40.09606
## 1147                 Cherokee County     48073     32-Town: Distant 31.93351
## 1148                    Scott County     27139     32-Town: Distant 44.55742
## 1149                     Polk County     12105     21-Suburb: Large 27.87960
## 1150                    Anoka County     27003     21-Suburb: Large 45.17384
## 1151              Los Angeles County      6037     21-Suburb: Large 33.88304
## 1152              Los Angeles County      6037     21-Suburb: Large 33.88303
## 1153                   Yakima County     53077     32-Town: Distant 46.38065
## 1154                   Harris County     48201     21-Suburb: Large 30.10054
## 1155                Kalamazoo County     26077  22-Suburb: Mid-size 42.31321
## 1156                 Richmond County     36085       11-City: Large 40.61087
## 1157                  Ventura County      6111    12-City: Mid-size 34.16848
## 1158                  Ventura County      6111    12-City: Mid-size 34.19910
## 1159                   Placer County      6061      31-Town: Fringe 38.89608
## 1160                     Wake County     37183     21-Suburb: Large 35.76669
## 1161                   Skagit County     53057     23-Suburb: Small 48.53189
## 1162                Jefferson County      8059     21-Suburb: Large 39.73655
## 1163                  Suffolk County     36103     21-Suburb: Large 40.74123
## 1164                 Chippewa County     26033      33-Town: Remote 46.26054
## 1165               St. Joseph County     26149      31-Town: Fringe 41.83597
## 1166                   Denver County      8031       11-City: Large 39.73004
## 1167               Bernalillo County     35001       11-City: Large 35.11295
## 1168                   Macomb County     26099     21-Suburb: Large 42.56239
## 1169                   Mobile County      1097    12-City: Mid-size 30.70215
## 1170                   Yakima County     53077     32-Town: Distant 46.25520
## 1171                     King County     53033       13-City: Small 47.67092
## 1172                     Cook County     27031     43-Rural: Remote 47.75686
## 1173                  Grayson County     48181     41-Rural: Fringe 33.70777
## 1174              Rock Island County     17161       13-City: Small 41.49087
## 1175                    Bexar County     48029       11-City: Large 29.42004
## 1176                  Jackson County     26075     23-Suburb: Small 42.29500
## 1177                 Hennepin County     27053     21-Suburb: Large 45.04117
## 1178                   Dakota County     27037     21-Suburb: Large 44.73253
## 1179                  Jackson County     17077      31-Town: Fringe 37.75606
## 1180               Miami-Dade County     12086     21-Suburb: Large 25.86707
## 1181                   Dallas County     48113     21-Suburb: Large 32.96750
## 1182                  Lincoln County     55069    42-Rural: Distant 45.32526
## 1183                  Whitley County     21235      33-Town: Remote 36.94066
## 1184                  Whitley County     21235      33-Town: Remote 36.91604
## 1185                    Kings County      6031     32-Town: Distant 36.09652
## 1186                  Alameda County      6001    12-City: Mid-size 37.61511
## 1187                   Denton County     48121     21-Suburb: Large 33.12586
## 1188                   McLeod County     27085     32-Town: Distant 44.89053
## 1189                 Campbell County     51031     41-Rural: Fringe 37.27612
## 1190                  Steuben County     36101     41-Rural: Fringe 42.11729
## 1191                Riverside County      6065    12-City: Mid-size 33.87193
## 1192                Riverside County      6065    12-City: Mid-size 33.85340
## 1193              Los Angeles County      6037     21-Suburb: Large 34.04992
## 1194                      Lee County     12071       13-City: Small 26.62066
## 1195                   Nueces County     48355       11-City: Large 27.72563
## 1196                Washtenaw County     26161     21-Suburb: Large 42.25529
## 1197                     Cass County     48067     32-Town: Distant 33.11654
## 1198                     Lane County     41039    12-City: Mid-size 44.09513
## 1199                   Canyon County     16027    42-Rural: Distant 43.68167
## 1200               Santa Cruz County      6087       13-City: Small 36.98114
## 1201               Burlington County     34005     41-Rural: Fringe 39.78604
## 1202                  Jackson County     26075     23-Suburb: Small 42.28879
## 1203                San Diego County      6073    42-Rural: Distant 32.73208
## 1204                   Solano County      6095     23-Suburb: Small 38.35832
## 1205                   Tulare County      6107  22-Suburb: Mid-size 36.19588
## 1206                 Mariposa County      6043     43-Rural: Remote 37.47176
## 1207                   Amador County      6005     41-Rural: Fringe 38.37748
## 1208                   Nassau County     36059     21-Suburb: Large 40.73234
## 1209                   Collin County     48085  22-Suburb: Mid-size 33.24577
## 1210                   Macomb County     26099    12-City: Mid-size 42.51619
## 1211                    Wayne County     26163       11-City: Large 42.33531
## 1212                    Wayne County     26163       11-City: Large 42.36350
## 1213                    Wayne County     26163       11-City: Large 42.32063
## 1214                     Kent County     26081    12-City: Mid-size 42.94745
## 1215               St. Joseph County     26149    42-Rural: Distant 41.91799
## 1216                   Kenton County     21117     21-Suburb: Large 39.06142
## 1217                Covington County     28031    42-Rural: Distant 31.64189
## 1218                    Clark County     32003       11-City: Large 36.08391
## 1219                    Clark County     32003       11-City: Large 36.08391
## 1220                   Dawson County     31047     41-Rural: Fringe 40.87110
## 1221                   Pierce County     53053       13-City: Small 47.15892
## 1222                  Kaufman County     48257     41-Rural: Fringe 32.62326
## 1223               Providence County     44007     21-Suburb: Large 41.78611
## 1224            Prince George County     51149     41-Rural: Fringe 37.17167
## 1225                 Franklin County     53021     32-Town: Distant 46.68091
## 1226                    Wayne County     26163       13-City: Small 42.32298
## 1227                    Wayne County     26163     21-Suburb: Large 42.40874
## 1228                   Macomb County     26099    12-City: Mid-size 42.44810
## 1229                  Olmsted County     27109    12-City: Mid-size 43.97279
## 1230                   Sonoma County      6097      31-Town: Fringe 38.28261
## 1231                   Orange County      6059       11-City: Large 33.69067
## 1232                 Callaway County     29027     32-Town: Distant 38.84501
## 1233              Los Angeles County      6037       11-City: Large 34.04718
## 1234                 Okaloosa County     12091     41-Rural: Fringe 30.69897
## 1235                   DeKalb County     13089       11-City: Large 33.74636
## 1236                    Crisp County     13081     41-Rural: Fringe 31.92589
## 1237                   Taylor County     48441    12-City: Mid-size 32.43436
## 1238          Prince George's County     24033     41-Rural: Fringe 38.73505
## 1239                   Harris County     48201     21-Suburb: Large 29.89991
## 1240                   Crosby County     48107     43-Rural: Remote 33.65838
## 1241          Prince George's County     24033     21-Suburb: Large 38.79442
## 1242                   Harris County     48201       11-City: Large 29.70780
## 1243                   Sonoma County      6097     23-Suburb: Small 38.23127
## 1244               Palm Beach County     12099     32-Town: Distant 26.68519
## 1245                   Merced County      6047     32-Town: Distant 37.06534
## 1246                     Kent County     26081     21-Suburb: Large 42.85457
## 1247                    Bristol city     51520       13-City: Small 36.60001
## 1248                     Pine County     27115     43-Rural: Remote 46.13835
## 1249                Baltimore County     24005     21-Suburb: Large 39.35457
## 1250              Los Angeles County      6037     21-Suburb: Large 34.68720
## 1251                Jefferson County     53031    42-Rural: Distant 47.82380
## 1252                  Coryell County     48099  22-Suburb: Mid-size 31.12125
## 1253                  Johnson County     48251     21-Suburb: Large 32.52991
## 1254             Contra Costa County      6013     21-Suburb: Large 37.96888
## 1255                  Alameda County      6001     21-Suburb: Large 37.54686
## 1256                Snohomish County     53061      31-Town: Fringe 48.08515
## 1257                Charlotte County     12015    42-Rural: Distant 26.93529
## 1258                  Carroll County     24013     41-Rural: Fringe 39.53484
## 1259                      Ada County     16001     21-Suburb: Large 43.61056
## 1260                Jefferson County      1073       13-City: Small 33.33760
## 1261          Anchorage Municipality      2020       11-City: Large 61.22389
## 1262                    Anoka County     27003     41-Rural: Fringe 45.40006
## 1263                    Anoka County     27003     41-Rural: Fringe 45.37674
## 1264                   Hardin County     21093     41-Rural: Fringe 37.74314
## 1265                   Parker County     48367     41-Rural: Fringe 32.69605
## 1266                   Dallas County     48113     21-Suburb: Large 32.75639
## 1267                    Bronx County     36005       11-City: Large 40.82931
## 1268                   McLeod County     27085     32-Town: Distant 44.88444
## 1269                  Tarrant County     48439     21-Suburb: Large 32.57926
## 1270                     Clay County     29047       11-City: Large 39.17703
## 1271                  Cullman County      1043    42-Rural: Distant 34.20756
## 1272                  Cullman County      1043     32-Town: Distant 34.17915
## 1273              Los Angeles County      6037     21-Suburb: Large 34.00732
## 1274              Los Angeles County      6037     21-Suburb: Large 34.00626
## 1275                    Smith County     48423    12-City: Mid-size 32.29615
## 1276               Cumberland County     34011     41-Rural: Fringe 39.41303
## 1277                Christian County     21047     41-Rural: Fringe 36.73817
## 1278               Cumberland County     34011     41-Rural: Fringe 39.44739
## 1279               Cumberland County     34011     41-Rural: Fringe 39.44739
## 1280                    Ferry County     53019     43-Rural: Remote 48.87441
## 1281                   Tulare County      6107     41-Rural: Fringe 36.50156
## 1282                    Lewis County     53041    42-Rural: Distant 46.58211
## 1283                 San Juan County     53055    42-Rural: Distant 48.49195
## 1284                  Spokane County     53063       13-City: Small 47.66770
## 1285                   Citrus County     12017     41-Rural: Fringe 28.84474
## 1286               Okeechobee County     12093     41-Rural: Fringe 27.29419
## 1287                  Broward County     12011    12-City: Mid-size 26.26659
## 1288                   Harris County     48201       11-City: Large 29.92429
## 1289               Montgomery County     48339       13-City: Small 30.31912
## 1290                  Jackson County     26075     41-Rural: Fringe 42.16591
## 1291               Miami-Dade County     12086     41-Rural: Fringe 25.37247
## 1292                     Hale County     48189      33-Town: Remote 34.19360
## 1293                  Hidalgo County     48215     21-Suburb: Large 26.09871
## 1294                 Maverick County     48323      33-Town: Remote 28.72546
## 1295                 McLennan County     48309     41-Rural: Fringe 31.65025
## 1296                    Cooke County     48097     41-Rural: Fringe 33.61968
## 1297                     Hale County     48189      33-Town: Remote 34.19360
## 1298                   Taylor County     48441    12-City: Mid-size 32.43166
## 1299                    Bexar County     48029       11-City: Large 29.51905
## 1300                   Travis County     48453       11-City: Large 30.25046
## 1301              Los Angeles County      6037    12-City: Mid-size 34.14893
## 1302                   Dakota County     27037     41-Rural: Fringe 44.73730
## 1303                   Dakota County     27037     41-Rural: Fringe 44.65085
## 1304                St. Lucie County     12111     21-Suburb: Large 27.44333
## 1305                   Denton County     48121     21-Suburb: Large 33.02668
## 1306                Box Elder County     49003     21-Suburb: Large 41.50638
## 1307                   Dallas County     48113       11-City: Large 32.65381
## 1308                   Dallas County     48113     21-Suburb: Large 32.94235
## 1309                   Dallas County     48113       11-City: Large 32.73186
## 1310                   Dallas County     48113       11-City: Large 32.80501
## 1311                   Dallas County     48113       11-City: Large 32.74162
## 1312                   Dallas County     48113       11-City: Large 32.77158
## 1313                   Dallas County     48113       11-City: Large 32.77158
## 1314                   Dallas County     48113       11-City: Large 32.77158
## 1315                   Dallas County     48113       11-City: Large 32.77158
## 1316                   Dallas County     48113       11-City: Large 32.77158
## 1317                   Dallas County     48113       11-City: Large 32.76927
## 1318                    Gregg County     48183       13-City: Small 32.52017
## 1319                     Yolo County      6113     23-Suburb: Small 38.66101
## 1320                  Douglas County      8035     21-Suburb: Large 39.36865
## 1321               Rutherford County     47149     41-Rural: Fringe 35.86058
## 1322                  Montour County     42093     23-Suburb: Small 40.94790
## 1323                     Dare County     37055     41-Rural: Fringe 35.89223
## 1324                 Tuolumne County      6109     32-Town: Distant 37.98181
## 1325                   Wright County     27171     32-Town: Distant 45.07950
## 1326                St. Lucie County     12111     41-Rural: Fringe 27.38403
## 1327                  Broward County     12011     21-Suburb: Large 26.24345
## 1328                     Polk County     12105  22-Suburb: Mid-size 28.15682
## 1329                 Davidson County     37057     41-Rural: Fringe 35.81710
## 1330             Transylvania County     37175      31-Town: Fringe 35.25815
## 1331                     Pima County      4019       11-City: Large 32.22889
## 1332                     Yolo County      6113     23-Suburb: Small 38.54713
## 1333               Greenbrier County     54025     41-Rural: Fringe 37.75968
## 1334                  Genesee County     26049     21-Suburb: Large 43.02465
## 1335                  Navarro County     48349     32-Town: Distant 32.10003
## 1336                   Taylor County     48441    12-City: Mid-size 32.43973
## 1337                   Pierce County     53053    12-City: Mid-size 47.25667
## 1338                  Spokane County     53063    12-City: Mid-size 47.65022
## 1339               Sacramento County      6067     21-Suburb: Large 38.48910
## 1340                  Volusia County     12127     41-Rural: Fringe 29.14463
## 1341               Providence County     44007     21-Suburb: Large 41.74388
## 1342                    Wayne County     26163     21-Suburb: Large 42.34057
## 1343                    Wayne County     26163     21-Suburb: Large 42.33982
## 1344                  Alameda County      6001     21-Suburb: Large 37.59998
## 1345                   Tulare County      6107  22-Suburb: Mid-size 36.29682
## 1346                 Hennepin County     27053     21-Suburb: Large 44.92151
## 1347                  Spokane County     53063      31-Town: Fringe 47.95869
## 1348                   Itasca County     27061    42-Rural: Distant 47.33445
## 1349                   DeKalb County     13089     21-Suburb: Large 33.80094
## 1350                   DeKalb County     13089     21-Suburb: Large 33.69163
## 1351             Contra Costa County      6013     21-Suburb: Large 37.82712
## 1352              Los Angeles County      6037     21-Suburb: Large 34.09854
## 1353                Del Norte County      6015      33-Town: Remote 41.76779
## 1354               Stanislaus County      6099      31-Town: Fringe 37.47557
## 1355                  Alameda County      6001     23-Suburb: Small 37.67862
## 1356                   Travis County     48453     21-Suburb: Large 30.17634
## 1357                   Travis County     48453       11-City: Large 30.30312
## 1358                  El Paso County     48141       11-City: Large 31.75892
## 1359                    Delta County      8029     32-Town: Distant 38.73938
## 1360            Santa Barbara County      6083  22-Suburb: Mid-size 34.86602
## 1361                 Crawford County     19047     41-Rural: Fringe 42.01737
## 1362                   Denton County     48121    12-City: Mid-size 33.21150
## 1363                   Denton County     48121     21-Suburb: Large 33.15127
## 1364                   Denton County     48121    12-City: Mid-size 33.21150
## 1365                   Denton County     48121    12-City: Mid-size 33.21150
## 1366                   Denton County     48121    12-City: Mid-size 33.21206
## 1367                   Denton County     48121     41-Rural: Fringe 33.30595
## 1368                   Denton County     48121    12-City: Mid-size 33.21206
## 1369                   Denton County     48121    12-City: Mid-size 33.21206
## 1370                   Denton County     48121      31-Town: Fringe 33.38782
## 1371                   Denton County     48121    12-City: Mid-size 33.21150
## 1372                   Denton County     48121    12-City: Mid-size 33.21150
## 1373                   Denton County     48121    12-City: Mid-size 33.21206
## 1374                   Denton County     48121    12-City: Mid-size 33.21206
## 1375                   Denton County     48121     41-Rural: Fringe 33.03538
## 1376                   Denver County      8031       11-City: Large 39.74292
## 1377                  Wichita County     48485    12-City: Mid-size 33.90900
## 1378                   Monroe County     13207     32-Town: Distant 33.03641
## 1379                   Fulton County     13121       11-City: Large 33.75416
## 1380                Fort Bend County     48157     21-Suburb: Large 29.57780
## 1381                  Volusia County     12127     41-Rural: Fringe 29.14047
## 1382                Riverside County      6065     21-Suburb: Large 33.81648
## 1383                 Imperial County      6025       13-City: Small 32.78095
## 1384                    Adams County     53001     32-Town: Distant 46.81934
## 1385                     Pima County      4019       11-City: Large 32.26565
## 1386                    Clark County     32003     21-Suburb: Large 36.21476
## 1387                 Imperial County      6025      31-Town: Fringe 32.98470
## 1388              Los Angeles County      6037     41-Rural: Fringe 34.52774
## 1389              Los Angeles County      6037     21-Suburb: Large 34.70089
## 1390                  Colbert County      1033     23-Suburb: Small 34.73874
## 1391                   Fresno County      6019       11-City: Large 36.76934
## 1392                   Dallas County     48113     21-Suburb: Large 32.58896
## 1393                   DeSoto County     12027     32-Town: Distant 27.21603
## 1394                   DeSoto County     28033     21-Suburb: Large 34.96075
## 1395                    Wolfe County     21237     43-Rural: Remote 37.76229
## 1396                     Coos County     41011      33-Town: Remote 43.36203
## 1397                 Sedgwick County      8115     43-Rural: Remote 40.99061
## 1398                  Tarrant County     48439       11-City: Large 32.79709
## 1399             Hillsborough County     12057       11-City: Large 27.98090
## 1400                   Taylor County     12123     41-Rural: Fringe 30.12087
## 1401                 Chippewa County     26033     43-Rural: Remote 45.99069
## 1402                   Becker County     27005     41-Rural: Fringe 46.82764
## 1403                   Becker County     27005     41-Rural: Fringe 46.82764
## 1404                   Becker County     27005      33-Town: Remote 46.82246
## 1405                    Wayne County     26163       11-City: Large 42.37889
## 1406                Limestone County     48293      33-Town: Remote 31.68790
## 1407                   Orange County     12095     21-Suburb: Large 28.60502
## 1408                  Liberty County     48291    42-Rural: Distant 30.02669
## 1409                   Medina County     48325     32-Town: Distant 29.13963
## 1410                  Alameda County      6001       11-City: Large 37.79693
## 1411                   Fresno County      6019       11-City: Large 36.78611
## 1412                Washtenaw County     26161     21-Suburb: Large 42.33482
## 1413             Contra Costa County      6013     21-Suburb: Large 37.94493
## 1414                 Pemiscot County     29155    42-Rural: Distant 36.23285
## 1415                Salt Lake County     49035     21-Suburb: Large 40.58719
## 1416                   Macomb County     26099     21-Suburb: Large 42.62198
## 1417               Stanislaus County      6099     21-Suburb: Large 37.60231
## 1418                Galveston County     48167  22-Suburb: Mid-size 29.46454
## 1419                  Douglas County     41019     41-Rural: Fringe 43.10036
## 1420                    Wayne County     26163     21-Suburb: Large 42.44257
## 1421                  Liberty County     48291      31-Town: Fringe 30.35422
## 1422                 Chambers County     48071    42-Rural: Distant 29.77069
## 1423                   Brazos County     48041       13-City: Small 30.65230
## 1424                    Comal County     48091       13-City: Small 29.69595
## 1425                   Harris County     48201     21-Suburb: Large 29.78240
## 1426                   Kitsap County     53035  22-Suburb: Mid-size 47.52943
## 1427                 Siskiyou County      6093     32-Town: Distant 41.74115
## 1428               Sacramento County      6067       11-City: Large 38.63336
## 1429                  El Paso County      8041     21-Suburb: Large 38.75535
## 1430                  Cowlitz County     53015       13-City: Small 46.13929
## 1431                  Cowlitz County     53015       13-City: Small 46.13931
## 1432                   Harris County     48201       11-City: Large 29.72384
## 1433                     King County     53033     21-Suburb: Large 47.71592
## 1434                  Spokane County     53063       13-City: Small 47.65547
## 1435                 Pinellas County     12103     21-Suburb: Large 27.76045
## 1436                 Atascosa County     48013     43-Rural: Remote 28.85185
## 1437                  Clallam County     53009      33-Town: Remote 47.94696
## 1438                 Hennepin County     27053       13-City: Small 44.99976
## 1439                  Tarrant County     48439       11-City: Large 32.75975
## 1440                El Dorado County      6017    42-Rural: Distant 38.90160
## 1441                   Solano County      6095    12-City: Mid-size 38.27137
## 1442                    Dixie County     12029      33-Town: Remote 29.63756
## 1443                   Solano County      6095      31-Town: Fringe 38.44783
## 1444                  Broward County     12011     21-Suburb: Large 25.97972
## 1445                     Polk County     12105  22-Suburb: Mid-size 28.02477
## 1446                    Dodge County     55027     32-Town: Distant 43.46725
## 1447                    Boone County     54005     41-Rural: Fringe 38.13772
## 1448                  Hidalgo County     48215     21-Suburb: Large 26.16561
## 1449                      Lee County     12071     21-Suburb: Large 26.60362
## 1450               Miami-Dade County     12086     21-Suburb: Large 25.63306
## 1451              Los Angeles County      6037       11-City: Large 33.93977
## 1452              Los Angeles County      6037     21-Suburb: Large 34.59336
## 1453                  Douglas County     32005     41-Rural: Fringe 38.95932
## 1454                  Douglas County     31055     21-Suburb: Large 41.29052
## 1455                  Douglas County     32005     41-Rural: Fringe 38.95932
## 1456                  Douglas County     31055       11-City: Large 41.24701
## 1457                    Ionia County     26067     32-Town: Distant 42.98138
## 1458                  Loudoun County     51107     21-Suburb: Large 39.10948
## 1459                Hunterdon County     34019     41-Rural: Fringe 40.42546
## 1460                    Wayne County     26163     21-Suburb: Large 42.25090
## 1461                     Pima County      4019       11-City: Large 32.22256
## 1462              Los Angeles County      6037       11-City: Large 34.06300
## 1463            San Francisco County      6075       11-City: Large 37.76153
## 1464             Contra Costa County      6013     41-Rural: Fringe 37.94836
## 1465            Santa Barbara County      6083     23-Suburb: Small 34.69376
## 1466                  El Paso County     48141       11-City: Large 31.85850
## 1467                  El Paso County     48141       11-City: Large 31.85525
## 1468                   Nueces County     48355       11-City: Large 27.75790
## 1469                    Brown County     55009    12-City: Mid-size 44.51182
## 1470              Los Angeles County      6037     21-Suburb: Large 34.09408
## 1471               Miami-Dade County     12086     21-Suburb: Large 25.85586
## 1472                  Lenawee County     26091     32-Town: Distant 41.89640
## 1473                   Harris County     48201       11-City: Large 29.72405
## 1474                   Dallas County     48113       11-City: Large 32.77158
## 1475                     Kane County     17089    12-City: Mid-size 42.03659
## 1476                 Pinellas County     12103       13-City: Small 27.91278
## 1477                     Mesa County      8077       13-City: Small 39.06774
## 1478                St. Louis County     27137       13-City: Small 46.78836
## 1479              San Joaquin County      6077     23-Suburb: Small 37.75358
## 1480                   Ottawa County     26139     23-Suburb: Small 42.83538
## 1481                 Siskiyou County      6093    42-Rural: Distant 41.21016
## 1482                   DuPage County     17043     21-Suburb: Large 41.86762
## 1483                Jefferson County      1073    12-City: Mid-size 33.54798
## 1484                 La Plata County      8067     32-Town: Distant 37.27668
## 1485                 Maricopa County      4013       11-City: Large 33.42870
## 1486               Washington County     41067     21-Suburb: Large 45.40389
## 1487                   Durham County     37063       11-City: Large 35.98946
## 1488                    Duval County     12031       11-City: Large 30.29763
## 1489                    Duval County     12031       11-City: Large 30.29259
## 1490                    Duval County     12031       11-City: Large 30.34576
## 1491                   Collin County     48085       11-City: Large 33.01336
## 1492                    Dewey County     46041      33-Town: Remote 45.00076
## 1493                    Dewey County     46041      33-Town: Remote 45.00076
## 1494                  Baltimore city     24510       11-City: Large 39.30097
## 1495                  Douglas County      8035     21-Suburb: Large 39.54497
## 1496                      Ada County     16001     21-Suburb: Large 43.69458
## 1497          San Luis Obispo County      6079     23-Suburb: Small 35.54469
## 1498                    Baker County     41001      33-Town: Remote 44.78397
## 1499                   Sonoma County      6097      31-Town: Fringe 38.80792
## 1500                   Kitsap County     53035  22-Suburb: Mid-size 47.63629
## 1501                  Spokane County     53063       13-City: Small 47.65376
## 1502                     Lyon County     32019    42-Rural: Distant 39.39404
## 1503           San Bernardino County      6071     41-Rural: Fringe 34.41871
## 1504              Los Angeles County      6037       13-City: Small 33.82088
## 1505                    Kings County      6031       13-City: Small 36.34375
## 1506                   Nevada County      6057     32-Town: Distant 39.24784
## 1507                   Tulare County      6107      31-Town: Fringe 35.88818
## 1508                    Scott County     27139     32-Town: Distant 44.61826
## 1509               Bernalillo County     35001       11-City: Large 35.09445
## 1510                   Orange County      6059    12-City: Mid-size 33.65354
## 1511                   Marion County     41047  22-Suburb: Mid-size 44.97412
## 1512                   Taylor County     48441    12-City: Mid-size 32.44501
## 1513                   Harris County     48201     21-Suburb: Large 29.99594
## 1514                     Kane County     17089     21-Suburb: Large 41.79072
## 1515                  Alameda County      6001     21-Suburb: Large 37.66953
## 1516                   Newton County     28101    42-Rural: Distant 32.43536
## 1517                   Wilson County     48493     32-Town: Distant 29.15842
## 1518             Grays Harbor County     53027     32-Town: Distant 47.00300
## 1519             Grays Harbor County     53027     32-Town: Distant 47.00300
## 1520                 Humboldt County      6023      33-Town: Remote 40.59567
## 1521               Charlevoix County     26029    42-Rural: Distant 45.15594
## 1522                     Kent County     26081       13-City: Small 42.92799
## 1523              Los Angeles County      6037       13-City: Small 34.04875
## 1524                 Hennepin County     27053       13-City: Small 44.97963
## 1525             St. Francois County     29187     32-Town: Distant 37.92313
## 1526             St. Francois County     29187     32-Town: Distant 37.92313
## 1527               Stanislaus County      6099     21-Suburb: Large 37.76047
## 1528                   Ramsey County     27123     21-Suburb: Large 45.01293
## 1529                San Diego County      6073       11-City: Large 32.72055
## 1530                  El Paso County      8041       11-City: Large 38.82406
## 1531                 Eastland County     48133      33-Town: Remote 32.39857
## 1532                    Dodge County     13091     32-Town: Distant 32.17988
## 1533                    Dodge County     13091     32-Town: Distant 32.17959
## 1534                  Douglas County     53017     23-Suburb: Small 47.41129
## 1535                   Fresno County      6019     21-Suburb: Large 36.65035
## 1536                   Fresno County      6019     21-Suburb: Large 36.65034
## 1537              Los Angeles County      6037     21-Suburb: Large 34.70045
## 1538                  Berrien County     26021     41-Rural: Fringe 41.98587
## 1539                 Franklin County     17055     32-Town: Distant 37.99812
## 1540                   Orange County     12095     21-Suburb: Large 28.56329
## 1541                    Ector County     48135     41-Rural: Fringe 31.91447
## 1542                     Lake County      6033     32-Town: Distant 38.97980
## 1543                  Hidalgo County     48215     21-Suburb: Large 26.29811
## 1544                   Meeker County     27093    42-Rural: Distant 45.32541
## 1545                     Pima County      4019       11-City: Large 32.23514
## 1546                  Hidalgo County     48215       13-City: Small 26.30697
## 1547                 Hennepin County     27053       11-City: Large 45.00939
## 1548                Snohomish County     53061     21-Suburb: Large 47.81683
## 1549                Snohomish County     53061     21-Suburb: Large 47.81087
## 1550                Snohomish County     53061     21-Suburb: Large 47.78646
## 1551                  Jackson County     48239     32-Town: Distant 28.98385
## 1552                Hunterdon County     34019     21-Suburb: Large 40.62974
## 1553                  Cameron County     48061       13-City: Small 26.20762
## 1554                   Dakota County     27037     41-Rural: Fringe 44.73720
## 1555                  St. Louis city     29510       11-City: Large 38.61633
## 1556                 McKinley County     35031      33-Town: Remote 35.52889
## 1557                   Asotin County     53003     23-Suburb: Small 46.41116
## 1558                   Asotin County     53003     23-Suburb: Small 46.41113
## 1559              Los Angeles County      6037       11-City: Large 33.78941
## 1560                     Gage County     31067     32-Town: Distant 40.26664
## 1561               Palm Beach County     12099     21-Suburb: Large 26.67098
## 1562               Palm Beach County     12099     41-Rural: Fringe 26.72291
## 1563           San Bernardino County      6071     32-Town: Distant 34.84905
## 1564                 New York County     36061       11-City: Large 40.79718
## 1565              San Joaquin County      6077       11-City: Large 37.93518
## 1566                 Humboldt County      6023      33-Town: Remote 40.58948
## 1567                  Jackson County     26075     23-Suburb: Small 42.30012
## 1568                 Hennepin County     27053     21-Suburb: Large 44.88229
## 1569                     Bell County     48027  22-Suburb: Mid-size 31.08386
## 1570                  Ventura County      6111    12-City: Mid-size 34.27834
## 1571                   Sonoma County      6097     21-Suburb: Large 38.34058
## 1572              Los Angeles County      6037     21-Suburb: Large 33.92048
## 1573                   Orange County      6059     21-Suburb: Large 33.86886
## 1574               Sacramento County      6067     21-Suburb: Large 38.54701
## 1575                Fort Bend County     48157     21-Suburb: Large 29.60100
## 1576                   Harris County     48201       11-City: Large 29.78122
## 1577               Williamson County     48491     21-Suburb: Large 30.49410
## 1578                    Bexar County     48029       11-City: Large 29.41767
## 1579              Los Angeles County      6037     21-Suburb: Large 34.07947
## 1580                  El Paso County     48141       11-City: Large 31.75163
## 1581                  El Paso County     48141       11-City: Large 31.86028
## 1582                 Monterey County      6053    12-City: Mid-size 36.68619
## 1583                   Fresno County      6019     32-Town: Distant 36.85390
## 1584               Sacramento County      6067     21-Suburb: Large 38.64592
## 1585                     Bibb County     13021    12-City: Mid-size 32.81947
## 1586                Whitfield County     13313       13-City: Small 34.78669
## 1587                    Gregg County     48183      31-Town: Fringe 32.39335
## 1588                     Rusk County     48401    42-Rural: Distant 32.23916
## 1589                    Union County     47173    42-Rural: Distant 36.24738
## 1590                   Dallas County     48113       11-City: Large 32.70410
## 1591               Sacramento County      6067       13-City: Small 38.60282
## 1592                  Johnson County     19103       13-City: Small 41.64410
## 1593                Del Norte County      6015      33-Town: Remote 41.76441
## 1594                Sherburne County     27141     21-Suburb: Large 45.32108
## 1595                Sherburne County     27141     21-Suburb: Large 45.31214
## 1596                 Anderson County     48001     32-Town: Distant 31.76971
## 1597                 Randolph County     54083      33-Town: Remote 38.92362
## 1598                    Glenn County      6021    42-Rural: Distant 39.74571
## 1599              Los Angeles County      6037     21-Suburb: Large 33.93579
## 1600                   Fresno County      6019     21-Suburb: Large 36.65031
## 1601                  Tarrant County     48439       11-City: Large 32.86327
## 1602                  Hidalgo County     48215     21-Suburb: Large 26.18745
## 1603               Sacramento County      6067       11-City: Large 38.64058
## 1604                 Okaloosa County     12091     32-Town: Distant 30.74960
## 1605               Bonneville County     16019       13-City: Small 43.49368
## 1606                     King County     53033     21-Suburb: Large 47.65534
## 1607                     King County     53033     21-Suburb: Large 47.65530
## 1608                   Denver County      8031       11-City: Large 39.74575
## 1609                 Hennepin County     27053     21-Suburb: Large 44.96411
## 1610                     Pine County     27115     43-Rural: Remote 46.01615
## 1611                  Henrico County     51087     21-Suburb: Large 37.55042
## 1612                   Harris County     48201       11-City: Large 29.72384
## 1613                 Maricopa County      4013       11-City: Large 33.48877
## 1614                 Hernando County     12053     41-Rural: Fringe 28.56478
## 1615               Stanislaus County      6099     21-Suburb: Large 37.59064
## 1616                   Harris County     48201     21-Suburb: Large 29.79277
## 1617                 Marathon County     55073     41-Rural: Fringe 44.98164
## 1618               Newport News city     51700    12-City: Mid-size 37.08471
## 1619                   Fresno County      6019     21-Suburb: Large 36.83656
## 1620                 Pinellas County     12103     21-Suburb: Large 28.01080
## 1621                   Fresno County      6019      31-Town: Fringe 36.72914
## 1622                   Shasta County      6089       13-City: Small 40.55787
## 1623                   Madera County      6039     23-Suburb: Small 36.95323
## 1624                  Ventura County      6111    12-City: Mid-size 34.18236
## 1625                     King County     53033     21-Suburb: Large 47.71995
## 1626                 Hennepin County     27053     21-Suburb: Large 44.89544
## 1627           San Bernardino County      6071     21-Suburb: Large 34.10973
## 1628                     Erie County     36029       11-City: Large 42.88407
## 1629                 Escambia County     12033     21-Suburb: Large 30.40614
## 1630                 Escambia County     12033     41-Rural: Fringe 30.58330
## 1631                 Escambia County      1053     32-Town: Distant 31.00668
## 1632                 Escambia County     12033     21-Suburb: Large 30.44198
## 1633                 Escambia County     12033     21-Suburb: Large 30.44244
## 1634                    Delta County     26041      33-Town: Remote 45.74204
## 1635                    Clark County     53011    12-City: Mid-size 45.63909
## 1636                  Douglas County     31055       11-City: Large 41.26723
## 1637                   Tulare County      6107     41-Rural: Fringe 36.50168
## 1638                    Butte County      6007     32-Town: Distant 39.36785
## 1639                    Essex County     34013     21-Suburb: Large 40.88687
## 1640                    Essex County     34013       11-City: Large 40.74771
## 1641                  Passaic County     34031     21-Suburb: Large 40.86761
## 1642                    Essex County     34013       11-City: Large 40.74805
## 1643                    Essex County     34013       11-City: Large 40.76158
## 1644                   Orange County     12095     21-Suburb: Large 28.53961
## 1645                  Larimer County      8069     32-Town: Distant 40.36844
## 1646                   Estill County     21065     32-Town: Distant 37.70336
## 1647                    Bexar County     48029       11-City: Large 29.41690
## 1648               Sacramento County      6067      31-Town: Fringe 38.28729
## 1649           San Bernardino County      6071     41-Rural: Fringe 34.14418
## 1650                     Lane County     41039     41-Rural: Fringe 44.01000
## 1651                 Humboldt County      6023      33-Town: Remote 40.80276
## 1652                  Spokane County     53063       13-City: Small 47.69237
## 1653                  Spokane County     53063       13-City: Small 47.68466
## 1654                   Jasper County     48241    42-Rural: Distant 30.34756
## 1655                 Richland County     45079    12-City: Mid-size 34.05894
## 1656                St. Louis County     27137      33-Town: Remote 47.46595
## 1657                   Mobile County      1097    12-City: Mid-size 30.60722
## 1658               Washington County     24043       13-City: Small 39.61431
## 1659                  Henrico County     51087     21-Suburb: Large 37.66192
## 1660                Snohomish County     53061    12-City: Mid-size 47.96511
## 1661                     Cass County     29037      31-Town: Fringe 38.65229
## 1662               Palm Beach County     12099     32-Town: Distant 26.82233
## 1663                  McHenry County     17111     41-Rural: Fringe 42.23411
## 1664                   Tehama County      6103     41-Rural: Fringe 40.35875
## 1665                   Tehama County      6103     41-Rural: Fringe 40.35748
## 1666              Los Angeles County      6037       11-City: Large 34.30727
## 1667                     Yolo County      6113     21-Suburb: Large 38.57794
## 1668                   Madera County      6039     41-Rural: Fringe 37.32942
## 1669                     Yolo County      6113     21-Suburb: Large 38.57785
## 1670                  Tarrant County     48439     21-Suburb: Large 32.62475
## 1671                Jefferson County     48245    12-City: Mid-size 30.04202
## 1672                   Dallas County     48113    12-City: Mid-size 32.93577
## 1673                   Harris County     48201     21-Suburb: Large 30.06724
## 1674                   Citrus County     12017     41-Rural: Fringe 28.72898
## 1675                 Hernando County     12053     41-Rural: Fringe 28.43727
## 1676                   Denver County      8031       11-City: Large 39.68433
## 1677                   Harris County     48201       11-City: Large 29.68441
## 1678                   Harris County     48201       11-City: Large 29.68441
## 1679                   Harris County     48201       11-City: Large 29.68452
## 1680                  Baltimore city     24510       11-City: Large 39.29202
## 1681                   Harris County     48201       11-City: Large 29.71007
## 1682                 Caldwell County     48055      31-Town: Fringe 29.87020
## 1683                    Gregg County     48183       13-City: Small 32.51578
## 1684                 Harrison County     48203    42-Rural: Distant 32.47525
## 1685                   Tulare County      6107  22-Suburb: Mid-size 36.29740
## 1686                   Tulare County      6107  22-Suburb: Mid-size 36.29742
## 1687                   Kitsap County     53035  22-Suburb: Mid-size 47.52367
## 1688                     King County     53033     21-Suburb: Large 47.67004
## 1689               Black Hawk County     19013       13-City: Small 42.49778
## 1690                Baltimore County     24005       13-City: Small 39.39939
## 1691                     Webb County     48479       11-City: Large 27.52914
## 1692                  Charles County     24017     41-Rural: Fringe 38.54883
## 1693                  El Paso County     48141       11-City: Large 31.76257
## 1694                    Butte County      6007       13-City: Small 39.75938
## 1695                  Fairfax County     51059     21-Suburb: Large 38.84015
## 1696                  Fairfax County     51059     21-Suburb: Large 38.84506
## 1697                Jefferson County      1073     21-Suburb: Large 33.47452
## 1698                   Solano County      6095    12-City: Mid-size 38.26785
## 1699              Los Angeles County      6037     21-Suburb: Large 34.10157
## 1700                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1701                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1702                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1703                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1704                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1705                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1706                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1707                  Runnels County     48399    42-Rural: Distant 31.60545
## 1708                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1709                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1710                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1711                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1712                   Ramsey County     27123     21-Suburb: Large 45.00491
## 1713                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1714                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1715                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1716                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1717                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1718                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1719                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1720                  Chisago County     27025     32-Town: Distant 45.38195
## 1721                   Ramsey County     27123     21-Suburb: Large 45.01271
## 1722                Sherburne County     27141     21-Suburb: Large 45.31222
## 1723                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1724                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1725                Tom Green County     48451    42-Rural: Distant 31.66791
## 1726                  Runnels County     48399    42-Rural: Distant 31.61004
## 1727                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1728                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1729                Tom Green County     48451     41-Rural: Fringe 31.39103
## 1730                    Ellis County     48139     41-Rural: Fringe 32.43169
## 1731             Hillsborough County     12057     21-Suburb: Large 27.96012
## 1732                   Shasta County      6089     43-Rural: Remote 41.05220
## 1733                   Shasta County      6089     43-Rural: Remote 41.00672
## 1734                San Diego County      6073     21-Suburb: Large 33.37938
## 1735                Minnehaha County     46099     41-Rural: Fringe 43.56136
## 1736                   Burnet County     48053     32-Town: Distant 30.58350
## 1737                  Fayette County     21067       11-City: Large 38.04648
## 1738                Jefferson County      1073    12-City: Mid-size 33.50510
## 1739                Jefferson County      1073    12-City: Mid-size 33.50510
## 1740                Arlington County     51013    12-City: Mid-size 38.88668
## 1741                     King County     53033     41-Rural: Fringe 47.42319
## 1742                    Macon County     29121      33-Town: Remote 39.73462
## 1743                     Lane County     41039    12-City: Mid-size 44.01623
## 1744                Riverside County      6065  22-Suburb: Mid-size 33.73747
## 1745                  Genesee County     26049     21-Suburb: Large 42.78666
## 1746                     Rice County     27131     41-Rural: Fringe 44.32066
## 1747                     Rice County     27131     41-Rural: Fringe 44.32067
## 1748                  Oakland County     26125       13-City: Small 42.45828
## 1749             St. Francois County     29187     32-Town: Distant 37.77370
## 1750             St. Francois County     29187     32-Town: Distant 37.77369
## 1751                   Solano County      6095    12-City: Mid-size 38.11199
## 1752                    Clare County     26035     41-Rural: Fringe 43.85535
## 1753                    Cache County     49005       13-City: Small 41.75827
## 1754                  Fayette County     21067       11-City: Large 38.07100
## 1755                  Fayette County     21067       11-City: Large 38.11230
## 1756                   Sutter County      6101       13-City: Small 39.13816
## 1757                Milwaukee County     55079       11-City: Large 43.07012
## 1758                    Bexar County     48029       11-City: Large 29.37421
## 1759                    Bexar County     48029       11-City: Large 29.37421
## 1760                  Suffolk County     25025       11-City: Large 42.33062
## 1761               Otter Tail County     27111      33-Town: Remote 46.28117
## 1762              Los Angeles County      6037     21-Suburb: Large 34.07720
## 1763                  Whatcom County     53073  22-Suburb: Mid-size 48.86004
## 1764                Fort Bend County     48157     41-Rural: Fringe 29.47599
## 1765                 Fillmore County     27045     43-Rural: Remote 43.55272
## 1766                 Tompkins County     36109     41-Rural: Fringe 42.54452
## 1767                   Fresno County      6019     32-Town: Distant 36.85377
## 1768                 Beltrami County     27007     41-Rural: Fringe 47.47725
## 1769               New Castle County     10003       13-City: Small 39.75146
## 1770                   Wilson County     48493     41-Rural: Fringe 29.15300
## 1771                   Wilson County     48493     41-Rural: Fringe 29.15300
## 1772                   Dakota County     27037     21-Suburb: Large 44.73451
## 1773                   Macomb County     26099    12-City: Mid-size 42.46384
## 1774                  Jackson County     17077      31-Town: Fringe 37.76411
## 1775                  Fremont County     16043     32-Town: Distant 43.94399
## 1776                  Broward County     12011    12-City: Mid-size 26.26081
## 1777                   Sawyer County     55113     43-Rural: Remote 45.65658
## 1778                  Kendall County     17093     21-Suburb: Large 41.66585
## 1779                  Carroll County     24013     41-Rural: Fringe 39.53484
## 1780                St. Louis County     27137     43-Rural: Remote 46.93025
## 1781                   Denver County      8031       11-City: Large 39.71540
## 1782               Lauderdale County      1077       13-City: Small 34.79673
## 1783                    Clark County     32003     21-Suburb: Large 36.25706
## 1784                   Wilson County     48493     41-Rural: Fringe 29.15300
## 1785                   Wilson County     48493     41-Rural: Fringe 29.15300
## 1786                   Wilson County     48493     32-Town: Distant 29.13740
## 1787                   Wilson County     48493     32-Town: Distant 29.13740
## 1788                 Gonzales County     48177     43-Rural: Remote 29.26741
## 1789               Palm Beach County     12099     21-Suburb: Large 26.70264
## 1790               Tangipahoa Parish     22105     41-Rural: Fringe 30.50221
## 1791                 Suwannee County     12121    42-Rural: Distant 30.42003
## 1792                    Floyd County     48153     32-Town: Distant 33.97903
## 1793                  Olmsted County     27109     32-Town: Distant 43.85344
## 1794                  Fayette County     17051      33-Town: Remote 38.96549
## 1795               Sacramento County      6067       13-City: Small 38.67238
## 1796            Santa Barbara County      6083  22-Suburb: Mid-size 34.41116
## 1797               Stanislaus County      6099     32-Town: Distant 37.32098
## 1798              Santa Clara County      6085       11-City: Large 37.36870
## 1799               Bernalillo County     35001     21-Suburb: Large 35.12011
## 1800                   Shasta County      6089     41-Rural: Fringe 40.56860
## 1801                  Clinton County     21053     43-Rural: Remote 36.75100
## 1802                 McDowell County     37111     32-Town: Distant 35.65922
## 1803                San Diego County      6073     21-Suburb: Large 33.18015
## 1804               Washington County     27163      31-Town: Fringe 45.27646
## 1805                    Roanoke city     51770       13-City: Small 37.28747
## 1806                  Clallam County     53009      33-Town: Remote 47.94616
## 1807                  Kaufman County     48257      31-Town: Fringe 32.73723
## 1808                Fort Bend County     48157     21-Suburb: Large 29.60135
## 1809                Fort Bend County     48157     41-Rural: Fringe 29.37144
## 1810                Fort Bend County     48157     21-Suburb: Large 29.49347
## 1811                   Harris County     48201     21-Suburb: Large 29.79730
## 1812                Fort Bend County     48157     21-Suburb: Large 29.56105
## 1813                  Lincoln County     21137     32-Town: Distant 37.53181
## 1814                  Tarrant County     48439       11-City: Large 32.74592
## 1815                  Tarrant County     48439       11-City: Large 32.65332
## 1816                  Jackson County     26075       13-City: Small 42.21959
## 1817                   Fresno County      6019      31-Town: Fringe 36.63479
## 1818                   Fresno County      6019      31-Town: Fringe 36.63476
## 1819                   Fresno County      6019      31-Town: Fringe 36.63479
## 1820                   Fresno County      6019      31-Town: Fringe 36.63540
## 1821               Livingston County     26093      31-Town: Fringe 42.66991
## 1822                    Dodge County     55027    42-Rural: Distant 43.56760
## 1823              St. Charles County     29183     41-Rural: Fringe 38.70233
## 1824              Los Angeles County      6037       11-City: Large 34.05812
## 1825                      Ada County     16001     21-Suburb: Large 43.57048
## 1826                    Bexar County     48029       11-City: Large 29.38378
## 1827                    Bexar County     48029       11-City: Large 29.32291
## 1828                 Franklin County     12037     41-Rural: Fringe 29.74358
## 1829                 Franklin County     16041     32-Town: Distant 42.09602
## 1830                   Benton County     41003       13-City: Small 44.57548
## 1831                  Simpson County     21213     32-Town: Distant 36.71526
## 1832                   Denton County     48121    12-City: Mid-size 33.20699
## 1833                     Bell County     48027       13-City: Small 31.10341
## 1834                  Liberty County     48291     32-Town: Distant 30.04140
## 1835                  Liberty County     48291      31-Town: Fringe 30.35422
## 1836                Frederick County     24021       13-City: Small 39.43702
## 1837                    Boone County     29019    12-City: Mid-size 38.95521
## 1838                    Scott County     27139     21-Suburb: Large 44.79266
## 1839                 Imperial County      6025      31-Town: Fringe 32.81629
## 1840               Bernalillo County     35001       11-City: Large 35.10499
## 1841                   Shasta County      6089       13-City: Small 40.58877
## 1842                   Madera County      6039      31-Town: Fringe 36.98639
## 1843               Stephenson County     17177     32-Town: Distant 42.28664
## 1844                    Dodge County     31053     32-Town: Distant 41.43827
## 1845                   Pierce County     53053    12-City: Mid-size 47.25606
## 1846              Southampton County     51175     41-Rural: Fringe 36.70316
## 1847                     Todd County     27153      33-Town: Remote 46.36554
## 1848                   Madera County      6039    42-Rural: Distant 37.37492
## 1849              Los Angeles County      6037       11-City: Large 34.02978
## 1850                    Anoka County     27003     21-Suburb: Large 45.08008
## 1851                    Anoka County     27003     21-Suburb: Large 45.08272
## 1852                  Ventura County      6111       13-City: Small 34.20673
## 1853              Los Angeles County      6037     21-Suburb: Large 33.95249
## 1854                   Elbert County      8039    42-Rural: Distant 39.35752
## 1855                  Payette County     16075     32-Town: Distant 44.00675
## 1856                 Muskegon County     26121  22-Suburb: Mid-size 43.12961
## 1857              St. Charles County     29183     21-Suburb: Large 38.80736
## 1858                Middlesex County     25017     21-Suburb: Large 42.38737
## 1859                  Gratiot County     26057    42-Rural: Distant 43.18581
## 1860                 Callaway County     29027     32-Town: Distant 38.84616
## 1861                   Madera County      6039       13-City: Small 36.93865
## 1862                San Diego County      6073      31-Town: Fringe 33.03915
## 1863                    Boone County     19015      31-Town: Fringe 42.05952
## 1864                     King County     53033     21-Suburb: Large 47.71518
## 1865                    Macon County     17115       13-City: Small 39.84388
## 1866                    Lewis County     53041     41-Rural: Fringe 46.72564
## 1867                  Tarrant County     48439       11-City: Large 32.75987
## 1868                 McLennan County     48309    12-City: Mid-size 31.57384
## 1869                   DeWitt County     48123     32-Town: Distant 29.09417
## 1870                   Lavaca County     48285     32-Town: Distant 29.28965
## 1871                   DeWitt County     48123     41-Rural: Fringe 29.09254
## 1872                   Etowah County      1055       13-City: Small 34.01396
## 1873                St. Johns County     12109     23-Suburb: Small 29.88754
## 1874                     Hall County     13139       13-City: Small 34.31917
## 1875                Kalamazoo County     26077     41-Rural: Fringe 42.29939
## 1876                 McKinley County     35031      33-Town: Remote 35.51539
## 1877                Galveston County     48167     41-Rural: Fringe 29.42710
## 1878                Galveston County     48167     21-Suburb: Large 29.52717
## 1879                Galveston County     48167     41-Rural: Fringe 29.42710
## 1880                Galveston County     48167  22-Suburb: Mid-size 29.38190
## 1881                Galveston County     48167     41-Rural: Fringe 29.34641
## 1882                Galveston County     48167      31-Town: Fringe 29.28077
## 1883                Galveston County     48167     41-Rural: Fringe 29.42710
## 1884               Burlington County     34005     21-Suburb: Large 40.15953
## 1885                Worcester County     25027  22-Suburb: Mid-size 42.55622
## 1886                  Passaic County     34031     21-Suburb: Large 40.87907
## 1887                San Diego County      6073       11-City: Large 32.71840
## 1888                   Dallas County     48113     21-Suburb: Large 32.89356
## 1889                   Dallas County     48113     21-Suburb: Large 32.95745
## 1890                  Kaufman County     48257     32-Town: Distant 32.56763
## 1891                    Garza County     48169     41-Rural: Fringe 33.19936
## 1892                   Travis County     48453       11-City: Large 30.27741
## 1893                   Gaston County     37071       13-City: Small 35.25385
## 1894                   Pierce County     53053     21-Suburb: Large 47.13796
## 1895                     King County     53033     21-Suburb: Large 47.38907
## 1896                Henderson County     48213     41-Rural: Fringe 32.17598
## 1897                  Daviess County     21059       13-City: Small 37.75866
## 1898                   Graves County     21083      33-Town: Remote 36.74851
## 1899                     Webb County     48479       11-City: Large 27.44609
## 1900                     Webb County     48479       11-City: Large 27.54348
## 1901                 Marshall County     54051     23-Suburb: Small 39.93026
## 1902                San Mateo County      6081     21-Suburb: Large 37.51401
## 1903               Montgomery County     21173     32-Town: Distant 38.05712
## 1904                  Ventura County      6111       13-City: Small 34.20829
## 1905                   Shasta County      6089     41-Rural: Fringe 40.69166
## 1906                    Duval County     12031       11-City: Large 30.29939
## 1907                  Johnson County     29101     32-Town: Distant 38.76156
## 1908                   Shasta County      6089       13-City: Small 40.61953
## 1909                     Bell County     48027    12-City: Mid-size 31.09632
## 1910                   Fresno County      6019     21-Suburb: Large 36.83656
## 1911                   Madera County      6039     32-Town: Distant 37.11604
## 1912             Contra Costa County      6013     21-Suburb: Large 38.03319
## 1913                     Bell County     48027    12-City: Mid-size 31.09592
## 1914                  Bastrop County     48021     32-Town: Distant 30.09505
## 1915                  Carroll County     24013     41-Rural: Fringe 39.53484
## 1916                 Caldwell County     37027     41-Rural: Fringe 35.86437
## 1917                  Wichita County     48485      31-Town: Fringe 34.08729
## 1918               Williamson County     48491     21-Suburb: Large 30.66311
## 1919                Worcester County     25027     41-Rural: Fringe 42.04758
## 1920                  Douglas County     31055       11-City: Large 41.27293
## 1921                     King County     53033     21-Suburb: Large 47.49593
## 1922                 Hennepin County     27053     21-Suburb: Large 45.09659
## 1923                  Alameda County      6001       11-City: Large 37.79654
## 1924                  Hampden County     25013    12-City: Mid-size 42.10885
## 1925                  Genesee County     26049       13-City: Small 43.01993
## 1926                  Cameron County     48061  22-Suburb: Mid-size 26.13336
## 1927                    Mason County     26105    42-Rural: Distant 43.96433
## 1928                     Polk County     12105     21-Suburb: Large 27.89962
## 1929                   Otsego County     26137     41-Rural: Fringe 45.02104
## 1930                   Nueces County     48355       11-City: Large 27.77180
## 1931              Los Angeles County      6037    12-City: Mid-size 33.82578
## 1932                  Fayette County     54019     41-Rural: Fringe 37.88546
## 1933                  Henrico County     51087     21-Suburb: Large 37.54418
## 1934                  Henrico County     51087     21-Suburb: Large 37.51702
## 1935                  Genesee County     26049       13-City: Small 43.01080
## 1936                  Genesee County     26049     21-Suburb: Large 43.04511
## 1937                  Bastrop County     48021     32-Town: Distant 30.11852
## 1938                  Conecuh County      1035     41-Rural: Fringe 31.43601
## 1939                   Warren County     21227       13-City: Small 36.98508
## 1940              San Joaquin County      6077     23-Suburb: Small 37.73772
## 1941                   George County     28039     32-Town: Distant 30.92047
## 1942                    Bexar County     48029       11-City: Large 29.49165
## 1943                   Harris County     48201       11-City: Large 29.71521
## 1944                   Harris County     48201       11-City: Large 29.86402
## 1945                   Travis County     48453       11-City: Large 30.26030
## 1946                    Spink County     46115     43-Rural: Remote 44.88641
## 1947                    Spink County     46115     43-Rural: Remote 44.88641
## 1948              Los Angeles County      6037       11-City: Large 33.80256
## 1949                    Union County     34039     21-Suburb: Large 40.66210
## 1950                     Cobb County     13067       13-City: Small 33.95339
## 1951                    Weber County     49057       13-City: Small 41.21418
## 1952               Williamson County     48491     41-Rural: Fringe 30.63644
## 1953               Williamson County     48491     21-Suburb: Large 30.61517
## 1954                Jefferson County     21111       11-City: Large 38.11621
## 1955               Sacramento County      6067     21-Suburb: Large 38.48227
## 1956                   Orange County      6059       11-City: Large 33.83710
## 1957                   Denver County      8031       11-City: Large 39.75745
## 1958                  Gladwin County     26051     41-Rural: Fringe 43.98142
## 1959                   Hardin County     21093       13-City: Small 37.69381
## 1960                Riverside County      6065     21-Suburb: Large 33.93428
## 1961                 Maricopa County      4013     21-Suburb: Large 33.55355
## 1962                     Kent County     26081     21-Suburb: Large 42.80015
## 1963                    Clark County     32003       11-City: Large 36.18008
## 1964                   Pueblo County      8101    12-City: Mid-size 38.26371
## 1965                  Carroll County     13045      31-Town: Fringe 33.56746
## 1966               Williamson County     48491    12-City: Mid-size 30.50955
## 1967                   DeWitt County     48123     41-Rural: Fringe 29.09254
## 1968                  Johnson County     48251    42-Rural: Distant 32.45393
## 1969                     Kent County     26081       13-City: Small 42.89989
## 1970                  Gogebic County     26053      33-Town: Remote 46.45874
## 1971                 Tuolumne County      6109     41-Rural: Fringe 37.96996
## 1972                Calaveras County      6009    42-Rural: Distant 38.20053
## 1973             Contra Costa County      6013     21-Suburb: Large 37.98817
## 1974    Fairbanks North Star Borough      2090       13-City: Small 64.83281
## 1975                El Dorado County      6017      31-Town: Fringe 38.72679
## 1976              Los Angeles County      6037     41-Rural: Fringe 34.08797
## 1977                  Goodhue County     27049    42-Rural: Distant 44.40199
## 1978           San Bernardino County      6071    12-City: Mid-size 34.52951
## 1979                  Douglas County     55031     43-Rural: Remote 46.23255
## 1980                   Ramsey County     27123       11-City: Large 44.95532
## 1981                   Orange County     36071     41-Rural: Fringe 41.36255
## 1982                     King County     53033    12-City: Mid-size 47.61069
## 1983                   Holmes County     12059     32-Town: Distant 30.79424
## 1984                   Travis County     48453       11-City: Large 30.36067
## 1985                   Travis County     48453       11-City: Large 30.23302
## 1986                Middlesex County     25017    12-City: Mid-size 42.38308
## 1987                    Young County     48503      33-Town: Remote 33.10420
## 1988                   Merced County      6047    42-Rural: Distant 37.22764
## 1989                   Ottawa County     26139  22-Suburb: Mid-size 43.04787
## 1990                     Hall County     31079     41-Rural: Fringe 40.85964
## 1991                     Mesa County      8077    42-Rural: Distant 39.23338
## 1992                     Mesa County      8077  22-Suburb: Mid-size 39.05658
## 1993                     Mesa County      8077  22-Suburb: Mid-size 39.05705
## 1994                    Duval County     12031       11-City: Large 30.35480
## 1995                   Itasca County     27061      33-Town: Remote 47.21814
## 1996                     Kent County     26081    12-City: Mid-size 42.96380
## 1997                  Jackson County     29095     21-Suburb: Large 38.88886
## 1998                Milwaukee County     55079       11-City: Large 42.99462
## 1999                  Johnson County     48251    42-Rural: Distant 32.26347
## 2000                Salt Lake County     49035     21-Suburb: Large 40.68811
## 2001                Snohomish County     53061      31-Town: Fringe 48.08459
## 2002                  Newaygo County     26123    42-Rural: Distant 43.33812
## 2003                  Newaygo County     26123    42-Rural: Distant 43.33607
## 2004                    Duval County     12031       11-City: Large 30.35660
## 2005                   Sonoma County      6097     21-Suburb: Large 38.36091
## 2006                 Thurston County     53067       13-City: Small 46.99463
## 2007                  Grayson County     48181     41-Rural: Fringe 33.52842
## 2008                  Grayson County     48181     41-Rural: Fringe 33.70585
## 2009                  Grayson County     21085     41-Rural: Fringe 37.46291
## 2010                  Grayson County     48181    42-Rural: Distant 33.44823
## 2011                 Crawford County     26039     41-Rural: Fringe 44.70070
## 2012                  Clinton County     26037    42-Rural: Distant 43.04585
## 2013                   Monroe County     26115     41-Rural: Fringe 41.92379
## 2014                   Peoria County     17143    12-City: Mid-size 40.69969
## 2015                    Brown County     55009  22-Suburb: Mid-size 44.47058
## 2016                  Passaic County     34031     41-Rural: Fringe 41.13373
## 2017                   Butler County     21031    42-Rural: Distant 37.29002
## 2018               Miami-Dade County     12086       11-City: Large 25.77938
## 2019          Prince George's County     24033     21-Suburb: Large 38.86293
## 2020           San Bernardino County      6071     21-Suburb: Large 34.00973
## 2021           San Bernardino County      6071     21-Suburb: Large 34.00973
## 2022                   Sevier County     47155    42-Rural: Distant 35.75902
## 2023                     Kern County      6029       11-City: Large 35.30660
## 2024                   Bremer County     19017     32-Town: Distant 42.72382
## 2025                     Hunt County     48231     32-Town: Distant 33.14151
## 2026                 Montcalm County     26117     32-Town: Distant 43.18656
## 2027             Contra Costa County      6013     21-Suburb: Large 37.93332
## 2028                    Gregg County     48183     23-Suburb: Small 32.53158
## 2029                  Grenada County     28043     41-Rural: Fringe 33.74131
## 2030                    Eaton County     26045      31-Town: Fringe 42.50258
## 2031                   Morris County     34027     21-Suburb: Large 40.83863
## 2032                 San Juan County     53055     43-Rural: Remote 48.53471
## 2033                   Dallas County     48113     21-Suburb: Large 32.94119
## 2034                  St. Louis city     29510       11-City: Large 38.64413
## 2035               New London County      9011     41-Rural: Fringe 41.57791
## 2036                Milwaukee County     55079       11-City: Large 43.04780
## 2037                San Diego County      6073     21-Suburb: Large 32.81639
## 2038                   Warren County     28149     32-Town: Distant 32.35155
## 2039                     Dane County     55025     41-Rural: Fringe 42.95091
## 2040                   Ramsey County     27123       11-City: Large 44.92832
## 2041                Guadalupe County     35019      33-Town: Remote 34.90842
## 2042                   Kenton County     21117     21-Suburb: Large 39.03007
## 2043                   Harris County     48201     21-Suburb: Large 29.66646
## 2044                Kalamazoo County     26077     41-Rural: Fringe 42.37580
## 2045                Kalamazoo County     26077     41-Rural: Fringe 42.37580
## 2046                  Lenawee County     26091     32-Town: Distant 41.88716
## 2047                 Gwinnett County     13135     21-Suburb: Large 33.98633
## 2048               Pasquotank County     37139     32-Town: Distant 36.28617
## 2049                   Harris County     48201       11-City: Large 29.84451
## 2050                   Harris County     48201     21-Suburb: Large 29.68489
## 2051                 Thurston County     53067     32-Town: Distant 46.82221
## 2052                     King County     53033    12-City: Mid-size 47.45640
## 2053                    Bexar County     48029       11-City: Large 29.34729
## 2054                    Bexar County     48029       11-City: Large 29.34230
## 2055                     Hale County     48189    42-Rural: Distant 34.06987
## 2056                     Hale County     48189      33-Town: Remote 34.19360
## 2057                     Hale County     48189      33-Town: Remote 34.18516
## 2058                     Hale County     48189      33-Town: Remote 34.19360
## 2059                  Halifax County     51083      33-Town: Remote 36.76191
## 2060                   Harris County     48201       11-City: Large 29.93634
## 2061                 Harrison County     48203      31-Town: Fringe 32.48812
## 2062                    Burke County     37023  22-Suburb: Mid-size 35.75521
## 2063                  Hamblen County     47063       13-City: Small 36.22576
## 2064                    Glenn County      6021     41-Rural: Fringe 39.74634
## 2065                  Allegan County     26005     41-Rural: Fringe 42.68487
## 2066                    Ionia County     26067     32-Town: Distant 42.98335
## 2067                    Kings County      6031       13-City: Small 36.34348
## 2068                    Kings County      6031       13-City: Small 36.33427
## 2069                    Kings County      6031       13-City: Small 36.34375
## 2070                  Jackson County     26075    42-Rural: Distant 42.11415
## 2071                   Shasta County      6089  22-Suburb: Mid-size 40.45078
## 2072                   Barren County     21009     32-Town: Distant 37.00693
## 2073                     Cook County     17031     21-Suburb: Large 41.88090
## 2074                   Dakota County     27037      31-Town: Fringe 44.73604
## 2075                  Oakland County     26125     41-Rural: Fringe 42.65044
## 2076             Contra Costa County      6013     21-Suburb: Large 37.98500
## 2077                   Hardin County     48199  22-Suburb: Mid-size 30.25569
## 2078                   Hardin County     48199    42-Rural: Distant 30.36863
## 2079                   Hardin County     48199      31-Town: Fringe 30.34581
## 2080                   Hardin County     48199    42-Rural: Distant 30.25810
## 2081                   Hardin County     48199    42-Rural: Distant 30.36863
## 2082                   Jasper County     48241    42-Rural: Distant 30.43062
## 2083                   Hardin County     21093       13-City: Small 37.70425
## 2084                    Bexar County     48029       11-City: Large 29.34230
## 2085                    Bexar County     48029       11-City: Large 29.34230
## 2086                 New York County     36061       11-City: Large 40.80777
## 2087             Scotts Bluff County     31157      33-Town: Remote 41.87283
## 2088                   Harris County     48201       11-City: Large 29.81414
## 2089                  Larimer County      8069     21-Suburb: Large 40.40407
## 2090              Los Angeles County      6037       11-City: Large 34.06126
## 2091                    Wayne County     26163     21-Suburb: Large 42.44433
## 2092                   Harris County     48201       11-City: Large 29.82949
## 2093                   Macomb County     26099     21-Suburb: Large 42.55458
## 2094                  Wichita County     48485    12-City: Mid-size 33.90836
## 2095                   Harris County     48201     21-Suburb: Large 29.70692
## 2096                   Harris County     48201       11-City: Large 29.68441
## 2097                   Harris County     48201     21-Suburb: Large 29.78240
## 2098                   Harris County     48201     21-Suburb: Large 30.04768
## 2099                   Harris County     48201       11-City: Large 29.68441
## 2100                   Harris County     48201     21-Suburb: Large 29.79723
## 2101                   Harris County     48201       11-City: Large 29.76056
## 2102                   Harris County     48201     21-Suburb: Large 29.57006
## 2103              Los Angeles County      6037       11-City: Large 34.06158
## 2104                    Clare County     26035     32-Town: Distant 44.01135
## 2105                St. Clair County     26147     23-Suburb: Small 42.98836
## 2106                 Harrison County     54033     32-Town: Distant 39.31007
## 2107                 Harrison County     54033     32-Town: Distant 39.31007
## 2108                 Harrison County     28047       13-City: Small 30.44413
## 2109                 Harrison County     21097     32-Town: Distant 38.38178
## 2110                     Yuba County      6115  22-Suburb: Mid-size 39.14893
## 2111                Van Buren County     26159      31-Town: Fringe 42.21159
## 2112              San Joaquin County      6077     23-Suburb: Small 37.74131
## 2113                   Dakota County     27037      31-Town: Fringe 44.74361
## 2114                St. Johns County     12109    42-Rural: Distant 29.72227
## 2115               Montgomery County     48339       13-City: Small 30.31607
## 2116                  Olmsted County     27109    12-City: Mid-size 44.01554
## 2117                 Umatilla County     41059     32-Town: Distant 45.67730
## 2118                     Hays County     48209     41-Rural: Fringe 30.09463
## 2119                  Oakland County     26125     21-Suburb: Large 42.44743
## 2120                  Oakland County     26125     21-Suburb: Large 42.46141
## 2121                  Oakland County     26125     21-Suburb: Large 42.46147
## 2122                  Oakland County     26125       13-City: Small 42.65501
## 2123                  Oakland County     26125     21-Suburb: Large 42.65579
## 2124                Arlington County     51013    12-City: Mid-size 38.90044
## 2125                   Harris County     48201       11-City: Large 29.68441
## 2126                   Collin County     48085       11-City: Large 33.02391
## 2127                  Hubbard County     27057     41-Rural: Fringe 46.92512
## 2128                 Hennepin County     27053     21-Suburb: Large 44.93413
## 2129                 Hennepin County     27053     21-Suburb: Large 45.06266
## 2130                    Bexar County     48029       11-City: Large 29.42818
## 2131                    Swift County     27151     41-Rural: Fringe 45.32342
## 2132                   Fresno County      6019      31-Town: Fringe 36.56960
## 2133                   Valley County     16085     43-Rural: Remote 44.90739
## 2134                Frederick County     24021       13-City: Small 39.43797
## 2135                Frederick County     24021       13-City: Small 39.43794
## 2136                Riverside County      6065  22-Suburb: Mid-size 33.73747
## 2137                Multnomah County     41051       11-City: Large 45.56126
## 2138                   Travis County     48453       11-City: Large 30.30235
## 2139                  Saginaw County     26145     41-Rural: Fringe 43.41879
## 2140                   Waller County     48473     32-Town: Distant 30.09768
## 2141              San Joaquin County      6077     41-Rural: Fringe 38.10052
## 2142                   Pierce County     53053     21-Suburb: Large 47.33315
## 2143                Henderson County     37089     21-Suburb: Large 35.30667
## 2144                    Rowan County     37159  22-Suburb: Mid-size 35.67681
## 2145                  Lincoln County     27081     43-Rural: Remote 44.50637
## 2146                  Lincoln County     27081     43-Rural: Remote 44.50637
## 2147                 Hennepin County     27053     21-Suburb: Large 45.09655
## 2148                  Henrico County     51087     21-Suburb: Large 37.62966
## 2149                    Henry County      1067    42-Rural: Distant 31.56736
## 2150                  Broward County     12011     21-Suburb: Large 25.97942
## 2151              Los Angeles County      6037       11-City: Large 34.16902
## 2152                 Hennepin County     27053       11-City: Large 45.03440
## 2153                   Monroe County     26115     41-Rural: Fringe 41.99904
## 2154               Miami-Dade County     12086     21-Suburb: Large 25.91229
## 2155               Deaf Smith County     48117     32-Town: Distant 34.82730
## 2156                    Bexar County     48029     21-Suburb: Large 29.51903
## 2157                 Hennepin County     27053       11-City: Large 44.98903
## 2158                Val Verde County     48465      33-Town: Remote 29.40748
## 2159                    Bexar County     48029     21-Suburb: Large 29.51903
## 2160                    Bexar County     48029     21-Suburb: Large 29.51903
## 2161                    Butte County      6007     32-Town: Distant 39.52138
## 2162                  Daviess County     21059       13-City: Small 37.73810
## 2163                  Ventura County      6111      31-Town: Fringe 34.40480
## 2164                St. Louis County     27137     41-Rural: Fringe 46.82548
## 2165                 Hernando County     12053  22-Suburb: Mid-size 28.48347
## 2166           San Bernardino County      6071     21-Suburb: Large 34.44383
## 2167                  Cameron County     48061  22-Suburb: Mid-size 26.16394
## 2168                  Hidalgo County     48215     21-Suburb: Large 26.09957
## 2169                  Hidalgo County     48215       13-City: Small 26.30590
## 2170                  Hidalgo County     48215    12-City: Mid-size 26.24010
## 2171                  Hidalgo County     48215       13-City: Small 26.30595
## 2172                  Hidalgo County     48215       13-City: Small 26.21791
## 2173                  Hidalgo County     48215       13-City: Small 26.30138
## 2174                  Hidalgo County     48215    12-City: Mid-size 26.24014
## 2175                  Hidalgo County     48215    12-City: Mid-size 26.24011
## 2176                  Hidalgo County     48215     21-Suburb: Large 26.17710
## 2177                  Hidalgo County     48215    12-City: Mid-size 26.17496
## 2178                  Hidalgo County     48215     21-Suburb: Large 26.09956
## 2179                  Lincoln County     16063     43-Rural: Remote 42.93248
## 2180                    Modoc County      6049      33-Town: Remote 41.49130
## 2181                    Clark County     32003    42-Rural: Distant 36.51729
## 2182           San Bernardino County      6071     21-Suburb: Large 34.48677
## 2183                    Clark County     32003    42-Rural: Distant 36.51729
## 2184                     Lake County     46079    42-Rural: Distant 43.90015
## 2185                   Harris County     48201     21-Suburb: Large 29.84101
## 2186                   Harris County     48201       13-City: Small 29.80251
## 2187                 New York County     36061       11-City: Large 40.72913
## 2188                Snohomish County     53061  22-Suburb: Mid-size 47.91898
## 2189                Lancaster County     31109       11-City: Large 40.79403
## 2190                   Ramsey County     27123     21-Suburb: Large 45.08043
## 2191                  Volusia County     12127  22-Suburb: Mid-size 28.89132
## 2192                   Dallas County     48113     21-Suburb: Large 32.84701
## 2193              Los Angeles County      6037       11-City: Large 34.11688
## 2194                   Ulster County     36111     41-Rural: Fringe 41.76127
## 2195                     Lake County      6033     32-Town: Distant 38.91281
## 2196                Highlands County     12055     41-Rural: Fringe 27.50228
## 2197                 Okanogan County     53047      33-Town: Remote 48.40275
## 2198                    Bristol city     51520       13-City: Small 36.60052
## 2199                     Polk County     12105    42-Rural: Distant 27.66523
## 2200                     King County     53033     21-Suburb: Large 47.43775
## 2201                     King County     53033     21-Suburb: Large 47.49638
## 2202                   Harris County     48201       11-City: Large 29.81585
## 2203                   Harris County     48201     21-Suburb: Large 29.84101
## 2204                   Harris County     48201     21-Suburb: Large 29.65594
## 2205                   Harris County     48201     21-Suburb: Large 29.84101
## 2206                   Harris County     48201     21-Suburb: Large 29.84101
## 2207                   Harris County     48201     21-Suburb: Large 29.84101
## 2208                   Harris County     48201     21-Suburb: Large 29.84101
## 2209                   Harris County     48201     21-Suburb: Large 29.95704
## 2210               Palm Beach County     12099    12-City: Mid-size 26.74983
## 2211                 Hennepin County     27053     21-Suburb: Large 45.00430
## 2212                 Hennepin County     27053     21-Suburb: Large 45.00436
## 2213                     Hill County     48217    42-Rural: Distant 32.16451
## 2214                     Hill County     48217     32-Town: Distant 32.00726
## 2215                     Hill County     48217    42-Rural: Distant 31.85431
## 2216                     Hill County     48217     32-Town: Distant 32.01215
## 2217                     Hill County     48217     32-Town: Distant 32.00724
## 2218                     Hill County     48217    42-Rural: Distant 31.94529
## 2219                     Hill County     48217     32-Town: Distant 32.00733
## 2220                     Kerr County     48265      33-Town: Remote 30.05823
## 2221                     Kerr County     48265     41-Rural: Fringe 30.09477
## 2222                     Hill County     48217     32-Town: Distant 32.00733
## 2223                     Hill County     48217     32-Town: Distant 32.00762
## 2224                     Hill County     48217    42-Rural: Distant 31.76279
## 2225                     Hill County     48217     32-Town: Distant 32.00762
## 2226                     Hill County     48217     32-Town: Distant 32.00724
## 2227                    Union County     34039     21-Suburb: Large 40.65485
## 2228                    Union County     34039     21-Suburb: Large 40.64098
## 2229                San Mateo County      6081     21-Suburb: Large 37.51329
## 2230                  Laclede County     29105      33-Town: Remote 37.68200
## 2231               Montgomery County     21173    42-Rural: Distant 37.99500
## 2232                  Kenosha County     55059  22-Suburb: Mid-size 42.61702
## 2233             Hillsborough County     12057     21-Suburb: Large 27.96784
## 2234           San Bernardino County      6071     21-Suburb: Large 34.09554
## 2235                San Diego County      6073    42-Rural: Distant 32.73406
## 2236                  Jackson County     29095     21-Suburb: Large 38.98192
## 2237                  Spencer County     21215    42-Rural: Distant 38.03302
## 2238                   Orange County      6059       13-City: Small 33.73998
## 2239               Miami-Dade County     12086     21-Suburb: Large 25.95797
## 2240                   Wright County     27171    42-Rural: Distant 45.05892
## 2241                 Nicollet County     27103     41-Rural: Fringe 44.30798
## 2242                   Ottawa County     26139       13-City: Small 42.77409
## 2243               Washington County     28151      33-Town: Remote 33.16937
## 2244                   Holmes County     28051     43-Rural: Remote 33.17839
## 2245                    Bexar County     48029       11-City: Large 29.51912
## 2246                 Phillips County      8095     43-Rural: Remote 40.58204
## 2247                Baltimore County     24005       13-City: Small 39.39939
## 2248                Baltimore County     24005       13-City: Small 39.39939
## 2249                    Clark County     53011    12-City: Mid-size 45.64093
## 2250                     King County     53033     21-Suburb: Large 47.77441
## 2251                     Kent County     26081    12-City: Mid-size 42.98501
## 2252                Jefferson County     21111       11-City: Large 38.25231
## 2253                Jefferson County     21111       11-City: Large 38.25229
## 2254                 Okanogan County     53047     43-Rural: Remote 48.44028
## 2255                   Ramsey County     27123       11-City: Large 44.94277
## 2256                    Bexar County     48029       11-City: Large 29.53832
## 2257                    Bexar County     48029     21-Suburb: Large 29.49392
## 2258                  Kleberg County     48273     32-Town: Distant 27.51816
## 2259                  Tarrant County     48439     21-Suburb: Large 32.80594
## 2260                  Tarrant County     48439     21-Suburb: Large 32.82133
## 2261                   Island County     53029     32-Town: Distant 48.29581
## 2262                  Clallam County     53009     41-Rural: Fringe 48.09079
## 2263                Snohomish County     53061  22-Suburb: Mid-size 48.01750
## 2264                    Clark County     53011     21-Suburb: Large 45.59514
## 2265         Kenai Peninsula Borough      2122     43-Rural: Remote 59.64998
## 2266                  Ventura County      6111    12-City: Mid-size 34.26511
## 2267                   Howard County     24027       13-City: Small 39.23546
## 2268                  Spokane County     53063      31-Town: Fringe 47.48959
## 2269                    Butte County      6007      31-Town: Fringe 39.75162
## 2270                    Butte County      6007      31-Town: Fringe 39.75190
## 2271                    Butte County      6007       13-City: Small 39.74368
## 2272                  Barbour County      1005     32-Town: Distant 31.86799
## 2273                  Passaic County     34031     21-Suburb: Large 40.87055
## 2274                  Gadsden County     12039      31-Town: Fringe 30.57977
## 2275                Hempstead County      5057     32-Town: Distant 33.66213
## 2276                  Hidalgo County     48215     21-Suburb: Large 26.24878
## 2277                  Calhoun County     48057     32-Town: Distant 28.62199
## 2278                  Houston County      1069       13-City: Small 31.25080
## 2279               Montgomery County     21173    42-Rural: Distant 38.01192
## 2280                  Jackson County     12063    42-Rural: Distant 30.71270
## 2281                   Navajo County      4017     41-Rural: Fringe 34.86995
## 2282                  Hopkins County     21107     32-Town: Distant 37.32677
## 2283                  Hopkins County     21107     32-Town: Distant 37.32761
## 2284                Riverside County      6065     21-Suburb: Large 33.70236
## 2285                   Fresno County      6019      31-Town: Fringe 36.43155
## 2286                    Wayne County     26163     21-Suburb: Large 42.40117
## 2287                   Morgan County      1103       13-City: Small 34.60688
## 2288                  Manatee County     12081     21-Suburb: Large 27.48254
## 2289                 Caldwell County     37027       13-City: Small 35.92717
## 2290                  Chaffee County      8015      33-Town: Remote 38.52742
## 2291                     Todd County     21219    42-Rural: Distant 36.79790
## 2292                  Boulder County      8013    12-City: Mid-size 39.99350
## 2293             Contra Costa County      6013     21-Suburb: Large 37.93359
## 2294                Salt Lake County     49035    12-City: Mid-size 40.74262
## 2295                     Clay County     21051      33-Town: Remote 37.15810
## 2296                  Hidalgo County     48215     21-Suburb: Large 26.16227
## 2297                   Collin County     48085       11-City: Large 33.01844
## 2298                   Dallas County     48113       11-City: Large 32.77512
## 2299                Roscommon County     26143      33-Town: Remote 44.33361
## 2300                Chickasaw County     28017      33-Town: Remote 33.88869
## 2301                   Harris County     48201       11-City: Large 29.65811
## 2302                   Harris County     48201       11-City: Large 29.79178
## 2303                   Harris County     48201       11-City: Large 29.67448
## 2304                  Houston County      1069       13-City: Small 31.22775
## 2305                   Harris County     48201       11-City: Large 29.79169
## 2306          Prince George's County     24033     21-Suburb: Large 38.99022
## 2307               Cumberland County     37051    12-City: Mid-size 35.02968
## 2308                   Becker County     27005      33-Town: Remote 46.81919
## 2309                   Becker County     27005      33-Town: Remote 46.81919
## 2310                    Erath County     48143    42-Rural: Distant 32.34414
## 2311                   Hudson County     34017     21-Suburb: Large 40.78507
## 2312                   Hudson County     34017     21-Suburb: Large 40.80144
## 2313                  Lenawee County     26091    42-Rural: Distant 41.85619
## 2314                   Marion County     21155     41-Rural: Fringe 37.57767
## 2315                   Denton County     48121     21-Suburb: Large 32.99895
## 2316                   Harris County     48201     21-Suburb: Large 29.99575
## 2317                 Humboldt County     32013      33-Town: Remote 40.97508
## 2318                 Humboldt County     32013      33-Town: Remote 40.97815
## 2319                 Humboldt County      6023      33-Town: Remote 40.78870
## 2320                 Humboldt County      6023      33-Town: Remote 40.78921
## 2321                 Plymouth County     25023     21-Suburb: Large 42.06266
## 2322                  Oakland County     26125     41-Rural: Fringe 42.65044
## 2323                Washtenaw County     26161     41-Rural: Fringe 42.17416
## 2324                    Erath County     48143     41-Rural: Fringe 32.19307
## 2325                     King County     53033       11-City: Large 47.62351
## 2326                   McLeod County     27085     32-Town: Distant 44.87901
## 2327                   McLeod County     27085     32-Town: Distant 44.88444
## 2328                 Kankakee County     17091     23-Suburb: Small 41.08055
## 2329                  Spokane County     53063       13-City: Small 47.65848
## 2330                      Ada County     16001    12-City: Mid-size 43.66237
## 2331                      Ada County     16001     21-Suburb: Large 43.58708
## 2332               Clearwater County     16035     43-Rural: Remote 46.49811
## 2333               Clearwater County     16035     43-Rural: Remote 46.49811
## 2334                San Diego County      6073     21-Suburb: Large 32.81728
## 2335                     King County     53033    12-City: Mid-size 47.37094
## 2336                   Island County     53029     32-Town: Distant 48.30213
## 2337                San Diego County      6073       11-City: Large 32.75087
## 2338                     Cook County     17031       11-City: Large 41.86719
## 2339                   Jersey County     17083    42-Rural: Distant 38.97317
## 2340                  Carroll County     21041     32-Town: Distant 38.65736
## 2341                     Kane County     17089     21-Suburb: Large 41.78665
## 2342                   DuPage County     17043     21-Suburb: Large 41.81137
## 2343                     Kane County     17089     21-Suburb: Large 41.90792
## 2344                    Boone County     21015     21-Suburb: Large 39.00082
## 2345                Dickinson County     26043      33-Town: Remote 45.81452
## 2346                  Collier County     12021     32-Town: Distant 26.42434
## 2347                    Duval County     12031    42-Rural: Distant 30.54107
## 2348                  Whatcom County     53073     41-Rural: Fringe 48.95216
## 2349                 Imperial County      6025  22-Suburb: Mid-size 32.85019
## 2350                 Imperial County      6025  22-Suburb: Mid-size 32.75209
## 2351              San Joaquin County      6077     41-Rural: Fringe 38.10010
## 2352                  Jackson County     29095     21-Suburb: Large 39.10490
## 2353                  Bingham County     16011     32-Town: Distant 43.19034
## 2354              Los Angeles County      6037       11-City: Large 34.18966
## 2355                El Dorado County      6017      31-Town: Fringe 38.69366
## 2356                   Madera County      6039     41-Rural: Fringe 36.92528
## 2357             Contra Costa County      6013     21-Suburb: Large 37.93661
## 2358            San Francisco County      6075       11-City: Large 37.76330
## 2359                     Utah County     49049    12-City: Mid-size 40.24267
## 2360          San Luis Obispo County      6079       13-City: Small 35.64301
## 2361                   Placer County      6061    12-City: Mid-size 38.75918
## 2362              Los Angeles County      6037     21-Suburb: Large 34.09066
## 2363                   Merced County      6047       13-City: Small 37.30082
## 2364                   Amador County      6005     41-Rural: Fringe 38.37758
## 2365                 New York County     36061       11-City: Large 40.76797
## 2366                   Fulton County     13121       13-City: Small 34.02000
## 2367                     Elko County     32007     41-Rural: Fringe 40.88057
## 2368                 Sandoval County     35043     21-Suburb: Large 35.26490
## 2369                  Spokane County     53063    42-Rural: Distant 47.96883
## 2370                  Douglas County     31055       11-City: Large 41.26723
## 2371                  Alameda County      6001       11-City: Large 37.76597
## 2372              Los Angeles County      6037  22-Suburb: Mid-size 34.15116
## 2373               Washington County     16087      33-Town: Remote 44.26388
## 2374                Sunflower County     28133      33-Town: Remote 33.44201
## 2375                 Plymouth County     19149     32-Town: Distant 42.78844
## 2376                   Monroe County     36055     41-Rural: Fringe 42.99664
## 2377                   Ingham County     26065    12-City: Mid-size 42.69556
## 2378                   Ingham County     26065    12-City: Mid-size 42.68118
## 2379                   Ingham County     26065     41-Rural: Fringe 42.46130
## 2380              Los Angeles County      6037     21-Suburb: Large 33.95673
## 2381                      Ada County     16001      31-Town: Fringe 43.49876
## 2382              Los Angeles County      6037     21-Suburb: Large 34.57573
## 2383                   Washoe County     32031    12-City: Mid-size 39.52533
## 2384                   Orange County     12095     21-Suburb: Large 28.58062
## 2385                     Dane County     55025       11-City: Large 43.08358
## 2386                     Dane County     55025       11-City: Large 43.08552
## 2387                    Eaton County     26045     21-Suburb: Large 42.72399
## 2388                  Clallam County     53009      33-Town: Remote 47.94936
## 2389                     Dane County     55025     21-Suburb: Large 43.01481
## 2390                  Tarrant County     48439       11-City: Large 32.76031
## 2391                   Harris County     48201       11-City: Large 29.64042
## 2392                  Hidalgo County     48215    12-City: Mid-size 26.19984
## 2393                    Starr County     48427     32-Town: Distant 26.40736
## 2394                  Tarrant County     48439       11-City: Large 32.72048
## 2395                   Carver County     27019     21-Suburb: Large 44.84280
## 2396                  Fairfax County     51059     21-Suburb: Large 38.86477
## 2397                     King County     53033       11-City: Large 47.55817
## 2398                     King County     53033       11-City: Large 47.58084
## 2399                     King County     53033     21-Suburb: Large 47.66381
## 2400                   Travis County     48453       11-City: Large 30.25781
## 2401                   Dallas County     48113     21-Suburb: Large 32.75192
## 2402              Los Angeles County      6037     21-Suburb: Large 34.05097
## 2403                     King County     53033    12-City: Mid-size 47.60412
## 2404                     King County     53033     21-Suburb: Large 47.31936
## 2405                 Franklin County     53021  22-Suburb: Mid-size 46.25451
## 2406                 Maricopa County      4013    12-City: Mid-size 33.40429
## 2407                Cheboygan County     26031    42-Rural: Distant 45.57148
## 2408                  Oakland County     26125     21-Suburb: Large 42.47031
## 2409                    Ionia County     26067     32-Town: Distant 42.98351
## 2410                  Wichita County     48485    12-City: Mid-size 33.92917
## 2411                   Merced County      6047     41-Rural: Fringe 37.39957
## 2412                 Hennepin County     27053       13-City: Small 45.04491
## 2413                   Denton County     48121     21-Suburb: Large 33.02598
## 2414                Crow Wing County     27035      33-Town: Remote 46.36230
## 2415                 Hennepin County     27053       13-City: Small 45.01954
## 2416              Koochiching County     27071      33-Town: Remote 48.59270
## 2417                  Henrico County     51087     21-Suburb: Large 37.54418
## 2418                Marquette County     26103      33-Town: Remote 46.49941
## 2419                   Fresno County      6019      31-Town: Fringe 36.51659
## 2420                  Alameda County      6001     21-Suburb: Large 37.77590
## 2421                      Lee County     12071     21-Suburb: Large 26.50107
## 2422               Mille Lacs County     27095     43-Rural: Remote 46.13762
## 2423                   Itasca County     27061      33-Town: Remote 47.22244
## 2424                 Itawamba County     28057      33-Town: Remote 34.26732
## 2425                   Collin County     48085       11-City: Large 33.01852
## 2426                Sherburne County     27141     21-Suburb: Large 45.31219
## 2427                Sherburne County     27141     21-Suburb: Large 45.31220
## 2428                Sherburne County     27141     21-Suburb: Large 45.31217
## 2429                Sherburne County     27141     21-Suburb: Large 45.31216
## 2430                San Diego County      6073     21-Suburb: Large 33.34871
## 2431                     Cook County     17031       11-City: Large 41.88348
## 2432                    Henry County     17073     32-Town: Distant 41.25337
## 2433                   Collin County     48085  22-Suburb: Mid-size 33.20557
## 2434                  Johnson County     48251      31-Town: Fringe 32.34561
## 2435                  Hidalgo County     48215    12-City: Mid-size 26.17496
## 2436                  Hidalgo County     48215    12-City: Mid-size 26.17496
## 2437                     Hoke County     37093     21-Suburb: Large 34.98472
## 2438                    Kings County      6031       13-City: Small 36.33099
## 2439              New Hanover County     37129    12-City: Mid-size 34.18486
## 2440                   Fresno County      6019       11-City: Large 36.75380
## 2441                 Siskiyou County      6093     41-Rural: Fringe 41.70831
## 2442                Hampshire County     54027    42-Rural: Distant 39.30308
## 2443              Los Angeles County      6037       11-City: Large 34.17678
## 2444              Los Angeles County      6037       11-City: Large 34.17678
## 2445                 Escambia County     12033     21-Suburb: Large 30.51590
## 2446                   Warren County     21227       13-City: Small 37.00718
## 2447                   Warren County     21227       13-City: Small 37.00724
## 2448                  Jackson County     12063     41-Rural: Fringe 30.76227
## 2449                  Jackson County     18071     32-Town: Distant 38.87452
## 2450                  Jackson County     37099     41-Rural: Fringe 35.40411
## 2451                  Jackson County     55053     32-Town: Distant 44.30531
## 2452                  Jackson County      1071    42-Rural: Distant 34.73048
## 2453                  Jackson County     26075       13-City: Small 42.24507
## 2454                  Jackson County     26075       13-City: Small 42.25066
## 2455               Miami-Dade County     12086       11-City: Large 25.79076
## 2456                    Perry County     17145     32-Town: Distant 38.00918
## 2457                  Douglas County     32005     41-Rural: Fringe 38.95932
## 2458                     Gila County      4007      33-Town: Remote 33.39241
## 2459                   Graham County      4009      33-Town: Remote 32.83396
## 2460                 Greenlee County      4011     41-Rural: Fringe 33.03765
## 2461                 Maricopa County      4013       11-City: Large 33.44860
## 2462               Santa Cruz County      4023      33-Town: Remote 31.35562
## 2463                    Mason County     53045     41-Rural: Fringe 47.41641
## 2464                Milwaukee County     55079       13-City: Small 43.01250
## 2465                  Kanawha County     54039     41-Rural: Fringe 38.37470
## 2466                    Pasco County     12101     23-Suburb: Small 28.34243
## 2467                   Denton County     48121     21-Suburb: Large 33.00202
## 2468                    Meade County     21163    42-Rural: Distant 37.99362
## 2469                    Kings County      6031     23-Suburb: Small 36.29720
## 2470                     Mono County      6051      33-Town: Remote 37.63891
## 2471              Los Angeles County      6037       11-City: Large 34.27399
## 2472              San Joaquin County      6077       11-City: Large 37.95636
## 2473               Miami-Dade County     12086     21-Suburb: Large 25.92128
## 2474              Los Angeles County      6037     21-Suburb: Large 34.70070
## 2475                Nez Perce County     16069     41-Rural: Fringe 46.36523
## 2476                   Canyon County     16027  22-Suburb: Mid-size 43.59966
## 2477                  Fremont County     16043     41-Rural: Fringe 43.96916
## 2478                Jefferson County     21111       11-City: Large 38.24062
## 2479                  Johnson County     48251    42-Rural: Distant 32.23041
## 2480                   Dallas County     48113     41-Rural: Fringe 32.59330
## 2481                  Tarrant County     48439       11-City: Large 32.74751
## 2482                Jefferson County     55055     41-Rural: Fringe 42.84269
## 2483                 Houghton County     26061    42-Rural: Distant 47.04077
## 2484                Jefferson County     48245    12-City: Mid-size 30.07911
## 2485                Jefferson County     48245    12-City: Mid-size 30.07907
## 2486                Jefferson County     48245    42-Rural: Distant 29.73004
## 2487                Jefferson County     48245  22-Suburb: Mid-size 30.00055
## 2488                Jefferson County     48245  22-Suburb: Mid-size 30.00055
## 2489                Jefferson County     48245  22-Suburb: Mid-size 30.00055
## 2490                Jefferson County     28063     43-Rural: Remote 31.69830
## 2491                Jefferson County      1073     21-Suburb: Large 33.44639
## 2492                Jefferson County      1073     21-Suburb: Large 33.60577
## 2493                Jefferson County     21111       11-City: Large 38.23992
## 2494                 Siskiyou County      6093      33-Town: Remote 41.32008
## 2495                Jefferson County     16051    42-Rural: Distant 43.70333
## 2496                     Weld County      8123    12-City: Mid-size 40.41758
## 2497                    Lamar County     28073    42-Rural: Distant 31.13687
## 2498                    Clark County     32003     21-Suburb: Large 36.21466
## 2499                   Ottawa County     26139     21-Suburb: Large 42.90526
## 2500              Los Angeles County      6037    12-City: Mid-size 34.16413
## 2501                    Bexar County     48029       11-City: Large 29.60700
## 2502                     Bell County     48027    12-City: Mid-size 31.11439
## 2503                  Houston County     48225      33-Town: Remote 31.29838
## 2504                     Hood County     48221     41-Rural: Fringe 32.44746
## 2505                     Hays County     48209     41-Rural: Fringe 29.83206
## 2506                 Gonzales County     48177     41-Rural: Fringe 29.62984
## 2507               Williamson County     48491     41-Rural: Fringe 30.66502
## 2508                    Milam County     48331     41-Rural: Fringe 30.67353
## 2509                 Lampasas County     48281     43-Rural: Remote 31.21714
## 2510                     Inyo County      6027      33-Town: Remote 37.36035
## 2511               Montgomery County     48339     41-Rural: Fringe 30.39196
## 2512                 Atascosa County     48013      31-Town: Fringe 29.23290
## 2513                   Dallas County     48113    12-City: Mid-size 32.93965
## 2514                  El Paso County     48141       11-City: Large 31.72898
## 2515                     Webb County     48479     43-Rural: Remote 27.42788
## 2516               Montgomery County     48339       13-City: Small 30.33412
## 2517                    Bexar County     48029       11-City: Large 29.43681
## 2518                   Harris County     48201     21-Suburb: Large 30.00791
## 2519                   Harris County     48201     21-Suburb: Large 29.65469
## 2520                   Harris County     48201       11-City: Large 29.68441
## 2521                  Hidalgo County     48215       13-City: Small 26.28818
## 2522                  Tarrant County     48439       11-City: Large 32.75979
## 2523                  Madison County     12079     43-Rural: Remote 30.45441
## 2524                   Denton County     48121    12-City: Mid-size 33.21206
## 2525              San Joaquin County      6077     41-Rural: Fringe 37.89148
## 2526                   Sonoma County      6097      31-Town: Fringe 38.80765
## 2527               Stanislaus County      6099     23-Suburb: Small 37.49562
## 2528                    Dodge County     55027     32-Town: Distant 43.62082
## 2529              San Joaquin County      6077       11-City: Large 37.90919
## 2530                Riverside County      6065     21-Suburb: Large 33.91729
## 2531                   Solano County      6095    12-City: Mid-size 38.13272
## 2532              Los Angeles County      6037       11-City: Large 33.96784
## 2533                   Tulare County      6107      31-Town: Fringe 36.20411
## 2534             Spotsylvania County     51177     41-Rural: Fringe 38.15561
## 2535                   Dallas County     48113       11-City: Large 32.70410
## 2536                 Seminole County     12117       13-City: Small 28.75779
## 2537                   Collin County     48085    42-Rural: Distant 33.30818
## 2538              Los Angeles County      6037       11-City: Large 34.21269
## 2539                 New York County     36061       11-City: Large 40.70561
## 2540                Calaveras County      6009     32-Town: Distant 38.08003
## 2541                  Bossier Parish     22015       13-City: Small 32.54624
## 2542                  Johnson County     21115      33-Town: Remote 37.82144
## 2543                  Johnson County     48251      31-Town: Fringe 32.37269
## 2544                  Johnson County     48251     21-Suburb: Large 32.52590
## 2545         Juneau City and Borough      2110     41-Rural: Fringe 58.32957
## 2546                    Jones County     28067     41-Rural: Fringe 31.69754
## 2547                Hillsdale County     26059     32-Town: Distant 41.98503
## 2548            San Francisco County      6075       11-City: Large 37.71956
## 2549                   Manassas city     51683     21-Suburb: Large 38.74745
## 2550                 Atascosa County     48013     32-Town: Distant 28.92110
## 2551                 Seminole County     12117       13-City: Small 28.78716
## 2552                    Nolan County     48353     32-Town: Distant 32.48027
## 2553                    Bexar County     48029       11-City: Large 29.45423
## 2554                    Bexar County     48029       11-City: Large 29.36796
## 2555                    Bexar County     48029       11-City: Large 29.37242
## 2556                    Bexar County     48029       11-City: Large 29.37195
## 2557               Dorchester County     24019     32-Town: Distant 38.57966
## 2558                    Bexar County     48029     21-Suburb: Large 29.50972
## 2559                    Bexar County     48029       11-City: Large 29.59395
## 2560                    Gregg County     48183     41-Rural: Fringe 32.58534
## 2561                 Escambia County     12033     21-Suburb: Large 30.38996
## 2562                   Orange County      6059     21-Suburb: Large 33.50648
## 2563                  Manatee County     12081       13-City: Small 27.46668
## 2564                  Manatee County     12081     21-Suburb: Large 27.52192
## 2565                  Boulder County      8013     23-Suburb: Small 39.98757
## 2566                 Stoddard County     29207    42-Rural: Distant 36.88390
## 2567                Fort Bend County     48157     21-Suburb: Large 29.57184
## 2568                 Angelina County     48005      33-Town: Remote 31.37094
## 2569                    Bexar County     48029       11-City: Large 29.39388
## 2570                    Gregg County     48183       13-City: Small 32.50122
## 2571                     Elko County     32007      33-Town: Remote 40.82475
## 2572                    Clark County     32003       11-City: Large 36.17472
## 2573                  Portage County     55097     32-Town: Distant 44.52030
## 2574                   Orange County     12095     21-Suburb: Large 28.51014
## 2575                    Clark County     32003       11-City: Large 36.17472
## 2576                Champaign County     17019       13-City: Small 40.11017
## 2577                  Manatee County     12081       13-City: Small 27.48289
## 2578                   Taylor County     48441    12-City: Mid-size 32.41846
## 2579                   Ottawa County     26139    42-Rural: Distant 42.94050
## 2580                    Pasco County     12101     41-Rural: Fringe 28.32334
## 2581                Guadalupe County     48187      31-Town: Fringe 29.60249
## 2582                Val Verde County     48465      33-Town: Remote 29.36132
## 2583               Montgomery County     48339       13-City: Small 30.33398
## 2584             San Patricio County     48409     32-Town: Distant 28.02763
## 2585                  Hidalgo County     48215       13-City: Small 26.30599
## 2586                St. Louis County     29189     21-Suburb: Large 38.64500
## 2587             St. Francois County     29187     32-Town: Distant 37.77629
## 2588                Jefferson County     29099      31-Town: Fringe 38.24724
## 2589               Burlington County     34005     21-Suburb: Large 40.13706
## 2590                   Madera County      6039     23-Suburb: Small 36.95323
## 2591                   Dallas County     48113       11-City: Large 32.77158
## 2592                   Harris County     48201       11-City: Large 29.68441
## 2593                  Johnson County     48251      31-Town: Fringe 32.34607
## 2594                  Tarrant County     48439       11-City: Large 32.72998
## 2595                  Johnson County     48251      31-Town: Fringe 32.42738
## 2596               Montgomery County     48339       13-City: Small 30.33398
## 2597               St. Joseph County     18141    12-City: Mid-size 41.66400
## 2598               Miami-Dade County     12086     21-Suburb: Large 25.80623
## 2599                   Greene County     29077    12-City: Mid-size 37.22035
## 2600                     Clay County     29047     21-Suburb: Large 39.23820
## 2601                    Boone County     29019    12-City: Mid-size 39.00465
## 2602                   Camden County     29029      33-Town: Remote 38.00503
## 2603               Burlington County     34005     21-Suburb: Large 40.13706
## 2604               Burlington County     34005     21-Suburb: Large 40.13737
## 2605                   Orange County     12095     21-Suburb: Large 28.57251
## 2606                   Ramsey County     27123       11-City: Large 44.94820
## 2607                 Hamilton County     18057     21-Suburb: Large 40.05175
## 2608                     Webb County     48479       11-City: Large 27.57188
## 2609                   Karnes County     48255     41-Rural: Fringe 28.82743
## 2610                     Kerr County     48265     41-Rural: Fringe 30.01822
## 2611                 Kittitas County     53037     32-Town: Distant 46.99455
## 2612                Kalamazoo County     26077       13-City: Small 42.28497
## 2613                Kalamazoo County     26077       13-City: Small 42.25779
## 2614                     Lane County     41039    12-City: Mid-size 44.07391
## 2615                 Kalkaska County     26079      33-Town: Remote 44.73617
## 2616                   Wilson County     48493     41-Rural: Fringe 29.15300
## 2617                   Harris County     48201     21-Suburb: Large 29.86384
## 2618                     Hays County     48209     32-Town: Distant 30.00294
## 2619                   Tulare County      6107     41-Rural: Fringe 36.33244
## 2620                   Wilson County     48493     41-Rural: Fringe 29.15300
## 2621                   DeKalb County     17037     41-Rural: Fringe 41.93987
## 2622                  Johnson County     48251      31-Town: Fringe 32.39386
## 2623                     Inyo County      6027      33-Town: Remote 37.36030
## 2624                  Douglas County     31055     41-Rural: Fringe 41.20401
## 2625                Riverside County      6065     21-Suburb: Large 33.68264
## 2626                     Lake County      6033     32-Town: Distant 38.97984
## 2627                  Kaufman County     48257    42-Rural: Distant 32.43644
## 2628                 Maricopa County      4013     21-Suburb: Large 33.29940
## 2629         Kenai Peninsula Borough      2122      33-Town: Remote 60.55380
## 2630                  Tarrant County     48439     21-Suburb: Large 32.64841
## 2631                   Tucker County     54093     43-Rural: Remote 39.14920
## 2632                     Kent County     26081     21-Suburb: Large 43.03310
## 2633                     King County     53033     21-Suburb: Large 47.40011
## 2634                     King County     53033    12-City: Mid-size 47.36650
## 2635                  Goodhue County     27049    42-Rural: Distant 44.26773
## 2636                  Goodhue County     27049    42-Rural: Distant 44.26785
## 2637                  Norfolk County     25021     21-Suburb: Large 42.03447
## 2638                     Kern County      6029       11-City: Large 35.37417
## 2639                     Kern County      6029       11-City: Large 35.37461
## 2640                     Kerr County     48265      33-Town: Remote 30.04671
## 2641                Sheboygan County     55117    42-Rural: Distant 43.71940
## 2642                  El Paso County     48141       11-City: Large 31.70602
## 2643                  Cameron County     48061       13-City: Small 26.22068
## 2644                   Monroe County     12087      33-Town: Remote 24.56355
## 2645                  El Paso County     48141     21-Suburb: Large 31.65291
## 2646                  Tarrant County     48439     21-Suburb: Large 32.82113
## 2647                     Hays County     48209     23-Suburb: Small 29.89829
## 2648             North Slope Borough      2185      33-Town: Remote 71.30034
## 2649                     Bell County     48027    12-City: Mid-size 31.11439
## 2650                     Yolo County      6113     23-Suburb: Small 38.54887
## 2651                Middlesex County     25017    12-City: Mid-size 42.37079
## 2652              Los Angeles County      6037     21-Suburb: Large 33.92421
## 2653                   Fresno County      6019     41-Rural: Fringe 36.58871
## 2654                    Kings County      6031     32-Town: Distant 36.09652
## 2655                   Fresno County      6019      31-Town: Fringe 36.70541
## 2656                   Fresno County      6019      31-Town: Fringe 36.51830
## 2657                  Forsyth County     37067    12-City: Mid-size 36.10417
## 2658               Sacramento County      6067       13-City: Small 38.60128
## 2659                  Bannock County     16005       13-City: Small 42.89049
## 2660                 Chippewa County     26033     41-Rural: Fringe 46.24940
## 2661              Los Angeles County      6037     21-Suburb: Large 34.01173
## 2662                  Klamath County     41035      33-Town: Remote 42.21674
## 2663                   Harris County     48201     21-Suburb: Large 30.01460
## 2664                   Harris County     48201     21-Suburb: Large 30.04817
## 2665                   Harris County     48201     21-Suburb: Large 30.04787
## 2666                    Swift County     27151     43-Rural: Remote 45.19503
## 2667                   Wright County     27171     21-Suburb: Large 45.21049
## 2668                     Knox County     21121      33-Town: Remote 36.86993
## 2669                     Knox County     21121      33-Town: Remote 36.86736
## 2670                     Knox County     21121      33-Town: Remote 36.86736
## 2671                     Knox County     21121      33-Town: Remote 36.86575
## 2672               Mille Lacs County     27095     43-Rural: Remote 46.07082
## 2673                     Lake County      6033     32-Town: Distant 38.93347
## 2674                 Kootenai County     16055       13-City: Small 47.67889
## 2675                   Attala County     28007      33-Town: Remote 33.05830
## 2676              Bethel Census Area      2050      33-Town: Remote 60.79613
## 2677                 Maricopa County      4013       11-City: Large 33.29253
## 2678                  Lubbock County     48303       11-City: Large 33.61977
## 2679                   Dallas County     48113     21-Suburb: Large 32.58815
## 2680              Los Angeles County      6037       11-City: Large 34.06393
## 2681                    Clark County     53011     41-Rural: Fringe 45.86530
## 2682            Santa Barbara County      6083       13-City: Small 34.42130
## 2683               Sacramento County      6067     21-Suburb: Large 38.64544
## 2684                   Orange County      6059     21-Suburb: Large 33.88891
## 2685                Riverside County      6065     21-Suburb: Large 33.63719
## 2686                  Cameron County     48061  22-Suburb: Mid-size 26.16190
## 2687             Contra Costa County      6013     21-Suburb: Large 37.92067
## 2688                   Orange County      6059     21-Suburb: Large 33.87919
## 2689                  Hidalgo County     48215     21-Suburb: Large 26.29596
## 2690                   Orange County      6059     21-Suburb: Large 33.87915
## 2691                   Hendry County     12051     32-Town: Distant 26.74490
## 2692                Milwaukee County     55079       11-City: Large 43.00512
## 2693                Lafourche Parish     22057       13-City: Small 29.77165
## 2694                   Sonoma County      6097     21-Suburb: Large 38.40628
## 2695             Hillsborough County     12057     21-Suburb: Large 27.96755
## 2696                     Lake County     12069  22-Suburb: Mid-size 28.83758
## 2697                     Lake County     12069  22-Suburb: Mid-size 28.83753
## 2698              Los Angeles County      6037       11-City: Large 34.19256
## 2699                Missaukee County     26113    42-Rural: Distant 44.33742
## 2700                  Wabasha County     27157     32-Town: Distant 44.44443
## 2701                     Lake County     17097     21-Suburb: Large 42.35397
## 2702                     Lake County     12069  22-Suburb: Mid-size 28.80194
## 2703                    Wayne County     21231    42-Rural: Distant 36.85262
## 2704              New Hanover County     37129    12-City: Mid-size 34.21547
## 2705                   Macomb County     26099     21-Suburb: Large 42.72517
## 2706                Kandiyohi County     27067      33-Town: Remote 45.14136
## 2707                   Bonner County     16017     32-Town: Distant 48.28280
## 2708                 Okanogan County     53047     43-Rural: Remote 47.97016
## 2709                   Branch County     26023     32-Town: Distant 41.96262
## 2710                     Lake County      6033     32-Town: Distant 39.05947
## 2711                     Lake County      6033     32-Town: Distant 39.05947
## 2712                    Bexar County     48029     41-Rural: Fringe 29.22207
## 2713                     Clay County     27027  22-Suburb: Mid-size 46.86674
## 2714                    Wayne County     26163     21-Suburb: Large 42.08520
## 2715                   Wright County     27171     41-Rural: Fringe 45.15272
## 2716                St. Louis County     27137       13-City: Small 46.78839
## 2717                Kalamazoo County     26077       13-City: Small 42.25095
## 2718                    Greer County     40055    42-Rural: Distant 34.95736
## 2719                 Escambia County     12033       13-City: Small 30.43210
## 2720                Kandiyohi County     27067      33-Town: Remote 45.11758
## 2721                   Durham County     37063       11-City: Large 36.03781
## 2722                   Dakota County     27037     21-Suburb: Large 44.64634
## 2723                Snohomish County     53061  22-Suburb: Mid-size 48.05507
## 2724                  Hidalgo County     48215    12-City: Mid-size 26.21298
## 2725                    Lamar County     48277      33-Town: Remote 33.69149
## 2726                   Dawson County     48115      33-Town: Remote 32.74387
## 2727                   Dawson County     48115      33-Town: Remote 32.73033
## 2728              Los Angeles County      6037     21-Suburb: Large 34.68877
## 2729                   Lander County     32015      33-Town: Remote 40.63896
## 2730                     Utah County     49049     21-Suburb: Large 40.10542
## 2731                Arlington County     51013    12-City: Mid-size 38.89607
## 2732                  Broward County     12011     21-Suburb: Large 25.99357
## 2733                   Macomb County     26099     21-Suburb: Large 42.59868
## 2734                   Ingham County     26065    12-City: Mid-size 42.67383
## 2735                   Collin County     48085       11-City: Large 33.07277
## 2736                   Harris County     48201       11-City: Large 29.70492
## 2737               Sacramento County      6067       11-City: Large 38.47029
## 2738              Los Angeles County      6037     21-Suburb: Large 33.87691
## 2739                  LaSalle County     17099     32-Town: Distant 41.37284
## 2740                   Lassen County      6035      33-Town: Remote 40.41673
## 2741               Lauderdale County     28075      33-Town: Remote 32.36592
## 2742                  Broward County     12011     21-Suburb: Large 26.14711
## 2743                   Laurel County     21125    42-Rural: Distant 37.08577
## 2744                   Laurel County     21125      33-Town: Remote 37.13259
## 2745                    Jones County     28067     32-Town: Distant 31.67933
## 2746                    Bexar County     48029       11-City: Large 29.60322
## 2747                St. Louis County     27137    42-Rural: Distant 47.68095
## 2748                Van Buren County     26159      31-Town: Fringe 42.16836
## 2749                Mendocino County      6045     43-Rural: Remote 39.68942
## 2750                    Gregg County     48183       13-City: Small 32.49001
## 2751                   Platte County     29165       11-City: Large 39.27720
## 2752                 Lawrence County     46081    42-Rural: Distant 44.21144
## 2753                Snohomish County     53061     21-Suburb: Large 47.85372
## 2754                   Harris County     48201     41-Rural: Fringe 29.89761
## 2755                   Travis County     48453       11-City: Large 30.23612
## 2756                 Pinellas County     12103     21-Suburb: Large 27.81681
## 2757                   Ramsey County     27123       11-City: Large 44.96080
## 2758                   Dakota County     27037     21-Suburb: Large 44.77242
## 2759                    Perry County     21193      33-Town: Remote 37.28463
## 2760                 Hartford County      9003    12-City: Mid-size 41.77503
## 2761               Santa Rosa County     12113     21-Suburb: Large 30.64847
## 2762                   Denton County     48121     21-Suburb: Large 33.02571
## 2763                  Oakland County     26125     41-Rural: Fringe 42.75523
## 2764              Los Angeles County      6037     21-Suburb: Large 34.40484
## 2765                      Lee County     12071       13-City: Small 26.64699
## 2766                      Lee County     28081      33-Town: Remote 34.30770
## 2767                      Lea County     35025     41-Rural: Fringe 32.76433
## 2768                      Lee County     12071       13-City: Small 26.64254
## 2769                      Lee County     45061     41-Rural: Fringe 34.19759
## 2770                Riverside County      6065    12-City: Mid-size 33.85340
## 2771          San Luis Obispo County      6079     32-Town: Distant 35.56899
## 2772                  Leflore County     28083      33-Town: Remote 33.49679
## 2773                     Napa County      6055     41-Rural: Fringe 38.16790
## 2774               Livingston County     26093     41-Rural: Fringe 42.63418
## 2775                   Benton County     53005       13-City: Small 46.20643
## 2776                    Clark County     53011    12-City: Mid-size 45.63830
## 2777                   Denver County      8031     41-Rural: Fringe 39.82061
## 2778                  Volusia County     12127  22-Suburb: Mid-size 28.86801
## 2779                 Tompkins County     36109       13-City: Small 42.43965
## 2780                 Humboldt County     32013      33-Town: Remote 40.97859
## 2781              Los Angeles County      6037     21-Suburb: Large 33.94294
## 2782                   Lenoir County     37107     41-Rural: Fringe 35.25452
## 2783                     Leon County     12073    12-City: Mid-size 30.41584
## 2784                     Leon County     12073    12-City: Mid-size 30.43666
## 2785                    Coles County     17029    42-Rural: Distant 39.41564
## 2786             Hillsborough County     12057       11-City: Large 27.98095
## 2787                   Denton County     48121    12-City: Mid-size 33.21820
## 2788                    Adams County      8001     21-Suburb: Large 39.82656
## 2789                  Letcher County     21133     43-Rural: Remote 37.11385
## 2790                   Dallas County     48113       11-City: Large 32.86752
## 2791                     Levy County     12075    42-Rural: Distant 29.44690
## 2792                  Jackson County     29095     41-Rural: Fringe 39.13928
## 2793                    Lewis County     53041     32-Town: Distant 46.64916
## 2794                   Sonoma County      6097    12-City: Mid-size 38.46180
## 2795                  Cowlitz County     53015     32-Town: Distant 45.90339
## 2796                     Clay County     29047     21-Suburb: Large 39.24076
## 2797                 Victoria County     48469       13-City: Small 28.82484
## 2798                   Harris County     48201       11-City: Large 29.72956
## 2799                Jefferson County     21111       11-City: Large 38.17135
## 2800              San Joaquin County      6077       13-City: Small 38.13120
## 2801                   Solano County      6095  22-Suburb: Mid-size 38.05050
## 2802              Santa Clara County      6085       11-City: Large 37.24448
## 2803          San Luis Obispo County      6079       13-City: Small 35.61484
## 2804                 New York County     36061       11-City: Large 40.74184
## 2805                  Liberty County     12077    42-Rural: Distant 30.42600
## 2806                  Liberty County     12077     43-Rural: Remote 30.18617
## 2807                     King County     53033       11-City: Large 47.69526
## 2808               Blue Earth County     27013       13-City: Small 44.15740
## 2809                  Oakland County     26125       13-City: Small 42.63404
## 2810                St. Lucie County     12111     21-Suburb: Large 27.43927
## 2811                   Ramsey County     27123     21-Suburb: Large 45.05111
## 2812                   Warren County     21227       13-City: Small 37.00724
## 2813                  Osceola County     26133     43-Rural: Remote 43.88016
## 2814                     Kent County     26081    12-City: Mid-size 42.98322
## 2815                     Kent County     26081    12-City: Mid-size 43.00088
## 2816                     Kent County     26081    12-City: Mid-size 42.97562
## 2817                     Kent County     26081    12-City: Mid-size 42.98183
## 2818                Mendocino County      6045      33-Town: Remote 39.43956
## 2819                   Carbon County     49007     41-Rural: Fringe 39.60527
## 2820                 Brazoria County     48039     23-Suburb: Small 29.01096
## 2821                 Brazoria County     48039     23-Suburb: Small 29.01094
## 2822                Limestone County     48293     41-Rural: Fringe 31.52693
## 2823                Snohomish County     53061      31-Town: Fringe 48.24267
## 2824                  Lincoln County     32017     43-Rural: Remote 37.79165
## 2825               Shiawassee County     26155     32-Town: Distant 42.98699
## 2826                  Lincoln County     32017     43-Rural: Remote 37.61902
## 2827                   Madera County      6039     41-Rural: Fringe 36.92528
## 2828                  Lincoln County     32017     43-Rural: Remote 37.79165
## 2829                Crow Wing County     27035      33-Town: Remote 46.35204
## 2830                  Alameda County      6001       13-City: Small 37.70873
## 2831                   Morgan County      8087      33-Town: Remote 40.24961
## 2832               Bonneville County     16019     23-Suburb: Small 43.51181
## 2833              Walla Walla County     53071       13-City: Small 46.05962
## 2834                  Clallam County     53009      33-Town: Remote 48.11861
## 2835                Snohomish County     53061      31-Town: Fringe 48.24213
## 2836                  Lincoln County     55069    42-Rural: Distant 45.32526
## 2837                    Curry County     35009      33-Town: Remote 34.40036
## 2838                  Cameron County     48061    12-City: Mid-size 25.90253
## 2839                     Will County     17197     21-Suburb: Large 41.54212
## 2840                     Will County     17197     21-Suburb: Large 41.54212
## 2841                     Will County     17197     21-Suburb: Large 41.54212
## 2842                   Hardin County     21093     23-Suburb: Small 37.78787
## 2843                   Denton County     48121      31-Town: Fringe 33.36057
## 2844                   Tulare County      6107      31-Town: Fringe 36.20655
## 2845                   Meeker County     27093     32-Town: Distant 45.13590
## 2846                 Morrison County     27097     32-Town: Distant 45.97178
## 2847                     Cass County     27021     43-Rural: Remote 47.05805
## 2848                     Hays County     48209     41-Rural: Fringe 30.02996
## 2849                   Sutter County      6101      31-Town: Fringe 39.27626
## 2850             Contra Costa County      6013     21-Suburb: Large 38.00551
## 2851               Livingston County     36051     32-Town: Distant 42.80148
## 2852                     Polk County     48373     41-Rural: Fringe 30.71982
## 2853                Guadalupe County     48187      31-Town: Fringe 29.57050
## 2854                     Lake County      6033     41-Rural: Fringe 38.99373
## 2855                  LaSalle County     17099     32-Town: Distant 41.32983
## 2856                  LaSalle County     17099     32-Town: Distant 41.34628
## 2857                 Caldwell County     48055     41-Rural: Fringe 29.89980
## 2858                     Hale County     48189      33-Town: Remote 34.19360
## 2859                     Lake County      6033    42-Rural: Distant 38.75612
## 2860                   Fresno County      6019    42-Rural: Distant 37.03702
## 2861                    Logan County     21141     41-Rural: Fringe 36.84469
## 2862              Los Angeles County      6037     21-Suburb: Large 33.80117
## 2863                    Duval County     12031       11-City: Large 30.33665
## 2864                 Tuolumne County      6109    42-Rural: Distant 38.09152
## 2865                   Morgan County      1103       13-City: Small 34.59929
## 2866                 Hennepin County     27053       11-City: Large 44.94591
## 2867                 Hennepin County     27053       11-City: Large 44.94644
## 2868                 Maricopa County      4013       11-City: Large 33.49308
## 2869                Jefferson County      8059    12-City: Mid-size 39.71494
## 2870                Jefferson County      8059     21-Suburb: Large 39.74348
## 2871                  Stevens County     53065    42-Rural: Distant 48.06347
## 2872                  Cowlitz County     53015     23-Suburb: Small 46.14549
## 2873          San Luis Obispo County      6079     41-Rural: Fringe 35.06615
## 2874                 Harrison County     28047       13-City: Small 30.39604
## 2875                   Orange County      6059       11-City: Large 33.73490
## 2876                 Hennepin County     27053       11-City: Large 44.96308
## 2877                 Hennepin County     27053       11-City: Large 44.96306
## 2878                     Wood County     54107       13-City: Small 39.25274
## 2879              Los Angeles County      6037     21-Suburb: Large 34.56425
## 2880              Los Angeles County      6037       11-City: Large 34.04427
## 2881                   Tehama County      6103     32-Town: Distant 40.02541
## 2882              Los Angeles County      6037     21-Suburb: Large 33.93634
## 2883                San Mateo County      6081     21-Suburb: Large 37.47332
## 2884               Williamson County     48491     41-Rural: Fringe 30.61834
## 2885               Williamson County     48491     41-Rural: Fringe 30.61834
## 2886                  Loudoun County     51107     21-Suburb: Large 39.02622
## 2887                  Loudoun County     51107     41-Rural: Fringe 39.07605
## 2888                Jefferson County     21111     21-Suburb: Large 38.26881
## 2889                Jefferson County     21111       11-City: Large 38.25410
## 2890                   Collin County     48085     21-Suburb: Large 33.12547
## 2891                   Tulare County      6107     41-Rural: Fringe 36.50156
## 2892                 New York County     36061       11-City: Large 40.72011
## 2893                  Lowndes County     28087    42-Rural: Distant 33.46865
## 2894                    Perry County     42099    42-Rural: Distant 40.36961
## 2895                Lancaster County     31109       11-City: Large 40.81614
## 2896              Santa Clara County      6085       11-City: Large 37.33803
## 2897                   Ramsey County     27123       11-City: Large 44.93127
## 2898                 Le Sueur County     27079     32-Town: Distant 44.45773
## 2899                  Lubbock County     48303       11-City: Large 33.61977
## 2900                  Lubbock County     48303       11-City: Large 33.61977
## 2901                  Lubbock County     48303       11-City: Large 33.61977
## 2902                  Lubbock County     48303       11-City: Large 33.61977
## 2903                  Lubbock County     48303       11-City: Large 33.61977
## 2904                  Lubbock County     48303       11-City: Large 33.61977
## 2905                  Lubbock County     48303       11-City: Large 33.61977
## 2906                  Lubbock County     48303      31-Town: Fringe 33.69285
## 2907                  Lubbock County     48303     41-Rural: Fringe 33.44438
## 2908           San Bernardino County      6071    42-Rural: Distant 34.41026
## 2909            District of Columbia     11001       11-City: Large 38.93174
## 2910                     Rock County     27133     41-Rural: Fringe 43.66156
## 2911                  Lynchburg city     51680       13-City: Small 37.40788
## 2912                  Lynchburg city     51680       13-City: Small 37.39379
## 2913                  Whatcom County     53073      31-Town: Fringe 48.94139
## 2914                   Dallas County     48113     21-Suburb: Large 32.70086
## 2915              Los Angeles County      6037     21-Suburb: Large 33.92608
## 2916                     Lyon County     32019     32-Town: Distant 39.57932
## 2917                 Atascosa County     48013      31-Town: Fringe 29.23290
## 2918               Burlington County     34005      31-Town: Fringe 39.88793
## 2919                  Kaufman County     48257     32-Town: Distant 32.36613
## 2920                   Yakima County     53077     32-Town: Distant 46.25542
## 2921                 Tompkins County     36109    42-Rural: Distant 42.32696
## 2922                 Chippewa County     27023     43-Rural: Remote 44.95723
## 2923                 Berkeley County     45015    42-Rural: Distant 33.16911
## 2924                  Alameda County      6001     21-Suburb: Large 37.89625
## 2925                  Saginaw County     26145  22-Suburb: Mid-size 43.45045
## 2926                   Macomb County     26099     21-Suburb: Large 42.72202
## 2927                     Bibb County     13021    12-City: Mid-size 32.82938
## 2928                     Bibb County     13021    12-City: Mid-size 32.83031
## 2929                   Madera County      6039     23-Suburb: Small 36.95304
## 2930                     Kane County     17089     21-Suburb: Large 41.90584
## 2931                    Norfolk city     51710    12-City: Mid-size 36.87905
## 2932                  Madison County     28089     41-Rural: Fringe 32.51267
## 2933                     Yolo County      6113     32-Town: Distant 38.67935
## 2934                  Madison County      1089     21-Suburb: Large 34.78550
## 2935                  Madison County     21151     32-Town: Distant 37.75722
## 2936                  Madison County     12079     41-Rural: Fringe 30.47641
## 2937                  Oakland County     26125     21-Suburb: Large 42.48109
## 2938                  Madison County     12079     32-Town: Distant 30.47107
## 2939                Snohomish County     53061     21-Suburb: Large 47.78426
## 2940                    Marin County      6041       13-City: Small 37.97145
## 2941               Twin Falls County     16083      33-Town: Remote 42.56018
## 2942                 Mahnomen County     27087     43-Rural: Remote 47.31305
## 2943                   Placer County      6061      31-Town: Fringe 38.95237
## 2944                San Diego County      6073     21-Suburb: Large 33.37848
## 2945                  Forsyth County     37067    12-City: Mid-size 36.06213
## 2946                    Hinds County     28049     41-Rural: Fringe 32.34701
## 2947                  Osceola County     12097       13-City: Small 28.30210
## 2948                   Solano County      6095      31-Town: Fringe 38.44786
## 2949                San Diego County      6073     21-Suburb: Large 33.19895
## 2950                Henderson County     48213      33-Town: Remote 32.16693
## 2951                  Tuscola County     26157    42-Rural: Distant 43.27722
## 2952                 Chippewa County     26033      33-Town: Remote 46.49937
## 2953              Nacogdoches County     48347      33-Town: Remote 31.66131
## 2954              Schoolcraft County     26153      33-Town: Remote 45.95892
## 2955               Blue Earth County     27013       13-City: Small 44.15739
## 2956               Blue Earth County     27013       13-City: Small 44.15733
## 2957                 Richland County     45079    12-City: Mid-size 34.08109
## 2958                   Travis County     48453     21-Suburb: Large 30.34199
## 2959              San Joaquin County      6077     23-Suburb: Small 37.79781
## 2960              San Joaquin County      6077     23-Suburb: Small 37.79521
## 2961                   Madera County      6039    42-Rural: Distant 37.22656
## 2962                    Wayne County     26163     21-Suburb: Large 42.12224
## 2963            Santa Barbara County      6083     23-Suburb: Small 34.69450
## 2964                    Eaton County     26045    42-Rural: Distant 42.61177
## 2965                Snohomish County     53061     21-Suburb: Large 47.81711
## 2966         Kenai Peninsula Borough      2122      33-Town: Remote 60.56700
## 2967                   Fresno County      6019    42-Rural: Distant 36.53895
## 2968                   Sonoma County      6097     21-Suburb: Large 38.62284
## 2969                Riverside County      6065     21-Suburb: Large 33.92719
## 2970                Riverside County      6065     21-Suburb: Large 33.92721
## 2971                San Mateo County      6081     21-Suburb: Large 37.50981
## 2972                   Orange County      6059     21-Suburb: Large 33.78767
## 2973                     Cobb County     13067     21-Suburb: Large 33.91548
## 2974                    Marin County      6041     21-Suburb: Large 38.02637
## 2975                    Marin County      6041     21-Suburb: Large 38.09054
## 2976                    Marin County      6041       13-City: Small 38.01414
## 2977                    Duval County     12031       11-City: Large 30.39391
## 2978                 Gonzales County     48177     43-Rural: Remote 29.26741
## 2979                   Marion County      1093     41-Rural: Fringe 34.11675
## 2980               Lauderdale County     28075      33-Town: Remote 32.38358
## 2981                   Marion County     12083       13-City: Small 29.19654
## 2982                   Marion County     12083       13-City: Small 29.18487
## 2983                   Marion County     12083     41-Rural: Fringe 29.30109
## 2984              Los Angeles County      6037  22-Suburb: Mid-size 34.16191
## 2985                    Falls County     48145     32-Town: Distant 31.30691
## 2986                    Falls County     48145     32-Town: Distant 31.31065
## 2987                Marquette County     26103      33-Town: Remote 46.51153
## 2988                 Marshall County      1095     41-Rural: Fringe 34.30545
## 2989                Deschutes County     41017       13-City: Small 44.06237
## 2990                  Calhoun County     26025      31-Town: Fringe 42.25980
## 2991                  Calhoun County     26025      31-Town: Fringe 42.25973
## 2992                 McLennan County     48309    42-Rural: Distant 31.54099
## 2993                  Clayton County     13063     21-Suburb: Large 33.43449
## 2994                   Martin County     12085     21-Suburb: Large 27.17015
## 2995                   Martin County     12085     21-Suburb: Large 27.17089
## 2996                  Fayette County     21067       11-City: Large 38.02586
## 2997                 Arapahoe County      8005     21-Suburb: Large 39.58443
## 2998                  Ventura County      6111     41-Rural: Fringe 34.24316
## 2999                  Forrest County     28035       13-City: Small 31.31114
## 3000                   Dallas County     48113     21-Suburb: Large 32.65061
## 3001                Jefferson County     21111       11-City: Large 38.26477
## 3002                     Pima County      4019       11-City: Large 32.23118
## 3003             Anne Arundel County     24003     21-Suburb: Large 38.97978
## 3004                  Stevens County     53065    42-Rural: Distant 48.05985
## 3005                  Stevens County     53065    42-Rural: Distant 48.05986
## 3006                     Yuba County      6115  22-Suburb: Mid-size 39.15849
## 3007                Snohomish County     53061  22-Suburb: Mid-size 48.06268
## 3008                Snohomish County     53061  22-Suburb: Mid-size 48.05507
## 3009                  Nodaway County     29147     41-Rural: Fringe 40.34650
## 3010                  Carlton County     27017    42-Rural: Distant 46.68945
## 3011                    Mason County     54053     41-Rural: Fringe 38.88159
## 3012                   Monroe County     26115     41-Rural: Fringe 41.81340
## 3013       Matanuska-Susitna Borough      2170     32-Town: Distant 61.58592
## 3014                     Lyon County     27083      33-Town: Remote 44.44262
## 3015                  Lubbock County     48303       11-City: Large 33.60441
## 3016                    Duval County     12031       11-City: Large 30.34210
## 3017               Palm Beach County     12099     21-Suburb: Large 26.62447
## 3018             Anne Arundel County     24003     41-Rural: Fringe 39.10053
## 3019                   Dallas County     48113       11-City: Large 32.80766
## 3020            District of Columbia     11001       11-City: Large 38.89032
## 3021                  Alameda County      6001     21-Suburb: Large 37.77249
## 3022                   Graves County     21083     41-Rural: Fringe 36.71427
## 3023               Red Willow County     31145      33-Town: Remote 40.20125
## 3024                Jefferson County      8059    12-City: Mid-size 39.71483
## 3025                Missaukee County     26113    42-Rural: Distant 44.19464
## 3026                   Fulton County     13121     21-Suburb: Large 33.65673
## 3027               Sacramento County      6067     21-Suburb: Large 38.72763
## 3028                McCracken County     21145     41-Rural: Fringe 37.07896
## 3029                McCracken County     21145     41-Rural: Fringe 37.08978
## 3030                 McCreary County     21147     43-Rural: Remote 36.70668
## 3031                   Laurel County     21125      33-Town: Remote 37.10192
## 3032               Washington County     27163     21-Suburb: Large 45.02421
## 3033                  Carlton County     27017     32-Town: Distant 46.43984
## 3034                  Goodhue County     27049     32-Town: Distant 44.55952
## 3035                     Kern County      6029      31-Town: Fringe 35.67959
## 3036                   Aitkin County     27001     43-Rural: Remote 46.60581
## 3037               Montgomery County      1101    12-City: Mid-size 32.29405
## 3038                 Maricopa County      4013       11-City: Large 33.45100
## 3039                Manitowoc County     55071     32-Town: Distant 44.10264
## 3040               Eau Claire County     55035       13-City: Small 44.82860
## 3041                Jefferson County      8059    12-City: Mid-size 39.71518
## 3042          Anchorage Municipality      2020       11-City: Large 61.18697
## 3043                 McLennan County     48309    12-City: Mid-size 31.52700
## 3044                 McLennan County     48309    12-City: Mid-size 31.52700
## 3045                 McLennan County     48309    42-Rural: Distant 31.64566
## 3046                 McLennan County     48309    12-City: Mid-size 31.52700
## 3047              Los Angeles County      6037     21-Suburb: Large 34.70070
## 3048                   Oneida County     55085     43-Rural: Remote 45.80028
## 3049                   Marion County     12083       13-City: Small 29.19450
## 3050                   Marion County     12083       13-City: Small 29.19517
## 3051                  Spokane County     53063     21-Suburb: Large 47.76735
## 3052                  Spokane County     53063     21-Suburb: Large 47.73668
## 3053                  Spokane County     53063     21-Suburb: Large 47.77308
## 3054                   Stokes County     37169     21-Suburb: Large 36.27105
## 3055                   Madera County      6039    42-Rural: Distant 37.25753
## 3056                  Laramie County     56021     41-Rural: Fringe 41.16046
## 3057                Baltimore County     24005     21-Suburb: Large 39.31617
## 3058               New Castle County     10003     21-Suburb: Large 39.70420
## 3059                  Spokane County     53063      31-Town: Fringe 47.57614
## 3060                   Dallas County     48113     41-Rural: Fringe 32.66838
## 3061                  Brevard County     12009     41-Rural: Fringe 28.12281
## 3062                 Hennepin County     27053     21-Suburb: Large 44.93885
## 3063                  Broward County     12011    12-City: Mid-size 26.10511
## 3064                   Dallas County     48113     21-Suburb: Large 32.91006
## 3065              Los Angeles County      6037    42-Rural: Distant 34.65304
## 3066                Mendocino County      6045    42-Rural: Distant 39.30821
## 3067                Mendocino County      6045      33-Town: Remote 39.16024
## 3068                Mendocino County      6045    42-Rural: Distant 39.30813
## 3069                   Fresno County      6019     32-Town: Distant 36.75675
## 3070                   Fresno County      6019     32-Town: Distant 36.75675
## 3071                     Dane County     55025       11-City: Large 43.13319
## 3072                 Hennepin County     27053       11-City: Large 45.00581
## 3073                 Hennepin County     27053       11-City: Large 45.00579
## 3074                 Hennepin County     27053       11-City: Large 44.95606
## 3075                 Hennepin County     27053       11-City: Large 44.95590
## 3076                   Merced County      6047       13-City: Small 37.33979
## 3077                   Merced County      6047     41-Rural: Fringe 37.18886
## 3078                  Hidalgo County     48215     21-Suburb: Large 26.14825
## 3079                  Hidalgo County     48215     21-Suburb: Large 26.14827
## 3080                  Hidalgo County     48215     21-Suburb: Large 26.14363
## 3081                Guadalupe County     48187      31-Town: Fringe 29.58020
## 3082                   Mercer County     21167     32-Town: Distant 37.75677
## 3083                   Mercer County     21167     32-Town: Distant 37.75677
## 3084                   Mercer County     34021       13-City: Small 40.24654
## 3085                      Ada County     16001     21-Suburb: Large 43.60669
## 3086                  Whatcom County     53073       13-City: Small 48.76569
## 3087                  Whatcom County     53073     41-Rural: Fringe 48.86565
## 3088                  Lincoln County     55069     32-Town: Distant 45.19026
## 3089                St. Louis County     27137       13-City: Small 46.75763
## 3090                 Maricopa County      4013       11-City: Large 33.38213
## 3091                St. Louis County     27137      33-Town: Remote 47.42562
## 3092                   Dallas County     48113     21-Suburb: Large 32.80200
## 3093                     Kern County      6029      33-Town: Remote 35.63843
## 3094                 McLennan County     48309    12-City: Mid-size 31.56991
## 3095                    Anoka County     27003     21-Suburb: Large 45.09743
## 3096                     Linn County     19113    12-City: Mid-size 41.97278
## 3097                  Tarrant County     48439       11-City: Large 32.78111
## 3098                   DeKalb County     13089     21-Suburb: Large 33.68996
## 3099                   Richmond city     51760    12-City: Mid-size 37.54105
## 3100                     Dane County     55025       11-City: Large 43.07319
## 3101               Miami-Dade County     12086     41-Rural: Fringe 25.80978
## 3102                     Bell County     48027    12-City: Mid-size 31.11361
## 3103              Los Angeles County      6037       11-City: Large 34.03367
## 3104                Multnomah County     41051       11-City: Large 45.52664
## 3105               Miami-Dade County     12086       11-City: Large 25.79310
## 3106               Miami-Dade County     12086     21-Suburb: Large 25.47319
## 3107               Miami-Dade County     12086     21-Suburb: Large 25.52117
## 3108               Miami-Dade County     12086       13-City: Small 25.69089
## 3109                  Spokane County     53063       13-City: Small 47.65848
## 3110                  Saginaw County     26145  22-Suburb: Mid-size 43.42425
## 3111                  Oakland County     26125     21-Suburb: Large 42.44743
## 3112                    Ionia County     26067     32-Town: Distant 42.97552
## 3113                  Calhoun County     26025     23-Suburb: Small 42.34390
## 3114                    Scott County     19163    12-City: Mid-size 41.55879
## 3115                   Colusa County      6011     32-Town: Distant 39.15502
## 3116              Los Angeles County      6037       11-City: Large 34.03207
## 3117                   Benton County     53005       13-City: Small 46.20639
## 3118                  Cameron County     48061  22-Suburb: Mid-size 26.15502
## 3119                   Itasca County     27061      33-Town: Remote 47.24364
## 3120                   Harris County     48201       11-City: Large 29.75222
## 3121                   Harris County     48201       11-City: Large 29.71596
## 3122                   Orange County      6059       11-City: Large 33.75992
## 3123           San Bernardino County      6071    12-City: Mid-size 34.08877
## 3124                Crow Wing County     27035      33-Town: Remote 46.36230
## 3125                  Douglas County     27041      33-Town: Remote 45.90178
## 3126                  Tarrant County     48439       11-City: Large 32.70180
## 3127               James City County     51095     41-Rural: Fringe 37.22154
## 3128                   Ramsey County     27123     21-Suburb: Large 45.01483
## 3129                Vermilion County     17183     23-Suburb: Small 40.10163
## 3130                     Bell County     21013     32-Town: Distant 36.60970
## 3131                Middlesex County     34023     21-Suburb: Large 40.42831
## 3132                   Canyon County     16027  22-Suburb: Mid-size 43.70419
## 3133                  Midland County     48329    12-City: Mid-size 32.00217
## 3134                  Midland County     48329    12-City: Mid-size 31.99244
## 3135               Washington County     16087     43-Rural: Remote 44.47104
## 3136                  Hidalgo County     48215    12-City: Mid-size 26.20631
## 3137                  Hidalgo County     48215     21-Suburb: Large 26.15188
## 3138                  Cameron County     48061  22-Suburb: Mid-size 26.15504
## 3139                  Randall County     48381     41-Rural: Fringe 35.06984
## 3140              St. Charles County     29183     21-Suburb: Large 38.82748
## 3141               Mille Lacs County     27095     32-Town: Distant 45.75144
## 3142                Washtenaw County     26161      31-Town: Fringe 42.09234
## 3143                   Fresno County      6019     32-Town: Distant 36.15059
## 3144               Washington County     49053       13-City: Small 37.10258
## 3145               Mille Lacs County     27095     43-Rural: Remote 46.06717
## 3146                  Alameda County      6001     21-Suburb: Large 37.82347
## 3147              Los Angeles County      6037     41-Rural: Fringe 34.09252
## 3148                    Macon County     17115       13-City: Small 39.84661
## 3149           San Bernardino County      6071     21-Suburb: Large 34.08575
## 3150                   Wilson County     37195      31-Town: Fringe 35.71249
## 3151                Milwaukee County     55079     21-Suburb: Large 42.87923
## 3152                Milwaukee County     55079       11-City: Large 43.04259
## 3153                Milwaukee County     55079       11-City: Large 43.04370
## 3154                  Mineral County     32021      33-Town: Remote 38.52641
## 3155                  Mineral County     32021      33-Town: Remote 38.52816
## 3156                  Mineral County     54057     32-Town: Distant 39.42740
## 3157               Palo Pinto County     48363     41-Rural: Fringe 32.81688
## 3158               Palo Pinto County     48363     32-Town: Distant 32.82178
## 3159                    Mingo County     54059    42-Rural: Distant 37.67700
## 3160                 Minidoka County     16067      33-Town: Remote 42.61910
## 3161                     Pope County     27121     43-Rural: Remote 45.61258
## 3162                     Pope County     27121     43-Rural: Remote 45.62490
## 3163                Jefferson County     21111     21-Suburb: Large 38.19757
## 3164                    Kings County      6031     32-Town: Distant 36.09773
## 3165              Los Angeles County      6037       11-City: Large 34.27094
## 3166              Santa Clara County      6085    12-City: Mid-size 37.39129
## 3167                    Clark County     32003       11-City: Large 36.17985
## 3168            Santa Barbara County      6083     23-Suburb: Small 34.66021
## 3169                San Diego County      6073     21-Suburb: Large 33.25603
## 3170                St. Louis County     29189      31-Town: Fringe 38.49074
## 3171                 Victoria County     48469       13-City: Small 28.80135
## 3172                 Victoria County     48469       13-City: Small 28.80164
## 3173              Rock Island County     17161       13-City: Small 41.42442
## 3174                     Rice County     27131     32-Town: Distant 44.28325
## 3175                    Anoka County     27003     21-Suburb: Large 45.17873
## 3176                  Chisago County     27025     32-Town: Distant 45.70702
## 3177                    Scott County     27139     21-Suburb: Large 44.79055
## 3178                Sherburne County     27141       13-City: Small 45.54173
## 3179               Washington County     27163     21-Suburb: Large 45.02783
## 3180                   Ramsey County     27123       11-City: Large 44.96237
## 3181                 Chippewa County     27023      33-Town: Remote 44.94911
## 3182                 Chippewa County     27023      33-Town: Remote 44.94913
## 3183                 Chippewa County     27023      33-Town: Remote 44.94915
## 3184                 Nicollet County     27103      31-Town: Fringe 44.31125
## 3185                   Isanti County     27059     32-Town: Distant 45.56002
## 3186                     Cole County     29051       13-City: Small 38.57751
## 3187                     Cole County     29051       13-City: Small 38.57743
## 3188                 Tuolumne County      6109    42-Rural: Distant 37.83524
## 3189                    Modoc County      6049     43-Rural: Remote 41.44659
## 3190           San Bernardino County      6071     21-Suburb: Large 34.44466
## 3191               Sacramento County      6067    42-Rural: Distant 38.32977
## 3192                 Morrison County     27097    42-Rural: Distant 45.91089
## 3193                     Ward County     48475     32-Town: Distant 31.58667
## 3194                San Diego County      6073       11-City: Large 32.70240
## 3195              Los Angeles County      6037       11-City: Large 33.86742
## 3196                 Monmouth County     34025     21-Suburb: Large 40.26602
## 3197                 Monmouth County     34025     21-Suburb: Large 40.26584
## 3198                   Monroe County     28095     41-Rural: Fringe 33.93646
## 3199                   Monroe County     36055     21-Suburb: Large 43.10658
## 3200                     Kern County      6029     32-Town: Distant 35.13006
## 3201                   Monroe County     12087      33-Town: Remote 24.57699
## 3202                   Monroe County     17133    42-Rural: Distant 38.28978
## 3203                   Denver County      8031       11-City: Large 39.77595
## 3204                  Ventura County      6111  22-Suburb: Mid-size 34.26149
## 3205                   Orange County      6059    12-City: Mid-size 33.65385
## 3206               Rio Grande County      8105      33-Town: Remote 37.58227
## 3207              Los Angeles County      6037     21-Suburb: Large 34.00911
## 3208                San Diego County      6073      31-Town: Fringe 33.03917
## 3209              Los Angeles County      6037     21-Suburb: Large 34.02858
## 3210              Los Angeles County      6037    12-City: Mid-size 34.18656
## 3211                 Monterey County      6053  22-Suburb: Mid-size 36.62619
## 3212                 Monterey County      6053  22-Suburb: Mid-size 36.59541
## 3213               Montgomery County     51121       13-City: Small 37.12790
## 3214               Montgomery County     48339       13-City: Small 30.31877
## 3215               Montgomery County     37123     32-Town: Distant 35.36212
## 3216                   Wright County     27171      31-Town: Fringe 45.29903
## 3217                  Genesee County     26049     41-Rural: Fringe 43.17930
## 3218                  Kanabec County     27065      33-Town: Remote 45.87872
## 3219                  Kanabec County     27065      33-Town: Remote 45.87844
## 3220                    Rowan County     21205     41-Rural: Fringe 38.18612
## 3221              Los Angeles County      6037     21-Suburb: Large 34.06320
## 3222                Riverside County      6065     21-Suburb: Large 33.90903
## 3223                   Morgan County      1103     41-Rural: Fringe 34.44874
## 3224               Charlevoix County     26029      33-Town: Remote 45.21144
## 3225                    Clark County     32003       11-City: Large 36.18008
## 3226                   Morris County     34027     21-Suburb: Large 40.83212
## 3227                   Morris County     34027     21-Suburb: Large 40.82705
## 3228                    Clark County     32003       11-City: Large 36.14883
## 3229                   Morris County     34027     21-Suburb: Large 40.82703
## 3230                    Hinds County     28049    12-City: Mid-size 32.34899
## 3231                Whiteside County     17195     32-Town: Distant 41.80172
## 3232                     Cook County     17031     21-Suburb: Large 41.85467
## 3233                Lancaster County     31109       11-City: Large 40.83561
## 3234                   Kitsap County     53035  22-Suburb: Mid-size 47.63624
## 3235                  Mecosta County     26107     43-Rural: Remote 43.59589
## 3236                  Jackson County     28059     23-Suburb: Small 30.39835
## 3237                    Lewis County     53041     43-Rural: Remote 46.53040
## 3238                   Ramsey County     27123     21-Suburb: Large 45.10605
## 3239                   Ramsey County     27123     21-Suburb: Large 45.10605
## 3240                  Whatcom County     53073     41-Rural: Fringe 48.71881
## 3241                    Titus County     48449      33-Town: Remote 33.17726
## 3242                 Monterey County      6053    12-City: Mid-size 36.68630
## 3243                     Wake County     37183       11-City: Large 35.79027
## 3244                   Skagit County     53057       13-City: Small 48.43736
## 3245                Jefferson County      8059     21-Suburb: Large 39.64777
## 3246                    Davis County     49011     21-Suburb: Large 41.02902
## 3247           San Bernardino County      6071      31-Town: Fringe 34.23298
## 3248               White Pine County     32033    42-Rural: Distant 39.38559
## 3249                   Shasta County      6089     41-Rural: Fringe 40.69158
## 3250                     Pima County      4019     21-Suburb: Large 32.32483
## 3251                    Pinal County      4021     21-Suburb: Large 33.38827
## 3252                San Diego County      6073      31-Town: Fringe 33.02643
## 3253                   Fresno County      6019     32-Town: Distant 36.60038
## 3254                  Fairfax County     51059     21-Suburb: Large 38.83757
## 3255           San Bernardino County      6071    42-Rural: Distant 34.41026
## 3256                Riverside County      6065  22-Suburb: Mid-size 33.79563
## 3257                   Shasta County      6089      33-Town: Remote 40.87982
## 3258                San Diego County      6073     21-Suburb: Large 32.83171
## 3259                   Madera County      6039       13-City: Small 36.97268
## 3260                    Pinal County      4021    42-Rural: Distant 32.61630
## 3261                 Kootenai County     16055      31-Town: Fringe 47.81266
## 3262                Hunterdon County     34019     41-Rural: Fringe 40.64969
## 3263                Jefferson County      8059     21-Suburb: Large 39.64857
## 3264                 Hennepin County     27053       11-City: Large 44.94772
## 3265                 Hennepin County     27053       11-City: Large 44.96930
## 3266                 Hennepin County     27053       11-City: Large 44.99379
## 3267                 Hennepin County     27053       11-City: Large 44.91854
## 3268                 Minidoka County     16067      33-Town: Remote 42.55701
## 3269                  Genesee County     26049     21-Suburb: Large 43.11875
## 3270                Jefferson County     17081     32-Town: Distant 38.29309
## 3271                San Diego County      6073       11-City: Large 32.81987
## 3272                  Trinity County      6105     43-Rural: Remote 40.45664
## 3273              Los Angeles County      6037       11-City: Large 34.25989
## 3274              Santa Clara County      6085     23-Suburb: Small 37.02015
## 3275             Contra Costa County      6013     21-Suburb: Large 37.98823
## 3276              Los Angeles County      6037     21-Suburb: Large 34.13726
## 3277                   Pierce County     53053     32-Town: Distant 46.87000
## 3278                Riverside County      6065     21-Suburb: Large 33.82449
## 3279                El Dorado County      6017     32-Town: Distant 38.90557
## 3280                Snohomish County     53061    12-City: Mid-size 47.91165
## 3281                    Brown County     48049      33-Town: Remote 31.71479
## 3282                  Lincoln County     28085      33-Town: Remote 31.56894
## 3283                   Travis County     48453       11-City: Large 30.29596
## 3284                Worcester County     25027     41-Rural: Fringe 42.69900
## 3285                Riverside County      6065     21-Suburb: Large 33.56035
## 3286                 Muscogee County     13215     41-Rural: Fringe 32.52667
## 3287                 Muskegon County     26121       13-City: Small 43.23373
## 3288                 Muskegon County     26121       13-City: Small 43.23393
## 3289                 Muskegon County     26121       13-City: Small 43.22796
## 3290              San Joaquin County      6077     41-Rural: Fringe 37.88959
## 3291                St. Louis County     27137     41-Rural: Fringe 46.91667
## 3292                Frederick County     51069     23-Suburb: Small 39.19843
## 3293                      Lee County     17103    42-Rural: Distant 41.83673
## 3294                      Lee County     17103    42-Rural: Distant 41.83673
## 3295              Nacogdoches County     48347     43-Rural: Remote 31.49619
## 3296              Nacogdoches County     48347     43-Rural: Remote 31.64192
## 3297              Nacogdoches County     48347      33-Town: Remote 31.66131
## 3298              Nacogdoches County     48347     43-Rural: Remote 31.82809
## 3299                     Napa County      6055     23-Suburb: Small 38.27942
## 3300                     Napa County      6055       13-City: Small 38.28835
## 3301                     Napa County      6055     23-Suburb: Small 38.27942
## 3302                     Napa County      6055       13-City: Small 38.31377
## 3303                  Collier County     12021     21-Suburb: Large 26.16725
## 3304                   Itasca County     27061    42-Rural: Distant 47.32024
## 3305                   Nassau County     36059     21-Suburb: Large 40.75487
## 3306                   Nassau County     12089     41-Rural: Fringe 30.60855
## 3307                     Lake County      6033     32-Town: Distant 39.05947
## 3308                  Navarro County     48349     32-Town: Distant 32.10001
## 3309                  Navarro County     48349     32-Town: Distant 32.09999
## 3310                   Ramsey County     27123     21-Suburb: Large 45.01486
## 3311               Washington County     27163     21-Suburb: Large 44.96125
## 3312                  Madison County      1089    12-City: Mid-size 34.74278
## 3313                    Adams County     31001     32-Town: Distant 40.58587
## 3314                 Hennepin County     27053     21-Suburb: Large 45.05369
## 3315           San Bernardino County      6071     32-Town: Distant 34.83997
## 3316                     Wood County     55141     41-Rural: Fringe 44.30953
## 3317              Westchester County     36119     21-Suburb: Large 40.91687
## 3318                   Ramsey County     27123     21-Suburb: Large 45.04735
## 3319                  Hubbard County     27057    42-Rural: Distant 46.96595
## 3320                    Union County     28145      33-Town: Remote 34.48103
## 3321                 Arapahoe County      8005       11-City: Large 39.72732
## 3322                    Adams County      8001     21-Suburb: Large 39.85864
## 3323                  Fayette County     17051      33-Town: Remote 38.96549
## 3324                   Pierce County     53053     32-Town: Distant 46.87073
## 3325                    Brown County     46013      33-Town: Remote 45.46417
## 3326                  Collier County     12021     21-Suburb: Large 26.14106
## 3327                     Kent County     26081      31-Town: Fringe 43.21911
## 3328                  Osceola County     12097       13-City: Small 28.30700
## 3329                     Polk County     12105       13-City: Small 28.01938
## 3330                  Collier County     12021     32-Town: Distant 26.42615
## 3331                     Kane County     17089    12-City: Mid-size 42.03655
## 3332                    Bowie County     48037    42-Rural: Distant 33.46849
## 3333                    Bowie County     48037     32-Town: Distant 33.47050
## 3334                    Bowie County     48037     32-Town: Distant 33.47049
## 3335                    Bowie County     48037     32-Town: Distant 33.47047
## 3336                    Bowie County     48037     32-Town: Distant 33.47050
## 3337                  Henrico County     51087     21-Suburb: Large 37.55047
## 3338                   Dakota County     27037      31-Town: Fringe 44.74124
## 3339                   Dakota County     27037     21-Suburb: Large 44.74151
## 3340                 Hennepin County     27053       13-City: Small 44.85435
## 3341                  Lubbock County     48303     41-Rural: Fringe 33.72964
## 3342                   Shelby County      1117     41-Rural: Fringe 33.17809
## 3343                  Tarrant County     48439     21-Suburb: Large 32.93138
## 3344                    Bexar County     48029       11-City: Large 29.48872
## 3345                     Kane County     17089     21-Suburb: Large 41.89360
## 3346           Prince William County     51153     21-Suburb: Large 38.76328
## 3347                Arlington County     51013    12-City: Mid-size 38.88904
## 3348                 Portsmouth city     51740       13-City: Small 36.82759
## 3349                     Kane County     17089     21-Suburb: Large 41.90685
## 3350                    Mower County     27099     41-Rural: Fringe 43.67665
## 3351           Prince William County     51153     21-Suburb: Large 38.76714
## 3352               Bernalillo County     35001       11-City: Large 35.10521
## 3353                  Hidalgo County     48215    12-City: Mid-size 26.20999
## 3354                   Hopewell city     51670     21-Suburb: Large 37.30300
## 3355                      Lea County     35025      33-Town: Remote 32.95384
## 3356               Williamson County     48491     21-Suburb: Large 30.57380
## 3357                Jefferson County      1073     21-Suburb: Large 33.40228
## 3358                  Johnson County     48251     41-Rural: Fringe 32.44497
## 3359                Riverside County      6065     21-Suburb: Large 33.93328
## 3360                  Bannock County     16005       13-City: Small 42.89068
## 3361                    Mills County     48333     43-Rural: Remote 31.45900
## 3362                     Polk County     12105     41-Rural: Fringe 27.79243
## 3363                    Stone County     29209    42-Rural: Distant 36.73331
## 3364                Milwaukee County     55079     21-Suburb: Large 43.08807
## 3365                 Franklin County     53021  22-Suburb: Mid-size 46.25438
## 3366 Southeast Fairbanks Census Area      2240     43-Rural: Remote 64.04267
## 3367                     Hunt County     48231     32-Town: Distant 33.13033
## 3368                   Taylor County     48441    12-City: Mid-size 32.45859
## 3369                Middlesex County     34023     21-Suburb: Large 40.34309
## 3370                 Monmouth County     34025     21-Suburb: Large 40.25790
## 3371                   Marion County     12083       13-City: Small 29.20282
## 3372                   Juneau County     55057    42-Rural: Distant 43.88138
## 3373                Kandiyohi County     27067      33-Town: Remote 45.29284
## 3374                 Thurston County     53067       13-City: Small 46.98281
## 3375                  Suffolk County     25025       11-City: Large 42.26297
## 3376                   Ottawa County     26139     21-Suburb: Large 42.96476
## 3377                   Oconto County     55083     32-Town: Distant 44.87475
## 3378                     Polk County     27119     32-Town: Distant 47.76692
## 3379                  Cameron County     48061       13-City: Small 26.19143
## 3380                    Scott County     27139     32-Town: Distant 44.55742
## 3381                    Scott County     27139     32-Town: Distant 44.54747
## 3382               Montgomery County     51121       13-City: Small 37.13374
## 3383               Santa Cruz County      6087       13-City: Small 36.91398
## 3384                     King County     53033     21-Suburb: Large 47.49593
## 3385                  Henrico County     51087     21-Suburb: Large 37.66243
## 3386                     Napa County      6055       13-City: Small 38.30512
## 3387              Santa Clara County      6085    12-City: Mid-size 37.35627
## 3388              San Joaquin County      6077       11-City: Large 37.89818
## 3389                 Kootenai County     16055     23-Suburb: Small 47.71576
## 3390                   Queens County     36081       11-City: Large 40.74554
## 3391                    Essex County     34013       11-City: Large 40.72760
## 3392                    Essex County     34013       11-City: Large 40.73282
## 3393                     Luce County     26095      33-Town: Remote 46.33032
## 3394                   Orange County     36071     21-Suburb: Large 41.50097
## 3395                Jefferson County     21111       11-City: Large 38.26196
## 3396                  Tarrant County     48439       11-City: Large 32.65546
## 3397                     Kent County     26081    12-City: Mid-size 42.97349
## 3398                  Spokane County     53063    12-City: Mid-size 47.65497
## 3399               Stanislaus County      6099     32-Town: Distant 37.32107
## 3400               Newport News city     51700    12-City: Mid-size 36.97734
## 3401                 Campbell County     21037     21-Suburb: Large 39.08973
## 3402                   Newton County     13217     21-Suburb: Large 33.58269
## 3403                Middlesex County     25017     21-Suburb: Large 42.38762
## 3404                    Marin County      6041     21-Suburb: Large 38.09779
## 3405                  Iredell County     37097     21-Suburb: Large 35.58687
## 3406                  Niagara County     36063      31-Town: Fringe 43.18027
## 3407               Miami-Dade County     12086     21-Suburb: Large 25.74142
## 3408              Los Angeles County      6037       11-City: Large 34.31611
## 3409                   Collin County     48085       11-City: Large 33.01852
## 3410                  El Paso County      8041       11-City: Large 38.86115
## 3411                  Berrien County     26021     41-Rural: Fringe 41.82845
## 3412                  Berrien County     26021       13-City: Small 41.82593
## 3413                    Bexar County     48029       11-City: Large 29.43681
## 3414                    Bexar County     48029     21-Suburb: Large 29.49061
## 3415                 Gonzales County     48177     43-Rural: Remote 29.26741
## 3416                 Gonzales County     48177     43-Rural: Remote 29.26741
## 3417                 Gonzales County     48177     43-Rural: Remote 29.26741
## 3418                St. Louis County     27137      33-Town: Remote 47.51415
## 3419                    Roanoke city     51770       13-City: Small 37.30135
## 3420                Nome Census Area      2180      33-Town: Remote 64.49684
## 3421                     Lake County     12069  22-Suburb: Mid-size 28.81149
## 3422                    Norfolk city     51710    12-City: Mid-size 36.87898
## 3423                    Norfolk city     51710    12-City: Mid-size 36.87900
## 3424                    Norfolk city     51710    12-City: Mid-size 36.86649
## 3425                 Sheridan County     56033     41-Rural: Fringe 44.77559
## 3426                 Waukesha County     55133     41-Rural: Fringe 42.85487
## 3427               Sacramento County      6067       11-City: Large 38.64064
## 3428                  Chisago County     27025     41-Rural: Fringe 45.50807
## 3429                  Alachua County     12001    12-City: Mid-size 29.67287
## 3430                 Randolph County     29175     32-Town: Distant 39.42066
## 3431                  Montour County     42093     23-Suburb: Small 40.94897
## 3432                  Conejos County      8021     43-Rural: Remote 37.27511
## 3433                     Cook County     17031       13-City: Small 42.01089
## 3434             Tallahatchie County     28135     43-Rural: Remote 33.96964
## 3435                    Bexar County     48029       11-City: Large 29.43681
## 3436                 Hennepin County     27053     21-Suburb: Large 45.05369
## 3437                 Franklin County     53021     41-Rural: Fringe 46.66342
## 3438               Miami-Dade County     12086     21-Suburb: Large 25.93884
## 3439                   Potter County     48375    12-City: Mid-size 35.22152
## 3440                   Potter County     48375  22-Suburb: Mid-size 35.30817
## 3441                   Denver County      8031       11-City: Large 39.75983
## 3442                   Macomb County     26099     21-Suburb: Large 42.53953
## 3443                    Mason County     53045     41-Rural: Fringe 47.41641
## 3444                 Monterey County      6053  22-Suburb: Mid-size 36.77552
## 3445                      Lee County     12071    12-City: Mid-size 26.64691
## 3446                   Panola County     28107    42-Rural: Distant 34.52306
## 3447              Los Angeles County      6037     21-Suburb: Large 34.09582
## 3448               Miami-Dade County     12086     21-Suburb: Large 25.89644
## 3449                    Moore County     48341      33-Town: Remote 35.88757
## 3450                   Nevada County      6057     32-Town: Distant 39.24000
## 3451                Marquette County     26103     41-Rural: Fringe 46.55730
## 3452                   Barron County     55005     41-Rural: Fringe 45.40251
## 3453                   Amador County      6005     41-Rural: Fringe 38.37748
## 3454                   Washoe County     32031    12-City: Mid-size 39.47381
## 3455                   Shasta County      6089  22-Suburb: Mid-size 40.44786
## 3456                   Shasta County      6089       13-City: Small 40.58738
## 3457             Hillsborough County     12057       11-City: Large 28.02988
## 3458                   Denton County     48121     41-Rural: Fringe 33.23908
## 3459                   Denton County     48121     21-Suburb: Large 33.03237
## 3460                Wilbarger County     48487      33-Town: Remote 34.15541
## 3461                  Broward County     12011     21-Suburb: Large 26.18375
## 3462                   Shasta County      6089     41-Rural: Fringe 40.44029
## 3463                    Glenn County      6021     41-Rural: Fringe 39.75577
## 3464                 Columbus County     37047     32-Town: Distant 34.32728
## 3465                  Brevard County     12009     21-Suburb: Large 28.37899
## 3466                     Kane County     17089     21-Suburb: Large 41.91066
## 3467                     Kane County     17089     21-Suburb: Large 41.91066
## 3468                 Prentiss County     28117      33-Town: Remote 34.65902
## 3469                  Madison County     31119     43-Rural: Remote 41.84358
## 3470                   Oconto County     55083     32-Town: Distant 44.89091
## 3471                    Union County     35059     43-Rural: Remote 36.43541
## 3472                   Kenton County     21117     41-Rural: Fringe 38.82097
## 3473                     Polk County     27119     41-Rural: Fringe 47.77086
## 3474                 Richmond County     51159    42-Rural: Distant 37.94464
## 3475                      Lee County     12071     21-Suburb: Large 26.66082
## 3476                 Alexandria city     51510    12-City: Mid-size 38.81221
## 3477                 Chippewa County     55017     41-Rural: Fringe 44.92888
## 3478                     Rice County     27131     32-Town: Distant 44.45805
## 3479                St. Louis County     27137      33-Town: Remote 47.51411
## 3480                St. Louis County     27137      33-Town: Remote 47.51411
## 3481                St. Louis County     27137      33-Town: Remote 47.51415
## 3482                St. Louis County     27137      33-Town: Remote 47.51415
## 3483                     Pike County     21195      33-Town: Remote 37.53768
## 3484                  Stevens County     53065     43-Rural: Remote 48.91196
## 3485                Snohomish County     53061     21-Suburb: Large 47.77702
## 3486                Snohomish County     53061     21-Suburb: Large 47.77696
## 3487                   Jerome County     16053      33-Town: Remote 42.72738
## 3488                     King County     53033     21-Suburb: Large 47.65507
## 3489                     Kent County     26081     21-Suburb: Large 43.03191
## 3490                  Jackson County     26075     41-Rural: Fringe 42.33333
## 3491               Pennington County     27113      33-Town: Remote 48.11437
## 3492                     Park County     56029      33-Town: Remote 44.76513
## 3493          Prince George's County     24033     21-Suburb: Large 38.97482
## 3494                   Cibola County     35006     41-Rural: Fringe 35.18070
## 3495                  Douglas County     31055       11-City: Large 41.33635
## 3496                  Oakland County     26125     21-Suburb: Large 42.45839
## 3497                    Marin County      6041     21-Suburb: Large 38.09833
## 3498                     King County     53033       11-City: Large 47.60853
## 3499                Milwaukee County     55079       11-City: Large 43.07568
## 3500                Mendocino County      6045      33-Town: Remote 39.43957
## 3501                 Hennepin County     27053       13-City: Small 44.99969
## 3502                   Nevada County      6057     32-Town: Distant 39.23957
## 3503                   Nueces County     48355    42-Rural: Distant 27.83118
## 3504                   Nueces County     48355      31-Town: Fringe 27.79681
## 3505                   Nueces County     48355       11-City: Large 27.64615
## 3506                   Nueces County     48355       11-City: Large 27.69323
## 3507                   Nueces County     48355       11-City: Large 27.84172
## 3508                   Nueces County     48355       11-City: Large 27.85896
## 3509                   Nueces County     48355     32-Town: Distant 27.58054
## 3510                     Kern County      6029     21-Suburb: Large 35.25828
## 3511                Riverside County      6065     21-Suburb: Large 34.01653
## 3512              Los Angeles County      6037     21-Suburb: Large 34.05168
## 3513                Snohomish County     53061  22-Suburb: Mid-size 48.15591
## 3514                      Nye County     32023      33-Town: Remote 36.19108
## 3515                   Albany County     36001       13-City: Small 42.67999
## 3516                Jefferson County     48245    12-City: Mid-size 30.08827
## 3517                   Dallas County     48113       11-City: Large 32.70408
## 3518                San Diego County      6073    42-Rural: Distant 33.28121
## 3519                 Hennepin County     27053     21-Suburb: Large 44.89544
## 3520              Los Angeles County      6037     21-Suburb: Large 34.11174
## 3521                   Fresno County      6019    42-Rural: Distant 37.03750
## 3522                  Oakland County     26125     21-Suburb: Large 42.45611
## 3523                  Ventura County      6111  22-Suburb: Mid-size 34.17155
## 3524                  Oakland County     26125     21-Suburb: Large 42.45620
## 3525                     Kane County     17089     21-Suburb: Large 42.10809
## 3526              Los Angeles County      6037     21-Suburb: Large 34.55910
## 3527                  Ventura County      6111  22-Suburb: Mid-size 34.17171
## 3528           San Bernardino County      6071     21-Suburb: Large 34.02964
## 3529                    Butte County      6007       13-City: Small 39.75938
## 3530                Calaveras County      6009    42-Rural: Distant 38.23464
## 3531                     Dane County     55025     41-Rural: Fringe 42.95109
## 3532                   Pierce County     53053    12-City: Mid-size 47.22991
## 3533                  Alameda County      6001       11-City: Large 37.83361
## 3534                  Oakland County     26125     21-Suburb: Large 42.53764
## 3535                 Muskegon County     26121  22-Suburb: Mid-size 43.24835
## 3536                  Kendall County     48259     41-Rural: Fringe 29.76613
## 3537                 Manistee County     26101      33-Town: Remote 44.24532
## 3538                   Shasta County      6089     41-Rural: Fringe 40.44028
## 3539                   Fresno County      6019      31-Town: Fringe 36.51864
## 3540                San Diego County      6073     21-Suburb: Large 33.35186
## 3541                 San Juan County     53055    42-Rural: Distant 48.69899
## 3542                  Osceola County     12097     41-Rural: Fringe 28.26211
## 3543                   Orange County      6059    12-City: Mid-size 33.66799
## 3544                Jefferson County     53031     41-Rural: Fringe 48.12896
## 3545                  Pacific County     53049    42-Rural: Distant 46.31341
## 3546                    Ocean County     34029     21-Suburb: Large 40.00607
## 3547                    Ocean County     34029     21-Suburb: Large 39.84067
## 3548                    Ocean County     34029     21-Suburb: Large 39.97622
## 3549                San Diego County      6073     21-Suburb: Large 33.20125
## 3550                    Ocean County     34029     21-Suburb: Large 39.97622
## 3551                San Mateo County      6081     21-Suburb: Large 37.63868
## 3552                   Taylor County     48441    12-City: Mid-size 32.40041
## 3553              Los Angeles County      6037     21-Suburb: Large 33.95528
## 3554                  El Paso County      8041       11-City: Large 38.86080
## 3555                 Isabella County     26073     41-Rural: Fringe 43.59352
## 3556                  Lubbock County     48303    42-Rural: Distant 33.66176
## 3557            Oglala Lakota County     46102     43-Rural: Remote 43.12694
## 3558                     Ohio County     21183     32-Town: Distant 37.44766
## 3559                     Ohio County     21183     32-Town: Distant 37.44766
## 3560                  Gogebic County     26053     43-Rural: Remote 46.30528
## 3561                 Okaloosa County     12091       13-City: Small 30.42639
## 3562                 Okaloosa County     12091     41-Rural: Fringe 30.69897
## 3563                 Okaloosa County     12091       13-City: Small 30.46826
## 3564                 Okaloosa County     12091     41-Rural: Fringe 30.69897
## 3565                 Okanogan County     53047      33-Town: Remote 48.36641
## 3566                 Okanogan County     53047      33-Town: Remote 48.36422
## 3567               Okeechobee County     12093     32-Town: Distant 27.27384
## 3568               Okeechobee County     12093     41-Rural: Fringe 27.30709
## 3569               Okeechobee County     12093     41-Rural: Fringe 27.30736
## 3570                  Boulder County      8013     23-Suburb: Small 40.14602
## 3571                 Honolulu County     15003     41-Rural: Fringe 21.37181
## 3572                 Thurston County     53067       13-City: Small 47.03717
## 3573             Contra Costa County      6013     21-Suburb: Large 37.97978
## 3574              Los Angeles County      6037       13-City: Small 34.00625
## 3575                  Douglas County     31055       11-City: Large 41.29764
## 3576                 Hennepin County     27053     21-Suburb: Large 44.96375
## 3577                  Saginaw County     26145  22-Suburb: Mid-size 43.45054
## 3578              San Joaquin County      6077       11-City: Large 37.90906
## 3579                   Oneida County     16071     43-Rural: Remote 42.19483
## 3580              Los Angeles County      6037     21-Suburb: Large 34.70070
## 3581                 Onondaga County     36067    12-City: Mid-size 43.04618
## 3582                      Lee County      1081       13-City: Small 32.65599
## 3583                   Island County     53029     41-Rural: Fringe 48.20675
## 3584                     King County     53033    12-City: Mid-size 47.45640
## 3585                   Chelan County     53007       13-City: Small 47.42741
## 3586                   Skagit County     53057      31-Town: Fringe 48.50946
## 3587                     King County     53033     21-Suburb: Large 47.70506
## 3588                    Clark County     53011     41-Rural: Fringe 45.73155
## 3589                    Clark County     53011    12-City: Mid-size 45.64093
## 3590                Jefferson County     53031     41-Rural: Fringe 48.01208
## 3591                    Clark County     53011    12-City: Mid-size 45.61950
## 3592                  Spokane County     53063    12-City: Mid-size 47.65941
## 3593                     King County     53033     21-Suburb: Large 47.31929
## 3594                Snohomish County     53061      31-Town: Fringe 47.86630
## 3595               Stanislaus County      6099      31-Town: Fringe 37.47298
## 3596                   Harris County     48201     21-Suburb: Large 29.79726
## 3597                  Alameda County      6001       11-City: Large 37.78348
## 3598                     Dale County      1045      31-Town: Fringe 31.45605
## 3599                     Dale County      1045      31-Town: Fringe 31.45578
## 3600                  Fayette County     21067       11-City: Large 38.02480
## 3601                Riverside County      6065       11-City: Large 33.94021
## 3602              Walla Walla County     53071       13-City: Small 46.07570
## 3603                  Douglas County     31055       11-City: Large 41.26740
## 3604                  Douglas County     31055       11-City: Large 41.26740
## 3605                  Douglas County     31055       11-City: Large 41.26740
## 3606                   Dakota County     27037     21-Suburb: Large 44.77078
## 3607                   Ramsey County     27123     21-Suburb: Large 45.02145
## 3608                    Bowie County     48037       13-City: Small 33.44211
## 3609                 Hennepin County     27053     21-Suburb: Large 44.88308
## 3610                  El Paso County     48141       11-City: Large 31.70599
## 3611                  Whatcom County     53073       13-City: Small 48.75644
## 3612                 Arapahoe County      8005     21-Suburb: Large 39.62688
## 3613                San Diego County      6073     21-Suburb: Large 32.61432
## 3614                Riverside County      6065    12-City: Mid-size 33.87712
## 3615                   Orange County     12095     21-Suburb: Large 28.50273
## 3616           San Bernardino County      6071       13-City: Small 34.05989
## 3617                     King County     53033       11-City: Large 47.55459
## 3618                   Monroe County     26115       13-City: Small 41.90121
## 3619                 Dutchess County     36027     41-Rural: Fringe 41.53682
## 3620                     Dane County     55025     41-Rural: Fringe 42.95217
## 3621                San Mateo County      6081       13-City: Small 37.49024
## 3622                    Glenn County      6021     32-Town: Distant 39.75217
## 3623                    Butte County      6007     32-Town: Distant 39.52226
## 3624                Mendocino County      6045      33-Town: Remote 39.16131
## 3625                Riverside County      6065     21-Suburb: Large 33.68172
## 3626              Los Angeles County      6037       11-City: Large 34.02891
## 3627                 Maricopa County      4013       11-City: Large 33.50747
## 3628                  Osceola County     12097     21-Suburb: Large 28.29375
## 3629                 Beltrami County     27007      33-Town: Remote 47.46354
## 3630                Winnebago County     55139       13-City: Small 44.07177
## 3631                 Humboldt County      6023     43-Rural: Remote 40.23537
## 3632                 Humboldt County      6023     43-Rural: Remote 40.23537
## 3633                 Hennepin County     27053     21-Suburb: Large 45.08796
## 3634                 Hennepin County     27053     21-Suburb: Large 45.08799
## 3635                  Kendall County     17093     21-Suburb: Large 41.68390
## 3636                  Allegan County     26005      31-Town: Fringe 42.45549
## 3637                    Wayne County     21231    42-Rural: Distant 36.78347
## 3638               Hutchinson County     46067     43-Rural: Remote 43.39337
## 3639                   Beadle County     46005     41-Rural: Fringe 44.34174
## 3640                   Beadle County     46005     41-Rural: Fringe 44.34174
## 3641                   Orange County      6059    12-City: Mid-size 33.78485
## 3642                   Orange County      6059    12-City: Mid-size 33.78481
## 3643                Snohomish County     53061  22-Suburb: Mid-size 48.01963
## 3644                  Brevard County     12009     41-Rural: Fringe 28.77063
## 3645               Shiawassee County     26155    42-Rural: Distant 43.00988
## 3646                   Steele County     27147     32-Town: Distant 44.08431
## 3647                   Steele County     27147     32-Town: Distant 44.10043
## 3648                   Steele County     27147     32-Town: Distant 44.08435
## 3649                  Daviess County     21059     23-Suburb: Small 37.75617
## 3650                  Daviess County     21059       13-City: Small 37.76656
## 3651              Los Angeles County      6037       11-City: Large 34.19641
## 3652                   Alpena County     26007      33-Town: Remote 45.08212
## 3653               Eau Claire County     55035       13-City: Small 44.80772
## 3654                  Oakland County     26125     21-Suburb: Large 42.82460
## 3655                  Oakland County     26125     21-Suburb: Large 42.81467
## 3656                Lafayette County     28071      33-Town: Remote 34.36952
## 3657                  Oakland County     26125     21-Suburb: Large 42.81870
## 3658                  Tillman County     40141    42-Rural: Distant 34.50478
## 3659                  Tillman County     40141    42-Rural: Distant 34.50478
## 3660             Pottawatomie County     40125     41-Rural: Fringe 35.24965
## 3661             Pottawatomie County     40125     41-Rural: Fringe 35.24965
## 3662                  Webster County     29225    42-Rural: Distant 37.15364
## 3663                   Wright County     29229     41-Rural: Fringe 37.12423
## 3664                    Floyd County     48153     32-Town: Distant 33.98621
## 3665                   Dallas County     48113       11-City: Large 32.77158
## 3666                   Dallas County     48113       11-City: Large 32.77158
## 3667                   Dallas County     48113       11-City: Large 32.77158
## 3668                   Dallas County     48113       11-City: Large 32.77158
## 3669                   Dallas County     48113       11-City: Large 32.77158
## 3670                  Hockley County     48219     43-Rural: Remote 33.81667
## 3671                  Hockley County     48219     43-Rural: Remote 33.81667
## 3672                   Bailey County     48017      33-Town: Remote 34.22407
## 3673                     Lamb County     48279     43-Rural: Remote 34.06306
## 3674                  Hockley County     48219     43-Rural: Remote 33.81667
## 3675                     Gray County     48179      33-Town: Remote 35.54306
## 3676                  Alachua County     12001    12-City: Mid-size 29.64866
## 3677                  Henrico County     51087     21-Suburb: Large 37.66192
## 3678                   Yakima County     53077      31-Town: Fringe 46.44520
## 3679                     Pike County     17149      33-Town: Remote 39.60963
## 3680                 Brazoria County     48039     21-Suburb: Large 29.56434
## 3681             Hillsborough County     12057       11-City: Large 27.99558
## 3682                  Manatee County     12081     21-Suburb: Large 27.46870
## 3683               Miami-Dade County     12086       11-City: Large 25.80939
## 3684                    Pasco County     12101     21-Suburb: Large 28.26815
## 3685                 Pinellas County     12103     21-Suburb: Large 27.85065
## 3686                 Hernando County     12053  22-Suburb: Mid-size 28.47913
## 3687                     Leon County     12073    12-City: Mid-size 30.42910
## 3688                     Polk County     12105    12-City: Mid-size 28.04431
## 3689               Palm Beach County     12099     21-Suburb: Large 26.65974
## 3690                   Orange County     12095       11-City: Large 28.55412
## 3691                  Volusia County     12127       13-City: Small 29.27938
## 3692                     Clay County     12019     21-Suburb: Large 30.12614
## 3693                   Marion County     12083       13-City: Small 29.19006
## 3694                  Broward County     12011     21-Suburb: Large 26.15654
## 3695                St. Lucie County     12111     21-Suburb: Large 27.42507
## 3696                    Duval County     12031       11-City: Large 30.35358
## 3697                 Escambia County     12033       13-City: Small 30.48309
## 3698                      Lee County     12071       13-City: Small 26.60689
## 3699          San Luis Obispo County      6079       13-City: Small 35.25388
## 3700               Sacramento County      6067     21-Suburb: Large 38.68447
## 3701                 Humboldt County      6023      33-Town: Remote 40.87642
## 3702                  Pacific County     53049      33-Town: Remote 46.66181
## 3703                  Ventura County      6111    12-City: Mid-size 34.26806
## 3704          Sitka City and Borough      2220      33-Town: Remote 57.05158
## 3705              Los Angeles County      6037       11-City: Large 34.15888
## 3706                  Pacific County     53049      33-Town: Remote 46.66177
## 3707                San Mateo County      6081     21-Suburb: Large 37.58543
## 3708              Santa Clara County      6085       13-City: Small 37.43584
## 3709                   Kitsap County     53035     41-Rural: Fringe 47.79648
## 3710                    Butte County      6007     32-Town: Distant 39.43664
## 3711                     Inyo County      6027     43-Rural: Remote 37.15245
## 3712                     Napa County      6055      31-Town: Fringe 38.58314
## 3713                      Lee County     12071     21-Suburb: Large 26.61855
## 3714               Palm Beach County     12099     21-Suburb: Large 26.67014
## 3715               Palm Beach County     12099     21-Suburb: Large 26.68720
## 3716               Palm Beach County     12099    12-City: Mid-size 26.75136
## 3717                  Manatee County     12081     21-Suburb: Large 27.64002
## 3718                  Manatee County     12081     21-Suburb: Large 27.46545
## 3719          San Luis Obispo County      6079     23-Suburb: Small 35.45804
## 3720                San Diego County      6073     21-Suburb: Large 32.60512
## 3721                 Franklin County     53021     32-Town: Distant 46.66076
## 3722                      Bay County     12005       13-City: Small 30.15195
## 3723                   Panola County     48365     41-Rural: Fringe 32.12879
## 3724                  Stevens County     53065      33-Town: Remote 48.54321
## 3725                     King County     53033     21-Suburb: Large 47.65234
## 3726                    Latah County     16057     32-Town: Distant 46.72240
## 3727                 Hennepin County     27053     21-Suburb: Large 45.06765
## 3728              Los Angeles County      6037     21-Suburb: Large 33.90152
## 3729                  Whatcom County     53073  22-Suburb: Mid-size 48.86004
## 3730                Snohomish County     53061  22-Suburb: Mid-size 47.92704
## 3731                  Clallam County     53009      33-Town: Remote 48.11502
## 3732                    Edgar County     17045     32-Town: Distant 39.61092
## 3733                    Edgar County     17045     32-Town: Distant 39.60892
## 3734              Los Angeles County      6037     21-Suburb: Large 34.06075
## 3735                   La Paz County      4012     32-Town: Distant 34.14930
## 3736                 Hennepin County     27053       13-City: Small 44.99145
## 3737                   Orange County      6059     21-Suburb: Large 33.90162
## 3738                  Madison County     47113       13-City: Small 35.62016
## 3739                  Hockley County     48219     41-Rural: Fringe 33.59539
## 3740                  Lubbock County     48303       11-City: Large 33.61237
## 3741                   Sevier County     47155      31-Town: Fringe 35.86554
## 3742                  Jackson County     26075     23-Suburb: Small 42.29316
## 3743                  Douglas County     31055       11-City: Large 41.26741
## 3744                   DuPage County     17043     21-Suburb: Large 41.94257
## 3745                   Orange County     37135     41-Rural: Fringe 36.02815
## 3746                  Jackson County     28059       13-City: Small 30.36224
## 3747                    Pasco County     12101     21-Suburb: Large 28.21144
## 3748                  El Paso County     48141       11-City: Large 31.75083
## 3749              Los Angeles County      6037       11-City: Large 33.95674
## 3750                  El Paso County     48141       11-City: Large 31.76284
## 3751          San Luis Obispo County      6079       13-City: Small 35.63974
## 3752                  Houston County      1069       13-City: Small 31.24287
## 3753                   Dallas County     48113       11-City: Large 32.77158
## 3754                Snohomish County     53061    12-City: Mid-size 48.00451
## 3755                    Scott County     27139     21-Suburb: Large 44.74995
## 3756                  Passaic County     34031     21-Suburb: Large 40.90056
## 3757                   Collin County     48085     21-Suburb: Large 33.08536
## 3758               Miami-Dade County     12086     21-Suburb: Large 25.83277
## 3759                   Dallas County     48113     21-Suburb: Large 32.91138
## 3760                     Hays County     48209    42-Rural: Distant 30.15088
## 3761                Lancaster County     31109       11-City: Large 40.76379
## 3762                     King County     53033       11-City: Large 47.56573
## 3763                     Cass County     26027      31-Town: Fringe 41.99018
## 3764               Crittenden County     21055      33-Town: Remote 37.33054
## 3765                   Fresno County      6019       11-City: Large 36.79841
## 3766                   Fresno County      6019       11-City: Large 36.74254
## 3767              Los Angeles County      6037     21-Suburb: Large 33.92151
## 3768                    Coles County     17029     32-Town: Distant 39.48451
## 3769                     Kerr County     48265     43-Rural: Remote 30.24985
## 3770                     Bell County     48027     41-Rural: Fringe 31.05349
## 3771                 Columbia County     12023     41-Rural: Fringe 30.19473
## 3772               Sacramento County      6067     21-Suburb: Large 38.68402
## 3773                      Nye County     32023      33-Town: Remote 36.19108
## 3774                    Adams County      8001     21-Suburb: Large 39.92082
## 3775                  Grayson County     48181       13-City: Small 33.75124
## 3776                      Nye County     32023      33-Town: Remote 36.19108
## 3777                Jefferson County     48245    12-City: Mid-size 30.08932
## 3778                      Ada County     16001     21-Suburb: Large 43.63999
## 3779                      Nye County     32023      33-Town: Remote 36.19108
## 3780                  Goodhue County     27049     32-Town: Distant 44.54453
## 3781                  Goodhue County     27049     41-Rural: Fringe 44.53680
## 3782                Washtenaw County     26161    12-City: Mid-size 42.24753
## 3783              Los Angeles County      6037     21-Suburb: Large 33.84747
## 3784                    Sarpy County     31153     21-Suburb: Large 41.16556
## 3785                  El Paso County      8041     41-Rural: Fringe 38.93382
## 3786                Jefferson County     48245    12-City: Mid-size 30.08932
## 3787                     Kane County     17089     21-Suburb: Large 41.84704
## 3788                     Kane County     17089     21-Suburb: Large 41.83035
## 3789                  Payette County     16075     32-Town: Distant 44.07549
## 3790                Jefferson County     21111       11-City: Large 38.21725
## 3791                Jefferson County     53031    42-Rural: Distant 47.82353
## 3792                  Allegan County     26005    42-Rural: Distant 42.60035
## 3793                 San Saba County     48411      33-Town: Remote 31.20018
## 3794                   Dallas County     48113       11-City: Large 32.78473
## 3795              Santa Clara County      6085       11-City: Large 37.36734
## 3796                 Caldwell County     48055     41-Rural: Fringe 29.83666
## 3797               Otter Tail County     27111     43-Rural: Remote 46.56602
## 3798               Otter Tail County     27111     43-Rural: Remote 46.56607
## 3799             Pend Oreille County     53051     32-Town: Distant 48.17669
## 3800                San Mateo County      6081     21-Suburb: Large 37.61239
## 3801                San Mateo County      6081     21-Suburb: Large 37.61239
## 3802                 Santa Fe County     35049     41-Rural: Fringe 35.56206
## 3803                 Maricopa County      4013     21-Suburb: Large 33.58703
## 3804                   Peoria County     17143     41-Rural: Fringe 40.73449
## 3805                  Hockley County     48219    42-Rural: Distant 33.45983
## 3806                St. Lucie County     12111     21-Suburb: Large 27.44295
## 3807                 Cabarrus County     37025       13-City: Small 35.43901
## 3808               Otter Tail County     27111      33-Town: Remote 46.58995
## 3809                  Grayson County     48181     41-Rural: Fringe 33.70999
## 3810                Riverside County      6065     21-Suburb: Large 33.77269
## 3811                    Perry County     28111    42-Rural: Distant 31.19809
## 3812                    Perry County     21193     41-Rural: Fringe 37.27520
## 3813                 Pershing County     32027     43-Rural: Remote 40.18314
## 3814                   Fresno County      6019       11-City: Large 36.74279
## 3815                   Harris County     48201       13-City: Small 29.76822
## 3816                     Hale County     48189      33-Town: Remote 34.19360
## 3817                 Petersburg city     51730     21-Suburb: Large 37.22722
## 3818               Stanislaus County      6099    12-City: Mid-size 37.66418
## 3819                    Clark County     32003       11-City: Large 36.27815
## 3820                     Wake County     37183       11-City: Large 35.78831
## 3821                Granville County     37077     41-Rural: Fringe 36.34333
## 3822                    Clark County     21049     32-Town: Distant 37.97772
## 3823                   Ramsey County     27123     21-Suburb: Large 45.00341
## 3824                    Marin County      6041       13-City: Small 38.01414
## 3825                   Travis County     48453       11-City: Large 30.24361
## 3826                 Monterey County      6053     41-Rural: Fringe 36.22121
## 3827                   Orange County     37135       13-City: Small 35.90339
## 3828                    Essex County     25009     21-Suburb: Large 42.70758
## 3829              Los Angeles County      6037       11-City: Large 34.28104
## 3830                Menominee County     26109     43-Rural: Remote 45.69128
## 3831                Kalamazoo County     26077       13-City: Small 42.27759
## 3832                St. Clair County     26147    42-Rural: Distant 43.12642
## 3833             Chesterfield County     51041     21-Suburb: Large 37.38791
## 3834              Los Angeles County      6037       11-City: Large 33.99694
## 3835                   Fresno County      6019       11-City: Large 36.78077
## 3836                  Bastrop County     48021      31-Town: Fringe 30.35227
## 3837              Santa Clara County      6085       11-City: Large 37.23569
## 3838                   Placer County      6061     21-Suburb: Large 38.89658
## 3839              Los Angeles County      6037     21-Suburb: Large 34.58669
## 3840                 Gwinnett County     13135     21-Suburb: Large 33.96333
## 3841                   Benton County     53005     41-Rural: Fringe 46.17930
## 3842                   Wright County     27171      31-Town: Fringe 45.17968
## 3843                 Maricopa County      4013       11-City: Large 33.45374
## 3844                  Kenosha County     55059  22-Suburb: Mid-size 42.59434
## 3845               Blue Earth County     27013       13-City: Small 44.16669
## 3846                 Imperial County      6025       13-City: Small 32.78088
## 3847                   Dallas County      1047     32-Town: Distant 32.40834
## 3848                 Hennepin County     27053       13-City: Small 45.02095
## 3849                   Harris County     48201       11-City: Large 29.67303
## 3850                   Fresno County      6019       11-City: Large 36.71388
## 3851                Jefferson County     53031     41-Rural: Fringe 48.01213
## 3852                 Siskiyou County      6093     43-Rural: Remote 41.96370
## 3853                 Nottoway County     51135    42-Rural: Distant 37.26374
## 3854            Prince Edward County     51147      33-Town: Remote 37.31958
## 3855                 Morrison County     27097    42-Rural: Distant 45.97844
## 3856                     Pike County      1109      33-Town: Remote 31.80630
## 3857                     Pike County     21195      33-Town: Remote 37.53782
## 3858                San Mateo County      6081      31-Town: Fringe 37.46301
## 3859                     Pima County      4019       11-City: Large 32.16129
## 3860                     Pine County     27115      33-Town: Remote 45.81279
## 3861                   Amador County      6005    42-Rural: Distant 38.41149
## 3862                     Erie County     36029       13-City: Small 42.92230
## 3863                   Custer County     30017     41-Rural: Fringe 46.40905
## 3864                   Custer County     30017     41-Rural: Fringe 46.40905
## 3865                  Goodhue County     27049      31-Town: Fringe 44.20173
## 3866                  Broward County     12011     21-Suburb: Large 26.10534
## 3867                  Gratiot County     26057     32-Town: Distant 43.41021
## 3868                     Cass County     27021     43-Rural: Remote 46.72684
## 3869                     Cass County     27021     43-Rural: Remote 46.72682
## 3870                    Gregg County     48183       13-City: Small 32.52400
## 3871               Burlington County     34005    42-Rural: Distant 39.68343
## 3872                 Pinellas County     12103     21-Suburb: Large 27.90261
## 3873                 Pinellas County     12103       13-City: Small 27.91542
## 3874                 Pinellas County     12103     21-Suburb: Large 27.89953
## 3875                 Pinellas County     12103       11-City: Large 27.76770
## 3876                 Pinellas County     12103     21-Suburb: Large 27.84959
## 3877                 Pinellas County     12103    12-City: Mid-size 27.97274
## 3878                    Anoka County     27003     21-Suburb: Large 45.18138
## 3879                    Anoka County     27003     21-Suburb: Large 45.18119
## 3880                    Anoka County     27003     21-Suburb: Large 45.18138
## 3881                    Anoka County     27003     21-Suburb: Large 45.18134
## 3882                  Houston County     48225      33-Town: Remote 31.30095
## 3883                     Rock County     27133    42-Rural: Distant 43.64609
## 3884               San Benito County      6069     32-Town: Distant 36.81672
## 3885                 Monterey County      6053     32-Town: Distant 36.43472
## 3886                     Carson City     32510       13-City: Small 39.17219
## 3887                   Hardee County     12049     41-Rural: Fringe 27.49733
## 3888                    Butte County      6007     32-Town: Distant 39.52135
## 3889                   Shasta County      6089       13-City: Small 40.58871
## 3890                   Merced County      6047     32-Town: Distant 37.26044
## 3891                  Sanilac County     26151     41-Rural: Fringe 43.26707
## 3892                    Crook County     41013     32-Town: Distant 44.30201
## 3893                  Allegan County     26005     41-Rural: Fringe 42.68306
## 3894                   Madera County      6039       13-City: Small 36.94349
## 3895                Pipestone County     27117     32-Town: Distant 43.99749
## 3896               Washington County     27163     21-Suburb: Large 44.82987
## 3897                   Placer County      6061      31-Town: Fringe 38.90649
## 3898                   Placer County      6061      31-Town: Fringe 38.90649
## 3899                   Placer County      6061      31-Town: Fringe 38.90653
## 3900                   Collin County     48085       11-City: Large 33.02490
## 3901                   Collin County     48085  22-Suburb: Mid-size 33.24866
## 3902                   Collin County     48085     41-Rural: Fringe 33.06352
## 3903                  El Paso County     48141       11-City: Large 31.75343
## 3904                     Weld County      8123    12-City: Mid-size 40.45110
## 3905                     Weld County      8123    12-City: Mid-size 40.45106
## 3906              San Joaquin County      6077       11-City: Large 38.03648
## 3907                  Sanpete County     49039     41-Rural: Fringe 39.53632
## 3908                 Atascosa County     48013     32-Town: Distant 28.96583
## 3909                  Fairfax County     51059     21-Suburb: Large 38.80604
## 3910                   Plumas County      6063      33-Town: Remote 39.93599
## 3911                   Plumas County      6063     41-Rural: Fringe 39.93390
## 3912               Litchfield County      9005     21-Suburb: Large 41.67878
## 3913                 Hennepin County     27053       11-City: Large 45.00176
## 3914                 Hennepin County     27053       11-City: Large 45.00208
## 3915               Pocahontas County     19151     43-Rural: Remote 42.73189
## 3916                  Bannock County     16005       13-City: Small 42.86580
## 3917                  Kleberg County     48273     32-Town: Distant 27.51140
## 3918                   Harris County     48201       13-City: Small 29.76823
## 3919               Newport News city     51700    12-City: Mid-size 37.08477
## 3920                   Morton County     20129     43-Rural: Remote 37.00839
## 3921                  Larimer County      8069    12-City: Mid-size 40.57813
## 3922                   Orange County      6059       11-City: Large 33.81709
## 3923                     Utah County     49049       13-City: Small 40.27858
## 3924                    Duval County     12031       11-City: Large 30.31195
## 3925                     Polk County     12105     41-Rural: Fringe 27.88141
## 3926                     Polk County     12105     41-Rural: Fringe 27.88150
## 3927                     Polk County     12105     21-Suburb: Large 27.88008
## 3928                     Polk County     12105     41-Rural: Fringe 27.99032
## 3929              Los Angeles County      6037     21-Suburb: Large 34.06144
## 3930                  Broward County     12011    12-City: Mid-size 26.26853
## 3931                 Pontotoc County     28115     41-Rural: Fringe 34.25541
## 3932                    Bexar County     48029       11-City: Large 29.38559
## 3933                Jefferson County     48245       13-City: Small 29.89390
## 3934                Snohomish County     53061    12-City: Mid-size 47.97081
## 3935                 Columbia County     55021     32-Town: Distant 43.54360
## 3936                Kalamazoo County     26077       13-City: Small 42.23100
## 3937                   Plumas County      6063     41-Rural: Fringe 39.93390
## 3938                 Monterey County      6053      33-Town: Remote 36.20968
## 3939                   Orange County     12095     21-Suburb: Large 28.61182
## 3940                  Cameron County     48061     41-Rural: Fringe 26.16651
## 3941                    Bexar County     48029       11-City: Large 29.43880
## 3942                  Carroll County     24013     23-Suburb: Small 39.56037
## 3943                  Larimer County      8069    12-City: Mid-size 40.58971
## 3944                   Powell County     21197     32-Town: Distant 37.85379
## 3945                 Maricopa County      4013       11-City: Large 33.43290
## 3946                 Hennepin County     27053     21-Suburb: Large 45.12530
## 3947                 Hennepin County     27053     21-Suburb: Large 45.06782
## 3948                 Hennepin County     27053     21-Suburb: Large 44.88450
## 3949               Blue Earth County     27013       13-City: Small 44.16739
## 3950                    Adams County      8001    42-Rural: Distant 39.74476
## 3951                 Crawford County     55023      33-Town: Remote 43.03276
## 3952                   Austin County     48015    42-Rural: Distant 29.62504
## 3953                   Wright County     27171      31-Town: Fringe 45.29903
## 3954                Kandiyohi County     27067      33-Town: Remote 45.14137
## 3955                     Dane County     55025     21-Suburb: Large 43.17936
## 3956                  Olmsted County     27109    12-City: Mid-size 44.00101
## 3957                   Carver County     27019     21-Suburb: Large 44.81810
## 3958                   Ramsey County     27123     21-Suburb: Large 45.02866
## 3959                Crow Wing County     27035     43-Rural: Remote 46.60015
## 3960                   Grundy County     17063     41-Rural: Fringe 41.39769
## 3961                   Grundy County     17063     41-Rural: Fringe 41.39769
## 3962                   Travis County     48453       11-City: Large 30.21550
## 3963                   Taylor County     48441    12-City: Mid-size 32.42009
## 3964                  Randall County     48381    12-City: Mid-size 35.18046
## 3965                   Dallas County     48113    12-City: Mid-size 32.97387
## 3966                   Travis County     48453       11-City: Large 30.22685
## 3967                  Cameron County     48061    12-City: Mid-size 25.93636
## 3968                    Erath County     48143      33-Town: Remote 32.08470
## 3969                  Liberty County     48291    42-Rural: Distant 30.04085
## 3970                Val Verde County     48465      33-Town: Remote 29.38872
## 3971                  El Paso County     48141       11-City: Large 31.72823
## 3972                  El Paso County     48141       11-City: Large 31.85404
## 3973                  Tarrant County     48439       11-City: Large 32.72480
## 3974                     Hood County     48221     32-Town: Distant 32.43283
## 3975                   Walker County     48471     32-Town: Distant 30.70801
## 3976                     Webb County     48479       11-City: Large 27.50537
## 3977                   Denton County     48121     21-Suburb: Large 33.01941
## 3978                  Lubbock County     48303       11-City: Large 33.57570
## 3979                  Midland County     48329    12-City: Mid-size 31.98901
## 3980                  Hidalgo County     48215       13-City: Small 26.19428
## 3981                    Comal County     48091       13-City: Small 29.67774
## 3982                   Travis County     48453       11-City: Large 30.43762
## 3983                   Harris County     48201     21-Suburb: Large 29.99102
## 3984                  Hidalgo County     48215     21-Suburb: Large 26.23717
## 3985                   Travis County     48453     21-Suburb: Large 30.44212
## 3986                  Hidalgo County     48215     21-Suburb: Large 26.20541
## 3987                  Hidalgo County     48215     21-Suburb: Large 26.18598
## 3988                   Dallas County     48113    12-City: Mid-size 32.80168
## 3989                    Bowie County     48037       13-City: Small 33.45119
## 3990                    Smith County     48423    12-City: Mid-size 32.36069
## 3991                 McLennan County     48309    12-City: Mid-size 31.58859
## 3992                    Bexar County     48029       11-City: Large 29.47009
## 3993                    Bexar County     48029     21-Suburb: Large 29.51141
## 3994                  Hidalgo County     48215       13-City: Small 26.25952
## 3995                     Cole County     29051       13-City: Small 38.56256
## 3996                   Denver County      8031       11-City: Large 39.75636
## 3997             Presque Isle County     26141     43-Rural: Remote 45.36157
## 3998                   Cabell County     54011  22-Suburb: Mid-size 38.43383
## 3999                 Harrison County     54033     41-Rural: Fringe 39.22400
## 4000                  Iredell County     37097     21-Suburb: Large 35.79478
## 4001                    Duval County     12031       11-City: Large 30.43442
## 4002                      Lee County     12071       13-City: Small 26.63234
## 4003               Washington County     48477     32-Town: Distant 30.15884
## 4004                 Angelina County     48005    42-Rural: Distant 31.28471
## 4005              San Joaquin County      6077     41-Rural: Fringe 37.97262
## 4006                  Carroll County     24013     23-Suburb: Small 39.54528
## 4007                   Bonner County     16017    42-Rural: Distant 48.18106
## 4008           Prince William County     51153     41-Rural: Fringe 38.63255
## 4009                   Mercer County     54055     32-Town: Distant 37.36921
## 4010               Mille Lacs County     27095     32-Town: Distant 45.57043
## 4011               Mille Lacs County     27095     32-Town: Distant 45.57024
## 4012                   Collin County     48085  22-Suburb: Mid-size 33.17804
## 4013                   Collin County     48085  22-Suburb: Mid-size 33.17757
## 4014                    Scott County     27139     21-Suburb: Large 44.71908
## 4015                  Lubbock County     48303       11-City: Large 33.57344
## 4016                   Harris County     48201       11-City: Large 29.65517
## 4017               Montgomery County      1101    12-City: Mid-size 32.34835
## 4018                  Russell County     51167     32-Town: Distant 36.90094
## 4019                   Orange County     12095     21-Suburb: Large 28.45697
## 4020               Williamson County     17199     41-Rural: Fringe 37.84784
## 4021                   Grundy County     17063     21-Suburb: Large 41.45449
## 4022                     Pima County      4019       11-City: Large 32.21732
## 4023              Northampton County     51131     43-Rural: Remote 37.40387
## 4024               Montgomery County     48339     21-Suburb: Large 30.13339
## 4025               Montgomery County     48339     41-Rural: Fringe 30.19703
## 4026                 Fluvanna County     51065    42-Rural: Distant 37.87407
## 4027                 Powhatan County     51145    42-Rural: Distant 37.54588
## 4028                    Perry County     17145     32-Town: Distant 38.00918
## 4029                Milwaukee County     55079       11-City: Large 43.03931
## 4030                  Lowndes County      1085    42-Rural: Distant 32.15128
## 4031                 Atlantic County     34001  22-Suburb: Mid-size 39.42045
## 4032               Burlington County     34005     21-Suburb: Large 40.01397
## 4033                 Cape May County     34009     41-Rural: Fringe 39.09888
## 4034                   Mercer County     34021     21-Suburb: Large 40.24735
## 4035                 Monmouth County     34025     21-Suburb: Large 40.26598
## 4036                   Warren County     34041     41-Rural: Fringe 40.76623
## 4037               Sacramento County      6067       13-City: Small 38.60128
## 4038                   Tulare County      6107       13-City: Small 36.07730
## 4039                    Butte County      6007     32-Town: Distant 39.52149
## 4040             Contra Costa County      6013     21-Suburb: Large 37.93359
## 4041                 Maricopa County      4013       11-City: Large 33.62361
## 4042             Contra Costa County      6013     21-Suburb: Large 38.01713
## 4043                   Orange County     12095     21-Suburb: Large 28.49769
## 4044                Snohomish County     53061  22-Suburb: Mid-size 48.01749
## 4045                  Ventura County      6111     21-Suburb: Large 34.25565
## 4046                   Lassen County      6035      33-Town: Remote 40.42588
## 4047                    Bronx County     36005       11-City: Large 40.84832
## 4048                     Cook County     17031     21-Suburb: Large 41.86508
## 4049                     Utah County     49049    12-City: Mid-size 40.24249
## 4050                 Guilford County     37081    12-City: Mid-size 35.95438
## 4051                  Hidalgo County     48215     21-Suburb: Large 26.20171
## 4052                   Solano County      6095    12-City: Mid-size 38.27681
## 4053              Los Angeles County      6037       11-City: Large 34.07502
## 4054                   Pueblo County      8101    12-City: Mid-size 38.28199
## 4055              Los Angeles County      6037     21-Suburb: Large 34.01078
## 4056                     King County     53033     21-Suburb: Large 47.44109
## 4057           Grand Traverse County     26055     43-Rural: Remote 44.54495
## 4058                  Pulaski County     21199      33-Town: Remote 37.04152
## 4059                    Bexar County     48029     21-Suburb: Large 29.49061
## 4060                 Marshall County     21157      33-Town: Remote 36.86474
## 4061                   Putnam County     36079     21-Suburb: Large 41.42522
## 4062                   Pierce County     53053     21-Suburb: Large 47.16015
## 4063                   Pierce County     53053     21-Suburb: Large 47.16015
## 4064                   Pierce County     53053     21-Suburb: Large 47.16015
## 4065               New Castle County     10003       13-City: Small 39.73943
## 4066               Palm Beach County     12099     21-Suburb: Large 26.54761
## 4067                   Queens County     36081       11-City: Large 40.76566
## 4068                   Pierce County     53053     21-Suburb: Large 47.18842
## 4069                San Diego County      6073     21-Suburb: Large 32.72940
## 4070             Spotsylvania County     51177     41-Rural: Fringe 38.18068
## 4071                   Burnet County     48053     32-Town: Distant 30.76490
## 4072                  Newaygo County     26123     41-Rural: Fringe 43.46127
## 4073                   Lapeer County     26087    42-Rural: Distant 43.22450
## 4074                    Grant County     53025     32-Town: Distant 47.23405
## 4075                   Clarke County     28023     43-Rural: Remote 32.03465
## 4076                Champaign County     17019       13-City: Small 40.11559
## 4077                   Sumner County     47165     21-Suburb: Large 36.39850
## 4078                     Mesa County      8077       13-City: Small 39.07133
## 4079                     Clay County     12019     21-Suburb: Large 29.99698
## 4080              Los Angeles County      6037     21-Suburb: Large 33.89603
## 4081              Los Angeles County      6037     21-Suburb: Large 34.58808
## 4082                     Boyd County     21019       13-City: Small 38.48003
## 4083                     Boyd County     21019       13-City: Small 38.47454
## 4084                   Racine County     55101       13-City: Small 42.75768
## 4085                   Racine County     55101  22-Suburb: Mid-size 42.70988
## 4086                   Racine County     55101       13-City: Small 42.73672
## 4087                     Knox County     17095     32-Town: Distant 40.94779
## 4088                     Knox County     17095     32-Town: Distant 40.94611
## 4089                     Knox County     17095     32-Town: Distant 40.94611
## 4090                   Warren County     17187     32-Town: Distant 40.91264
## 4091                   Warren County     17187     32-Town: Distant 40.91264
## 4092                St. Louis County     27137  22-Suburb: Mid-size 46.74366
## 4093                Riverside County      6065       11-City: Large 33.94050
## 4094                   Harris County     48201     21-Suburb: Large 29.79714
## 4095                     King County     53033     21-Suburb: Large 47.52078
## 4096                  Alameda County      6001       11-City: Large 37.81331
## 4097                     Boyd County     21019    42-Rural: Distant 38.29134
## 4098                San Diego County      6073      31-Town: Fringe 33.02673
## 4099              Los Angeles County      6037     21-Suburb: Large 34.03393
## 4100               Cumberland County     37051    12-City: Mid-size 35.07903
## 4101                Van Zandt County     48467    42-Rural: Distant 32.42299
## 4102                Mendocino County      6045     43-Rural: Remote 39.02938
## 4103              Los Angeles County      6037     21-Suburb: Large 33.75853
## 4104              Los Angeles County      6037       13-City: Small 34.13817
## 4105                Riverside County      6065    12-City: Mid-size 33.48772
## 4106                 Randolph County     54083      33-Town: Remote 38.91703
## 4107                   Rankin County     28121     21-Suburb: Large 32.28121
## 4108               Jo Daviess County     17085    42-Rural: Distant 42.31456
## 4109               Stephenson County     17177     32-Town: Distant 42.29860
## 4110               Pennington County     46103       13-City: Small 44.07650
## 4111                 Stafford County     51179     21-Suburb: Large 38.40963
## 4112                     Kern County      6029      31-Town: Fringe 34.86467
## 4113                 Alamance County     37001  22-Suburb: Mid-size 36.06162
## 4114                   Madera County      6039    42-Rural: Distant 37.31551
## 4115                    Union County     34039     21-Suburb: Large 40.67848
## 4116                  El Paso County     48141     21-Suburb: Large 31.99543
## 4117                  El Paso County     48141     21-Suburb: Large 31.99533
## 4118                  Willacy County     48489     32-Town: Distant 26.47930
## 4119                  Jackson County     29095     21-Suburb: Large 39.01513
## 4120                  Spokane County     53063     21-Suburb: Large 47.68259
## 4121                  Stevens County     53065      31-Town: Fringe 47.80909
## 4122                   Pierce County     53053       13-City: Small 47.17880
## 4123                   Pierce County     53053       13-City: Small 47.17880
## 4124                   Orange County      6059       11-City: Large 33.74747
## 4125                  Tarrant County     48439     21-Suburb: Large 32.77777
## 4126                     Polk County     12105     21-Suburb: Large 27.87550
## 4127                      Ada County     16001     21-Suburb: Large 43.60084
## 4128                    Bexar County     48029       11-City: Large 29.34114
## 4129                   Crosby County     48107    42-Rural: Distant 33.68065
## 4130                   Tehama County      6103     41-Rural: Fringe 40.17344
## 4131                    Eagle County      8037      33-Town: Remote 39.64193
## 4132                 Dutchess County     36027     41-Rural: Fringe 42.01994
## 4133                 Beltrami County     27007     43-Rural: Remote 47.87851
## 4134                 Beltrami County     27007     43-Rural: Remote 47.87851
## 4135                 Beltrami County     27007     43-Rural: Remote 47.87851
## 4136                     Clay County     27027     41-Rural: Fringe 46.84864
## 4137                     Clay County     27027     41-Rural: Fringe 46.84864
## 4138                    Clark County     32003     41-Rural: Fringe 36.26477
## 4139               Cottonwood County     27033      33-Town: Remote 43.86695
## 4140               Cottonwood County     27033      33-Town: Remote 43.86695
## 4141                    Teton County     56039    42-Rural: Distant 43.36686
## 4142                  Goodhue County     27049     41-Rural: Fringe 44.53509
## 4143                   Shasta County      6089       13-City: Small 40.53106
## 4144                    Bexar County     48029       11-City: Large 29.51813
## 4145                 Waushara County     55137    42-Rural: Distant 44.05376
## 4146                   Orange County     51137     41-Rural: Fringe 38.23918
## 4147              Los Angeles County      6037     21-Suburb: Large 33.88623
## 4148                   DeSoto County     12027     32-Town: Distant 27.22102
## 4149                  Alameda County      6001     21-Suburb: Large 37.71363
## 4150                San Mateo County      6081       13-City: Small 37.49544
## 4151                  Redwood County     27127      33-Town: Remote 44.53826
## 4152                    Kings County      6031     32-Town: Distant 36.00395
## 4153                    Kings County      6031     41-Rural: Fringe 36.00832
## 4154                  Lubbock County     48303     41-Rural: Fringe 33.59121
## 4155            Santa Barbara County      6083     32-Town: Distant 34.60762
## 4156                Buena Vista city     51530     32-Town: Distant 37.73683
## 4157                    Roanoke city     51770       13-City: Small 37.28330
## 4158                Winnebago County     17201     41-Rural: Fringe 42.30331
## 4159                    Boone County     17007     21-Suburb: Large 42.25482
## 4160                Winnebago County     17201     41-Rural: Fringe 42.30331
## 4161                    Henry County     17073    42-Rural: Distant 41.41507
## 4162                Nez Perce County     16069       13-City: Small 46.41831
## 4163                   McLean County     17113       13-City: Small 40.47925
## 4164             King William County     51101    42-Rural: Distant 37.74186
## 4165                 Stafford County     51179     41-Rural: Fringe 38.38150
## 4166                Winnebago County     17201     41-Rural: Fringe 42.30326
## 4167                 Monmouth County     34025     41-Rural: Fringe 40.27033
## 4168             Pittsylvania County     51143    42-Rural: Distant 36.79017
## 4169                    Wythe County     51197     32-Town: Distant 36.94243
## 4170                Whiteside County     17195     32-Town: Distant 41.80781
## 4171                   Denton County     48121    12-City: Mid-size 33.22896
## 4172                   Collin County     48085       11-City: Large 33.03444
## 4173                     King County     53033    12-City: Mid-size 47.37121
## 4174                     Wise County     51195     32-Town: Distant 36.98058
## 4175                 Campbell County     21037     41-Rural: Fringe 39.01796
## 4176                 Stafford County     51179  22-Suburb: Mid-size 38.33303
## 4177                     Cook County     17031     21-Suburb: Large 41.68804
## 4178                     Cook County     17031     21-Suburb: Large 41.52391
## 4179                    Boone County     17007     21-Suburb: Large 42.24725
## 4180              Los Angeles County      6037       11-City: Large 33.80544
## 4181                    Eaton County     26045      31-Town: Fringe 42.56180
## 4182                 Imperial County      6025      31-Town: Fringe 32.98531
## 4183              Santa Clara County      6085       11-City: Large 37.33631
## 4184                    Davis County     49011     21-Suburb: Large 41.03046
## 4185                   Kitsap County     53035       13-City: Small 47.56223
## 4186                  Oakland County     26125     21-Suburb: Large 42.73380
## 4187              Santa Clara County      6085       11-City: Large 37.35112
## 4188              Los Angeles County      6037     21-Suburb: Large 33.89891
## 4189                     Lake County      6033     32-Town: Distant 39.11167
## 4190                  Ventura County      6111      31-Town: Fringe 34.35452
## 4191               Santa Cruz County      6087     41-Rural: Fringe 36.92649
## 4192                  Allegan County     26005      31-Town: Fringe 42.44844
## 4193              Los Angeles County      6037       11-City: Large 33.79337
## 4194                    Floyd County     21071     41-Rural: Fringe 37.57478
## 4195                     King County     53033     21-Suburb: Large 47.61356
## 4196                  Oakland County     26125     21-Suburb: Large 42.73381
## 4197                    Scott County     51169  22-Suburb: Mid-size 36.64105
## 4198               Rensselaer County     36083       13-City: Small 42.70949
## 4199                     King County     53033    12-City: Mid-size 47.45640
## 4200                 Franklin County     21073     32-Town: Distant 38.19912
## 4201                    Ferry County     53019     43-Rural: Remote 48.64164
## 4202                   Ramsey County     27123       11-City: Large 44.93115
## 4203                  Bristol County     25005     21-Suburb: Large 41.70592
## 4204                   Denver County      8031       11-City: Large 39.67603
## 4205                   Denton County     48121     21-Suburb: Large 33.01911
## 4206                  Kenosha County     55059  22-Suburb: Mid-size 42.58337
## 4207       Ketchikan Gateway Borough      2130      33-Town: Remote 55.35460
## 4208                Multnomah County     41051     21-Suburb: Large 45.53196
## 4209                  Cameron County     48061     41-Rural: Fringe 26.12689
## 4210                 Colorado County     48089     32-Town: Distant 29.57452
## 4211              Los Angeles County      6037       11-City: Large 34.09496
## 4212                     Lake County      6033     32-Town: Distant 38.93347
## 4213                   Elmore County     16039     32-Town: Distant 43.13714
## 4214                  Volusia County     12127       13-City: Small 29.21723
## 4215                  Randall County     48381    12-City: Mid-size 35.15504
## 4216                   Nueces County     48355       11-City: Large 27.71057
## 4217                  Tarrant County     48439       11-City: Large 32.72013
## 4218                   Harris County     48201       11-City: Large 29.98388
## 4219                  Lubbock County     48303       11-City: Large 33.54836
## 4220                  Midland County     48329    12-City: Mid-size 31.97576
## 4221                    Ector County     48135    12-City: Mid-size 31.86085
## 4222                   Harris County     48201     21-Suburb: Large 29.69012
## 4223                     Bell County     48027    12-City: Mid-size 31.12443
## 4224                     Knox County     47093    12-City: Mid-size 36.01986
## 4225                   Travis County     48453       11-City: Large 30.23570
## 4226                   Harris County     48201       11-City: Large 29.99968
## 4227                 Hennepin County     27053       13-City: Small 44.83063
## 4228                   Orange County      6059    12-City: Mid-size 33.79722
## 4229                   Richmond city     51760    12-City: Mid-size 37.55194
## 4230                   Richmond city     51760    12-City: Mid-size 37.55187
## 4231                 Richmond County     51159    42-Rural: Distant 37.93111
## 4232                   Richmond city     51760    12-City: Mid-size 37.54967
## 4233               Miami-Dade County     12086     21-Suburb: Large 25.60446
## 4234                     Polk County     12105       13-City: Small 28.07659
## 4235                 Arapahoe County      8005     41-Rural: Fringe 39.66000
## 4236                     Knox County     47093    12-City: Mid-size 35.98681
## 4237                   Jasper County     45053     32-Town: Distant 32.49419
## 4238                    Butte County      6007      31-Town: Fringe 39.80473
## 4239                   Sonoma County      6097    12-City: Mid-size 38.44969
## 4240            Santa Barbara County      6083  22-Suburb: Mid-size 34.41112
## 4241               Sacramento County      6067       11-City: Large 38.47026
## 4242                   Fresno County      6019    42-Rural: Distant 36.53314
## 4243              Doña Ana County     35013  22-Suburb: Mid-size 32.27564
## 4244                 Sandoval County     35043     21-Suburb: Large 35.23914
## 4245                  Johnson County     48251      31-Town: Fringe 32.34604
## 4246                   Madera County      6039    42-Rural: Distant 36.85181
## 4247                   Washoe County     32031    12-City: Mid-size 39.51276
## 4248                   Denver County      8031       11-City: Large 39.74534
## 4249                     Lyon County     32019    42-Rural: Distant 39.08338
## 4250                   Warren County     21227       13-City: Small 36.99885
## 4251                   Warren County     21227       13-City: Small 36.99685
## 4252                    Brown County     27015     32-Town: Distant 44.29978
## 4253                     Wood County     55141     32-Town: Distant 44.37374
## 4254               Sacramento County      6067    42-Rural: Distant 38.32973
## 4255                   Solano County      6095      31-Town: Fringe 38.16542
## 4256                     Wake County     37183       11-City: Large 35.79743
## 4257                     Kent County     26081     21-Suburb: Large 43.12696
## 4258                  Wabasha County     27157     43-Rural: Remote 44.30994
## 4259                    Grant County     55043    42-Rural: Distant 43.19324
## 4260                   Benton County     53005       13-City: Small 46.27239
## 4261                 Hennepin County     27053     21-Suburb: Large 45.01142
## 4262                   Isanti County     27059     32-Town: Distant 45.57902
## 4263                   Monroe County     26115      31-Town: Fringe 41.95359
## 4264                   Isanti County     27059     32-Town: Distant 45.57902
## 4265                   Isanti County     27059     32-Town: Distant 45.57902
## 4266                Jefferson Parish     22051     21-Suburb: Large 29.93838
## 4267                Riverside County      6065       11-City: Large 33.97894
## 4268                Riverside County      6065     21-Suburb: Large 33.92122
## 4269                Riverside County      6065       11-City: Large 33.97893
## 4270                   Dakota County     27037      31-Town: Fringe 44.74124
## 4271                Jefferson County     30043     43-Rural: Remote 46.22746
## 4272                Jefferson County     30043     43-Rural: Remote 46.22746
## 4273                St. Clair County     26147     23-Suburb: Small 42.71678
## 4274                  Volusia County     12127       13-City: Small 29.23842
## 4275                  Bullitt County     21029     21-Suburb: Large 38.00140
## 4276                 Waukesha County     55133       13-City: Small 43.02154
## 4277                   Canyon County     16027     41-Rural: Fringe 43.69096
## 4278                  Stearns County     27145       13-City: Small 45.54014
## 4279               Palm Beach County     12099     21-Suburb: Large 26.78062
## 4280              Los Angeles County      6037     41-Rural: Fringe 34.09153
## 4281                Botetourt County     51023  22-Suburb: Mid-size 37.34260
## 4282                 Hennepin County     27053     21-Suburb: Large 45.04118
## 4283                 Hennepin County     27053     21-Suburb: Large 45.00427
## 4284                  Charles County     24017     41-Rural: Fringe 38.57052
## 4285                 La Plata County      8067     32-Town: Distant 37.24716
## 4286               Stanislaus County      6099    12-City: Mid-size 37.66496
## 4287                   Racine County     55101      31-Town: Fringe 42.69121
## 4288              Los Angeles County      6037       11-City: Large 34.22614
## 4289                      Ada County     16001    12-City: Mid-size 43.61561
## 4290                   Monroe County     55081     41-Rural: Fringe 43.98699
## 4291                   Cabell County     54011  22-Suburb: Mid-size 38.41805
## 4292                   Marion County     41047    12-City: Mid-size 44.92728
## 4293                  Alameda County      6001     21-Suburb: Large 37.52015
## 4294                  Oakland County     26125     21-Suburb: Large 42.63358
## 4295                  Olmsted County     27109    12-City: Mid-size 43.97279
## 4296                  Olmsted County     27109    12-City: Mid-size 43.97269
## 4297                 San Juan County     35045       13-City: Small 36.75950
## 4298                 Nicollet County     27103      31-Town: Fringe 44.34332
## 4299                     Ogle County     17141    42-Rural: Distant 41.98105
## 4300               Rockcastle County     21203      33-Town: Remote 37.35789
## 4301              Los Angeles County      6037     21-Suburb: Large 34.13509
## 4302                 Rockland County     36087     21-Suburb: Large 41.14726
## 4303                St. Louis County     27137       13-City: Small 46.84694
## 4304                 Rockwall County     48397     41-Rural: Fringe 32.93548
## 4305                  Stearns County     27145      31-Town: Fringe 45.46431
## 4306                    White County     17193    42-Rural: Distant 37.98283
## 4307                 Tazewell County     17179     21-Suburb: Large 40.64335
## 4308                 Tazewell County     17179     21-Suburb: Large 40.64352
## 4309                   Jersey County     17083     32-Town: Distant 39.11988
## 4310                 Macoupin County     17117     32-Town: Distant 39.26532
## 4311                     Lake County     17097     21-Suburb: Large 42.45453
## 4312                   Greene County     17061     32-Town: Distant 39.43746
## 4313                 Macoupin County     17117     32-Town: Distant 39.29358
## 4314                    White County     17193    42-Rural: Distant 37.97826
## 4315                   Macomb County     26099     21-Suburb: Large 42.80334
## 4316                    Wayne County     26163     21-Suburb: Large 42.23257
## 4317              Los Angeles County      6037     21-Suburb: Large 34.00789
## 4318                     Ohio County     54069       13-City: Small 40.07137
## 4319                 Hennepin County     27053       11-City: Large 44.96998
## 4320                   Tulare County      6107     32-Town: Distant 36.52811
## 4321                     Polk County     12105  22-Suburb: Mid-size 27.91105
## 4322                  Hidalgo County     48215       13-City: Small 26.20836
## 4323                 Hennepin County     27053       11-City: Large 44.99414
## 4324              Los Angeles County      6037    12-City: Mid-size 34.13988
## 4325                   Queens County     36081       11-City: Large 40.77331
## 4326                  Douglas County     41019      33-Town: Remote 43.20166
## 4327                   Roseau County     27135      33-Town: Remote 48.84875
## 4328                   Travis County     48453       11-City: Large 30.31987
## 4329                Baltimore County     24005     21-Suburb: Large 39.33322
## 4330               Stanislaus County      6099     41-Rural: Fringe 37.48909
## 4331                   Dakota County     27037     21-Suburb: Large 44.73251
## 4332                      Bay County     12005       13-City: Small 30.16560
## 4333                   Ramsey County     27123     21-Suburb: Large 45.00494
## 4334                   Chaves County     35005    42-Rural: Distant 33.14083
## 4335                   Shelby County     48419      33-Town: Remote 31.80386
## 4336               Williamson County     48491    12-City: Mid-size 30.54690
## 4337                Mendocino County      6045     43-Rural: Remote 39.79219
## 4338                    Hinds County     28049    12-City: Mid-size 32.31531
## 4339              Los Angeles County      6037     21-Suburb: Large 33.98337
## 4340                    Bexar County     48029       11-City: Large 29.48886
## 4341                  Alameda County      6001     21-Suburb: Large 37.66907
## 4342                   Fulton County     17057     41-Rural: Fringe 40.52797
## 4343                  Hancock County     17067      33-Town: Remote 40.41405
## 4344                McDonough County     17109      33-Town: Remote 40.45549
## 4345                   Fulton County     17057     32-Town: Distant 40.55873
## 4346                  Hancock County     17067      33-Town: Remote 40.41405
## 4347                McDonough County     17109      33-Town: Remote 40.45549
## 4348                     Clay County     27027     41-Rural: Fringe 46.84864
## 4349                  Douglas County     31055     21-Suburb: Large 41.25000
## 4350                  Douglas County     31055     21-Suburb: Large 41.25007
## 4351                  Lincoln County     27081     43-Rural: Remote 44.28174
## 4352                  Lincoln County     27081     43-Rural: Remote 44.28174
## 4353                  Saginaw County     26145       13-City: Small 43.43003
## 4354                  Saginaw County     26145       13-City: Small 43.44087
## 4355              Los Angeles County      6037     21-Suburb: Large 33.98835
## 4356                St. Clair County      1115    42-Rural: Distant 33.83211
## 4357                  Alameda County      6001       11-City: Large 37.76573
## 4358                  Douglas County     27041      33-Town: Remote 45.90184
## 4359              Santa Clara County      6085       11-City: Large 37.36906
## 4360                    Bexar County     48029       11-City: Large 29.49244
## 4361               Rutherford County     37161     32-Town: Distant 35.32976
## 4362                   Dakota County     27037     21-Suburb: Large 44.87951
## 4363                   Colusa County      6011     41-Rural: Fringe 39.16037
## 4364          Anchorage Municipality      2020       11-City: Large 61.16968
## 4365            San Francisco County      6075       11-City: Large 37.78045
## 4366            San Francisco County      6075       11-City: Large 37.74592
## 4367            San Francisco County      6075       11-City: Large 37.76577
## 4368            San Francisco County      6075       11-City: Large 37.75533
## 4369                 Woodford County     21239      31-Town: Fringe 38.04841
## 4370                   McLean County     17113       13-City: Small 40.47925
## 4371                Jefferson County     17081     32-Town: Distant 38.29309
## 4372                   Marion County     17121      33-Town: Remote 38.52425
## 4373                  Chatham County     37037     32-Town: Distant 35.72998
## 4374                    Grant County     53025     41-Rural: Fringe 47.31805
## 4375                    Grant County     53025     41-Rural: Fringe 47.31671
## 4376                  Saginaw County     26145     41-Rural: Fringe 43.50561
## 4377                  Saginaw County     26145  22-Suburb: Mid-size 43.45764
## 4378                  Saginaw County     26145       13-City: Small 43.43231
## 4379                Washtenaw County     26161     41-Rural: Fringe 42.34870
## 4380                St. Clair County     17163     21-Suburb: Large 38.51804
## 4381                   Goshen County     56015      33-Town: Remote 42.05949
## 4382                    Anoka County     27003     41-Rural: Fringe 45.40006
## 4383                    Anoka County     27003     41-Rural: Fringe 45.40006
## 4384                   Nueces County     48355      31-Town: Fringe 27.79673
## 4385                   Dallas County     48113     21-Suburb: Large 32.97066
## 4386                 Monterey County      6053    12-City: Mid-size 36.70063
## 4387                Washtenaw County     26161     21-Suburb: Large 42.18008
## 4388                   Tehama County      6103     32-Town: Distant 40.15770
## 4389                    Lemhi County     16059     41-Rural: Fringe 45.16772
## 4390                     King County     53033       11-City: Large 47.67658
## 4391                    Lemhi County     16059      33-Town: Remote 45.17928
## 4392                   Menard County     17129    42-Rural: Distant 39.99729
## 4393                 Kankakee County     17091     23-Suburb: Small 41.08055
## 4394                   Mercer County     54055     41-Rural: Fringe 37.33169
## 4395                 Imperial County      6025      31-Town: Fringe 32.81513
## 4396                   Marion County     41047      31-Town: Fringe 45.10341
## 4397               San Benito County      6069     32-Town: Distant 36.85458
## 4398           San Bernardino County      6071    12-City: Mid-size 34.12931
## 4399                    Marin County      6041     21-Suburb: Large 37.93533
## 4400                    Bexar County     48029       11-City: Large 29.37793
## 4401              Los Angeles County      6037     21-Suburb: Large 33.98740
## 4402              Los Angeles County      6037     21-Suburb: Large 34.08359
## 4403                   Sonoma County      6097     23-Suburb: Small 38.23794
## 4404               San Benito County      6069     41-Rural: Fringe 36.88278
## 4405               San Benito County      6069     32-Town: Distant 36.85460
## 4406           San Bernardino County      6071     21-Suburb: Large 34.10778
## 4407           San Bernardino County      6071    12-City: Mid-size 34.12738
## 4408                San Diego County      6073       11-City: Large 32.76976
## 4409                San Diego County      6073       11-City: Large 32.79420
## 4410                San Diego County      6073       11-City: Large 32.80479
## 4411                  El Paso County     48141     21-Suburb: Large 31.57687
## 4412              San Joaquin County      6077       11-City: Large 37.95463
## 4413              San Joaquin County      6077       11-City: Large 37.90906
## 4414                     Kern County      6029      31-Town: Fringe 35.67998
## 4415                   Fresno County      6019     41-Rural: Fringe 36.61674
## 4416                San Diego County      6073    42-Rural: Distant 33.27433
## 4417                   Merced County      6047     32-Town: Distant 37.06686
## 4418          San Luis Obispo County      6079     41-Rural: Fringe 35.33436
## 4419          San Luis Obispo County      6079     23-Suburb: Small 35.32129
## 4420                San Diego County      6073     41-Rural: Fringe 33.08725
## 4421                 Imperial County      6025     41-Rural: Fringe 32.75109
## 4422                   Juneau County     55057      33-Town: Remote 43.80850
## 4423               Washington County     13303      33-Town: Remote 32.96659
## 4424                   Bonner County     16017     32-Town: Distant 48.30816
## 4425                   Fresno County      6019    42-Rural: Distant 37.03661
## 4426                 Sangamon County     17167    12-City: Mid-size 39.71845
## 4427                 Sangamon County     17167    12-City: Mid-size 39.71867
## 4428                Mendocino County      6045      33-Town: Remote 39.41370
## 4429            Santa Barbara County      6083  22-Suburb: Mid-size 34.45199
## 4430            Santa Barbara County      6083  22-Suburb: Mid-size 34.45137
## 4431              Santa Clara County      6085    12-City: Mid-size 37.34191
## 4432              Santa Clara County      6085       11-City: Large 37.38406
## 4433              Santa Clara County      6085       11-City: Large 37.38372
## 4434               Santa Cruz County      6087       13-City: Small 36.98103
## 4435               Santa Cruz County      6087       13-City: Small 36.98796
## 4436               Santa Cruz County      6087       13-City: Small 36.98796
## 4437                San Diego County      6073     21-Suburb: Large 33.38444
## 4438                  Cameron County     48061     41-Rural: Fringe 26.07656
## 4439                  Hidalgo County     48215     21-Suburb: Large 26.17043
## 4440                  Cameron County     48061     41-Rural: Fringe 26.07773
## 4441              Los Angeles County      6037       13-City: Small 34.00528
## 4442               Santa Rosa County     12113     41-Rural: Fringe 30.64801
## 4443                  Cameron County     48061  22-Suburb: Mid-size 26.25357
## 4444                  Cameron County     48061  22-Suburb: Mid-size 26.25367
## 4445              Los Angeles County      6037     21-Suburb: Large 34.01259
## 4446                San Diego County      6073     21-Suburb: Large 32.86543
## 4447                San Diego County      6073     21-Suburb: Large 32.86541
## 4448                  Fayette County     21067       11-City: Large 38.04648
## 4449                 Richland County     45079    12-City: Mid-size 34.07576
## 4450                Snohomish County     53061      31-Town: Fringe 48.24501
## 4451                 New York County     36061       11-City: Large 40.74753
## 4452                 Montcalm County     26117     41-Rural: Fringe 43.17552
## 4453                   Dallas County     48113       11-City: Large 32.75233
## 4454                   Benton County     27009  22-Suburb: Mid-size 45.59113
## 4455                  Chatham County     13051    12-City: Mid-size 32.06058
## 4456                     Mono County      6051     43-Rural: Remote 38.56833
## 4457                 Guilford County     37081       11-City: Large 36.13387
## 4458                     Polk County     19153    12-City: Mid-size 41.58397
## 4459                  Spokane County     53063    12-City: Mid-size 47.67433
## 4460                Riverside County      6065     21-Suburb: Large 33.77907
## 4461                    Bexar County     48029     21-Suburb: Large 29.49402
## 4462                   Saline County     17165     32-Town: Distant 37.73926
## 4463                    Duval County     12031       11-City: Large 30.36961
## 4464                   Harris County     48201       11-City: Large 29.75884
## 4465                Snohomish County     53061  22-Suburb: Mid-size 48.06268
## 4466                  Manatee County     12081     21-Suburb: Large 27.42658
## 4467               Sacramento County      6067       11-City: Large 38.49395
## 4468               Bernalillo County     35001       11-City: Large 35.06891
## 4469                    Pasco County     12101     21-Suburb: Large 28.23931
## 4470                   Harris County     48201     21-Suburb: Large 29.79525
## 4471                Lancaster County     31109       11-City: Large 40.79918
## 4472              Los Angeles County      6037     21-Suburb: Large 34.70070
## 4473                     Wake County     37183     21-Suburb: Large 35.75475
## 4474                     Bell County     48027       13-City: Small 31.07767
## 4475              Los Angeles County      6037     41-Rural: Fringe 34.45746
## 4476                 Siskiyou County      6093     43-Rural: Remote 41.45991
## 4477                 Siskiyou County      6093     43-Rural: Remote 41.57736
## 4478                 Seminole County     12117       13-City: Small 28.77698
## 4479                Snohomish County     53061     21-Suburb: Large 47.78576
## 4480              Los Angeles County      6037     41-Rural: Fringe 34.45784
## 4481                  Broward County     12011    12-City: Mid-size 26.08919
## 4482                     King County     53033       11-City: Large 47.61337
## 4483                 Hennepin County     27053     21-Suburb: Large 44.86805
## 4484               Eau Claire County     55035       13-City: Small 44.80761
## 4485                     Bath County     21011    42-Rural: Distant 38.13357
## 4486                     Leon County     12073    12-City: Mid-size 30.44554
## 4487                Snohomish County     53061     21-Suburb: Large 47.79807
## 4488                  Cameron County     48061       13-City: Small 26.17379
## 4489                     Rice County     27131     41-Rural: Fringe 44.32065
## 4490                   Harris County     48201       11-City: Large 29.80251
## 4491                  Fairfax County     51059     21-Suburb: Large 38.85726
## 4492                 Thurston County     53067       13-City: Small 46.97813
## 4493               Miami-Dade County     12086     21-Suburb: Large 25.93445
## 4494               Miami-Dade County     12086       11-City: Large 25.79468
## 4495               Miami-Dade County     12086     21-Suburb: Large 25.59928
## 4496               Miami-Dade County     12086     21-Suburb: Large 25.83993
## 4497                  Douglas County     31055       11-City: Large 41.20455
## 4498                    Bexar County     48029       11-City: Large 29.35557
## 4499                   Yakima County     53077  22-Suburb: Mid-size 46.65326
## 4500                   Yakima County     53077  22-Suburb: Mid-size 46.65326
## 4501              Los Angeles County      6037       11-City: Large 33.79667
## 4502                   Fresno County      6019      31-Town: Fringe 36.56970
## 4503                   Solano County      6095    12-City: Mid-size 38.27456
## 4504                 Seminole County     12117       13-City: Small 28.75783
## 4505             Hillsborough County     12057       11-City: Large 27.98191
## 4506                   Gaines County     48165      33-Town: Remote 32.71734
## 4507                     Tate County     28137     32-Town: Distant 34.61534
## 4508               Stanislaus County      6099      31-Town: Fringe 37.63631
## 4509                    Grant County     53025     41-Rural: Fringe 46.73860
## 4510                Minnehaha County     46099     41-Rural: Fringe 43.56136
## 4511                  Clallam County     53009     32-Town: Distant 48.08294
## 4512                   Merced County      6047       13-City: Small 37.30011
## 4513                   Tulare County      6107    12-City: Mid-size 36.33678
## 4514                Snohomish County     53061    12-City: Mid-size 47.97082
## 4515               Bernalillo County     35001     21-Suburb: Large 35.11840
## 4516                    Wayne County     26163       11-City: Large 42.32847
## 4517                   Collin County     48085  22-Suburb: Mid-size 33.21027
## 4518                   Collin County     48085  22-Suburb: Mid-size 33.21019
## 4519                  Houston County     48225      33-Town: Remote 31.29790
## 4520                    Bexar County     48029       11-City: Large 29.38773
## 4521                   Travis County     48453       11-City: Large 30.36513
## 4522                     Dane County     55025       11-City: Large 43.11776
## 4523           San Bernardino County      6071     21-Suburb: Large 34.42479
## 4524                    Scott County     27139     21-Suburb: Large 44.78556
## 4525                    Scott County     27139     21-Suburb: Large 44.78556
## 4526                Milwaukee County     55079       11-City: Large 43.05380
## 4527                  Tarrant County     48439     21-Suburb: Large 32.80683
## 4528                Milwaukee County     55079       13-City: Small 43.00295
## 4529                  Carlton County     27017      31-Town: Fringe 46.73461
## 4530                   Shasta County      6089       13-City: Small 40.54836
## 4531                   Shasta County      6089       13-City: Small 40.58824
## 4532                 Scotland County     37165    42-Rural: Distant 34.85869
## 4533                   Orange County     12095     21-Suburb: Large 28.61191
## 4534                   Shelby County     21211     32-Town: Distant 38.21326
## 4535                   Shelby County     17173     41-Rural: Fringe 39.42204
## 4536                   Harris County     48201       11-City: Large 29.68441
## 4537                Mendocino County      6045      33-Town: Remote 39.43957
## 4538                   Staunton city     51790       13-City: Small 38.14956
## 4539                   Staunton city     51790       13-City: Small 38.17524
## 4540                    Pasco County     12101     41-Rural: Fringe 28.30578
## 4541                     Polk County     12105     41-Rural: Fringe 27.90396
## 4542              Los Angeles County      6037       11-City: Large 34.18465
## 4543              Los Angeles County      6037    12-City: Mid-size 33.82312
## 4544                   Wright County     27171    42-Rural: Distant 45.05898
## 4545             San Patricio County     48409      31-Town: Fringe 27.97523
## 4546                     King County     53033     21-Suburb: Large 47.74751
## 4547                     Inyo County      6027     43-Rural: Remote 35.97849
## 4548                   Harris County     48201       11-City: Large 29.70440
## 4549                   Yakima County     53077     32-Town: Distant 46.32019
## 4550                   Carter County     47019     41-Rural: Fringe 36.32936
## 4551                  Alachua County     12001  22-Suburb: Mid-size 29.66237
## 4552                 Cheyenne County     31033      33-Town: Remote 41.14289
## 4553                  Alachua County     12001    12-City: Mid-size 29.66770
## 4554               Bernalillo County     35001       11-City: Large 35.11295
## 4555           San Bernardino County      6071    12-City: Mid-size 34.11648
## 4556                  Ventura County      6111      31-Town: Fringe 34.40301
## 4557              Los Angeles County      6037     21-Suburb: Large 34.11841
## 4558                   Nevada County      6057     32-Town: Distant 39.32375
## 4559                     Mono County      6051      33-Town: Remote 37.63853
## 4560                 Mariposa County      6043     43-Rural: Remote 37.47176
## 4561            Santa Barbara County      6083     43-Rural: Remote 34.94368
## 4562                   Sierra County      6091    42-Rural: Distant 39.67952
## 4563                    Butte County      6007       13-City: Small 39.75084
## 4564              Los Angeles County      6037     21-Suburb: Large 33.95275
## 4565                   Tulare County      6107     32-Town: Distant 36.52793
## 4566                   Blaine County     16013      33-Town: Remote 43.51530
## 4567                   Marion County     12083       13-City: Small 29.16264
## 4568                   Nevada County      6057     32-Town: Distant 39.21140
## 4569           San Bernardino County      6071    42-Rural: Distant 34.86075
## 4570           San Bernardino County      6071    42-Rural: Distant 34.86069
## 4571                   Orange County      6059     21-Suburb: Large 33.62072
## 4572                   Dakota County     27037     21-Suburb: Large 44.83205
## 4573             Hillsborough County     12057     21-Suburb: Large 28.00465
## 4574              Los Angeles County      6037     21-Suburb: Large 33.94248
## 4575                   Orange County     12095       11-City: Large 28.46811
## 4576                  Simpson County     28127     32-Town: Distant 31.85821
## 4577                   Skagit County     53057       13-City: Small 48.40563
## 4578                   Skagit County     53057    42-Rural: Distant 48.53169
## 4579                   Chelan County     53007       13-City: Small 47.42696
## 4580                    Grant County     53025      33-Town: Remote 47.12956
## 4581                Snohomish County     53061     21-Suburb: Large 47.85608
## 4582                Snohomish County     53061      31-Town: Fringe 47.86447
## 4583                     Utah County     49049    12-City: Mid-size 40.20770
## 4584                     Hale County     48189      33-Town: Remote 34.19360
## 4585                  Lubbock County     48303      31-Town: Fringe 33.43588
## 4586           San Bernardino County      6071     21-Suburb: Large 34.07085
## 4587                 Fillmore County     27045    42-Rural: Distant 43.70935
## 4588              Los Angeles County      6037     21-Suburb: Large 34.70070
## 4589                    Grant County     53025    42-Rural: Distant 47.38537
## 4590               Rutherford County     47149     21-Suburb: Large 35.96959
## 4591               Twin Falls County     16083     41-Rural: Fringe 42.54366
## 4592                Snohomish County     53061  22-Suburb: Mid-size 47.92704
## 4593                     King County     53033      31-Town: Fringe 47.49405
## 4594           San Bernardino County      6071     41-Rural: Fringe 34.41760
## 4595                   Summit County      8117     41-Rural: Fringe 39.58345
## 4596                   Scurry County     48415    42-Rural: Distant 32.62805
## 4597                    Bexar County     48029       11-City: Large 29.34887
## 4598                    Wayne County     26163     21-Suburb: Large 42.38572
## 4599                 Arapahoe County      8005     21-Suburb: Large 39.64381
## 4600              Los Angeles County      6037     21-Suburb: Large 34.67532
## 4601                   Solano County      6095    12-City: Mid-size 38.25205
## 4602                   Solano County      6095    12-City: Mid-size 38.27421
## 4603                 Maricopa County      4013       11-City: Large 33.51777
## 4604                   Shasta County      6089     43-Rural: Remote 41.05220
## 4605              Los Angeles County      6037       11-City: Large 34.07560
## 4606                     Lake County     27075     41-Rural: Fringe 47.04971
## 4607               Washington County     28151      33-Town: Remote 33.37495
## 4608                 Monterey County      6053     32-Town: Distant 36.51174
## 4609              Los Angeles County      6037     21-Suburb: Large 33.88250
## 4610                   Sonoma County      6097     21-Suburb: Large 38.51225
## 4611                   Sonoma County      6097     21-Suburb: Large 38.51252
## 4612                   Sonoma County      6097     23-Suburb: Small 38.24177
## 4613                    Clark County     32003       11-City: Large 36.14883
## 4614                Milwaukee County     55079       11-City: Large 43.01353
## 4615                  Brevard County     12009       13-City: Small 28.14258
## 4616               Palm Beach County     12099     21-Suburb: Large 26.59649
## 4617                    Texas County     29215     43-Rural: Remote 37.50547
## 4618                Mendocino County      6045     43-Rural: Remote 38.91343
## 4619             Hillsborough County     12057     41-Rural: Fringe 27.67219
## 4620                 Siskiyou County      6093      33-Town: Remote 41.32008
## 4621                 Hennepin County     27053     21-Suburb: Large 44.86805
## 4622                     King County     53033       11-City: Large 47.52472
## 4623                     Yuba County      6115  22-Suburb: Mid-size 39.08306
## 4624                 Franklin County     42055     41-Rural: Fringe 39.84420
## 4625                  Hidalgo County     48215     21-Suburb: Large 26.14772
## 4626                     Pike County     28113    42-Rural: Distant 31.14749
## 4627                  Lubbock County     48303       11-City: Large 33.55699
## 4628                    Union County     37179     21-Suburb: Large 34.92151
## 4629              Los Angeles County      6037       11-City: Large 33.72260
## 4630                 Thurston County     53067  22-Suburb: Mid-size 47.05251
## 4631                Mendocino County      6045      33-Town: Remote 39.14692
## 4632               Washington County     27163     21-Suburb: Large 44.81834
## 4633                   Island County     53029    42-Rural: Distant 48.00547
## 4634                     Kent County     26081    12-City: Mid-size 42.93791
## 4635              Mississippi County     29133     32-Town: Distant 36.89508
## 4636                Milwaukee County     55079       11-City: Large 43.09397
## 4637                    Clark County     32003    42-Rural: Distant 36.51500
## 4638                 Humboldt County      6023     43-Rural: Remote 40.09738
## 4639              Doña Ana County     35013    42-Rural: Distant 32.24930
## 4640                Faribault County     27043    42-Rural: Distant 43.76619
## 4641                 Atlantic County     34001     41-Rural: Fringe 39.53661
## 4642                  Oakland County     26125       13-City: Small 42.45106
## 4643                Salt Lake County     49035     21-Suburb: Large 40.58463
## 4644                    Bexar County     48029     41-Rural: Fringe 29.22207
## 4645                 Ouachita Parish     22073       13-City: Small 32.45184
## 4646                Brunswick County     51025     41-Rural: Fringe 36.80997
## 4647                    Bexar County     48029     41-Rural: Fringe 29.30823
## 4648                    Clark County     32003     21-Suburb: Large 36.11281
## 4649                     Iron County     49021      33-Town: Remote 37.66411
## 4650                      Lee County     12071       13-City: Small 26.63329
## 4651               Washington County     49053       13-City: Small 37.10791
## 4652                 Hennepin County     27053       11-City: Large 44.91840
## 4653                   Canyon County     16027  22-Suburb: Mid-size 43.66469
## 4654                  Cameron County     48061  22-Suburb: Mid-size 26.23906
## 4655                  Hidalgo County     48215    12-City: Mid-size 26.24011
## 4656                Montezuma County      8083     41-Rural: Fringe 37.35388
## 4657                    Bexar County     48029       11-City: Large 29.48872
## 4658                    Bexar County     48029       11-City: Large 29.45188
## 4659                    Bexar County     48029       11-City: Large 29.41878
## 4660                   Harris County     48201       11-City: Large 29.67872
## 4661                   Crosby County     48107     43-Rural: Remote 33.65838
## 4662                   Monroe County     55081     32-Town: Distant 43.94540
## 4663                 Lawrence County     46081     32-Town: Distant 44.48446
## 4664                 Lawrence County     46081     32-Town: Distant 44.48446
## 4665                   Collin County     48085  22-Suburb: Mid-size 33.21525
## 4666                   Collin County     48085  22-Suburb: Mid-size 33.24577
## 4667                   Pierce County     53053    12-City: Mid-size 47.25606
## 4668                 Angelina County     48005      33-Town: Remote 31.35985
## 4669                   Hardin County     21093     41-Rural: Fringe 37.71611
## 4670                   Martin County     12085     21-Suburb: Large 27.19219
## 4671                  Tarrant County     48439       11-City: Large 32.76045
## 4672                   Austin County     48015     32-Town: Distant 29.94992
## 4673                  Spokane County     53063       13-City: Small 47.67562
## 4674                  Spokane County     53063       13-City: Small 47.67483
## 4675                  El Paso County      8041       11-City: Large 38.78662
## 4676                  El Paso County      8041       11-City: Large 38.78678
## 4677                 Mariposa County      6043     43-Rural: Remote 37.47266
## 4678                 Mariposa County      6043     43-Rural: Remote 37.47176
## 4679                   Ottawa County     26139  22-Suburb: Mid-size 43.07203
## 4680                   DeSoto County     12027    42-Rural: Distant 27.11230
## 4681                  Bullitt County     21029     21-Suburb: Large 38.04284
## 4682                    Clark County     32003    42-Rural: Distant 36.31894
## 4683                  Stevens County     53065    42-Rural: Distant 48.05985
## 4684                   Colfax County     35007     43-Rural: Remote 36.38700
## 4685                 Tuolumne County      6109     41-Rural: Fringe 38.03138
## 4686                     Lamb County     48279     43-Rural: Remote 34.26025
## 4687                  Saginaw County     26145    42-Rural: Distant 43.29731
## 4688                St. Clair County     26147     23-Suburb: Small 42.94254
## 4689                  Stearns County     27145  22-Suburb: Mid-size 45.55800
## 4690                  Stearns County     27145       13-City: Small 45.57102
## 4691                  Stearns County     27145       13-City: Small 45.57460
## 4692                St. Croix County     55109     32-Town: Distant 45.13049
## 4693               Washington County     27163     21-Suburb: Large 45.02805
## 4694                 Mackinac County     26097     41-Rural: Fringe 45.88978
## 4695                St. Johns County     12109     23-Suburb: Small 29.94200
## 4696                Jefferson County     21111       11-City: Large 38.25429
## 4697             St. Lawrence County     36089      33-Town: Remote 44.58794
## 4698                  Gratiot County     26057     32-Town: Distant 43.41212
## 4699                  Benewah County     16009     41-Rural: Fringe 47.32811
## 4700                    Macon County     17115       13-City: Small 39.82674
## 4701                      Bay County     12005       13-City: Small 30.17496
## 4702                 Hennepin County     27053     21-Suburb: Large 45.02828
## 4703                  Stearns County     27145       13-City: Small 45.54741
## 4704                  Stearns County     27145       13-City: Small 45.57522
## 4705                St. Johns County     12109     23-Suburb: Small 29.94205
## 4706                St. Johns County     12109     23-Suburb: Small 29.92439
## 4707                  St. Louis city     29510       11-City: Large 38.63792
## 4708                St. Lucie County     12111     21-Suburb: Large 27.45336
## 4709                St. Lucie County     12111     21-Suburb: Large 27.39470
## 4710               St. Mary's County     24037     23-Suburb: Small 38.24057
## 4711                 Nicollet County     27103      31-Town: Fringe 44.32827
## 4712                 Hennepin County     27053       11-City: Large 44.97474
## 4713                Fort Bend County     48157     21-Suburb: Large 29.60135
## 4714               Stanislaus County      6099    12-City: Mid-size 37.64430
## 4715               Stanislaus County      6099     21-Suburb: Large 37.58990
## 4716               Stanislaus County      6099    12-City: Mid-size 37.66260
## 4717                 Chippewa County     55017     32-Town: Distant 44.94898
## 4718                   Stanly County     37167     32-Town: Distant 35.36289
## 4719                   Yakima County     53077       13-City: Small 46.61747
## 4720                  Harnett County     37085      31-Town: Fringe 35.39869
## 4721                 Marshall County     21157    42-Rural: Distant 36.91223
## 4722           San Bernardino County      6071     21-Suburb: Large 34.10775
## 4723                  Allegan County     26005      31-Town: Fringe 42.46624
## 4724                    Wayne County     26163     21-Suburb: Large 42.35334
## 4725               Williamson County     17199     41-Rural: Fringe 37.84784
## 4726                   Massac County     17127      33-Town: Remote 37.16180
## 4727                     Hood County     48221     32-Town: Distant 32.44404
## 4728                   Skagit County     53057     23-Suburb: Small 48.50366
## 4729                  Fayette County     21067       11-City: Large 38.05350
## 4730                     King County     53033       13-City: Small 47.67078
## 4731               Miami-Dade County     12086     21-Suburb: Large 25.84818
## 4732                     Kane County     17089     21-Suburb: Large 41.75390
## 4733               Red Willow County     31145      33-Town: Remote 40.20006
## 4734                   Yakima County     53077     32-Town: Distant 46.25542
## 4735                Riverside County      6065     21-Suburb: Large 34.00130
## 4736               White Pine County     32033      33-Town: Remote 39.24854
## 4737               White Pine County     32033      33-Town: Remote 39.24854
## 4738                   Macomb County     26099     21-Suburb: Large 42.55378
## 4739                 Hartford County      9003       13-City: Small 41.75494
## 4740                  Volusia County     12127     41-Rural: Fringe 29.14549
## 4741                Snohomish County     53061  22-Suburb: Mid-size 48.19764
## 4742                Jefferson County     48245       13-City: Small 29.92684
## 4743              Los Angeles County      6037       11-City: Large 34.25200
## 4744                   Tulare County      6107     23-Suburb: Small 36.15185
## 4745                  Alameda County      6001       11-City: Large 37.81816
## 4746                  Spokane County     53063    12-City: Mid-size 47.66562
## 4747               Montgomery County     48339  22-Suburb: Mid-size 30.42576
## 4748                 Angelina County     48005     41-Rural: Fringe 31.30467
## 4749                 Angelina County     48005     41-Rural: Fringe 31.30466
## 4750                 Angelina County     48005     41-Rural: Fringe 31.30459
## 4751                 Angelina County     48005      33-Town: Remote 31.33397
## 4752                 Angelina County     48005      33-Town: Remote 31.33396
## 4753                  Hidalgo County     48215    12-City: Mid-size 26.17496
## 4754                 Brazoria County     48039     23-Suburb: Small 29.16610
## 4755                     King County     53033     41-Rural: Fringe 47.42260
## 4756                   Collin County     48085     21-Suburb: Large 33.15452
## 4757                   Dallas County     48113    12-City: Mid-size 32.80062
## 4758               Okeechobee County     12093     32-Town: Distant 27.23687
## 4759                Klickitat County     53039    42-Rural: Distant 45.69428
## 4760                   Nueces County     48355       11-City: Large 27.75385
## 4761             Anne Arundel County     24003     21-Suburb: Large 38.98100
## 4762                   Greene County     29077    12-City: Mid-size 37.21088
## 4763               St. Joseph County     26149     32-Town: Distant 41.80164
## 4764                    Ionia County     26067     41-Rural: Fringe 43.08865
## 4765                 Montcalm County     26117     43-Rural: Remote 43.39611
## 4766                    Delta County     26041      33-Town: Remote 45.74598
## 4767                     Kent County     26081    12-City: Mid-size 42.91914
## 4768                     Kent County     26081    12-City: Mid-size 42.98322
## 4769                 Montcalm County     26117    42-Rural: Distant 43.39638
## 4770                     Kent County     26081     21-Suburb: Large 43.02211
## 4771                 Montcalm County     26117    42-Rural: Distant 43.43475
## 4772                Menominee County     26109     32-Town: Distant 45.10691
## 4773                  Gratiot County     26057     32-Town: Distant 43.41015
## 4774                 Montcalm County     26117    42-Rural: Distant 43.29897
## 4775               St. Joseph County     26149      31-Town: Fringe 41.96890
## 4776               Sacramento County      6067       11-City: Large 38.48704
## 4777                     Kane County     17089     21-Suburb: Large 41.79096
## 4778                     Hall County     31079       13-City: Small 40.93931
## 4779                    Falls County     48145     32-Town: Distant 31.30913
## 4780                     Kane County     17089     21-Suburb: Large 42.10779
## 4781                      Lee County     12071       13-City: Small 26.64709
## 4782                    Wolfe County     21237     43-Rural: Remote 37.76238
## 4783                   Barren County     21009     32-Town: Distant 37.00865
## 4784                  Russell County      1113     21-Suburb: Large 32.47725
## 4785                  McHenry County     17111     21-Suburb: Large 42.16185
## 4786                     Leon County     12073    12-City: Mid-size 30.44572
## 4787                     Kane County     17089     21-Suburb: Large 42.13381
## 4788                 Maricopa County      4013    42-Rural: Distant 33.20130
## 4789                 Maricopa County      4013  22-Suburb: Mid-size 33.47017
## 4790                     Pima County      4019       11-City: Large 32.06750
## 4791                     Yuma County      4027    42-Rural: Distant 32.49393
## 4792               Williamson County     48491    12-City: Mid-size 30.49567
## 4793                  Tarrant County     48439       11-City: Large 32.73630
## 4794                 Montcalm County     26117     43-Rural: Remote 43.39611
## 4795                  Suffolk County     36103     21-Suburb: Large 40.91497
## 4796                   Nevada County      6057     41-Rural: Fringe 39.26582
## 4797                   Denver County      8031       11-City: Large 39.67889
## 4798                     Utah County     49049       13-City: Small 40.27854
## 4799             Contra Costa County      6013     21-Suburb: Large 37.97779
## 4800                Riverside County      6065     21-Suburb: Large 33.73179
## 4801                   Dallas County     48113     21-Suburb: Large 32.64407
## 4802                  Houston County     27055    42-Rural: Distant 43.75954
## 4803                Minnehaha County     46099    12-City: Mid-size 43.57764
## 4804                    Weber County     49057       13-City: Small 41.24584
## 4805                    Clark County     53011     41-Rural: Fringe 45.73013
## 4806                Riverside County      6065       11-City: Large 33.94046
## 4807                    Clark County     32003     41-Rural: Fringe 36.26478
## 4808                   Sumter County     12119  22-Suburb: Mid-size 28.86522
## 4809                   Sumter County     13261     32-Town: Distant 32.07216
## 4810                 Maricopa County      4013     21-Suburb: Large 33.55791
## 4811                  Broward County     12011     21-Suburb: Large 26.24325
## 4812                  Broward County     12011     21-Suburb: Large 26.16508
## 4813                 Maricopa County      4013       11-City: Large 33.36356
## 4814                    Boyle County     21021     32-Town: Distant 37.65279
## 4815                   Antrim County     26009    42-Rural: Distant 44.90146
## 4816                    Rowan County     21205     41-Rural: Fringe 38.23166
## 4817                    Kings County      6031     41-Rural: Fringe 36.00882
## 4818                  Broward County     12011    12-City: Mid-size 26.13618
## 4819                   Ramsey County     27123     21-Suburb: Large 45.05807
## 4820                Del Norte County      6015      33-Town: Remote 41.80984
## 4821                San Diego County      6073     21-Suburb: Large 33.04409
## 4822                   Orange County     12095     21-Suburb: Large 28.53823
## 4823                St. Louis County     27137       13-City: Small 46.78905
## 4824                Riverside County      6065    12-City: Mid-size 33.48770
## 4825                 Leelanau County     26089    42-Rural: Distant 44.97117
## 4826                     King County     53033       11-City: Large 47.59976
## 4827                     King County     53033      31-Town: Fringe 47.52912
## 4828                   Orange County      6059     21-Suburb: Large 33.62107
## 4829                      Lee County     12071       13-City: Small 26.63319
## 4830                   Carver County     27019     21-Suburb: Large 44.78894
## 4831                    Scott County     27139     21-Suburb: Large 44.79266
## 4832                    Scott County     27139     21-Suburb: Large 44.79266
## 4833                    Scott County     27139     21-Suburb: Large 44.79266
## 4834                    Scott County     27139     21-Suburb: Large 44.79266
## 4835                    Scott County     27139     21-Suburb: Large 44.79266
## 4836                  Saginaw County     26145  22-Suburb: Mid-size 43.41053
## 4837                  Genesee County     26049     21-Suburb: Large 42.95674
## 4838                San Diego County      6073     21-Suburb: Large 32.57924
## 4839                 Kittitas County     53037     32-Town: Distant 47.22407
## 4840                   Thomas County     13275     32-Town: Distant 30.80949
## 4841                  Tarrant County     48439     21-Suburb: Large 32.77595
## 4842                  Jackson County     26075       13-City: Small 42.24048
## 4843                   Oneida County     36065    42-Rural: Distant 43.34570
## 4844                    Butte County      6007     32-Town: Distant 39.52978
## 4845                     Pike County     28113      33-Town: Remote 31.24623
## 4846                   Pierce County     53053    12-City: Mid-size 47.25220
## 4847                  Tarrant County     48439     21-Suburb: Large 32.81102
## 4848                   Fresno County      6019      31-Town: Fringe 36.70541
## 4849          Prince George's County     24033     21-Suburb: Large 38.91947
## 4850                Talladega County      1121    42-Rural: Distant 33.31846
## 4851                     King County     53033     21-Suburb: Large 47.48540
## 4852                    Marin County      6041     21-Suburb: Large 37.93777
## 4853                Nez Perce County     16069     41-Rural: Fringe 46.35817
## 4854             Hillsborough County     12057     21-Suburb: Large 27.96744
## 4855               Okeechobee County     12093    42-Rural: Distant 27.39835
## 4856                 Escambia County     12033       13-City: Small 30.44696
## 4857                     Cook County     17031     21-Suburb: Large 41.86238
## 4858                     Nash County     37127       13-City: Small 35.94164
## 4859                  Tarrant County     48439     21-Suburb: Large 32.76008
## 4860                  Tarrant County     48439       11-City: Large 32.75934
## 4861                  Tarrant County     48439     21-Suburb: Large 32.91247
## 4862                  Tarrant County     48439       11-City: Large 32.72998
## 4863                  Tarrant County     48439     21-Suburb: Large 32.57520
## 4864                  Tarrant County     48439       11-City: Large 32.73002
## 4865                  Tarrant County     48439     21-Suburb: Large 32.89563
## 4866                  Tarrant County     48439     21-Suburb: Large 32.80620
## 4867                  Tarrant County     48439       11-City: Large 32.75927
## 4868                  Tarrant County     48439     21-Suburb: Large 32.76406
## 4869                  Tarrant County     48439       11-City: Large 32.79686
## 4870                  Tarrant County     48439     21-Suburb: Large 32.93785
## 4871                  Tarrant County     48439     21-Suburb: Large 32.56758
## 4872                  Tarrant County     48439       11-City: Large 32.72998
## 4873                  Tarrant County     48439       11-City: Large 32.72998
## 4874                  Tarrant County     48439       11-City: Large 32.72998
## 4875                  Tarrant County     48439       11-City: Large 32.79748
## 4876                  Tarrant County     48439       11-City: Large 32.76005
## 4877                  Bristol County     25005     21-Suburb: Large 41.90020
## 4878              Fond du Lac County     55039       13-City: Small 43.79890
## 4879                   Taylor County     12123      33-Town: Remote 30.12109
## 4880                   Taylor County     48441    12-City: Mid-size 32.48943
## 4881                   Taylor County     48441    12-City: Mid-size 32.41850
## 4882                   Taylor County     48441    12-City: Mid-size 32.41853
## 4883                    Wayne County     26163       13-City: Small 42.23764
## 4884                   Tunica County     28143     32-Town: Distant 34.70318
## 4885                Minnehaha County     46099    12-City: Mid-size 43.54110
## 4886                Minnehaha County     46099    12-City: Mid-size 43.54110
## 4887                Freestone County     48161      33-Town: Remote 31.63358
## 4888                Freestone County     48161      33-Town: Remote 31.63271
## 4889                  Cowlitz County     53015     32-Town: Distant 45.90359
## 4890                  Johnson County     48251      31-Town: Fringe 32.34531
## 4891                   Albany County     36001       13-City: Small 42.69176
## 4892                   Sonoma County      6097     21-Suburb: Large 38.34014
## 4893                  Lenawee County     26091     32-Town: Distant 42.01221
## 4894                 Hamilton County     12047     41-Rural: Fringe 30.52337
## 4895                     Pima County      4019       11-City: Large 32.22276
## 4896                   Harris County     48201     21-Suburb: Large 29.63793
## 4897                   Tehama County      6103     32-Town: Distant 40.16972
## 4898                  El Paso County     48141       11-City: Large 31.73822
## 4899                    Bexar County     48029       11-City: Large 29.32288
## 4900                  El Paso County     48141       11-City: Large 31.75675
## 4901                  El Paso County     48141       11-City: Large 31.75678
## 4902                     Bell County     48027     41-Rural: Fringe 31.13886
## 4903              Los Angeles County      6037     21-Suburb: Large 34.09404
## 4904          San Luis Obispo County      6079     23-Suburb: Small 35.54475
## 4905          San Luis Obispo County      6079     23-Suburb: Small 35.54475
## 4906                  Kaufman County     48257     32-Town: Distant 32.73891
## 4907                     King County     53033     21-Suburb: Large 47.64808
## 4908                Galveston County     48167     41-Rural: Fringe 29.42710
## 4909                     Hays County     48209     23-Suburb: Small 29.89637
## 4910                   Harris County     48201       11-City: Large 29.87112
## 4911                 Saguache County      8109     43-Rural: Remote 37.75085
## 4912              Santa Clara County      6085       11-City: Large 37.26698
## 4913                 Franklin County     21073     41-Rural: Fringe 38.17321
## 4914                Charlotte County     12015  22-Suburb: Mid-size 27.00515
## 4915                   Nelson County     21179     41-Rural: Fringe 37.83108
## 4916                Highlands County     12055     23-Suburb: Small 27.47797
## 4917                    Norfolk city     51710    12-City: Mid-size 36.90573
## 4918                   Harris County     48201     21-Suburb: Large 29.65526
## 4919                 Hennepin County     27053       13-City: Small 45.04509
## 4920                   Carver County     27019     21-Suburb: Large 44.86116
## 4921                  El Paso County      8041       11-City: Large 38.86115
## 4922                    Duval County     12031       11-City: Large 30.33776
## 4923                  Berrien County     26021       13-City: Small 42.11397
## 4924                  Tarrant County     48439     21-Suburb: Large 32.94073
## 4925                Jefferson County     21111     21-Suburb: Large 38.23621
## 4926                Jefferson County     21111     21-Suburb: Large 38.26405
## 4927                Henderson County     21101  22-Suburb: Mid-size 37.83451
## 4928                  Volusia County     12127       13-City: Small 29.21330
## 4929                Brunswick County     37019    42-Rural: Distant 34.03815
## 4930                    Moore County     37125    42-Rural: Distant 35.34054
## 4931                Multnomah County     41051     21-Suburb: Large 45.53422
## 4932                  Jackson County     12063     32-Town: Distant 30.95152
## 4933                  Alachua County     12001  22-Suburb: Mid-size 29.60725
## 4934                   Etowah County      1055     23-Suburb: Small 33.99633
## 4935                   Travis County     48453       11-City: Large 30.33897
## 4936                   Travis County     48453       11-City: Large 30.33907
## 4937                    Bexar County     48029       11-City: Large 29.58717
## 4938                  Hanover County     51085     41-Rural: Fringe 37.68792
## 4939                   Mohave County      4015     41-Rural: Fringe 35.18885
## 4940                 Lawrence County      1079     41-Rural: Fringe 34.47814
## 4941                   Morgan County     17137     32-Town: Distant 39.73754
## 4942                 Atascosa County     48013     32-Town: Distant 28.92074
## 4943                 Harrison County     28047       13-City: Small 30.39522
## 4944                Oktibbeha County     28105    42-Rural: Distant 33.51941
## 4945               Montgomery County     48339     21-Suburb: Large 30.15605
## 4946                    Larue County     21123    42-Rural: Distant 37.47254
## 4947                   Brazos County     48041       13-City: Small 30.65232
## 4948                    Comal County     48091       13-City: Small 29.69594
## 4949          Anchorage Municipality      2020       11-City: Large 61.21849
## 4950                 Cherokee County     37039     43-Rural: Remote 35.17840
## 4951                    Union County     12125     41-Rural: Fringe 30.01773
## 4952                  Collier County     12021     32-Town: Distant 26.42061
## 4953                   Mobile County      1097    12-City: Mid-size 30.69226
## 4954                      Gem County     16045     32-Town: Distant 43.87611
## 4955                  Tarrant County     48439     21-Suburb: Large 32.56452
## 4956                  Collier County     12021     21-Suburb: Large 26.14159
## 4957                  Collier County     12021     32-Town: Distant 26.40826
## 4958                Jefferson County     21111       11-City: Large 38.20451
## 4959                  Manatee County     12081     21-Suburb: Large 27.63901
## 4960                   Harris County     48201       11-City: Large 29.65518
## 4961                Jessamine County     21113      31-Town: Fringe 37.85905
## 4962                 Fauquier County     51061    42-Rural: Distant 38.62386
## 4963             Virginia Beach city     51810       11-City: Large 36.84336
## 4964               Muhlenberg County     21177     32-Town: Distant 37.22739
## 4965               Rockingham County     37157     32-Town: Distant 36.36339
## 4966               Miami-Dade County     12086     21-Suburb: Large 25.89062
## 4967             Hillsborough County     12057     21-Suburb: Large 28.00788
## 4968                    Scott County     21209     41-Rural: Fringe 38.16589
## 4969               Montgomery County     21173     32-Town: Distant 38.04481
## 4970                  Saginaw County     26145       13-City: Small 43.44561
## 4971                   Harris County     48201     21-Suburb: Large 29.68283
## 4972                   Harris County     48201     21-Suburb: Large 29.68283
## 4973              Northampton County     51131     43-Rural: Remote 37.40379
## 4974                    Anoka County     27003     41-Rural: Fringe 45.15758
## 4975                 Tuolumne County      6109     32-Town: Distant 37.98260
## 4976                   Etowah County      1055       13-City: Small 34.01387
## 4977                   Harris County     48201     21-Suburb: Large 30.01460
## 4978              Los Angeles County      6037       11-City: Large 34.02458
## 4979                   Walker County     48471    42-Rural: Distant 30.54064
## 4980                     Yuba County      6115  22-Suburb: Mid-size 39.14787
## 4981                   McLean County     17113  22-Suburb: Mid-size 40.50947
## 4982              Los Angeles County      6037       11-City: Large 33.94277
## 4983                     Dane County     55025     41-Rural: Fringe 43.02448
## 4984                     King County     53033       11-City: Large 47.68529
## 4985                San Mateo County      6081     21-Suburb: Large 37.69122
## 4986                   Benton County     53005       13-City: Small 46.29372
## 4987                  Spokane County     53063      31-Town: Fringe 47.48959
## 4988                   Lapeer County     26087      31-Town: Fringe 43.03523
## 4989                 Chesapeake city     51550     21-Suburb: Large 36.71853
## 4990                    Norfolk city     51710    12-City: Mid-size 36.85119
## 4991                  Oakland County     26125       13-City: Small 42.66782
## 4992                     Kern County      6029       11-City: Large 35.34716
## 4993                    Wayne County     26163     21-Suburb: Large 42.28733
## 4994                     Mono County      6051     43-Rural: Remote 37.95570
## 4995                   Tipton County     47167     32-Town: Distant 35.55749
## 4996               Tishomingo County     28141     43-Rural: Remote 34.63397
## 4997                   Travis County     48453       11-City: Large 30.18876
## 4998                     Todd County     46121     43-Rural: Remote 43.30052
## 4999                     Todd County     46121     43-Rural: Remote 43.30054
## 5000              Los Angeles County      6037       11-City: Large 34.01511
## 5001                   Harris County     48201     21-Suburb: Large 30.09253
## 5002                   Harris County     48201     21-Suburb: Large 30.09253
## 5003                Ochiltree County     48357     41-Rural: Fringe 36.40690
## 5004                     King County     53033       11-City: Large 47.64247
## 5005                  El Paso County     48141     32-Town: Distant 31.44422
## 5006               Palm Beach County     12099     21-Suburb: Large 26.64005
## 5007                    Wayne County     31179     32-Town: Distant 42.24240
## 5008                  Goodhue County     27049     41-Rural: Fringe 44.57018
## 5009             Hillsborough County     12057     21-Suburb: Large 28.02713
## 5010              Los Angeles County      6037     21-Suburb: Large 33.87839
## 5011                   Kenton County     21117     21-Suburb: Large 39.08586
## 5012                Galveston County     48167     41-Rural: Fringe 29.42710
## 5013                  Tarrant County     48439       11-City: Large 32.73708
## 5014                Milwaukee County     55079       11-City: Large 43.05576
## 5015                  Tarrant County     48439     21-Suburb: Large 32.83906
## 5016                  Fairfax County     51059     21-Suburb: Large 38.76373
## 5017                El Dorado County      6017     32-Town: Distant 38.90557
## 5018                 Davidson County     47037       11-City: Large 36.15461
## 5019                   Travis County     48453       11-City: Large 30.23659
## 5020                   Travis County     48453       11-City: Large 30.17973
## 5021                   Travis County     48453     21-Suburb: Large 30.32797
## 5022                   Travis County     48453     21-Suburb: Large 30.27686
## 5023               Williamson County     48491     21-Suburb: Large 30.57766
## 5024                   Travis County     48453     21-Suburb: Large 30.44643
## 5025                   Solano County      6095    12-City: Mid-size 38.28035
## 5026                   Travis County     48453       11-City: Large 30.33579
## 5027                   Travis County     48453       11-City: Large 30.27207
## 5028                   Travis County     48453       11-City: Large 30.26935
## 5029                   Travis County     48453       11-City: Large 30.23618
## 5030                   Solano County      6095    12-City: Mid-size 38.27989
## 5031                    Lamar County     48277     41-Rural: Fringe 33.66519
## 5032                   Solano County      6095    12-City: Mid-size 38.27911
## 5033                Edgefield County     45037    42-Rural: Distant 33.71438
## 5034                   Mercer County     34021       13-City: Small 40.24438
## 5035                  Grayson County     48181     41-Rural: Fringe 33.70586
## 5036                  Oakland County     26125     21-Suburb: Large 42.45039
## 5037              Los Angeles County      6037       11-City: Large 34.03163
## 5038                 Sarasota County     12115     21-Suburb: Large 27.29027
## 5039                    Comal County     48091    42-Rural: Distant 29.86460
## 5040                Fort Bend County     48157     21-Suburb: Large 29.77121
## 5041                  Trinity County      6105     43-Rural: Remote 40.74971
## 5042                  Trinity County      6105     43-Rural: Remote 40.74971
## 5043                Effingham County     17049      33-Town: Remote 39.11982
## 5044                    Lewis County     53041     43-Rural: Remote 46.57490
## 5045                  Oakland County     26125       13-City: Small 42.60587
## 5046                     Bell County     48027    12-City: Mid-size 31.11439
## 5047                 Humboldt County      6023      33-Town: Remote 40.95522
## 5048                 Coconino County      4005      33-Town: Remote 36.14211
## 5049                   Tulare County      6107  22-Suburb: Mid-size 36.19919
## 5050                   Tulare County      6107    12-City: Mid-size 36.27431
## 5051                   Tulare County      6107    12-City: Mid-size 36.27431
## 5052                   Tulare County      6107  22-Suburb: Mid-size 36.19933
## 5053                   Tulare County      6107  22-Suburb: Mid-size 36.19604
## 5054                   Tulare County      6107    42-Rural: Distant 35.88477
## 5055                 Siskiyou County      6093     43-Rural: Remote 41.95050
## 5056                   Nueces County     48355     41-Rural: Fringe 27.81087
## 5057                 Tuolumne County      6109     32-Town: Distant 37.99013
## 5058                      Lee County     28081      33-Town: Remote 34.24916
## 5059                Clarendon County     45027    42-Rural: Distant 33.88635
## 5060                    Suffolk city     51800     21-Suburb: Large 36.69873
## 5061                 McLennan County     48309     41-Rural: Fringe 31.65025
## 5062                   Turner County     13287     32-Town: Distant 31.70497
## 5063               Miami-Dade County     12086     21-Suburb: Large 25.81143
## 5064                   Washoe County     32031    12-City: Mid-size 39.51680
## 5065                Jefferson County     12065    42-Rural: Distant 30.49084
## 5066                Cleveland County     37045      31-Town: Fringe 35.29272
## 5067              Mecklenburg County     37119       11-City: Large 35.27377
## 5068                   Orange County     51137     41-Rural: Fringe 38.23913
## 5069                  Tarrant County     48439       11-City: Large 32.77203
## 5070               Palm Beach County     12099    12-City: Mid-size 26.70778
## 5071                   Apache County      4001      33-Town: Remote 36.14910
## 5072               Tuscaloosa County      1125       13-City: Small 33.15238
## 5073                   Orange County      6059       13-City: Small 33.73998
## 5074                San Diego County      6073       11-City: Large 32.77213
## 5075                   Skagit County     53057    42-Rural: Distant 48.53169
## 5076                  Madison County     12079     43-Rural: Remote 30.45085
## 5077                San Diego County      6073     21-Suburb: Large 33.18019
## 5078                Riverside County      6065      33-Town: Remote 33.61790
## 5079                    Weber County     49057       13-City: Small 41.24447
## 5080                     King County     53033      31-Town: Fringe 47.49613
## 5081              Spartanburg County     45083    42-Rural: Distant 34.71249
## 5082                Jefferson County     21111       11-City: Large 38.21830
## 5083                   Mobile County      1097    12-City: Mid-size 30.69281
## 5084                   Macomb County     26099     21-Suburb: Large 42.59429
## 5085                 Franklin County     53021  22-Suburb: Mid-size 46.24104
## 5086                   Uintah County     49047    42-Rural: Distant 40.28225
## 5087                Mendocino County      6045      33-Town: Remote 39.16386
## 5088                Middlesex County     34023     21-Suburb: Large 40.52570
## 5089               Otter Tail County     27111    42-Rural: Distant 46.28200
## 5090                    Wayne County     26163     21-Suburb: Large 42.42020
## 5091                    Macon County     37113    42-Rural: Distant 35.11682
## 5092                    Union County     47173    42-Rural: Distant 36.23657
## 5093                    Union County     21225    42-Rural: Distant 37.62972
## 5094                   Canyon County     16027  22-Suburb: Mid-size 43.52808
## 5095                    Union County     12125    42-Rural: Distant 30.08564
## 5096                    Union County     34039     21-Suburb: Large 40.62006
## 5097                   Ramsey County     27123       11-City: Large 44.94342
## 5098                     Webb County     48479       11-City: Large 27.55125
## 5099                     Kent County     26081      31-Town: Fringe 42.93623
## 5100                   Orange County     12095       11-City: Large 28.47711
## 5101                   Orange County     12095     21-Suburb: Large 28.58179
## 5102                   Travis County     48453       11-City: Large 30.28326
## 5103                   Chaves County     35005      33-Town: Remote 33.31609
## 5104                   McLean County     17113  22-Suburb: Mid-size 40.51573
## 5105                Champaign County     17019       13-City: Small 40.11316
## 5106                   Harris County     48201     21-Suburb: Large 29.69637
## 5107                  Douglas County     31055       11-City: Large 41.25872
## 5108               Sacramento County      6067     21-Suburb: Large 38.64592
## 5109                    Essex County     34013       11-City: Large 40.73752
## 5110                     Lake County      6033     41-Rural: Fringe 39.16505
## 5111                    Kings County     36047       11-City: Large 40.68970
## 5112                  Jackson County     41029  22-Suburb: Mid-size 42.47167
## 5113                    Bexar County     48029       11-City: Large 29.49230
## 5114                  Douglas County     31055     41-Rural: Fringe 41.35616
## 5115              Los Angeles County      6037     21-Suburb: Large 33.99347
## 5116                    Eagle County      8037     41-Rural: Fringe 39.56513
## 5117                Riverside County      6065     21-Suburb: Large 33.88578
## 5118                Riverside County      6065     41-Rural: Fringe 33.83854
## 5119                Riverside County      6065     21-Suburb: Large 33.88508
## 5120                Calaveras County      6009     32-Town: Distant 38.07996
## 5121                 Imperial County      6025       13-City: Small 32.78057
## 5122                   Chelan County     53007       13-City: Small 47.45244
## 5123              Los Angeles County      6037     21-Suburb: Large 34.01081
## 5124                   Merced County      6047  22-Suburb: Mid-size 37.34000
## 5125                San Diego County      6073     41-Rural: Fringe 33.23539
## 5126               Stanislaus County      6099     21-Suburb: Large 37.59519
## 5127              Los Angeles County      6037     21-Suburb: Large 34.01081
## 5128                  Daviess County     21059     41-Rural: Fringe 37.78376
## 5129                     Kern County      6029     23-Suburb: Small 35.78244
## 5130                  Trinity County      6105     43-Rural: Remote 40.55334
## 5131                San Diego County      6073     21-Suburb: Large 33.15061
## 5132                  Alameda County      6001     21-Suburb: Large 37.70974
## 5133                  Daviess County     21059     41-Rural: Fringe 37.78375
## 5134                Salt Lake County     49035     21-Suburb: Large 40.55115
## 5135                   Merced County      6047     32-Town: Distant 37.06789
## 5136                   Merced County      6047       13-City: Small 37.29439
## 5137                 McLennan County     48309    42-Rural: Distant 31.64566
## 5138                   Sutter County      6101      31-Town: Fringe 39.27688
## 5139                     Napa County      6055       13-City: Small 38.31437
## 5140               Stanislaus County      6099     21-Suburb: Large 37.76089
## 5141                   Sonoma County      6097     23-Suburb: Small 38.23815
## 5142                   Sonoma County      6097     23-Suburb: Small 38.23815
## 5143       Matanuska-Susitna Borough      2170     41-Rural: Fringe 61.59168
## 5144                   Madera County      6039     41-Rural: Fringe 36.90305
## 5145                  Madison County     16065     32-Town: Distant 43.87316
## 5146                  Olmsted County     27109    42-Rural: Distant 43.97480
## 5147                   Hardin County     21093       13-City: Small 37.68546
## 5148                  Jackson County     29095     21-Suburb: Large 39.03127
## 5149           San Bernardino County      6071    12-City: Mid-size 34.08541
## 5150                  Hidalgo County     48215     21-Suburb: Large 26.10982
## 5151                   Orange County      6059       13-City: Small 33.70818
## 5152                   Canyon County     16027  22-Suburb: Mid-size 43.62711
## 5153                Van Zandt County     48467     32-Town: Distant 32.68477
## 5154                Van Zandt County     48467     32-Town: Distant 32.67471
## 5155                    Clark County     53011    12-City: Mid-size 45.61950
## 5156                    Clark County     53011    12-City: Mid-size 45.61950
## 5157                Marquette County     26103      33-Town: Remote 46.55756
## 5158                  Jackson County     26075     23-Suburb: Small 42.20031
## 5159                    Adams County      8001     21-Suburb: Large 39.89403
## 5160                Milwaukee County     55079     21-Suburb: Large 43.04431
## 5161             Contra Costa County      6013       13-City: Small 37.76741
## 5162              San Joaquin County      6077       11-City: Large 37.90815
## 5163                  Tarrant County     48439       11-City: Large 32.65546
## 5164                 Kootenai County     16055       13-City: Small 47.69018
## 5165                   Lapeer County     26087     32-Town: Distant 43.00500
## 5166              Los Angeles County      6037    12-City: Mid-size 34.23747
## 5167                Tom Green County     48451     41-Rural: Fringe 31.39103
## 5168                   Concho County     48095     43-Rural: Remote 31.50361
## 5169                Tom Green County     48451    42-Rural: Distant 31.47704
## 5170                   Concho County     48095     43-Rural: Remote 31.50366
## 5171                Tom Green County     48451    42-Rural: Distant 31.47704
## 5172                    Wayne County     26163     21-Suburb: Large 42.42020
## 5173                  St. Louis city     29510       11-City: Large 38.63346
## 5174             Contra Costa County      6013     21-Suburb: Large 38.01533
## 5175                 Berkeley County     54003       13-City: Small 39.44599
## 5176                Kalamazoo County     26077  22-Suburb: Mid-size 42.11706
## 5177                 Victoria County     48469     23-Suburb: Small 28.83866
## 5178             Pittsylvania County     51143    42-Rural: Distant 36.82012
## 5179                   Placer County      6061     21-Suburb: Large 38.81584
## 5180                   Dallas County     48113     21-Suburb: Large 32.98257
## 5181              Los Angeles County      6037       11-City: Large 34.02180
## 5182                  Oakland County     26125     21-Suburb: Large 42.45131
## 5183                   Orange County     12095     21-Suburb: Large 28.51285
## 5184              Los Angeles County      6037     21-Suburb: Large 34.06192
## 5185                  Alameda County      6001       13-City: Small 37.65584
## 5186              San Joaquin County      6077     21-Suburb: Large 38.00038
## 5187                   Wright County     27171    42-Rural: Distant 45.05898
## 5188                   Nassau County     36059     21-Suburb: Large 40.80306
## 5189                Milwaukee County     55079       11-City: Large 43.15494
## 5190                   Tulare County      6107       13-City: Small 36.06278
## 5191               Cumberland County     34011       13-City: Small 39.49357
## 5192                  Alameda County      6001     23-Suburb: Small 37.67660
## 5193              Los Angeles County      6037       11-City: Large 34.25208
## 5194                  Midland County     48329    12-City: Mid-size 32.01903
## 5195                   Fresno County      6019       11-City: Large 36.77052
## 5196             Virginia Beach city     51810       11-City: Large 36.75193
## 5197                St. Clair County     26147     23-Suburb: Small 42.95215
## 5198                  Hidalgo County     48215       13-City: Small 26.30348
## 5199                    Delta County      8029     32-Town: Distant 38.73308
## 5200               Bernalillo County     35001       11-City: Large 35.08933
## 5201                  Whatcom County     53073       13-City: Small 48.76848
## 5202              Los Angeles County      6037     21-Suburb: Large 34.11778
## 5203                   Denver County      8031       11-City: Large 39.78570
## 5204                  Alameda County      6001     21-Suburb: Large 37.51999
## 5205                     Yuma County      4027       13-City: Small 32.68505
## 5206                     Kern County      6029       11-City: Large 35.35771
## 5207              Los Angeles County      6037     21-Suburb: Large 33.92146
## 5208             Contra Costa County      6013     21-Suburb: Large 37.96859
## 5209              San Joaquin County      6077      31-Town: Fringe 37.79987
## 5210                    Wayne County     26163     21-Suburb: Large 42.34046
## 5211               Sacramento County      6067       11-City: Large 38.64049
## 5212                 San Juan County     35045      31-Town: Fringe 36.82015
## 5213                San Diego County      6073     21-Suburb: Large 33.22019
## 5214                     Kern County      6029     21-Suburb: Large 35.38289
## 5215                   Harris County     48201     21-Suburb: Large 29.96119
## 5216                Minnehaha County     46099    12-City: Mid-size 43.50813
## 5217                 Hennepin County     27053       11-City: Large 44.96318
## 5218                     Cass County     26027    42-Rural: Distant 42.01210
## 5219                 Hennepin County     27053       11-City: Large 44.96311
## 5220                  Volusia County     12127     41-Rural: Fringe 29.13674
## 5221                Hunterdon County     34019     41-Rural: Fringe 40.68164
## 5222                 Beltrami County     27007      33-Town: Remote 47.50461
## 5223                 Beltrami County     27007      33-Town: Remote 47.50461
## 5224                   Grimes County     48185     32-Town: Distant 30.40080
## 5225                   Dakota County     27037     21-Suburb: Large 44.88720
## 5226                 Hennepin County     27053     21-Suburb: Large 44.90124
## 5227                     Cass County     27021     43-Rural: Remote 47.09757
## 5228                 Davidson County     47037       11-City: Large 36.15020
## 5229                Jefferson County     21111     21-Suburb: Large 38.19979
## 5230                   Danville city     51590     32-Town: Distant 36.58269
## 5231                 McLennan County     48309    12-City: Mid-size 31.54512
## 5232                 McLennan County     48309    12-City: Mid-size 31.57931
## 5233                   Carver County     27019      31-Town: Fringe 44.83817
## 5234                   Carver County     27019     41-Rural: Fringe 44.83605
## 5235                    Wasco County     41065      33-Town: Remote 45.62547
## 5236               Twin Falls County     16083     41-Rural: Fringe 42.60745
## 5237                  Wakulla County     12129     32-Town: Distant 30.17628
## 5238                   Racine County     55101       13-City: Small 42.72073
## 5239                   Walker County      1127     32-Town: Distant 33.83456
## 5240                   Pierce County     53053     21-Suburb: Large 47.20510
## 5241                     Cass County     27021     43-Rural: Remote 47.09809
## 5242                Tom Green County     48451     41-Rural: Fringe 31.37327
## 5243                Tom Green County     48451     41-Rural: Fringe 31.37171
## 5244                Tom Green County     48451     41-Rural: Fringe 31.37369
## 5245                Tom Green County     48451     41-Rural: Fringe 31.37327
## 5246                Tom Green County     48451    42-Rural: Distant 31.66732
## 5247                  Runnels County     48399    42-Rural: Distant 31.60996
## 5248                   Concho County     48095     43-Rural: Remote 31.50362
## 5249                Tom Green County     48451     41-Rural: Fringe 31.37369
## 5250                 Mitchell County     48335      33-Town: Remote 32.39974
## 5251                 Mitchell County     48335     41-Rural: Fringe 32.38365
## 5252                 Mitchell County     48335     41-Rural: Fringe 32.38369
## 5253                 Mitchell County     48335     41-Rural: Fringe 32.38369
## 5254                   Waller County     48473    42-Rural: Distant 30.06315
## 5255                     Polk County     19153       13-City: Small 41.58675
## 5256                   Bosque County     48035     43-Rural: Remote 32.05229
## 5257               Sacramento County      6067       13-City: Small 38.60696
## 5258              San Joaquin County      6077     41-Rural: Fringe 38.10032
## 5259                   Walton County     12131     41-Rural: Fringe 30.72120
## 5260                   Walton County     12131     41-Rural: Fringe 30.78355
## 5261                   Walton County     12131     32-Town: Distant 30.74151
## 5262                   Walton County     12131     41-Rural: Fringe 30.73418
## 5263                  Passaic County     34031     21-Suburb: Large 41.01455
##       Longitude
## 1     -93.57477
## 2     -93.59692
## 3     -93.59659
## 4    -116.96927
## 5     -93.41184
## 6     -93.41183
## 7     -93.41242
## 8     -93.41379
## 9     -93.44948
## 10    -93.47677
## 11    -93.51107
## 12    -93.51115
## 13    -93.51147
## 14    -93.67219
## 15    -93.66838
## 16    -93.36092
## 17    -93.36141
## 18    -93.36095
## 19   -112.01470
## 20    -98.03972
## 21    -93.25129
## 22    -93.41835
## 23    -93.37460
## 24    -85.66869
## 25    -92.99506
## 26   -104.54371
## 27    -93.29000
## 28    -93.29000
## 29    -92.98547
## 30    -93.18026
## 31    -82.33605
## 32    -84.85224
## 33   -118.04546
## 34    -93.16045
## 35    -98.49352
## 36   -101.71285
## 37   -106.43813
## 38   -106.48226
## 39   -118.17895
## 40   -117.36645
## 41   -117.06094
## 42    -84.33517
## 43    -95.28448
## 44    -95.50303
## 45    -91.39305
## 46    -92.02660
## 47    -80.17002
## 48    -80.26868
## 49   -122.44939
## 50    -83.02136
## 51    -77.66266
## 52   -106.01995
## 53    -77.48163
## 54   -105.95238
## 55   -121.85842
## 56    -97.34432
## 57    -95.31104
## 58    -95.51211
## 59    -98.41992
## 60    -96.83901
## 61    -77.55705
## 62   -124.19407
## 63    -80.16430
## 64    -78.86385
## 65    -83.75175
## 66   -122.07546
## 67    -83.59031
## 68    -83.71939
## 69    -97.43294
## 70    -80.17987
## 71   -122.43540
## 72    -80.34086
## 73    -81.31154
## 74    -81.84589
## 75    -81.49495
## 76    -95.95071
## 77    -92.93588
## 78   -117.88155
## 79   -117.84435
## 80    -83.10541
## 81   -104.99846
## 82   -122.24429
## 83    -96.53667
## 84    -82.50231
## 85    -76.56993
## 86    -82.93720
## 87    -77.07945
## 88    -85.75115
## 89    -84.34361
## 90    -82.32621
## 91   -116.25984
## 92    -96.53118
## 93    -85.30529
## 94    -91.39305
## 95   -104.79703
## 96   -121.81271
## 97   -121.83974
## 98   -119.96168
## 99   -120.92103
## 100  -121.27997
## 101   -86.52225
## 102   -95.59669
## 103  -112.11828
## 104   -84.02550
## 105   -79.40735
## 106   -93.36894
## 107   -85.53033
## 108   -96.69717
## 109   -74.27403
## 110   -97.49424
## 111   -97.33717
## 112  -115.76506
## 113   -77.32673
## 114   -99.74619
## 115   -76.11893
## 116   -97.80192
## 117  -106.33658
## 118   -78.39939
## 119   -83.08745
## 120   -96.61302
## 121  -117.74321
## 122   -76.60613
## 123   -95.84688
## 124  -118.59288
## 125   -85.75302
## 126  -119.63066
## 127   -84.47594
## 128   -94.00406
## 129   -94.82370
## 130  -122.09948
## 131   -83.37665
## 132   -93.71661
## 133  -123.03442
## 134   -82.27195
## 135   -82.28144
## 136   -82.28155
## 137  -122.09794
## 138  -122.11822
## 139  -122.28050
## 140  -105.89229
## 141  -117.13461
## 142  -123.09429
## 143   -74.66962
## 144  -118.47993
## 145   -93.35338
## 146  -121.62619
## 147   -93.49274
## 148   -93.39487
## 149   -93.38660
## 150   -93.31084
## 151   -93.42134
## 152   -77.08016
## 153   -77.27891
## 154   -77.16300
## 155   -77.42504
## 156   -93.34182
## 157   -93.14730
## 158   -93.39071
## 159   -93.49304
## 160   -93.37665
## 161   -93.15119
## 162   -93.25087
## 163   -93.11292
## 164   -93.39071
## 165   -93.42884
## 166   -93.21938
## 167   -93.35386
## 168   -93.41147
## 169   -93.11133
## 170   -93.15119
## 171   -93.28547
## 172   -93.28532
## 173   -93.14733
## 174   -93.14729
## 175   -93.39071
## 176   -92.46112
## 177   -93.67220
## 178   -93.59548
## 179   -88.55770
## 180   -95.36211
## 181   -95.35921
## 182   -81.66814
## 183   -96.02053
## 184  -116.95779
## 185   -93.39129
## 186   -84.39024
## 187   -78.95192
## 188   -86.63865
## 189   -92.22379
## 190   -82.58569
## 191   -97.36450
## 192  -119.72660
## 193  -106.34869
## 194   -95.41728
## 195   -95.58229
## 196   -95.58252
## 197   -96.69698
## 198   -85.84259
## 199   -78.03321
## 200   -85.16844
## 201   -83.20282
## 202   -86.51249
## 203  -122.62210
## 204  -104.71237
## 205   -93.45455
## 206   -98.27633
## 207  -121.23205
## 208   -81.30557
## 209   -87.78885
## 210   -94.07128
## 211   -95.75664
## 212  -119.80913
## 213  -119.78078
## 214  -122.94779
## 215  -117.02540
## 216  -119.69565
## 217  -119.69558
## 218  -122.06370
## 219  -117.21908
## 220   -97.40744
## 221  -102.38042
## 222   -99.34218
## 223   -97.13619
## 224   -98.49491
## 225   -97.89665
## 226   -97.31043
## 227   -98.49508
## 228   -94.72510
## 229   -98.88545
## 230   -93.96611
## 231   -95.58625
## 232   -80.40409
## 233   -92.24283
## 234   -98.55961
## 235   -80.41429
## 236   -83.11362
## 237   -73.44138
## 238  -110.97228
## 239   -78.44353
## 240   -78.41213
## 241   -77.69162
## 242  -118.27740
## 243   -95.75662
## 244   -93.98751
## 245  -117.81924
## 246   -83.58452
## 247   -84.21607
## 248   -81.71404
## 249   -98.42428
## 250  -122.01381
## 251   -98.66800
## 252   -74.17140
## 253   -84.37921
## 254  -122.02803
## 255   -85.96236
## 256   -97.70919
## 257   -85.16967
## 258   -95.80947
## 259  -117.21638
## 260   -90.40753
## 261   -95.70750
## 262   -95.56506
## 263   -85.61769
## 264   -89.44635
## 265  -147.71805
## 266   -98.58619
## 267   -75.47012
## 268   -98.58909
## 269   -80.24192
## 270   -80.06747
## 271   -77.12243
## 272   -94.58569
## 273   -98.54666
## 274   -98.15678
## 275   -93.16731
## 276   -94.85203
## 277   -83.71790
## 278   -85.70326
## 279  -120.12287
## 280   -74.89538
## 281   -97.41586
## 282   -91.82371
## 283   -95.33270
## 284  -117.48133
## 285  -117.48905
## 286   -97.65731
## 287  -101.86704
## 288  -118.38803
## 289  -112.85944
## 290   -93.24605
## 291   -93.24591
## 292  -121.46452
## 293   -82.73616
## 294   -86.60043
## 295   -97.35397
## 296   -82.32131
## 297   -84.33244
## 298   -82.41370
## 299   -81.71353
## 300   -81.46366
## 301   -82.55051
## 302   -80.13970
## 303   -80.15800
## 304   -80.14533
## 305   -81.47573
## 306   -81.94897
## 307   -81.06361
## 308  -116.20860
## 309   -93.23979
## 310   -74.86067
## 311  -101.50585
## 312  -122.30705
## 313  -102.55159
## 314   -80.13512
## 315  -118.29678
## 316   -74.80116
## 317   -93.19421
## 318   -76.88599
## 319   -76.55828
## 320   -85.82284
## 321   -97.67605
## 322   -93.29948
## 323   -93.29938
## 324   -93.29936
## 325   -93.39160
## 326   -93.41731
## 327   -71.11774
## 328   -80.07963
## 329  -122.19390
## 330   -80.12720
## 331   -93.25230
## 332   -92.95048
## 333   -93.23789
## 334  -102.76428
## 335  -110.23325
## 336  -109.71812
## 337  -111.39361
## 338  -110.92773
## 339  -112.47990
## 340  -114.64967
## 341  -110.77094
## 342   -84.93938
## 343   -84.90792
## 344  -121.83022
## 345  -118.73581
## 346   -88.41128
## 347   -76.89247
## 348   -84.39849
## 349   -97.14821
## 350  -105.19816
## 351  -122.05550
## 352   -90.24033
## 353   -88.28442
## 354   -93.91072
## 355   -92.99923
## 356  -118.41176
## 357  -120.94820
## 358   -92.94985
## 359   -96.71951
## 360  -122.01369
## 361   -97.06780
## 362  -122.16688
## 363   -82.88266
## 364   -93.41711
## 365  -117.84701
## 366   -92.12860
## 367  -118.20425
## 368   -95.80942
## 369   -96.68623
## 370  -122.75851
## 371  -122.44949
## 372   -81.20786
## 373   -80.19743
## 374   -83.01219
## 375  -101.70066
## 376   -83.19499
## 377   -84.53272
## 378   -79.78423
## 379  -109.56143
## 380  -111.37147
## 381  -111.24119
## 382  -112.13293
## 383  -109.59163
## 384  -109.56273
## 385  -111.33560
## 386  -111.37131
## 387  -110.71187
## 388  -110.71843
## 389  -104.79094
## 390   -77.46991
## 391   -81.39478
## 392  -119.73008
## 393   -88.55341
## 394  -116.95759
## 395   -87.95738
## 396   -97.36046
## 397   -88.02157
## 398   -88.02157
## 399  -120.68657
## 400   -98.54752
## 401   -98.54691
## 402   -98.54783
## 403   -98.54751
## 404   -98.54694
## 405   -98.54751
## 406   -98.54754
## 407   -83.63624
## 408   -74.63376
## 409   -74.69380
## 410   -74.57093
## 411   -74.57063
## 412   -71.30305
## 413  -120.61084
## 414   -84.52769
## 415   -82.00616
## 416   -82.00616
## 417  -115.51707
## 418   -98.46666
## 419   -98.46666
## 420   -92.97917
## 421   -92.97910
## 422   -97.70895
## 423   -97.79175
## 424   -97.75605
## 425   -86.45428
## 426  -149.88710
## 427  -118.26397
## 428  -122.88748
## 429   -83.15816
## 430   -96.97335
## 431   -97.24869
## 432   -97.24869
## 433   -97.54119
## 434   -95.07619
## 435   -95.14552
## 436   -95.26392
## 437  -106.94064
## 438   -77.04872
## 439   -87.61735
## 440  -117.88984
## 441  -122.43593
## 442   -91.89232
## 443   -95.42090
## 444  -118.50295
## 445   -76.60613
## 446   -86.12069
## 447   -83.91956
## 448   -87.97152
## 449  -116.87520
## 450   -97.39890
## 451   -88.51060
## 452   -96.94539
## 453  -102.07657
## 454   -96.82403
## 455   -96.82448
## 456   -82.30265
## 457   -85.56627
## 458   -85.48174
## 459  -111.52363
## 460  -122.63144
## 461   -83.97481
## 462   -83.97481
## 463   -80.13704
## 464   -85.62309
## 465   -84.60678
## 466   -81.81867
## 467   -93.29681
## 468  -111.10993
## 469   -97.37852
## 470   -97.31605
## 471  -122.44649
## 472   -85.21330
## 473   -85.91336
## 474   -83.94157
## 475   -83.86545
## 476   -84.07758
## 477   -85.65462
## 478   -87.99950
## 479   -83.83906
## 480   -82.67746
## 481  -117.23371
## 482   -82.69963
## 483   -95.12993
## 484   -76.60607
## 485  -118.14943
## 486   -86.45493
## 487   -93.27679
## 488   -93.27694
## 489   -81.76381
## 490   -93.87279
## 491   -81.19339
## 492  -120.46634
## 493   -85.23190
## 494   -79.52510
## 495   -73.94677
## 496  -106.77249
## 497   -97.35223
## 498   -97.67527
## 499   -97.42184
## 500   -97.67527
## 501   -83.66007
## 502   -97.34632
## 503   -97.34632
## 504   -97.23000
## 505   -97.34632
## 506   -97.79370
## 507   -97.23000
## 508   -97.41049
## 509   -85.10616
## 510  -103.84222
## 511   -94.41720
## 512  -122.14182
## 513   -85.54405
## 514  -118.13434
## 515  -122.49411
## 516  -122.48703
## 517   -93.60423
## 518   -89.02503
## 519   -94.87058
## 520   -94.90942
## 521   -94.92275
## 522   -83.75155
## 523  -115.68858
## 524   -95.59837
## 525   -95.59835
## 526  -149.75956
## 527   -83.59187
## 528   -86.09324
## 529   -74.05693
## 530   -74.05402
## 531  -122.27117
## 532   -86.34470
## 533   -86.34469
## 534   -86.34480
## 535   -86.34480
## 536  -121.84988
## 537   -81.32676
## 538   -85.65055
## 539   -92.08427
## 540  -161.78698
## 541   -98.47277
## 542   -98.47277
## 543   -98.47277
## 544   -98.47277
## 545   -98.46685
## 546   -98.47277
## 547   -98.66976
## 548   -98.47277
## 549   -98.47277
## 550   -98.42651
## 551  -121.79214
## 552  -122.53835
## 553  -122.32810
## 554   -85.51370
## 555  -101.46487
## 556   -99.67205
## 557  -121.70248
## 558   -81.89580
## 559   -97.11925
## 560   -97.11921
## 561  -114.59846
## 562  -115.13706
## 563   -81.11884
## 564   -81.67613
## 565   -83.95192
## 566  -118.32809
## 567  -118.43428
## 568  -118.40601
## 569  -116.48413
## 570  -121.87433
## 571  -103.81780
## 572  -103.81780
## 573  -103.81116
## 574   -90.65222
## 575  -116.37130
## 576   -95.95071
## 577  -122.74458
## 578  -122.51053
## 579  -102.25120
## 580  -100.90365
## 581   -84.52793
## 582  -122.60548
## 583  -112.32427
## 584  -119.97300
## 585   -81.91611
## 586   -78.49660
## 587   -81.24578
## 588   -85.98204
## 589   -83.44176
## 590   -83.44143
## 591   -77.90207
## 592   -85.20697
## 593   -98.73646
## 594   -97.34951
## 595   -94.98872
## 596   -87.40867
## 597   -84.62986
## 598   -92.73142
## 599   -92.73146
## 600   -71.06816
## 601   -71.09507
## 602   -71.12553
## 603  -112.11636
## 604  -105.20310
## 605   -97.39696
## 606   -82.43157
## 607   -86.43870
## 608  -118.51436
## 609   -84.79830
## 610  -118.21147
## 611  -121.96690
## 612   -85.66854
## 613  -102.25361
## 614  -117.72243
## 615   -93.01398
## 616   -81.17932
## 617   -96.12788
## 618   -80.34726
## 619   -82.11266
## 620  -105.05433
## 621   -79.16021
## 622   -94.74080
## 623   -86.17368
## 624   -82.28508
## 625   -86.25613
## 626  -119.10374
## 627   -95.40333
## 628   -95.34166
## 629   -95.40297
## 630   -95.65114
## 631   -95.70911
## 632   -95.24119
## 633   -95.74055
## 634   -95.40343
## 635   -96.39617
## 636   -96.39617
## 637   -97.18223
## 638   -97.64783
## 639   -96.36759
## 640   -95.42233
## 641   -95.44277
## 642  -117.87553
## 643   -79.89285
## 644   -83.41594
## 645   -83.41604
## 646   -83.34561
## 647   -96.57576
## 648   -85.73323
## 649  -122.66604
## 650  -122.09834
## 651   -73.30524
## 652  -118.47463
## 653   -80.78434
## 654   -80.78431
## 655   -80.78464
## 656   -98.53457
## 657  -119.78333
## 658  -114.44010
## 659   -83.77438
## 660   -97.36039
## 661  -122.04300
## 662  -119.67522
## 663  -107.21143
## 664  -121.81276
## 665  -119.79999
## 666  -117.84701
## 667  -117.66244
## 668  -121.13192
## 669   -76.78949
## 670  -104.81192
## 671  -122.13090
## 672   -93.04591
## 673  -121.87992
## 674   -73.89848
## 675   -85.67443
## 676   -73.94677
## 677   -93.31123
## 678   -93.29770
## 679   -93.29708
## 680   -93.29708
## 681   -86.17994
## 682   -73.75576
## 683   -80.17082
## 684   -80.25223
## 685   -82.99313
## 686  -102.26914
## 687   -97.45360
## 688   -73.92392
## 689   -97.49294
## 690   -97.44986
## 691   -98.97292
## 692   -96.65309
## 693  -117.43639
## 694   -77.07943
## 695   -86.36747
## 696   -83.47404
## 697   -85.43732
## 698   -98.18157
## 699  -119.16065
## 700  -117.70614
## 701  -118.14779
## 702  -122.89058
## 703  -119.46478
## 704   -97.13392
## 705   -85.69940
## 706   -84.33509
## 707  -118.35120
## 708  -118.30468
## 709  -149.49493
## 710  -115.20304
## 711   -78.92089
## 712   -74.64023
## 713   -74.89927
## 714   -74.82193
## 715   -74.82237
## 716  -122.33697
## 717   -95.47725
## 718  -121.67173
## 719  -121.67173
## 720  -119.05793
## 721   -93.21662
## 722   -93.28155
## 723   -93.21675
## 724   -85.31498
## 725  -119.07017
## 726  -117.02562
## 727   -86.70851
## 728  -121.81529
## 729  -121.75588
## 730  -106.16270
## 731   -85.64088
## 732   -85.98902
## 733  -114.50323
## 734   -87.33510
## 735   -80.16620
## 736   -92.44845
## 737   -80.58933
## 738   -82.40032
## 739  -121.80830
## 740  -111.84537
## 741   -96.22875
## 742   -85.39903
## 743  -116.93196
## 744  -118.45254
## 745  -121.88308
## 746  -120.69182
## 747  -120.68042
## 748   -96.70930
## 749  -121.82698
## 750   -85.75824
## 751  -116.89029
## 752  -117.67164
## 753  -121.17943
## 754   -75.58746
## 755   -88.33443
## 756   -88.33442
## 757   -76.58289
## 758   -95.73428
## 759   -95.73432
## 760  -121.37877
## 761  -122.54582
## 762  -119.73560
## 763  -120.36042
## 764   -75.06721
## 765  -121.93744
## 766   -75.10847
## 767   -75.10847
## 768   -75.10847
## 769   -87.28506
## 770   -91.74241
## 771   -97.65771
## 772   -97.58125
## 773   -97.68157
## 774   -97.65917
## 775   -97.65731
## 776   -97.65926
## 777   -97.21913
## 778   -97.49545
## 779   -97.82180
## 780  -106.63206
## 781  -122.27104
## 782  -111.85423
## 783  -119.62706
## 784   -85.34824
## 785  -116.49270
## 786   -76.39451
## 787   -92.90240
## 788   -92.88654
## 789   -90.04928
## 790  -106.58626
## 791  -117.98608
## 792  -122.28639
## 793  -117.38270
## 794  -110.85743
## 795  -116.67928
## 796   -73.81870
## 797  -122.62258
## 798   -82.93244
## 799   -74.79920
## 800   -74.79938
## 801  -117.67000
## 802   -90.24139
## 803  -121.48167
## 804   -89.37174
## 805  -110.59701
## 806  -123.67557
## 807   -84.57272
## 808   -92.45698
## 809   -92.45698
## 810   -89.56466
## 811   -90.17480
## 812  -122.29874
## 813   -83.09690
## 814   -74.22971
## 815   -88.57767
## 816   -95.96124
## 817   -85.63155
## 818   -86.22489
## 819  -106.63565
## 820  -122.35192
## 821   -98.34620
## 822  -108.71405
## 823   -83.49679
## 824   -77.90063
## 825   -79.13442
## 826  -122.60792
## 827  -117.32980
## 828  -117.34070
## 829  -121.82755
## 830   -83.38018
## 831   -86.45434
## 832  -122.64572
## 833  -119.51550
## 834  -121.64511
## 835   -85.15429
## 836   -80.73661
## 837   -80.73500
## 838  -119.76389
## 839  -119.76389
## 840   -84.87265
## 841   -84.84702
## 842   -82.63033
## 843   -84.43149
## 844   -84.58046
## 845   -83.15036
## 846   -75.22334
## 847  -100.44668
## 848   -77.47247
## 849   -90.06802
## 850   -99.47491
## 851  -121.92413
## 852  -122.29975
## 853  -122.87529
## 854  -122.35886
## 855   -73.99061
## 856   -86.31216
## 857   -94.60390
## 858  -113.80369
## 859   -86.00141
## 860   -88.74576
## 861   -81.74604
## 862   -81.61581
## 863   -80.40965
## 864  -105.58751
## 865   -76.72543
## 866   -97.79687
## 867   -97.77619
## 868   -89.94887
## 869  -116.78372
## 870  -118.56368
## 871  -118.23425
## 872   -97.47700
## 873   -97.70414
## 874  -112.09829
## 875   -85.88436
## 876   -93.16180
## 877  -104.76789
## 878  -122.16568
## 879  -105.07352
## 880  -119.89650
## 881  -122.48013
## 882   -94.56804
## 883   -89.68627
## 884   -89.67046
## 885  -121.85842
## 886   -96.33035
## 887   -90.85594
## 888   -90.59408
## 889   -77.48173
## 890   -89.88071
## 891   -76.16980
## 892   -83.33965
## 893   -93.25207
## 894   -93.25197
## 895  -123.10501
## 896  -118.36537
## 897  -116.37552
## 898   -93.01293
## 899  -121.66867
## 900  -121.80162
## 901   -80.55187
## 902   -94.00946
## 903   -82.91277
## 904  -118.25388
## 905   -94.00947
## 906  -121.67925
## 907  -117.02570
## 908   -86.22510
## 909  -111.77756
## 910   -85.68076
## 911  -118.20715
## 912  -122.87329
## 913   -84.59241
## 914   -93.48270
## 915   -88.07036
## 916   -94.17216
## 917   -94.46511
## 918   -94.30370
## 919   -94.20777
## 920   -93.90897
## 921   -94.12629
## 922  -106.76496
## 923   -82.47749
## 924   -85.62170
## 925   -91.36957
## 926   -75.65220
## 927  -119.86175
## 928  -119.26786
## 929   -89.39431
## 930   -89.12895
## 931  -118.86016
## 932  -106.70997
## 933  -118.14181
## 934   -95.07305
## 935  -106.36454
## 936  -106.36454
## 937  -121.79563
## 938  -118.23969
## 939   -97.38836
## 940  -117.86728
## 941   -87.69873
## 942  -106.12528
## 943  -117.61316
## 944  -117.61384
## 945   -97.12092
## 946   -97.24869
## 947   -97.12092
## 948   -97.12092
## 949   -97.12092
## 950   -97.09406
## 951   -97.09406
## 952   -97.16701
## 953   -97.09406
## 954   -97.12092
## 955   -97.09406
## 956   -97.16700
## 957   -97.09406
## 958   -97.12092
## 959   -97.12092
## 960  -122.30703
## 961  -101.90108
## 962  -122.42969
## 963  -112.20981
## 964  -117.02568
## 965   -80.46735
## 966   -81.39540
## 967   -81.66221
## 968  -111.88687
## 969  -119.24241
## 970  -117.57760
## 971  -116.98066
## 972  -117.80779
## 973   -85.01287
## 974   -82.67387
## 975   -89.58405
## 976  -107.98541
## 977   -78.49470
## 978  -120.83469
## 979  -120.86666
## 980   -85.35890
## 981   -79.50387
## 982  -116.82618
## 983   -98.58628
## 984   -84.52410
## 985  -120.01632
## 986  -117.57737
## 987   -75.01354
## 988   -75.01348
## 989   -75.01354
## 990   -84.12659
## 991   -76.23740
## 992  -120.09874
## 993   -92.09364
## 994   -77.50005
## 995  -118.39261
## 996  -117.71675
## 997  -117.71675
## 998   -82.71067
## 999   -72.56138
## 1000  -96.70818
## 1001 -115.09936
## 1002  -81.39164
## 1003  -97.36044
## 1004  -98.55183
## 1005  -86.43501
## 1006 -106.62156
## 1007  -86.62310
## 1008 -117.71556
## 1009  -97.66582
## 1010  -84.45470
## 1011  -82.92700
## 1012  -92.83658
## 1013  -92.84369
## 1014 -122.32812
## 1015  -93.31277
## 1016  -93.31283
## 1017 -123.10850
## 1018  -88.62349
## 1019  -89.27973
## 1020  -96.73520
## 1021  -87.50342
## 1022  -87.48018
## 1023  -98.49851
## 1024 -105.56260
## 1025 -122.54828
## 1026  -88.35990
## 1027  -83.13533
## 1028 -118.78337
## 1029 -118.09210
## 1030  -98.98319
## 1031  -82.49720
## 1032  -80.32172
## 1033 -119.01178
## 1034 -117.45658
## 1035  -82.49720
## 1036  -86.82578
## 1037 -118.18617
## 1038  -81.85378
## 1039  -83.24189
## 1040  -84.78716
## 1041 -115.11171
## 1042 -115.09936
## 1043  -85.71061
## 1044  -83.39328
## 1045  -83.41138
## 1046  -81.95306
## 1047  -96.72307
## 1048  -95.08642
## 1049  -82.78616
## 1050  -85.48218
## 1051  -80.92820
## 1052  -85.33957
## 1053 -106.36454
## 1054  -90.30073
## 1055  -73.46683
## 1056  -82.90985
## 1057  -83.73332
## 1058  -83.73335
## 1059 -121.90796
## 1060  -88.91125
## 1061  -92.44845
## 1062 -111.29649
## 1063 -122.90308
## 1064 -104.85576
## 1065 -119.68366
## 1066 -119.68367
## 1067  -99.47345
## 1068  -88.41077
## 1069 -117.56444
## 1070 -118.38804
## 1071 -118.00392
## 1072  -94.89991
## 1073  -95.10478
## 1074  -95.10478
## 1075  -95.10478
## 1076  -77.45502
## 1077 -120.21268
## 1078  -97.40055
## 1079 -106.62487
## 1080  -98.17548
## 1081 -106.46318
## 1082  -96.32189
## 1083  -85.91093
## 1084  -85.88628
## 1085  -97.39888
## 1086  -98.52423
## 1087  -81.76375
## 1088  -96.65824
## 1089  -96.61324
## 1090  -96.63464
## 1091  -96.49101
## 1092  -96.63307
## 1093  -96.63465
## 1094  -96.37068
## 1095  -96.53666
## 1096  -96.36579
## 1097 -120.85089
## 1098 -105.00574
## 1099 -101.01298
## 1100 -105.01460
## 1101 -122.17469
## 1102  -93.24956
## 1103  -84.33593
## 1104 -118.20303
## 1105  -89.49101
## 1106 -122.81580
## 1107  -73.75572
## 1108  -84.33630
## 1109 -117.72155
## 1110 -118.05579
## 1111 -121.81512
## 1112 -118.20482
## 1113 -122.32531
## 1114 -118.11597
## 1115  -96.54505
## 1116  -96.51025
## 1117  -82.34214
## 1118 -122.01854
## 1119 -122.01865
## 1120  -98.09449
## 1121  -98.09443
## 1122 -117.38047
## 1123  -85.21442
## 1124  -80.75858
## 1125  -76.93097
## 1126 -122.03580
## 1127 -122.14924
## 1128 -122.42776
## 1129 -119.55378
## 1130 -117.71583
## 1131 -122.17828
## 1132 -122.17770
## 1133 -118.40285
## 1134  -97.13266
## 1135 -118.89791
## 1136 -121.92987
## 1137  -82.40423
## 1138  -83.74431
## 1139  -89.51908
## 1140 -104.81820
## 1141 -122.84820
## 1142  -95.15719
## 1143 -122.19078
## 1144 -117.29377
## 1145  -95.32838
## 1146  -85.71568
## 1147  -95.26208
## 1148  -93.57507
## 1149  -81.84001
## 1150  -93.33970
## 1151 -118.24948
## 1152 -118.24943
## 1153 -120.33432
## 1154  -95.61264
## 1155  -85.54120
## 1156  -74.08690
## 1157 -119.16044
## 1158 -118.85317
## 1159 -121.06853
## 1160  -78.74195
## 1161 -122.20745
## 1162 -105.19949
## 1163  -73.12713
## 1164  -84.46587
## 1165  -85.66679
## 1166 -104.98449
## 1167 -106.53484
## 1168  -82.89116
## 1169  -88.08186
## 1170 -119.91504
## 1171 -122.12347
## 1172  -90.33428
## 1173  -96.66301
## 1174  -90.48815
## 1175  -98.50242
## 1176  -84.39713
## 1177  -93.38471
## 1178  -93.18310
## 1179  -89.34142
## 1180  -80.23044
## 1181  -96.98858
## 1182  -89.63981
## 1183  -84.09412
## 1184  -84.12209
## 1185 -119.57247
## 1186 -122.02805
## 1187  -97.04553
## 1188  -94.37173
## 1189  -79.08837
## 1190  -77.07344
## 1191 -117.58663
## 1192 -117.56847
## 1193 -117.91410
## 1194  -81.87109
## 1195  -97.40860
## 1196  -83.67885
## 1197  -94.16720
## 1198 -123.13659
## 1199 -116.90547
## 1200 -122.01368
## 1201  -74.66447
## 1202  -84.38954
## 1203 -116.49266
## 1204 -121.98343
## 1205 -119.35741
## 1206 -119.90324
## 1207 -120.80900
## 1208  -73.55365
## 1209  -96.63507
## 1210  -83.00966
## 1211  -83.08840
## 1212  -83.00773
## 1213  -83.08523
## 1214  -85.66951
## 1215  -85.52565
## 1216  -84.50013
## 1217  -89.55440
## 1218 -115.05593
## 1219 -115.05593
## 1220  -99.98460
## 1221 -122.51976
## 1222  -96.45800
## 1223  -71.43736
## 1224  -77.28874
## 1225 -118.85099
## 1226  -83.17410
## 1227  -83.09695
## 1228  -83.05803
## 1229  -92.46163
## 1230 -122.45850
## 1231 -117.82015
## 1232  -91.93828
## 1233 -118.37398
## 1234  -86.52225
## 1235  -84.33137
## 1236  -83.78106
## 1237  -99.76301
## 1238  -76.84314
## 1239  -95.06223
## 1240 -101.24788
## 1241  -76.93072
## 1242  -95.59986
## 1243 -122.65698
## 1244  -80.67899
## 1245 -120.83749
## 1246  -85.66295
## 1247  -82.18638
## 1248  -92.86387
## 1249  -76.40757
## 1250 -118.14403
## 1251 -122.87447
## 1252  -97.89983
## 1253  -97.32448
## 1254 -122.02699
## 1255 -122.03630
## 1256 -121.96341
## 1257  -81.69785
## 1258  -76.99083
## 1259 -116.37072
## 1260  -86.84093
## 1261 -149.81792
## 1262  -93.37104
## 1263  -93.38842
## 1264  -85.83316
## 1265  -97.79881
## 1266  -97.01835
## 1267  -73.89224
## 1268  -94.39292
## 1269  -97.36103
## 1270  -94.55680
## 1271  -87.05347
## 1272  -86.84046
## 1273 -118.40246
## 1274 -118.40239
## 1275  -95.28678
## 1276  -75.26091
## 1277  -87.46825
## 1278  -75.04624
## 1279  -75.04624
## 1280 -118.60446
## 1281 -119.28861
## 1282 -122.71707
## 1283 -122.89730
## 1284 -117.14418
## 1285  -82.48139
## 1286  -80.81920
## 1287  -80.15991
## 1288  -95.58369
## 1289  -95.45364
## 1290  -84.40382
## 1291  -80.48095
## 1292 -101.71285
## 1293  -97.95745
## 1294 -100.49693
## 1295  -97.30957
## 1296  -97.10523
## 1297 -101.71285
## 1298  -99.74402
## 1299  -98.57869
## 1300  -97.75969
## 1301 -118.25115
## 1302  -93.07818
## 1303  -93.20476
## 1304  -80.35468
## 1305  -97.00974
## 1306 -112.02017
## 1307  -96.77449
## 1308  -96.88927
## 1309  -96.64917
## 1310  -96.77849
## 1311  -96.82762
## 1312  -96.86899
## 1313  -96.86899
## 1314  -96.86899
## 1315  -96.86899
## 1316  -96.86899
## 1317  -96.86780
## 1318  -94.70669
## 1319 -121.73020
## 1320 -104.85380
## 1321  -86.33570
## 1322  -76.59836
## 1323  -75.66010
## 1324 -120.37961
## 1325  -94.18680
## 1326  -80.36544
## 1327  -80.18942
## 1328  -81.60014
## 1329  -80.18875
## 1330  -82.70418
## 1331 -110.97924
## 1332 -121.74533
## 1333  -80.50763
## 1334  -83.50187
## 1335  -96.46753
## 1336  -99.73035
## 1337 -122.51141
## 1338 -117.40854
## 1339 -121.43332
## 1340  -81.14682
## 1341  -71.45816
## 1342  -83.26001
## 1343  -83.26017
## 1344 -122.01939
## 1345 -119.20764
## 1346  -93.52398
## 1347 -117.47610
## 1348  -93.79172
## 1349  -84.19967
## 1350  -84.27584
## 1351 -122.01018
## 1352 -118.09920
## 1353 -124.20777
## 1354 -121.14034
## 1355 -121.76667
## 1356  -97.61224
## 1357  -97.70709
## 1358 -106.41044
## 1359 -108.06844
## 1360 -120.43374
## 1361  -95.32312
## 1362  -97.11279
## 1363  -96.94263
## 1364  -97.11279
## 1365  -97.11279
## 1366  -97.11256
## 1367  -96.98087
## 1368  -97.11256
## 1369  -97.11256
## 1370  -96.95437
## 1371  -97.11279
## 1372  -97.11279
## 1373  -97.11256
## 1374  -97.11256
## 1375  -97.19482
## 1376 -104.96528
## 1377  -98.50755
## 1378  -83.93191
## 1379  -84.39064
## 1380  -95.76266
## 1381  -81.14943
## 1382 -116.52083
## 1383 -115.55092
## 1384 -119.16297
## 1385 -110.97633
## 1386 -115.15002
## 1387 -115.54124
## 1388 -117.96345
## 1389 -118.12320
## 1390  -87.70087
## 1391 -119.78717
## 1392  -96.85530
## 1393  -81.84850
## 1394  -90.02636
## 1395  -83.60975
## 1396 -124.21950
## 1397 -102.26784
## 1398  -97.30623
## 1399  -82.51086
## 1400  -83.56891
## 1401  -83.90589
## 1402  -95.83265
## 1403  -95.83265
## 1404  -95.83468
## 1405  -82.99359
## 1406  -96.47488
## 1407  -81.46561
## 1408  -94.59111
## 1409  -98.90804
## 1410 -122.25839
## 1411 -119.83954
## 1412  -83.88248
## 1413 -122.04420
## 1414  -89.82464
## 1415 -111.86893
## 1416  -82.86416
## 1417 -120.86633
## 1418  -95.05268
## 1419 -123.42973
## 1420  -82.94641
## 1421  -95.08054
## 1422  -94.67606
## 1423  -96.34732
## 1424  -98.13185
## 1425  -95.51481
## 1426 -122.60035
## 1427 -122.63765
## 1428 -121.49452
## 1429 -104.73598
## 1430 -122.95712
## 1431 -122.95715
## 1432  -95.49943
## 1433 -122.23047
## 1434 -117.24730
## 1435  -82.70304
## 1436  -98.70756
## 1437 -124.38600
## 1438  -93.45035
## 1439  -97.36049
## 1440 -120.90056
## 1441 -122.05044
## 1442  -83.13263
## 1443 -121.82048
## 1444  -80.24900
## 1445  -81.61806
## 1446  -88.82129
## 1447  -81.83791
## 1448  -98.05222
## 1449  -81.61101
## 1450  -80.35859
## 1451 -118.24498
## 1452 -118.15383
## 1453 -119.73008
## 1454  -96.29041
## 1455 -119.73008
## 1456  -95.97375
## 1457  -85.04282
## 1458  -77.55511
## 1459  -74.75812
## 1460  -83.15080
## 1461 -110.96886
## 1462 -118.25048
## 1463 -122.40393
## 1464 -121.76842
## 1465 -120.47062
## 1466 -106.43813
## 1467 -106.41702
## 1468  -97.43294
## 1469  -87.99950
## 1470 -118.06706
## 1471  -80.20198
## 1472  -84.03281
## 1473  -95.50635
## 1474  -96.86899
## 1475  -88.27632
## 1476  -82.79155
## 1477 -108.57842
## 1478  -92.09999
## 1479 -121.42759
## 1480  -86.15279
## 1481 -122.27648
## 1482  -88.14269
## 1483  -86.76937
## 1484 -107.87764
## 1485 -112.12786
## 1486 -122.76018
## 1487  -78.87885
## 1488  -81.64108
## 1489  -81.77371
## 1490  -81.63841
## 1491  -96.66609
## 1492 -101.23673
## 1493 -101.23673
## 1494  -76.61050
## 1495 -104.93267
## 1496 -116.33687
## 1497 -120.71139
## 1498 -117.83819
## 1499 -123.02073
## 1500 -122.52192
## 1501 -117.31083
## 1502 -119.28086
## 1503 -117.57520
## 1504 -118.27538
## 1505 -119.64404
## 1506 -121.02936
## 1507 -119.27065
## 1508  -93.77191
## 1509 -106.63565
## 1510 -117.88988
## 1511 -122.98100
## 1512  -99.76007
## 1513  -95.19443
## 1514  -88.28147
## 1515 -122.11493
## 1516  -89.11972
## 1517  -98.17315
## 1518 -123.40963
## 1519 -123.40963
## 1520 -124.15039
## 1521  -85.11142
## 1522  -85.69995
## 1523 -118.16114
## 1524  -93.43327
## 1525  -90.51580
## 1526  -90.51580
## 1527 -120.85693
## 1528  -93.10405
## 1529 -117.15050
## 1530 -104.79359
## 1531  -98.82789
## 1532  -83.15189
## 1533  -83.15215
## 1534 -120.27392
## 1535 -119.79550
## 1536 -119.79552
## 1537 -118.07604
## 1538  -86.30532
## 1539  -88.91577
## 1540  -81.17491
## 1541 -102.37947
## 1542 -122.83897
## 1543  -97.97798
## 1544  -94.54471
## 1545 -110.93426
## 1546  -98.14755
## 1547  -93.25168
## 1548 -122.32769
## 1549 -122.33470
## 1550 -122.36866
## 1551  -96.65165
## 1552  -74.93378
## 1553  -97.68612
## 1554  -93.07735
## 1555  -90.19573
## 1556 -108.72677
## 1557 -117.05771
## 1558 -117.05785
## 1559 -118.19452
## 1560  -96.77611
## 1561  -80.09370
## 1562  -80.66437
## 1563 -114.61371
## 1564  -73.96676
## 1565 -121.26313
## 1566 -124.14097
## 1567  -84.39101
## 1568  -93.37679
## 1569  -97.59702
## 1570 -119.22792
## 1571 -122.68980
## 1572 -118.01992
## 1573 -117.83758
## 1574 -121.34021
## 1575  -95.51261
## 1576  -95.30639
## 1577  -97.75044
## 1578  -98.55961
## 1579 -118.03327
## 1580 -106.32913
## 1581 -106.59012
## 1582 -121.64515
## 1583 -120.44812
## 1584 -121.26323
## 1585  -83.64523
## 1586  -84.93001
## 1587  -94.87323
## 1588  -94.94109
## 1589  -83.80375
## 1590  -96.82403
## 1591 -121.41898
## 1592  -91.50408
## 1593 -124.19065
## 1594  -93.55949
## 1595  -93.57924
## 1596  -95.63820
## 1597  -79.83510
## 1598 -122.01672
## 1599 -118.30395
## 1600 -119.79559
## 1601  -97.40761
## 1602  -98.15878
## 1603 -121.43721
## 1604  -86.57143
## 1605 -112.02776
## 1606 -122.19557
## 1607 -122.19559
## 1608 -104.98575
## 1609  -93.34753
## 1610  -92.94455
## 1611  -77.34415
## 1612  -95.49943
## 1613 -112.09005
## 1614  -82.49510
## 1615 -120.94879
## 1616  -95.12321
## 1617  -89.59823
## 1618  -76.46466
## 1619 -119.68734
## 1620  -82.71118
## 1621 -120.06534
## 1622 -122.35152
## 1623 -120.03397
## 1624 -118.93219
## 1625 -122.23259
## 1626  -93.45762
## 1627 -117.41011
## 1628  -78.87930
## 1629  -87.29321
## 1630  -87.28736
## 1631  -87.26820
## 1632  -87.23241
## 1633  -87.23693
## 1634  -87.08406
## 1635 -122.60581
## 1636  -95.96019
## 1637 -119.28858
## 1638 -121.68396
## 1639  -74.27318
## 1640  -74.18531
## 1641  -74.11780
## 1642  -74.19204
## 1643  -74.18389
## 1644  -81.56321
## 1645 -105.49751
## 1646  -83.97640
## 1647  -98.52785
## 1648 -121.27529
## 1649 -117.51312
## 1650 -123.03104
## 1651 -124.15206
## 1652 -117.19551
## 1653 -117.23835
## 1654  -94.07859
## 1655  -81.10215
## 1656  -92.53209
## 1657  -88.07285
## 1658  -77.73420
## 1659  -77.48173
## 1660 -122.20184
## 1661  -94.34766
## 1662  -80.66586
## 1663  -88.53744
## 1664 -122.33111
## 1665 -122.32767
## 1666 -118.44068
## 1667 -121.53100
## 1668 -119.63640
## 1669 -121.53100
## 1670  -97.28111
## 1671  -94.12399
## 1672  -96.74201
## 1673  -95.45274
## 1674  -82.31722
## 1675  -82.37523
## 1676 -105.02595
## 1677  -95.41728
## 1678  -95.41728
## 1679  -95.41726
## 1680  -76.63436
## 1681  -95.47794
## 1682  -97.65300
## 1683  -94.78069
## 1684  -94.07106
## 1685 -119.13451
## 1686 -119.12886
## 1687 -122.62639
## 1688 -122.06000
## 1689  -92.30632
## 1690  -76.60613
## 1691  -99.46625
## 1692  -76.94710
## 1693 -106.35734
## 1694 -121.85842
## 1695  -77.27681
## 1696  -77.31381
## 1697  -86.91506
## 1698 -122.01355
## 1699 -117.90423
## 1700 -100.40296
## 1701 -100.40296
## 1702 -100.40296
## 1703 -100.40296
## 1704 -100.40296
## 1705 -100.40296
## 1706 -100.40296
## 1707 -100.18638
## 1708 -100.40296
## 1709 -100.40296
## 1710 -100.40296
## 1711 -100.40296
## 1712  -93.18102
## 1713 -100.40296
## 1714 -100.40296
## 1715 -100.40296
## 1716 -100.40296
## 1717 -100.40296
## 1718 -100.40296
## 1719 -100.40296
## 1720  -92.86828
## 1721  -93.01593
## 1722  -93.57564
## 1723 -100.40296
## 1724 -100.40296
## 1725 -100.71852
## 1726  -99.96126
## 1727 -100.40296
## 1728 -100.40296
## 1729 -100.40296
## 1730  -96.87522
## 1731  -82.33641
## 1732 -121.40195
## 1733 -121.44049
## 1734 -117.23510
## 1735  -96.89956
## 1736  -98.28625
## 1737  -84.52523
## 1738  -86.83383
## 1739  -86.83383
## 1740  -77.14178
## 1741 -122.45813
## 1742  -92.47467
## 1743 -123.11149
## 1744 -116.93554
## 1745  -83.73263
## 1746  -93.27003
## 1747  -93.26999
## 1748  -83.34829
## 1749  -90.43696
## 1750  -90.43703
## 1751 -122.26139
## 1752  -84.90172
## 1753 -111.85561
## 1754  -84.50657
## 1755  -84.54620
## 1756 -121.65302
## 1757  -87.95162
## 1758  -98.51867
## 1759  -98.51867
## 1760  -71.09916
## 1761  -96.07530
## 1762 -118.00223
## 1763 -122.60060
## 1764  -95.47165
## 1765  -92.01081
## 1766  -76.49578
## 1767 -120.44795
## 1768  -94.90422
## 1769  -75.54977
## 1770  -98.15678
## 1771  -98.15678
## 1772  -93.21189
## 1773  -83.06267
## 1774  -89.33496
## 1775 -111.69862
## 1776  -80.15036
## 1777  -90.74104
## 1778  -88.54680
## 1779  -76.99083
## 1780  -92.91572
## 1781 -105.01609
## 1782  -87.68373
## 1783 -115.07676
## 1784  -98.15678
## 1785  -98.15678
## 1786  -98.15743
## 1787  -98.15743
## 1788  -97.63663
## 1789  -80.08596
## 1790  -90.24488
## 1791  -83.01641
## 1792 -101.34657
## 1793  -92.19195
## 1794  -89.11121
## 1795 -121.17006
## 1796 -119.51881
## 1797 -121.02423
## 1798 -121.83824
## 1799 -106.63206
## 1800 -122.23681
## 1801  -85.20924
## 1802  -82.02808
## 1803 -117.15877
## 1804  -92.98954
## 1805  -79.97997
## 1806 -124.38297
## 1807  -96.47979
## 1808  -95.54335
## 1809  -95.80308
## 1810  -95.46268
## 1811  -95.80950
## 1812  -95.79202
## 1813  -84.66937
## 1814  -97.31560
## 1815  -97.36235
## 1816  -84.42251
## 1817 -119.67362
## 1818 -119.67540
## 1819 -119.67362
## 1820 -119.67363
## 1821  -84.07128
## 1822  -88.90070
## 1823  -90.71554
## 1824 -118.20289
## 1825 -116.28230
## 1826  -98.47777
## 1827  -98.49143
## 1828  -84.87617
## 1829 -111.87908
## 1830 -123.26870
## 1831  -86.58201
## 1832  -97.12670
## 1833  -97.35536
## 1834  -94.88905
## 1835  -95.08054
## 1836  -77.39809
## 1837  -92.33359
## 1838  -93.47200
## 1839 -115.38654
## 1840 -106.58598
## 1841 -122.41242
## 1842 -119.88024
## 1843  -89.62734
## 1844  -96.49709
## 1845 -122.44588
## 1846  -76.96361
## 1847  -94.79227
## 1848 -119.72732
## 1849 -118.26372
## 1850  -93.25188
## 1851  -93.23714
## 1852 -119.07673
## 1853 -118.04524
## 1854 -104.59648
## 1855 -116.91743
## 1856  -86.16167
## 1857  -90.70356
## 1858  -71.08718
## 1859  -84.70753
## 1860  -91.92249
## 1861 -120.06854
## 1862 -116.86352
## 1863  -93.90263
## 1864 -122.19878
## 1865  -88.95343
## 1866 -122.98055
## 1867  -97.36045
## 1868  -97.12507
## 1869  -97.28934
## 1870  -97.14236
## 1871  -97.30855
## 1872  -86.02095
## 1873  -81.32927
## 1874  -83.79167
## 1875  -85.40415
## 1876 -108.77023
## 1877  -94.98024
## 1878  -95.20279
## 1879  -94.98024
## 1880  -95.10572
## 1881  -95.01645
## 1882  -94.80574
## 1883  -94.98024
## 1884  -74.67692
## 1885  -71.97925
## 1886  -74.12691
## 1887 -117.14920
## 1888  -96.61541
## 1889  -96.66228
## 1890  -96.30978
## 1891 -101.37095
## 1892  -97.72096
## 1893  -81.18803
## 1894 -122.44392
## 1895 -122.30152
## 1896  -96.03432
## 1897  -87.08352
## 1898  -88.63626
## 1899  -99.47217
## 1900  -99.48125
## 1901  -80.73692
## 1902 -122.33403
## 1903  -83.94218
## 1904 -119.07531
## 1905 -122.40198
## 1906  -81.50355
## 1907  -93.70724
## 1908 -122.40227
## 1909  -97.69849
## 1910 -119.68735
## 1911 -120.26244
## 1912 -121.96640
## 1913  -97.69806
## 1914  -97.32035
## 1915  -76.99083
## 1916  -81.36836
## 1917  -98.57274
## 1918  -97.69034
## 1919  -71.61670
## 1920  -95.95071
## 1921 -122.34261
## 1922  -93.39487
## 1923 -122.26319
## 1924  -72.57859
## 1925  -83.67246
## 1926  -97.62520
## 1927  -86.27810
## 1928  -81.85779
## 1929  -84.67178
## 1930  -97.41712
## 1931 -118.32148
## 1932  -81.16654
## 1933  -77.32663
## 1934  -77.37680
## 1935  -83.68735
## 1936  -83.76436
## 1937  -97.31542
## 1938  -86.95078
## 1939  -86.47216
## 1940 -121.43607
## 1941  -88.59618
## 1942  -98.42830
## 1943  -95.31172
## 1944  -95.39352
## 1945  -97.71742
## 1946  -98.52444
## 1947  -98.52444
## 1948 -118.30722
## 1949  -74.21647
## 1950  -84.53054
## 1951 -111.96883
## 1952  -97.61313
## 1953  -97.68073
## 1954  -85.74922
## 1955 -121.39421
## 1956 -117.94667
## 1957 -104.97288
## 1958  -84.52433
## 1959  -85.86193
## 1960 -116.96927
## 1961 -112.15683
## 1962  -85.52262
## 1963 -115.09317
## 1964 -104.61575
## 1965  -85.04808
## 1966  -97.69638
## 1967  -97.30855
## 1968  -97.53082
## 1969  -85.66567
## 1970  -90.17191
## 1971 -120.36598
## 1972 -120.68418
## 1973 -122.08810
## 1974 -147.76460
## 1975 -120.82805
## 1976 -118.70831
## 1977  -92.62818
## 1978 -117.30813
## 1979  -91.75384
## 1980  -93.15119
## 1981  -74.38678
## 1982 -122.17869
## 1983  -85.68324
## 1984  -97.70856
## 1985  -97.74416
## 1986  -71.12405
## 1987  -98.58049
## 1988 -120.25374
## 1989  -86.20619
## 1990  -98.37745
## 1991 -107.99662
## 1992 -108.53252
## 1993 -108.53241
## 1994  -81.70077
## 1995  -93.52120
## 1996  -85.65889
## 1997  -94.53334
## 1998  -87.92933
## 1999  -97.17623
## 2000 -111.87637
## 2001 -121.96336
## 2002  -85.80201
## 2003  -85.80554
## 2004  -81.59944
## 2005 -122.78541
## 2006 -122.91663
## 2007  -96.60891
## 2008  -96.65796
## 2009  -86.33710
## 2010  -96.74299
## 2011  -84.73051
## 2012  -84.38865
## 2013  -83.46654
## 2014  -89.58054
## 2015  -88.03718
## 2016  -74.26007
## 2017  -86.73704
## 2018  -80.25255
## 2019  -76.93312
## 2020 -117.02048
## 2021 -117.02048
## 2022  -83.39420
## 2023 -119.01088
## 2024  -92.49235
## 2025  -96.12077
## 2026  -85.27414
## 2027 -122.36106
## 2028  -94.86093
## 2029  -89.78443
## 2030  -84.64058
## 2031  -74.51061
## 2032 -123.02402
## 2033  -96.91601
## 2034  -90.23503
## 2035  -71.89808
## 2036  -87.94729
## 2037 -117.00635
## 2038  -90.87363
## 2039  -89.38645
## 2040  -93.06920
## 2041 -104.70299
## 2042  -84.55527
## 2043  -95.18432
## 2044  -85.43368
## 2045  -85.43368
## 2046  -84.00750
## 2047  -83.97181
## 2048  -76.21228
## 2049  -95.40268
## 2050  -95.12572
## 2051 -123.09643
## 2052 -122.19743
## 2053  -98.48428
## 2054  -98.48020
## 2055 -101.85041
## 2056 -101.71285
## 2057 -101.70234
## 2058 -101.71285
## 2059  -78.92730
## 2060  -95.35525
## 2061  -94.57214
## 2062  -81.60398
## 2063  -83.24946
## 2064 -122.00912
## 2065  -86.02689
## 2066  -85.10531
## 2067 -119.64542
## 2068 -119.65372
## 2069 -119.64404
## 2070  -84.51857
## 2071 -122.30289
## 2072  -85.91801
## 2073  -87.90779
## 2074  -92.86478
## 2075  -83.53614
## 2076 -122.30796
## 2077  -94.21795
## 2078  -94.31801
## 2079  -94.18471
## 2080  -94.56180
## 2081  -94.31801
## 2082  -93.95799
## 2083  -85.88224
## 2084  -98.48020
## 2085  -98.48020
## 2086  -73.93998
## 2087 -103.64549
## 2088  -95.56121
## 2089 -105.09903
## 2090 -118.27999
## 2091  -82.93435
## 2092  -95.41110
## 2093  -82.92941
## 2094  -98.52845
## 2095  -95.12026
## 2096  -95.41728
## 2097  -95.51466
## 2098  -95.53344
## 2099  -95.41728
## 2100  -95.80952
## 2101  -95.35894
## 2102  -95.06775
## 2103 -118.26464
## 2104  -84.80889
## 2105  -82.43331
## 2106  -80.35547
## 2107  -80.35547
## 2108  -89.09765
## 2109  -84.29346
## 2110 -121.59957
## 2111  -86.16618
## 2112 -121.12898
## 2113  -92.84949
## 2114  -81.48945
## 2115  -95.45341
## 2116  -92.45688
## 2117 -118.80634
## 2118  -97.89114
## 2119  -83.08742
## 2120  -83.10882
## 2121  -83.10882
## 2122  -83.32306
## 2123  -83.33072
## 2124  -77.11109
## 2125  -95.41728
## 2126  -96.67664
## 2127  -95.06463
## 2128  -93.41242
## 2129  -93.31123
## 2130  -98.48035
## 2131  -95.58488
## 2132 -119.61917
## 2133 -116.10249
## 2134  -77.41340
## 2135  -77.41336
## 2136 -116.93554
## 2137 -122.57425
## 2138  -97.73658
## 2139  -84.23048
## 2140  -96.07325
## 2141 -121.31060
## 2142 -122.60336
## 2143  -82.41993
## 2144  -80.45645
## 2145  -96.42207
## 2146  -96.42230
## 2147  -93.39784
## 2148  -77.51118
## 2149  -85.25238
## 2150  -80.22817
## 2151 -118.56996
## 2152  -93.30533
## 2153  -83.31020
## 2154  -80.24463
## 2155 -102.39369
## 2156  -98.39306
## 2157  -93.22626
## 2158 -100.91773
## 2159  -98.39306
## 2160  -98.39306
## 2161 -121.57812
## 2162  -87.14424
## 2163 -118.91626
## 2164  -92.24308
## 2165  -82.45113
## 2166 -117.30137
## 2167  -97.65979
## 2168  -98.25944
## 2169  -98.13042
## 2170  -98.23897
## 2171  -98.13060
## 2172  -98.31049
## 2173  -98.16294
## 2174  -98.23899
## 2175  -98.23907
## 2176  -97.98398
## 2177  -98.23458
## 2178  -98.25947
## 2179 -114.40919
## 2180 -120.54118
## 2181 -115.58660
## 2182 -117.18514
## 2183 -115.58660
## 2184  -96.93013
## 2185  -95.18561
## 2186  -94.98954
## 2187  -74.00620
## 2188 -122.09891
## 2189  -96.66411
## 2190  -93.13455
## 2191  -81.28500
## 2192  -96.80770
## 2193 -118.20118
## 2194  -73.98393
## 2195 -122.60519
## 2196  -81.41887
## 2197 -119.53867
## 2198  -82.15461
## 2199  -81.36761
## 2200 -122.32573
## 2201 -122.34097
## 2202  -95.36018
## 2203  -95.18561
## 2204  -95.01422
## 2205  -95.18561
## 2206  -95.18561
## 2207  -95.18561
## 2208  -95.18561
## 2209  -95.43575
## 2210  -80.06945
## 2211  -93.36544
## 2212  -93.36554
## 2213  -97.14529
## 2214  -97.13759
## 2215  -97.21856
## 2216  -97.12903
## 2217  -97.13756
## 2218  -97.31927
## 2219  -97.13739
## 2220  -99.13182
## 2221  -99.24405
## 2222  -97.13739
## 2223  -97.13713
## 2224  -96.87937
## 2225  -97.13713
## 2226  -97.13756
## 2227  -74.37372
## 2228  -74.34264
## 2229 -122.33742
## 2230  -92.67755
## 2231  -83.92186
## 2232  -87.86496
## 2233  -82.34226
## 2234 -117.68027
## 2235 -116.49270
## 2236  -94.37725
## 2237  -85.34382
## 2238 -117.81608
## 2239  -80.28077
## 2240  -94.07128
## 2241  -93.98183
## 2242  -86.12186
## 2243  -90.85542
## 2244  -90.21715
## 2245  -98.57852
## 2246 -102.29674
## 2247  -76.60613
## 2248  -76.60613
## 2249 -122.53330
## 2250 -122.29975
## 2251  -85.61056
## 2252  -85.73218
## 2253  -85.73234
## 2254 -120.16656
## 2255  -93.10801
## 2256  -98.42006
## 2257  -98.61838
## 2258  -97.87256
## 2259  -97.25457
## 2260  -97.13528
## 2261 -122.65690
## 2262 -123.30008
## 2263 -122.06431
## 2264 -122.40738
## 2265 -151.51896
## 2266 -119.25368
## 2267  -76.88961
## 2268 -117.57751
## 2269 -121.61155
## 2270 -121.60993
## 2271 -121.83710
## 2272  -85.15158
## 2273  -74.12534
## 2274  -84.58054
## 2275  -93.59650
## 2276  -98.47867
## 2277  -96.63157
## 2278  -85.38899
## 2279  -83.77655
## 2280  -85.18943
## 2281 -110.15592
## 2282  -87.50098
## 2283  -87.50095
## 2284 -116.27626
## 2285 -119.85440
## 2286  -83.05687
## 2287  -86.97601
## 2288  -82.53400
## 2289  -81.53588
## 2290 -105.99576
## 2291  -87.16143
## 2292 -105.23728
## 2293 -122.06750
## 2294 -111.89030
## 2295  -83.76770
## 2296  -97.98690
## 2297  -96.74644
## 2298  -96.79358
## 2299  -84.80265
## 2300  -88.99554
## 2301  -95.25724
## 2302  -95.35277
## 2303  -95.54925
## 2304  -85.39290
## 2305  -95.40742
## 2306  -76.83962
## 2307  -78.89822
## 2308  -95.84688
## 2309  -95.84688
## 2310  -98.30245
## 2311  -74.05735
## 2312  -74.04700
## 2313  -84.33592
## 2314  -85.22804
## 2315  -96.87789
## 2316  -95.19457
## 2317 -117.73043
## 2318 -117.72286
## 2319 -124.14031
## 2320 -124.14145
## 2321  -71.01964
## 2322  -83.53614
## 2323  -83.69074
## 2324  -98.25329
## 2325 -122.33336
## 2326  -94.39094
## 2327  -94.39294
## 2328  -87.87005
## 2329 -117.20121
## 2330 -116.33996
## 2331 -116.35553
## 2332 -115.79798
## 2333 -115.79798
## 2334 -116.98066
## 2335 -122.20173
## 2336 -122.67045
## 2337 -117.19470
## 2338  -87.67550
## 2339  -90.46309
## 2340  -85.13092
## 2341  -88.35471
## 2342  -88.21057
## 2343  -88.37380
## 2344  -84.62964
## 2345  -88.05521
## 2346  -81.42372
## 2347  -81.72211
## 2348 -122.42834
## 2349 -115.56968
## 2350 -115.56376
## 2351 -121.31075
## 2352  -94.42224
## 2353 -112.33933
## 2354 -118.50165
## 2355 -120.82188
## 2356 -119.89650
## 2357 -121.69590
## 2358 -122.46362
## 2359 -111.68718
## 2360 -120.69512
## 2361 -121.27445
## 2362 -118.14123
## 2363 -120.47384
## 2364 -120.80882
## 2365  -73.98893
## 2366  -84.36249
## 2367 -115.72686
## 2368 -106.63307
## 2369 -117.35025
## 2370  -95.96019
## 2371 -122.15368
## 2372 -118.74935
## 2373 -116.98135
## 2374  -90.65070
## 2375  -96.16871
## 2376  -77.71813
## 2377  -84.57340
## 2378  -84.54224
## 2379  -84.44157
## 2380 -118.36308
## 2381 -116.43277
## 2382 -118.06652
## 2383 -119.82323
## 2384  -81.47781
## 2385  -89.37086
## 2386  -89.37218
## 2387  -84.64431
## 2388 -124.38343
## 2389  -89.30031
## 2390  -97.36045
## 2391  -95.50691
## 2392  -98.25096
## 2393  -99.01560
## 2394  -97.43779
## 2395  -93.59659
## 2396  -77.22911
## 2397 -122.28711
## 2398 -122.33096
## 2399 -122.19080
## 2400  -97.68131
## 2401  -96.96475
## 2402 -117.81958
## 2403 -122.17033
## 2404 -122.29874
## 2405 -119.20487
## 2406 -111.90171
## 2407  -84.52410
## 2408  -83.11096
## 2409  -85.10110
## 2410  -98.49574
## 2411 -120.85849
## 2412  -93.51071
## 2413  -96.97503
## 2414  -94.17510
## 2415  -93.41816
## 2416  -93.42826
## 2417  -77.32663
## 2418  -87.60890
## 2419 -119.56129
## 2420 -122.28149
## 2421  -81.85705
## 2422  -93.47461
## 2423  -93.50283
## 2424  -88.40975
## 2425  -96.74604
## 2426  -93.57555
## 2427  -93.57554
## 2428  -93.57554
## 2429  -93.57556
## 2430 -117.23809
## 2431  -87.68747
## 2432  -89.89163
## 2433  -96.63331
## 2434  -97.41267
## 2435  -98.23458
## 2436  -98.23458
## 2437  -79.22601
## 2438 -119.66630
## 2439  -77.94176
## 2440 -119.78892
## 2441 -122.63506
## 2442  -78.64445
## 2443 -118.41519
## 2444 -118.41523
## 2445  -87.27009
## 2446  -86.45505
## 2447  -86.45451
## 2448  -85.26012
## 2449  -86.03621
## 2450  -83.16385
## 2451  -90.79145
## 2452  -85.96396
## 2453  -84.41014
## 2454  -84.41885
## 2455  -80.20956
## 2456  -89.22994
## 2457 -119.73008
## 2458 -110.77426
## 2459 -109.71847
## 2460 -109.29706
## 2461 -112.07704
## 2462 -110.92795
## 2463 -122.84394
## 2464  -88.01020
## 2465  -81.76000
## 2466  -82.22301
## 2467  -97.22388
## 2468  -86.17296
## 2469 -119.77634
## 2470 -118.96352
## 2471 -118.48822
## 2472 -121.27647
## 2473  -80.27198
## 2474 -118.22351
## 2475 -117.03528
## 2476 -116.53349
## 2477 -111.71508
## 2478  -85.75085
## 2479  -97.37532
## 2480  -96.75022
## 2481  -97.10627
## 2482  -88.69962
## 2483  -88.66849
## 2484  -94.09352
## 2485  -94.09342
## 2486  -93.89750
## 2487  -94.04200
## 2488  -94.04203
## 2489  -94.04203
## 2490  -91.07744
## 2491  -86.99157
## 2492  -86.76233
## 2493  -85.75095
## 2494 -122.30544
## 2495 -112.00835
## 2496 -104.68432
## 2497  -89.41108
## 2498 -115.14888
## 2499  -85.78823
## 2500 -118.22752
## 2501  -98.48277
## 2502  -97.67527
## 2503  -95.47068
## 2504  -97.80255
## 2505  -97.94579
## 2506  -97.57998
## 2507  -97.89330
## 2508  -97.00396
## 2509  -98.39188
## 2510 -118.43334
## 2511  -95.47834
## 2512  -98.80384
## 2513  -96.72842
## 2514 -106.36454
## 2515  -98.83719
## 2516  -95.45508
## 2517  -98.47277
## 2518  -95.26295
## 2519  -95.01479
## 2520  -95.41728
## 2521  -98.15683
## 2522  -97.37160
## 2523  -83.61568
## 2524  -97.11256
## 2525 -121.19908
## 2526 -123.02088
## 2527 -120.87599
## 2528  -88.73619
## 2529 -121.23248
## 2530 -117.56444
## 2531 -122.24795
## 2532 -118.26678
## 2533 -119.08557
## 2534  -77.59927
## 2535  -96.82403
## 2536  -81.28416
## 2537  -96.40442
## 2538 -118.54160
## 2539  -74.01584
## 2540 -120.55229
## 2541  -93.66778
## 2542  -82.81482
## 2543  -97.38760
## 2544  -97.34445
## 2545 -134.46769
## 2546  -89.20618
## 2547  -84.66008
## 2548 -122.42524
## 2549  -77.46756
## 2550  -98.54723
## 2551  -81.29574
## 2552 -100.40519
## 2553  -98.48556
## 2554  -98.54713
## 2555  -98.44720
## 2556  -98.40621
## 2557  -76.08925
## 2558  -98.30922
## 2559  -98.35470
## 2560  -94.75373
## 2561  -87.28150
## 2562 -117.66449
## 2563  -82.61932
## 2564  -82.58302
## 2565 -105.08084
## 2566  -89.92964
## 2567  -95.75099
## 2568  -94.71836
## 2569  -98.49100
## 2570  -94.73467
## 2571 -115.77245
## 2572 -115.09936
## 2573  -89.58145
## 2574  -81.35241
## 2575 -115.09936
## 2576  -88.18369
## 2577  -82.56579
## 2578  -99.73328
## 2579  -86.08473
## 2580  -82.34360
## 2581  -97.96955
## 2582 -100.90254
## 2583  -95.45181
## 2584  -97.51175
## 2585  -98.13048
## 2586  -90.34334
## 2587  -90.40040
## 2588  -90.56374
## 2589  -74.72171
## 2590 -120.03407
## 2591  -96.86899
## 2592  -95.41728
## 2593  -97.38750
## 2594  -97.39052
## 2595  -97.09927
## 2596  -95.45181
## 2597  -86.24900
## 2598  -80.24222
## 2599  -93.29137
## 2600  -94.45229
## 2601  -92.30700
## 2602  -92.75022
## 2603  -74.72171
## 2604  -74.72197
## 2605  -81.48218
## 2606  -93.09806
## 2607  -85.99393
## 2608  -99.48172
## 2609  -97.85393
## 2610  -99.11229
## 2611 -120.52666
## 2612  -85.58974
## 2613  -85.58906
## 2614 -123.18922
## 2615  -85.18539
## 2616  -98.15678
## 2617  -95.13385
## 2618  -98.10690
## 2619 -119.09860
## 2620  -98.15678
## 2621  -88.87793
## 2622  -97.31043
## 2623 -118.43425
## 2624  -96.24544
## 2625 -117.33531
## 2626 -122.83904
## 2627  -96.22828
## 2628 -111.80799
## 2629 -151.25370
## 2630  -97.22227
## 2631  -79.44248
## 2632  -85.75138
## 2633 -122.28785
## 2634 -122.19387
## 2635  -92.99174
## 2636  -92.98972
## 2637  -71.48933
## 2638 -119.01620
## 2639 -119.01731
## 2640  -99.13187
## 2641  -88.15011
## 2642 -106.27388
## 2643  -97.69047
## 2644  -81.79740
## 2645 -106.29221
## 2646  -97.13599
## 2647  -97.92847
## 2648 -156.75424
## 2649  -97.67527
## 2650 -121.74631
## 2651  -71.10377
## 2652 -118.24592
## 2653 -119.37655
## 2654 -119.57247
## 2655 -119.56235
## 2656 -119.54150
## 2657  -80.26361
## 2658 -121.27547
## 2659 -112.45694
## 2660  -84.45618
## 2661 -118.16974
## 2662 -121.75297
## 2663  -95.52393
## 2664  -95.53423
## 2665  -95.53325
## 2666  -95.32222
## 2667  -93.66584
## 2668  -83.84646
## 2669  -83.89150
## 2670  -83.89150
## 2671  -83.88802
## 2672  -93.66739
## 2673 -122.61531
## 2674 -116.79223
## 2675  -89.59241
## 2676 -161.76519
## 2677 -112.00798
## 2678 -101.87379
## 2679  -96.75519
## 2680 -118.17001
## 2681 -122.65681
## 2682 -119.69591
## 2683 -121.26393
## 2684 -117.82482
## 2685 -116.14354
## 2686  -97.82711
## 2687 -121.68102
## 2688 -117.89026
## 2689  -97.92554
## 2690 -117.89027
## 2691  -81.42625
## 2692  -87.95016
## 2693  -90.84512
## 2694 -122.82370
## 2695  -82.34224
## 2696  -81.89639
## 2697  -81.89645
## 2698 -118.50203
## 2699  -85.21138
## 2700  -92.26620
## 2701  -87.98619
## 2702  -81.73292
## 2703  -85.01908
## 2704  -77.92820
## 2705  -82.79138
## 2706  -95.01394
## 2707 -116.55768
## 2708 -118.97284
## 2709  -84.99203
## 2710 -122.91431
## 2711 -122.91431
## 2712  -98.44196
## 2713  -96.76247
## 2714  -83.21188
## 2715  -93.75506
## 2716  -92.09995
## 2717  -85.61070
## 2718  -99.36588
## 2719  -87.23328
## 2720  -95.04812
## 2721  -78.87847
## 2722  -93.24384
## 2723 -122.17460
## 2724  -98.22893
## 2725  -95.54669
## 2726 -101.95996
## 2727 -101.96088
## 2728 -118.14336
## 2729 -116.93171
## 2730 -111.65626
## 2731  -77.12672
## 2732  -80.16459
## 2733  -82.87165
## 2734  -84.58980
## 2735  -96.73847
## 2736  -95.49824
## 2737 -121.43176
## 2738 -118.11956
## 2739  -88.82579
## 2740 -120.65963
## 2741  -88.73579
## 2742  -80.20519
## 2743  -83.92235
## 2744  -84.08735
## 2745  -89.15040
## 2746  -98.43819
## 2747  -92.63327
## 2748  -85.84135
## 2749 -123.48921
## 2750  -94.73818
## 2751  -94.67092
## 2752 -103.54992
## 2753 -121.97908
## 2754  -95.81909
## 2755  -97.75445
## 2756  -82.67247
## 2757  -93.16054
## 2758  -93.28155
## 2759  -83.21049
## 2760  -72.68862
## 2761  -87.04455
## 2762  -97.00954
## 2763  -83.23889
## 2764 -118.56868
## 2765  -81.83919
## 2766  -88.78512
## 2767 -103.22477
## 2768  -81.86798
## 2769  -80.22631
## 2770 -117.56847
## 2771 -121.07288
## 2772  -90.19130
## 2773 -122.23933
## 2774  -83.76474
## 2775 -119.12419
## 2776 -122.52993
## 2777 -104.76901
## 2778  -81.26417
## 2779  -76.51841
## 2780 -117.72248
## 2781 -118.35775
## 2782  -77.69347
## 2783  -84.33800
## 2784  -84.33564
## 2785  -88.28618
## 2786  -82.50949
## 2787  -97.11851
## 2788 -104.91235
## 2789  -82.80634
## 2790  -96.88079
## 2791  -82.63479
## 2792  -94.29191
## 2793 -122.95756
## 2794 -122.71600
## 2795 -122.75285
## 2796  -94.44777
## 2797  -96.97595
## 2798  -95.49957
## 2799  -85.70018
## 2800 -121.28120
## 2801 -122.15165
## 2802 -121.85690
## 2803 -120.67238
## 2804  -74.00025
## 2805  -84.98128
## 2806  -84.93938
## 2807 -122.34089
## 2808  -94.00946
## 2809  -83.28566
## 2810  -80.32749
## 2811  -93.12295
## 2812  -86.45451
## 2813  -85.42285
## 2814  -85.63625
## 2815  -85.61168
## 2816  -85.63137
## 2817  -85.63257
## 2818 -123.79037
## 2819 -110.81691
## 2820  -95.41961
## 2821  -95.41960
## 2822  -96.51484
## 2823 -122.33679
## 2824 -114.38895
## 2825  -84.16047
## 2826 -114.50323
## 2827 -119.89650
## 2828 -114.38895
## 2829  -94.20119
## 2830 -122.15990
## 2831 -103.80889
## 2832 -111.96863
## 2833 -118.33757
## 2834 -123.45633
## 2835 -122.33409
## 2836  -89.63981
## 2837 -103.22576
## 2838  -97.47782
## 2839  -88.06797
## 2840  -88.06797
## 2841  -88.06797
## 2842  -85.91463
## 2843  -97.17952
## 2844 -119.08207
## 2845  -94.52053
## 2846  -94.34739
## 2847  -93.91079
## 2848  -97.88980
## 2849 -121.65486
## 2850 -121.81308
## 2851  -77.81612
## 2852  -94.96899
## 2853  -97.97064
## 2854 -122.88440
## 2855  -89.13588
## 2856  -88.84237
## 2857  -97.67930
## 2858 -101.71285
## 2859 -122.61517
## 2860 -119.45300
## 2861  -86.84866
## 2862 -118.32043
## 2863  -81.57204
## 2864 -120.13798
## 2865  -86.98398
## 2866  -93.22775
## 2867  -93.22776
## 2868 -112.05487
## 2869 -105.14860
## 2870 -105.20692
## 2871 -117.63171
## 2872 -122.89015
## 2873 -120.59455
## 2874  -88.92825
## 2875 -117.89431
## 2876  -93.27743
## 2877  -93.27757
## 2878  -81.56402
## 2879 -118.01054
## 2880 -118.37143
## 2881 -122.09428
## 2882 -118.16199
## 2883 -122.14550
## 2884  -97.65902
## 2885  -97.65902
## 2886  -77.37358
## 2887  -77.54924
## 2888  -85.59006
## 2889  -85.76250
## 2890  -96.61136
## 2891 -119.28861
## 2892  -73.98600
## 2893  -88.53312
## 2894  -77.34817
## 2895  -96.60185
## 2896 -121.84071
## 2897  -93.11828
## 2898  -93.90228
## 2899 -101.87379
## 2900 -101.87379
## 2901 -101.87379
## 2902 -101.87379
## 2903 -101.87379
## 2904 -101.87379
## 2905 -101.87379
## 2906 -101.99136
## 2907 -101.84513
## 2908 -116.90760
## 2909  -76.99229
## 2910  -96.21614
## 2911  -79.14736
## 2912  -79.13714
## 2913 -122.46881
## 2914  -97.01098
## 2915 -118.20055
## 2916 -119.24028
## 2917  -98.80384
## 2918  -74.58195
## 2919  -96.09718
## 2920 -119.90752
## 2921  -76.31864
## 2922  -95.37456
## 2923  -80.29101
## 2924 -122.29237
## 2925  -83.97151
## 2926  -82.76142
## 2927  -83.55262
## 2928  -83.55508
## 2929 -120.03534
## 2930  -88.29371
## 2931  -76.30289
## 2932  -90.09813
## 2933 -121.97145
## 2934  -86.52295
## 2935  -84.29941
## 2936  -83.45561
## 2937  -83.09550
## 2938  -83.40970
## 2939 -122.35715
## 2940 -122.51397
## 2941 -114.47475
## 2942  -95.97133
## 2943 -121.10819
## 2944 -117.25528
## 2945  -80.23885
## 2946  -90.46149
## 2947  -81.40427
## 2948 -121.82013
## 2949 -117.25482
## 2950  -96.03044
## 2951  -83.52266
## 2952  -84.35471
## 2953  -94.65999
## 2954  -86.24530
## 2955  -94.00953
## 2956  -94.00951
## 2957  -80.98983
## 2958  -97.55030
## 2959 -121.22623
## 2960 -121.20830
## 2961 -119.50597
## 2962  -83.27188
## 2963 -120.47053
## 2964  -85.05613
## 2965 -122.34878
## 2966 -151.23234
## 2967 -119.83796
## 2968 -122.86709
## 2969 -117.23430
## 2970 -117.23427
## 2971 -122.33699
## 2972 -117.97481
## 2973  -84.58000
## 2974 -122.56792
## 2975 -122.57163
## 2976 -122.55023
## 2977  -81.42774
## 2978  -97.63663
## 2979  -87.99438
## 2980  -88.70708
## 2981  -82.17451
## 2982  -82.11464
## 2983  -82.19408
## 2984 -118.75592
## 2985  -96.89863
## 2986  -96.89539
## 2987  -87.38267
## 2988  -86.28585
## 2989 -121.29957
## 2990  -84.75069
## 2991  -84.75095
## 2992  -96.82906
## 2993  -84.30608
## 2994  -80.24202
## 2995  -80.24257
## 2996  -84.44876
## 2997 -104.83278
## 2998 -119.10589
## 2999  -89.30093
## 3000  -96.90092
## 3001  -85.56160
## 3002 -110.88290
## 3003  -76.50081
## 3004 -117.74613
## 3005 -117.74593
## 3006 -121.58605
## 3007 -122.19844
## 3008 -122.17460
## 3009  -94.81378
## 3010  -92.63714
## 3011  -82.12101
## 3012  -83.49158
## 3013 -149.10428
## 3014  -95.79229
## 3015 -101.87255
## 3016  -81.65310
## 3017  -80.08968
## 3018  -76.78469
## 3019  -96.78468
## 3020  -76.92033
## 3021 -122.27182
## 3022  -88.67647
## 3023 -100.63564
## 3024 -105.15156
## 3025  -85.20896
## 3026  -84.45051
## 3027 -121.39303
## 3028  -88.79475
## 3029  -88.67166
## 3030  -84.46363
## 3031  -84.07140
## 3032  -92.80340
## 3033  -92.75841
## 3034  -92.49787
## 3035 -119.23447
## 3036  -93.30520
## 3037  -86.25392
## 3038 -111.82402
## 3039  -87.66103
## 3040  -91.45898
## 3041 -105.14989
## 3042 -149.83364
## 3043  -97.09406
## 3044  -97.09406
## 3045  -97.45359
## 3046  -97.09406
## 3047 -118.22351
## 3048  -89.62982
## 3049  -82.17610
## 3050  -82.17417
## 3051 -117.42049
## 3052 -117.45415
## 3053 -117.37568
## 3054  -80.37252
## 3055 -119.71681
## 3056 -104.65203
## 3057  -76.72832
## 3058  -75.68399
## 3059 -117.68349
## 3060  -96.70636
## 3061  -80.71316
## 3062  -93.33970
## 3063  -80.17873
## 3064  -96.64682
## 3065 -118.47980
## 3066 -123.80313
## 3067 -123.21539
## 3068 -123.80151
## 3069 -120.38998
## 3070 -120.39005
## 3071  -89.40213
## 3072  -93.26666
## 3073  -93.26734
## 3074  -93.28263
## 3075  -93.28252
## 3076 -120.46339
## 3077 -120.53840
## 3078  -97.89491
## 3079  -97.91237
## 3080  -97.91237
## 3081  -97.94769
## 3082  -84.85337
## 3083  -84.85337
## 3084  -74.79943
## 3085 -116.36297
## 3086 -122.51286
## 3087 -122.43890
## 3088  -89.68753
## 3089  -92.15530
## 3090 -111.82966
## 3091  -92.93252
## 3092  -96.64413
## 3093 -117.67192
## 3094  -97.15520
## 3095  -93.26474
## 3096  -91.65294
## 3097  -97.34649
## 3098  -84.33613
## 3099  -77.43304
## 3100  -89.38143
## 3101  -80.41821
## 3102  -97.80159
## 3103 -118.23425
## 3104 -122.69332
## 3105  -80.24174
## 3106  -80.48286
## 3107  -80.41795
## 3108  -80.36903
## 3109 -117.20121
## 3110  -84.05391
## 3111  -83.08742
## 3112  -85.09309
## 3113  -85.29146
## 3114  -90.58991
## 3115 -122.15620
## 3116 -118.31806
## 3117 -119.12708
## 3118  -97.65109
## 3119  -93.51401
## 3120  -95.33230
## 3121  -95.47473
## 3122 -117.89008
## 3123 -117.31310
## 3124  -94.17509
## 3125  -95.36500
## 3126  -97.45076
## 3127  -76.61175
## 3128  -93.09966
## 3129  -87.66174
## 3130  -83.71428
## 3131  -74.48941
## 3132 -116.62852
## 3133 -102.07260
## 3134 -102.09718
## 3135 -116.73014
## 3136  -98.23714
## 3137  -97.91169
## 3138  -97.65111
## 3139 -101.90059
## 3140  -90.68745
## 3141  -93.65772
## 3142  -83.68143
## 3143 -120.36260
## 3144 -113.53196
## 3145  -93.68688
## 3146 -122.23247
## 3147 -118.83739
## 3148  -88.95212
## 3149 -117.37372
## 3150  -77.90762
## 3151  -88.00138
## 3152  -87.92357
## 3153  -87.92483
## 3154 -118.62944
## 3155 -118.62966
## 3156  -78.98820
## 3157  -98.07774
## 3158  -98.11148
## 3159  -82.17714
## 3160 -113.67759
## 3161  -95.53594
## 3162  -95.45529
## 3163  -85.67289
## 3164 -119.57087
## 3165 -118.44091
## 3166 -121.98213
## 3167 -115.13706
## 3168 -120.45140
## 3169 -117.26416
## 3170  -90.70095
## 3171  -97.00237
## 3172  -97.00226
## 3173  -90.58599
## 3174  -93.25706
## 3175  -93.12386
## 3176  -92.94822
## 3177  -93.53786
## 3178  -94.11766
## 3179  -92.78708
## 3180  -93.19559
## 3181  -95.71076
## 3182  -95.71072
## 3183  -95.71067
## 3184  -93.97898
## 3185  -93.23682
## 3186  -92.17138
## 3187  -92.17111
## 3188 -120.22071
## 3189 -120.87073
## 3190 -117.30151
## 3191 -121.56778
## 3192  -94.64196
## 3193 -102.89169
## 3194 -117.15040
## 3195 -118.29473
## 3196  -74.07501
## 3197  -74.07497
## 3198  -88.48443
## 3199  -77.61240
## 3200 -118.43847
## 3201  -81.75083
## 3202  -89.94879
## 3203 -104.79590
## 3204 -118.78179
## 3205 -117.89021
## 3206 -106.15610
## 3207 -118.10870
## 3208 -116.86353
## 3209 -118.15868
## 3210 -118.33191
## 3211 -121.83408
## 3212 -121.89847
## 3213  -80.41525
## 3214  -95.45359
## 3215  -79.78262
## 3216  -93.79206
## 3217  -83.89000
## 3218  -93.29207
## 3219  -93.29263
## 3220  -83.47998
## 3221 -118.41297
## 3222 -117.23371
## 3223  -86.84324
## 3224  -85.01287
## 3225 -115.09317
## 3226  -74.52003
## 3227  -74.50128
## 3228 -115.11323
## 3229  -74.50128
## 3230  -90.19791
## 3231  -89.96640
## 3232  -87.75944
## 3233  -96.63922
## 3234 -122.52384
## 3235  -85.14124
## 3236  -88.55055
## 3237 -122.48590
## 3238  -93.21211
## 3239  -93.21211
## 3240 -122.20881
## 3241  -94.99011
## 3242 -121.64524
## 3243  -78.71895
## 3244 -122.31028
## 3245 -105.08851
## 3246 -111.92528
## 3247 -117.20867
## 3248 -114.93843
## 3249 -122.40137
## 3250 -111.04374
## 3251 -111.56007
## 3252 -116.87844
## 3253 -119.44012
## 3254  -77.42559
## 3255 -116.90760
## 3256 -116.97726
## 3257 -121.67173
## 3258 -116.81610
## 3259 -120.03837
## 3260 -110.80120
## 3261 -116.89351
## 3262  -74.86288
## 3263 -105.08790
## 3264  -93.23929
## 3265  -93.28154
## 3266  -93.25659
## 3267  -93.25846
## 3268 -113.76347
## 3269  -83.68986
## 3270  -88.90267
## 3271 -117.18655
## 3272 -123.52887
## 3273 -118.29937
## 3274 -121.59514
## 3275 -122.08805
## 3276 -117.95519
## 3277 -122.26386
## 3278 -116.47497
## 3279 -120.01284
## 3280 -122.24366
## 3281  -99.00590
## 3282  -90.42950
## 3283  -97.69066
## 3284  -72.04365
## 3285 -117.23218
## 3286  -84.85392
## 3287  -86.22989
## 3288  -86.23863
## 3289  -86.24067
## 3290 -121.20012
## 3291  -92.32984
## 3292  -78.14464
## 3293  -89.38891
## 3294  -89.38891
## 3295  -94.35000
## 3296  -94.41507
## 3297  -94.65999
## 3298  -94.48942
## 3299 -122.25676
## 3300 -122.29974
## 3301 -122.25676
## 3302 -122.29905
## 3303  -81.70116
## 3304  -93.29895
## 3305  -73.55435
## 3306  -81.62342
## 3307 -122.91431
## 3308  -96.46749
## 3309  -96.46750
## 3310  -92.99847
## 3311  -92.97197
## 3312  -86.59751
## 3313  -98.43926
## 3314  -93.38660
## 3315 -114.60517
## 3316  -89.90951
## 3317  -73.83799
## 3318  -93.14627
## 3319  -94.84381
## 3320  -88.99492
## 3321 -104.87807
## 3322 -104.97624
## 3323  -89.11121
## 3324 -122.26846
## 3325  -98.46216
## 3326  -81.76385
## 3327  -85.55023
## 3328  -81.42889
## 3329  -81.73017
## 3330  -81.42411
## 3331  -88.27618
## 3332  -94.63690
## 3333  -94.42504
## 3334  -94.42505
## 3335  -94.42504
## 3336  -94.42508
## 3337  -77.34423
## 3338  -92.88777
## 3339  -93.15790
## 3340  -93.41688
## 3341 -101.84119
## 3342  -86.63088
## 3343  -97.24237
## 3344  -98.44317
## 3345  -88.31739
## 3346  -77.50748
## 3347  -77.09285
## 3348  -76.33358
## 3349  -88.29376
## 3350  -92.92533
## 3351  -77.44708
## 3352 -106.58429
## 3353  -98.21054
## 3354  -77.28885
## 3355 -103.35525
## 3356  -97.85212
## 3357  -86.95816
## 3358  -97.38123
## 3359 -116.88958
## 3360 -112.47066
## 3361  -98.70959
## 3362  -81.98317
## 3363  -93.38100
## 3364  -87.88864
## 3365 -119.11809
## 3366 -145.71372
## 3367  -96.11897
## 3368  -99.75834
## 3369  -74.39830
## 3370  -74.07413
## 3371  -82.10129
## 3372  -90.13181
## 3373  -94.94573
## 3374 -122.91464
## 3375  -71.11789
## 3376  -85.95032
## 3377  -88.14065
## 3378  -96.59690
## 3379  -97.70243
## 3380  -93.57507
## 3381  -93.57908
## 3382  -80.42355
## 3383 -121.77749
## 3384 -122.34261
## 3385  -77.48152
## 3386 -122.28912
## 3387 -121.99556
## 3388 -121.30792
## 3389 -116.95009
## 3390  -73.72599
## 3391  -74.19534
## 3392  -74.19110
## 3393  -85.50811
## 3394  -74.02945
## 3395  -85.81525
## 3396  -97.10396
## 3397  -85.71231
## 3398 -117.39653
## 3399 -121.02420
## 3400  -76.43018
## 3401  -84.49644
## 3402  -83.89688
## 3403  -71.08727
## 3404 -122.57617
## 3405  -80.82373
## 3406  -78.73684
## 3407  -80.29454
## 3408 -118.48362
## 3409  -96.74604
## 3410 -104.78221
## 3411  -86.30686
## 3412  -86.26560
## 3413  -98.47277
## 3414  -98.60163
## 3415  -97.63663
## 3416  -97.63663
## 3417  -97.63663
## 3418  -92.55444
## 3419  -79.94200
## 3420 -165.38553
## 3421  -81.72922
## 3422  -76.30300
## 3423  -76.30277
## 3424  -76.20795
## 3425 -107.01628
## 3426  -88.24349
## 3427 -121.41947
## 3428  -92.96580
## 3429  -82.33818
## 3430  -92.43200
## 3431  -76.59520
## 3432 -105.95682
## 3433  -87.87115
## 3434  -90.36538
## 3435  -98.47277
## 3436  -93.38660
## 3437 -118.87546
## 3438  -80.27677
## 3439 -101.84763
## 3440 -101.83239
## 3441 -105.02255
## 3442  -82.87548
## 3443 -122.84394
## 3444 -121.66876
## 3445  -81.98495
## 3446  -89.94460
## 3447 -117.95712
## 3448  -80.25532
## 3449 -101.96460
## 3450 -121.05311
## 3451  -87.45269
## 3452  -91.73833
## 3453 -120.80900
## 3454 -119.77552
## 3455 -122.30591
## 3456 -122.40456
## 3457  -82.48445
## 3458  -97.17804
## 3459  -97.00937
## 3460  -99.32527
## 3461  -80.25101
## 3462 -122.30694
## 3463 -122.19167
## 3464  -78.71065
## 3465  -80.70753
## 3466  -88.32132
## 3467  -88.32132
## 3468  -88.56553
## 3469  -97.45772
## 3470  -87.87118
## 3471 -103.12370
## 3472  -84.60698
## 3473  -96.62420
## 3474  -76.74794
## 3475  -81.88500
## 3476  -77.13556
## 3477  -91.35001
## 3478  -93.16914
## 3479  -92.55445
## 3480  -92.55444
## 3481  -92.55444
## 3482  -92.55439
## 3483  -82.58094
## 3484 -117.78921
## 3485 -122.19000
## 3486 -122.18994
## 3487 -114.51976
## 3488 -122.19434
## 3489  -85.59075
## 3490  -84.46408
## 3491  -96.18037
## 3492 -108.75119
## 3493  -76.95451
## 3494 -107.79810
## 3495  -95.99033
## 3496  -83.18587
## 3497 -122.57624
## 3498 -122.30104
## 3499  -87.94162
## 3500 -123.79027
## 3501  -93.45060
## 3502 -121.05538
## 3503  -97.06096
## 3504  -97.66865
## 3505  -97.29182
## 3506  -97.37127
## 3507  -97.56841
## 3508  -97.63335
## 3509  -97.79088
## 3510 -118.90779
## 3511 -117.42943
## 3512 -117.97664
## 3513 -122.16688
## 3514 -116.00310
## 3515  -73.80779
## 3516  -94.12097
## 3517  -96.82797
## 3518 -117.02520
## 3519  -93.45762
## 3520 -117.84701
## 3521 -119.45350
## 3522  -83.17394
## 3523 -118.76466
## 3524  -83.17370
## 3525  -88.27302
## 3526 -118.06183
## 3527 -118.76517
## 3528 -117.06094
## 3529 -121.85842
## 3530 -120.65646
## 3531  -89.39776
## 3532 -122.48570
## 3533 -122.26047
## 3534  -83.51596
## 3535  -86.10960
## 3536  -98.70950
## 3537  -86.27254
## 3538 -122.30692
## 3539 -119.54169
## 3540 -117.23629
## 3541 -122.90357
## 3542  -81.52333
## 3543 -117.88006
## 3544 -122.77913
## 3545 -124.04253
## 3546  -74.22443
## 3547  -74.18459
## 3548  -74.19734
## 3549 -117.33032
## 3550  -74.19736
## 3551 -122.48718
## 3552  -99.73957
## 3553 -118.21123
## 3554 -104.78170
## 3555  -84.64542
## 3556 -101.68337
## 3557 -102.09991
## 3558  -86.90264
## 3559  -86.90299
## 3560  -89.70665
## 3561  -86.66575
## 3562  -86.52225
## 3563  -86.61486
## 3564  -86.52225
## 3565 -119.58169
## 3566 -119.58062
## 3567  -80.83839
## 3568  -80.82022
## 3569  -80.82405
## 3570 -105.12057
## 3571 -157.74897
## 3572 -122.86783
## 3573 -122.02821
## 3574 -118.47790
## 3575  -95.99243
## 3576  -93.42116
## 3577  -83.94661
## 3578 -121.23247
## 3579 -112.25205
## 3580 -118.22351
## 3581  -76.14655
## 3582  -85.36793
## 3583 -122.68479
## 3584 -122.19743
## 3585 -120.31641
## 3586 -122.60740
## 3587 -122.16694
## 3588 -122.56042
## 3589 -122.53330
## 3590 -122.77803
## 3591 -122.58382
## 3592 -117.41566
## 3593 -122.29883
## 3594 -121.81510
## 3595 -121.14862
## 3596  -95.80906
## 3597 -122.23538
## 3598  -85.63431
## 3599  -85.63589
## 3600  -84.50364
## 3601 -117.38050
## 3602 -118.30728
## 3603  -95.96069
## 3604  -95.96069
## 3605  -95.96069
## 3606  -93.28000
## 3607  -93.19300
## 3608  -94.07627
## 3609  -93.37693
## 3610 -106.27390
## 3611 -122.47354
## 3612 -104.79771
## 3613 -117.07590
## 3614 -117.57702
## 3615  -81.42042
## 3616 -117.19196
## 3617 -122.27584
## 3618  -83.37855
## 3619  -73.84101
## 3620  -89.39502
## 3621 -122.23403
## 3622 -122.19082
## 3623 -121.56899
## 3624 -123.22239
## 3625 -117.33599
## 3626 -118.27116
## 3627 -112.08795
## 3628  -81.34931
## 3629  -94.87058
## 3630  -88.56025
## 3631 -123.82227
## 3632 -123.82227
## 3633  -93.39071
## 3634  -93.39078
## 3635  -88.34326
## 3636  -85.71157
## 3637  -84.97761
## 3638  -97.97562
## 3639  -98.14381
## 3640  -98.14381
## 3641 -117.82774
## 3642 -117.82774
## 3643 -122.06601
## 3644  -80.86921
## 3645  -84.36336
## 3646  -93.21938
## 3647  -93.21533
## 3648  -93.21945
## 3649  -87.06404
## 3650  -87.11114
## 3651 -118.60314
## 3652  -83.46528
## 3653  -91.50402
## 3654  -83.23595
## 3655  -83.23073
## 3656  -89.52509
## 3657  -83.25908
## 3658  -98.97967
## 3659  -98.97967
## 3660  -96.94437
## 3661  -96.94437
## 3662  -92.87551
## 3663  -92.28474
## 3664 -101.33383
## 3665  -96.86899
## 3666  -96.86899
## 3667  -96.86899
## 3668  -96.86899
## 3669  -96.86899
## 3670 -102.55774
## 3671 -102.55774
## 3672 -102.73255
## 3673 -102.52938
## 3674 -102.55774
## 3675 -100.96907
## 3676  -82.31302
## 3677  -77.48173
## 3678 -120.42346
## 3679  -90.80119
## 3680  -95.27905
## 3681  -82.43747
## 3682  -82.58810
## 3683  -80.22018
## 3684  -82.67594
## 3685  -82.68862
## 3686  -82.50975
## 3687  -84.23744
## 3688  -81.95773
## 3689  -80.11516
## 3690  -81.33092
## 3691  -81.05916
## 3692  -81.79191
## 3693  -82.13648
## 3694  -80.14700
## 3695  -80.36226
## 3696  -81.60190
## 3697  -87.19901
## 3698  -81.86031
## 3699 -120.68725
## 3700 -121.37224
## 3701 -124.08907
## 3702 -123.79032
## 3703 -119.24243
## 3704 -135.33033
## 3705 -118.58772
## 3706 -123.79164
## 3707 -122.49896
## 3708 -122.17475
## 3709 -122.51641
## 3710 -121.54678
## 3711 -118.32809
## 3712 -122.57820
## 3713  -81.68572
## 3714  -80.09248
## 3715  -80.19777
## 3716  -80.06752
## 3717  -82.53840
## 3718  -82.54972
## 3719 -120.63913
## 3720 -117.07374
## 3721 -118.85716
## 3722  -85.66104
## 3723  -94.34546
## 3724 -117.89672
## 3725 -121.90798
## 3726 -117.00079
## 3727  -93.44378
## 3728 -118.16058
## 3729 -122.60060
## 3730 -122.08690
## 3731 -123.43320
## 3732  -87.69192
## 3733  -87.69515
## 3734 -117.72044
## 3735 -114.29103
## 3736  -93.47785
## 3737 -117.86453
## 3738  -88.82348
## 3739 -102.38372
## 3740 -101.86813
## 3741  -83.56011
## 3742  -84.38959
## 3743  -95.97833
## 3744  -88.00509
## 3745  -79.07885
## 3746  -88.54942
## 3747  -82.74143
## 3748 -106.30236
## 3749 -118.43382
## 3750 -106.49113
## 3751 -120.69300
## 3752  -85.38853
## 3753  -96.86899
## 3754 -122.19415
## 3755  -93.45158
## 3756  -74.22749
## 3757  -96.66579
## 3758  -80.24192
## 3759  -96.64176
## 3760  -98.06053
## 3761  -96.70522
## 3762 -122.39676
## 3763  -86.12068
## 3764  -88.09120
## 3765 -119.86785
## 3766 -119.82180
## 3767 -118.18020
## 3768  -88.34623
## 3769  -99.44914
## 3770  -97.75157
## 3771  -82.65653
## 3772 -121.37229
## 3773 -116.00310
## 3774 -104.98215
## 3775  -96.53823
## 3776 -116.00310
## 3777  -94.13701
## 3778 -116.37130
## 3779 -116.00310
## 3780  -92.54420
## 3781  -92.51713
## 3782  -83.72114
## 3783 -118.38320
## 3784  -96.06583
## 3785 -104.60558
## 3786  -94.13701
## 3787  -88.32956
## 3788  -88.29109
## 3789 -116.92727
## 3790  -85.71193
## 3791 -122.87494
## 3792  -86.10577
## 3793  -98.76219
## 3794  -96.80099
## 3795 -121.85831
## 3796  -97.68226
## 3797  -96.08436
## 3798  -96.08438
## 3799 -117.05606
## 3800 -122.42833
## 3801 -122.42833
## 3802 -106.06075
## 3803 -112.23884
## 3804  -89.74395
## 3805 -102.48542
## 3806  -80.35504
## 3807  -80.72792
## 3808  -95.57683
## 3809  -96.65417
## 3810 -117.23291
## 3811  -88.99473
## 3812  -83.23102
## 3813 -118.47991
## 3814 -119.82145
## 3815  -95.00844
## 3816 -101.71285
## 3817  -77.38991
## 3818 -121.04260
## 3819 -115.32188
## 3820  -78.61628
## 3821  -78.60348
## 3822  -84.19587
## 3823  -93.02702
## 3824 -122.55023
## 3825  -97.75564
## 3826 -121.13599
## 3827  -79.06826
## 3828  -71.15322
## 3829 -118.38283
## 3830  -87.51215
## 3831  -85.60081
## 3832  -82.80311
## 3833  -77.49967
## 3834 -118.44097
## 3835 -119.81563
## 3836  -97.37800
## 3837 -121.82894
## 3838 -121.29777
## 3839 -118.08804
## 3840  -84.00498
## 3841 -119.19486
## 3842  -93.86376
## 3843 -112.06395
## 3844  -87.91229
## 3845  -94.00019
## 3846 -115.55149
## 3847  -87.00388
## 3848  -93.42575
## 3849  -95.56152
## 3850 -119.72423
## 3851 -122.77817
## 3852 -121.92404
## 3853  -78.13269
## 3854  -78.42224
## 3855  -94.09698
## 3856  -85.97291
## 3857  -82.58097
## 3858 -122.43537
## 3859 -111.00196
## 3860  -92.97176
## 3861 -120.63982
## 3862  -78.79504
## 3863 -105.82063
## 3864 -105.82063
## 3865  -92.64458
## 3866  -80.20368
## 3867  -84.59754
## 3868  -94.40708
## 3869  -94.40706
## 3870  -94.80534
## 3871  -74.53018
## 3872  -82.70578
## 3873  -82.77591
## 3874  -82.70497
## 3875  -82.64575
## 3876  -82.72949
## 3877  -82.74342
## 3878  -93.12506
## 3879  -93.12504
## 3880  -93.12506
## 3881  -93.12504
## 3882  -95.47027
## 3883  -96.08496
## 3884 -121.38659
## 3885 -121.32328
## 3886 -119.76488
## 3887  -81.78327
## 3888 -121.57813
## 3889 -122.41271
## 3890 -121.00172
## 3891  -82.53444
## 3892 -120.83977
## 3893  -86.01994
## 3894 -120.05500
## 3895  -96.33990
## 3896  -92.95667
## 3897 -121.08159
## 3898 -121.08159
## 3899 -121.08116
## 3900  -96.69698
## 3901  -96.63309
## 3902  -96.36579
## 3903 -106.34831
## 3904 -104.71360
## 3905 -104.71336
## 3906 -121.33923
## 3907 -111.45098
## 3908  -98.49312
## 3909  -77.18159
## 3910 -120.94334
## 3911 -120.91147
## 3912  -72.99883
## 3913  -93.30660
## 3914  -93.30668
## 3915  -94.67223
## 3916 -112.44323
## 3917  -97.86140
## 3918  -95.00846
## 3919  -76.46455
## 3920 -101.90477
## 3921 -105.11134
## 3922 -117.94676
## 3923 -111.73257
## 3924  -81.59333
## 3925  -81.81956
## 3926  -81.82000
## 3927  -81.82264
## 3928  -81.88927
## 3929 -117.72073
## 3930  -80.14840
## 3931  -89.02332
## 3932  -98.49098
## 3933  -93.98872
## 3934 -122.21211
## 3935  -89.46398
## 3936  -85.60001
## 3937 -120.91147
## 3938 -121.13321
## 3939  -81.42861
## 3940  -97.63443
## 3941  -98.50331
## 3942  -76.99182
## 3943 -105.12472
## 3944  -83.86135
## 3945 -111.68345
## 3946  -93.35423
## 3947  -93.44401
## 3948  -93.32773
## 3949  -93.99835
## 3950 -104.32272
## 3951  -91.14190
## 3952  -96.07288
## 3953  -93.79206
## 3954  -95.01407
## 3955  -89.21956
## 3956  -92.48658
## 3957  -93.60062
## 3958  -93.01627
## 3959  -94.31700
## 3960  -88.40232
## 3961  -88.40232
## 3962  -97.74680
## 3963  -99.76138
## 3964 -101.88209
## 3965  -96.70556
## 3966  -97.78507
## 3967  -97.48895
## 3968  -98.34191
## 3969  -94.99338
## 3970 -100.92228
## 3971 -106.31425
## 3972 -106.54000
## 3973  -97.42347
## 3974  -97.77657
## 3975  -95.54846
## 3976  -99.47400
## 3977  -96.97765
## 3978 -101.94703
## 3979 -102.13199
## 3980  -98.31654
## 3981  -98.10631
## 3982  -97.69691
## 3983  -95.48033
## 3984  -98.37377
## 3985  -97.61086
## 3986  -98.18022
## 3987  -98.13830
## 3988  -96.95841
## 3989  -94.06377
## 3990  -95.31857
## 3991  -97.18268
## 3992  -98.61375
## 3993  -98.39308
## 3994  -98.18641
## 3995  -92.18148
## 3996 -104.95774
## 3997  -84.23063
## 3998  -82.20333
## 3999  -80.38666
## 4000  -80.86405
## 4001  -81.68212
## 4002  -81.80821
## 4003  -96.39316
## 4004  -94.57131
## 4005 -121.14804
## 4006  -77.00438
## 4007 -116.91888
## 4008  -77.41908
## 4009  -81.10323
## 4010  -93.59724
## 4011  -93.57948
## 4012  -96.49144
## 4013  -96.49098
## 4014  -93.41280
## 4015 -101.82093
## 4016  -95.35989
## 4017  -86.35557
## 4018  -82.05765
## 4019  -81.39774
## 4020  -88.93175
## 4021  -88.26253
## 4022 -110.95686
## 4023  -75.91047
## 4024  -95.22021
## 4025  -95.75348
## 4026  -78.26174
## 4027  -77.91916
## 4028  -89.22994
## 4029  -87.92246
## 4030  -86.68166
## 4031  -74.57063
## 4032  -74.82183
## 4033  -74.79957
## 4034  -74.79987
## 4035  -74.07501
## 4036  -74.93525
## 4037 -121.27547
## 4038 -119.04448
## 4039 -121.56808
## 4040 -122.06750
## 4041 -112.01441
## 4042 -121.81617
## 4043  -81.39731
## 4044 -122.06432
## 4045 -119.15790
## 4046 -120.65000
## 4047  -73.89356
## 4048  -87.83252
## 4049 -111.68709
## 4050  -80.01587
## 4051  -98.16719
## 4052 -122.03786
## 4053 -118.20428
## 4054 -104.62664
## 4055 -117.97194
## 4056 -122.32310
## 4057  -85.42831
## 4058  -84.61416
## 4059  -98.60163
## 4060  -88.36801
## 4061  -73.67652
## 4062 -122.30173
## 4063 -122.30173
## 4064 -122.30173
## 4065  -75.54593
## 4066  -80.08366
## 4067  -73.82837
## 4068 -122.30885
## 4069 -117.00740
## 4070  -77.51768
## 4071  -98.22606
## 4072  -85.95139
## 4073  -83.18493
## 4074 -119.85428
## 4075  -88.72078
## 4076  -88.24127
## 4077  -86.44376
## 4078 -108.54107
## 4079  -81.69133
## 4080 -118.36683
## 4081 -118.12009
## 4082  -82.63891
## 4083  -82.66718
## 4084  -87.80569
## 4085  -87.90266
## 4086  -87.79951
## 4087  -90.36551
## 4088  -90.36772
## 4089  -90.36772
## 4090  -90.65426
## 4091  -90.65426
## 4092  -92.23683
## 4093 -117.38011
## 4094  -95.80942
## 4095 -122.30060
## 4096 -122.28673
## 4097  -82.77094
## 4098 -116.87828
## 4099 -118.19095
## 4100  -78.88342
## 4101  -95.86094
## 4102 -123.38808
## 4103 -118.35904
## 4104 -118.02344
## 4105 -117.10407
## 4106  -79.85137
## 4107  -89.99751
## 4108  -90.23715
## 4109  -89.61782
## 4110 -103.22843
## 4111  -77.42153
## 4112 -118.17895
## 4113  -79.39499
## 4114 -119.78971
## 4115  -74.23430
## 4116 -106.60135
## 4117 -106.60133
## 4118  -97.77629
## 4119  -94.45632
## 4120 -117.28349
## 4121 -117.55872
## 4122 -122.51179
## 4123 -122.51179
## 4124 -117.88916
## 4125  -97.39726
## 4126  -81.84630
## 4127 -116.37652
## 4128  -98.54666
## 4129 -101.38042
## 4130 -122.25128
## 4131 -106.57553
## 4132  -73.81596
## 4133  -95.01453
## 4134  -95.01453
## 4135  -95.01453
## 4136  -96.72307
## 4137  -96.72307
## 4138 -115.05476
## 4139  -95.11962
## 4140  -95.11962
## 4141 -110.84471
## 4142  -92.51432
## 4143 -122.37208
## 4144  -98.57784
## 4145  -89.10771
## 4146  -78.12019
## 4147 -118.36177
## 4148  -81.86313
## 4149 -122.09206
## 4150 -122.24413
## 4151  -95.09122
## 4152 -120.13825
## 4153 -120.12530
## 4154 -102.02530
## 4155 -120.09977
## 4156  -79.35117
## 4157  -79.94007
## 4158  -89.15320
## 4159  -88.83221
## 4160  -89.15320
## 4161  -90.01597
## 4162 -117.02170
## 4163  -88.99710
## 4164  -77.12974
## 4165  -77.44352
## 4166  -89.15320
## 4167  -74.08052
## 4168  -79.38893
## 4169  -81.10309
## 4170  -89.71024
## 4171  -97.14574
## 4172  -96.74572
## 4173 -122.17958
## 4174  -82.57048
## 4175  -84.43361
## 4176  -77.47469
## 4177  -87.77976
## 4178  -87.65422
## 4179  -88.83121
## 4180 -118.14939
## 4181  -84.82820
## 4182 -115.53969
## 4183 -121.82964
## 4184 -111.92760
## 4185 -122.66182
## 4186  -83.41194
## 4187 -121.84255
## 4188 -118.33259
## 4189 -122.91030
## 4190 -119.07347
## 4191 -121.84643
## 4192  -85.63025
## 4193 -118.17414
## 4194  -82.75146
## 4195 -122.03122
## 4196  -83.41389
## 4197  -82.57585
## 4198  -73.70094
## 4199 -122.19744
## 4200  -84.85293
## 4201 -118.72671
## 4202  -93.11875
## 4203  -71.15282
## 4204 -105.02702
## 4205  -96.97821
## 4206  -87.82246
## 4207 -131.68293
## 4208 -122.45454
## 4209  -97.72785
## 4210  -96.32213
## 4211 -118.31530
## 4212 -122.61531
## 4213 -115.67556
## 4214  -81.04958
## 4215 -101.88260
## 4216  -97.38756
## 4217  -97.43446
## 4218  -95.41158
## 4219 -101.86866
## 4220 -102.06629
## 4221 -102.39695
## 4222  -95.20772
## 4223  -97.72493
## 4224  -83.88733
## 4225  -97.78841
## 4226  -95.41858
## 4227  -93.33192
## 4228 -117.85483
## 4229  -77.43831
## 4230  -77.43819
## 4231  -76.73903
## 4232  -77.42468
## 4233  -80.35330
## 4234  -81.65424
## 4235 -104.67080
## 4236  -84.03083
## 4237  -80.96668
## 4238 -121.57942
## 4239 -122.72260
## 4240 -119.51886
## 4241 -121.43335
## 4242 -120.09945
## 4243 -106.79383
## 4244 -106.65349
## 4245  -97.38748
## 4246 -120.07294
## 4247 -119.79114
## 4248 -105.02570
## 4249 -119.21908
## 4250  -86.37979
## 4251  -86.38365
## 4252  -94.44669
## 4253  -89.76659
## 4254 -121.56842
## 4255 -121.69380
## 4256  -78.55824
## 4257  -85.55740
## 4258  -92.00185
## 4259  -90.43567
## 4260 -119.27696
## 4261  -93.37997
## 4262  -93.22090
## 4263  -83.65908
## 4264  -93.22090
## 4265  -93.22090
## 4266  -90.16864
## 4267 -117.38045
## 4268 -117.22549
## 4269 -117.38041
## 4270  -92.88777
## 4271 -112.11594
## 4272 -112.11594
## 4273  -82.50918
## 4274  -81.01661
## 4275  -85.69940
## 4276  -88.22998
## 4277 -116.77321
## 4278  -94.15586
## 4279  -80.09293
## 4280 -118.83817
## 4281  -79.85959
## 4282  -93.38491
## 4283  -93.36546
## 4284  -77.02911
## 4285 -107.87816
## 4286 -120.98410
## 4287  -88.07761
## 4288 -118.40421
## 4289 -116.24450
## 4290  -90.48243
## 4291  -82.29174
## 4292 -122.98857
## 4293 -121.96446
## 4294  -83.15864
## 4295  -92.46163
## 4296  -92.46150
## 4297 -108.16368
## 4298  -93.96184
## 4299  -89.22220
## 4300  -84.35759
## 4301 -117.79471
## 4302  -73.99451
## 4303  -92.02698
## 4304  -96.44527
## 4305  -94.42819
## 4306  -88.32493
## 4307  -89.59410
## 4308  -89.59399
## 4309  -90.32952
## 4310  -89.89781
## 4311  -87.83214
## 4312  -90.40069
## 4313  -89.87593
## 4314  -88.32499
## 4315  -83.02654
## 4316  -83.38942
## 4317 -117.85634
## 4318  -80.72190
## 4319  -93.22591
## 4320 -119.38384
## 4321  -81.59586
## 4322  -98.32301
## 4323  -93.30069
## 4324 -118.13403
## 4325  -73.89283
## 4326 -123.34870
## 4327  -95.75610
## 4328  -97.74021
## 4329  -76.49171
## 4330 -120.79838
## 4331  -93.18437
## 4332  -85.64122
## 4333  -93.18105
## 4334 -104.54274
## 4335  -94.20064
## 4336  -97.67580
## 4337 -123.25619
## 4338  -90.18897
## 4339 -117.88814
## 4340  -98.52646
## 4341 -122.11470
## 4342  -90.07235
## 4343  -91.13480
## 4344  -90.67430
## 4345  -90.02359
## 4346  -91.13480
## 4347  -90.67429
## 4348  -96.72307
## 4349  -96.13493
## 4350  -96.13405
## 4351  -96.13353
## 4352  -96.13353
## 4353  -83.99009
## 4354  -83.96852
## 4355 -118.09038
## 4356  -86.24780
## 4357 -122.15392
## 4358  -95.36500
## 4359 -121.83690
## 4360  -98.42840
## 4361  -81.85805
## 4362  -93.03342
## 4363 -122.13678
## 4364 -149.87423
## 4365 -122.42294
## 4366 -122.45250
## 4367 -122.42000
## 4368 -122.40881
## 4369  -84.73090
## 4370  -88.99696
## 4371  -88.90267
## 4372  -89.12364
## 4373  -79.45944
## 4374 -119.53702
## 4375 -119.53773
## 4376  -84.10523
## 4377  -84.05088
## 4378  -83.92968
## 4379  -84.07557
## 4380  -90.00361
## 4381 -104.18288
## 4382  -93.37104
## 4383  -93.37104
## 4384  -97.66866
## 4385  -96.87539
## 4386 -121.63285
## 4387  -83.78600
## 4388 -122.24247
## 4389 -113.88615
## 4390 -122.38057
## 4391 -113.90227
## 4392  -89.60284
## 4393  -87.87005
## 4394  -81.12746
## 4395 -115.38576
## 4396 -122.89459
## 4397 -121.39692
## 4398 -117.21639
## 4399 -122.52609
## 4400  -98.53782
## 4401 -118.21710
## 4402 -117.71608
## 4403 -122.62865
## 4404 -121.41194
## 4405 -121.39690
## 4406 -117.27124
## 4407 -117.26970
## 4408 -117.17959
## 4409 -117.15391
## 4410 -117.16905
## 4411 -106.25997
## 4412 -121.34253
## 4413 -121.23247
## 4414 -119.23458
## 4415 -119.52951
## 4416 -116.64311
## 4417 -120.84225
## 4418 -120.74284
## 4419 -120.71887
## 4420 -116.94798
## 4421 -114.59835
## 4422  -90.10128
## 4423  -82.80379
## 4424 -116.55820
## 4425 -119.45357
## 4426  -89.62646
## 4427  -89.62582
## 4428 -123.35587
## 4429 -119.76964
## 4430 -119.76934
## 4431 -121.99173
## 4432 -121.90120
## 4433 -121.90019
## 4434 -122.01243
## 4435 -122.03899
## 4436 -122.03900
## 4437 -117.24788
## 4438  -97.84451
## 4439  -97.98160
## 4440  -97.84624
## 4441 -118.48114
## 4442  -87.09977
## 4443  -97.82441
## 4444  -97.82465
## 4445 -117.89840
## 4446 -116.97229
## 4447 -116.97228
## 4448  -84.52523
## 4449  -81.10413
## 4450 -122.37285
## 4451  -73.99062
## 4452  -85.29237
## 4453  -96.80862
## 4454  -94.16235
## 4455  -81.16565
## 4456 -119.50892
## 4457  -79.79266
## 4458  -93.64212
## 4459 -117.35835
## 4460 -117.21803
## 4461  -98.61906
## 4462  -88.55949
## 4463  -81.67033
## 4464  -95.35921
## 4465 -122.19844
## 4466  -82.55284
## 4467 -121.53702
## 4468 -106.66875
## 4469  -82.71925
## 4470  -95.50795
## 4471  -96.67862
## 4472 -118.22351
## 4473  -78.73837
## 4474  -97.36385
## 4475 -118.48722
## 4476 -122.89986
## 4477 -122.95698
## 4478  -81.25524
## 4479 -122.36772
## 4480 -118.48307
## 4481  -80.14749
## 4482 -122.30928
## 4483  -93.31084
## 4484  -91.50397
## 4485  -83.76139
## 4486  -84.34954
## 4487 -122.20034
## 4488  -97.67690
## 4489  -93.27003
## 4490  -95.45427
## 4491  -77.20176
## 4492 -122.94819
## 4493  -80.23978
## 4494  -80.20825
## 4495  -80.39036
## 4496  -80.22731
## 4497  -95.96686
## 4498  -98.45638
## 4499 -120.53478
## 4500 -120.53478
## 4501 -118.13679
## 4502 -119.61938
## 4503 -122.03133
## 4504  -81.28414
## 4505  -82.45973
## 4506 -102.64810
## 4507  -89.97131
## 4508 -120.77503
## 4509 -119.92191
## 4510  -96.89956
## 4511 -123.10601
## 4512 -120.47424
## 4513 -119.31500
## 4514 -122.21209
## 4515 -106.62795
## 4516  -83.15325
## 4517  -96.63538
## 4518  -96.63544
## 4519  -95.47245
## 4520  -98.49125
## 4521  -97.71340
## 4522  -89.36269
## 4523 -117.31918
## 4524  -93.55343
## 4525  -93.55343
## 4526  -87.93320
## 4527  -97.25437
## 4528  -88.02502
## 4529  -92.46100
## 4530 -122.37947
## 4531 -122.40962
## 4532  -79.41679
## 4533  -81.42859
## 4534  -85.18222
## 4535  -88.79236
## 4536  -95.41728
## 4537 -123.79027
## 4538  -79.08499
## 4539  -79.08743
## 4540  -82.48298
## 4541  -81.80118
## 4542 -118.53792
## 4543 -118.32388
## 4544  -94.07130
## 4545  -97.38329
## 4546 -122.35845
## 4547 -116.27318
## 4548  -95.40566
## 4549 -119.99656
## 4550  -82.15618
## 4551  -82.41766
## 4552 -102.98875
## 4553  -82.32755
## 4554 -106.53484
## 4555 -117.27366
## 4556 -118.91463
## 4557 -117.88048
## 4558 -120.21268
## 4559 -118.96275
## 4560 -119.90321
## 4561 -119.67473
## 4562 -120.24532
## 4563 -121.81220
## 4564 -118.04309
## 4565 -119.38404
## 4566 -114.29242
## 4567  -82.07343
## 4568 -121.06325
## 4569 -116.89030
## 4570 -116.88993
## 4571 -117.68286
## 4572  -93.04619
## 4573  -82.13419
## 4574 -118.22306
## 4575  -81.45346
## 4576  -89.72285
## 4577 -122.34027
## 4578 -121.75816
## 4579 -120.31623
## 4580 -119.27354
## 4581 -121.97553
## 4582 -121.81337
## 4583 -111.62814
## 4584 -101.71285
## 4585 -101.65873
## 4586 -117.34513
## 4587  -92.26982
## 4588 -118.22351
## 4589 -119.49632
## 4590  -86.53255
## 4591 -114.43279
## 4592 -122.08690
## 4593 -121.77931
## 4594 -117.57313
## 4595 -106.08869
## 4596 -100.75248
## 4597  -98.54895
## 4598  -83.30075
## 4599 -105.02933
## 4600 -118.18466
## 4601 -122.06401
## 4602 -122.00370
## 4603 -112.09207
## 4604 -121.40195
## 4605 -118.28652
## 4606  -91.66539
## 4607  -91.04482
## 4608 -121.44198
## 4609 -118.13676
## 4610 -122.79813
## 4611 -122.79835
## 4612 -122.59901
## 4613 -115.11323
## 4614  -87.93120
## 4615  -80.67079
## 4616  -80.06752
## 4617  -91.87368
## 4618 -123.69721
## 4619  -82.47239
## 4620 -122.30544
## 4621  -93.31084
## 4622 -122.27102
## 4623 -121.53603
## 4624  -77.49564
## 4625  -97.95149
## 4626  -90.46373
## 4627 -101.85674
## 4628  -80.74119
## 4629 -118.32248
## 4630 -122.82426
## 4631 -123.21115
## 4632  -92.93591
## 4633 -122.40984
## 4634  -85.66309
## 4635  -89.35105
## 4636  -87.90516
## 4637 -115.55560
## 4638 -123.79716
## 4639 -106.95010
## 4640  -94.16335
## 4641  -74.63375
## 4642  -83.24080
## 4643 -111.97435
## 4644  -98.44196
## 4645  -92.10946
## 4646  -77.77299
## 4647  -98.67342
## 4648 -115.23168
## 4649 -113.06990
## 4650  -81.80835
## 4651 -113.59004
## 4652  -93.32434
## 4653 -116.68018
## 4654  -97.72934
## 4655  -98.23898
## 4656 -108.55511
## 4657  -98.44317
## 4658  -98.61761
## 4659  -98.40611
## 4660  -95.52697
## 4661 -101.24788
## 4662  -90.80889
## 4663 -103.81780
## 4664 -103.81780
## 4665  -96.62677
## 4666  -96.63509
## 4667 -122.44553
## 4668  -94.72387
## 4669  -85.81109
## 4670  -80.24301
## 4671  -97.36042
## 4672  -96.26808
## 4673 -117.28449
## 4674 -117.28432
## 4675 -104.77475
## 4676 -104.77429
## 4677 -119.90200
## 4678 -119.90324
## 4679  -86.19068
## 4680  -81.98915
## 4681  -85.53170
## 4682 -115.58375
## 4683 -117.74608
## 4684 -104.62605
## 4685 -120.40704
## 4686 -102.35860
## 4687  -84.15311
## 4688  -82.47938
## 4689  -94.22626
## 4690  -94.17217
## 4691  -94.16880
## 4692  -92.57064
## 4693  -92.84679
## 4694  -84.72802
## 4695  -81.33922
## 4696  -85.69000
## 4697  -75.18149
## 4698  -84.59265
## 4699 -116.57457
## 4700  -88.93247
## 4701  -85.70219
## 4702  -93.21454
## 4703  -94.17275
## 4704  -94.16993
## 4705  -81.33930
## 4706  -81.34593
## 4707  -90.26471
## 4708  -80.40988
## 4709  -80.33728
## 4710  -76.49455
## 4711  -93.96651
## 4712  -93.26155
## 4713  -95.54335
## 4714 -120.99889
## 4715 -120.93941
## 4716 -121.04304
## 4717  -90.95497
## 4718  -80.20939
## 4719 -120.52304
## 4720  -78.82266
## 4721  -88.33235
## 4722 -117.27117
## 4723  -85.64136
## 4724  -83.43315
## 4725  -88.93178
## 4726  -88.73909
## 4727  -97.79337
## 4728 -122.22784
## 4729  -84.48505
## 4730 -122.15991
## 4731  -80.24308
## 4732  -88.34745
## 4733 -100.62416
## 4734 -119.90752
## 4735 -117.42266
## 4736 -114.89061
## 4737 -114.89061
## 4738  -82.99715
## 4739  -72.59627
## 4740  -81.15205
## 4741 -122.11455
## 4742  -93.94891
## 4743 -118.58813
## 4744 -119.05815
## 4745 -122.26565
## 4746 -117.43058
## 4747  -95.48885
## 4748  -94.74254
## 4749  -94.74250
## 4750  -94.74251
## 4751  -94.75824
## 4752  -94.75833
## 4753  -98.23458
## 4754  -95.43708
## 4755 -122.45728
## 4756  -96.82414
## 4757  -96.92496
## 4758  -80.83191
## 4759 -121.28041
## 4760  -97.43539
## 4761  -76.51366
## 4762  -93.32439
## 4763  -85.41957
## 4764  -85.25377
## 4765  -84.90795
## 4766  -87.07089
## 4767  -85.64800
## 4768  -85.63625
## 4769  -85.46497
## 4770  -85.68963
## 4771  -85.26483
## 4772  -87.60515
## 4773  -84.60900
## 4774  -85.08380
## 4775  -85.63253
## 4776 -121.48671
## 4777  -88.35076
## 4778  -98.36455
## 4779  -96.87649
## 4780  -88.27423
## 4781  -81.83867
## 4782  -83.61248
## 4783  -85.88801
## 4784  -85.01634
## 4785  -88.34122
## 4786  -84.35029
## 4787  -88.26982
## 4788 -112.64198
## 4789 -112.44583
## 4790 -110.86710
## 4791 -114.64375
## 4792  -97.67222
## 4793  -97.33640
## 4794  -84.90795
## 4795  -72.67248
## 4796 -121.03245
## 4797 -105.05655
## 4798 -111.73323
## 4799 -121.98833
## 4800 -116.30118
## 4801  -96.92509
## 4802  -91.57168
## 4803  -96.71951
## 4804 -111.96158
## 4805 -122.56010
## 4806 -117.38013
## 4807 -115.05471
## 4808  -82.03745
## 4809  -84.27090
## 4810 -112.26274
## 4811  -80.19528
## 4812  -80.17445
## 4813 -111.85034
## 4814  -84.78954
## 4815  -85.40751
## 4816  -83.45564
## 4817 -120.12545
## 4818  -80.14877
## 4819  -92.99867
## 4820 -124.15359
## 4821 -117.27780
## 4822  -81.47367
## 4823  -92.10029
## 4824 -117.10409
## 4825  -85.65538
## 4826 -122.30371
## 4827 -121.82971
## 4828 -117.68270
## 4829  -81.85502
## 4830  -93.59610
## 4831  -93.47200
## 4832  -93.47200
## 4833  -93.47200
## 4834  -93.47200
## 4835  -93.47200
## 4836  -84.07870
## 4837  -83.83849
## 4838 -117.12194
## 4839 -120.99720
## 4840  -83.99219
## 4841  -97.39802
## 4842  -84.41268
## 4843  -75.66843
## 4844 -121.57004
## 4845  -90.46405
## 4846 -122.44687
## 4847  -97.43653
## 4848 -119.56258
## 4849  -76.75887
## 4850  -86.19753
## 4851 -122.23670
## 4852 -122.52984
## 4853 -116.92920
## 4854  -82.34211
## 4855  -80.78537
## 4856  -87.22253
## 4857  -87.89266
## 4858  -77.80121
## 4859  -97.44888
## 4860  -97.34578
## 4861  -97.12300
## 4862  -97.39052
## 4863  -97.37502
## 4864  -97.39052
## 4865  -97.54308
## 4866  -97.25445
## 4867  -97.34557
## 4868  -97.39147
## 4869  -97.30625
## 4870  -97.24821
## 4871  -97.12965
## 4872  -97.39052
## 4873  -97.39052
## 4874  -97.39052
## 4875  -97.30588
## 4876  -97.36042
## 4877  -71.09700
## 4878  -88.38530
## 4879  -83.57724
## 4880  -99.74374
## 4881  -99.73327
## 4882  -99.73329
## 4883  -83.27794
## 4884  -90.37382
## 4885  -96.71711
## 4886  -96.71711
## 4887  -96.26344
## 4888  -96.26574
## 4889 -122.75084
## 4890  -97.39122
## 4891  -73.83594
## 4892 -122.67405
## 4893  -83.95824
## 4894  -82.98443
## 4895 -110.93895
## 4896  -95.17961
## 4897 -122.25483
## 4898 -106.37694
## 4899  -98.49179
## 4900 -106.48287
## 4901 -106.48270
## 4902  -97.41139
## 4903 -118.06764
## 4904 -120.71138
## 4905 -120.71138
## 4906  -96.27936
## 4907 -122.03735
## 4908  -94.98024
## 4909  -97.91653
## 4910  -95.49193
## 4911 -106.11345
## 4912 -121.81260
## 4913  -84.81864
## 4914  -82.14730
## 4915  -85.42899
## 4916  -81.42473
## 4917  -76.23628
## 4918  -95.01369
## 4919  -93.51115
## 4920  -93.54119
## 4921 -104.78221
## 4922  -81.69650
## 4923  -86.46575
## 4924  -97.06938
## 4925  -85.63147
## 4926  -85.59745
## 4927  -87.58350
## 4928  -81.03970
## 4929  -78.23872
## 4930  -79.42688
## 4931 -122.41312
## 4932  -85.49425
## 4933  -82.40632
## 4934  -86.10487
## 4935  -97.69451
## 4936  -97.69445
## 4937  -98.45138
## 4938  -77.38953
## 4939 -114.06094
## 4940  -87.29646
## 4941  -90.24033
## 4942  -98.54691
## 4943  -89.03168
## 4944  -88.74108
## 4945  -95.21885
## 4946  -85.79730
## 4947  -96.34720
## 4948  -98.13171
## 4949 -149.85702
## 4950  -83.92068
## 4951  -82.33659
## 4952  -81.41769
## 4953  -88.09921
## 4954 -116.50437
## 4955  -97.13113
## 4956  -81.76369
## 4957  -81.42085
## 4958  -85.64364
## 4959  -82.53842
## 4960  -95.36002
## 4961  -84.66559
## 4962  -77.69165
## 4963  -76.15950
## 4964  -87.16350
## 4965  -79.67981
## 4966  -80.23195
## 4967  -82.28559
## 4968  -84.52885
## 4969  -83.94137
## 4970  -83.96892
## 4971  -95.15698
## 4972  -95.15698
## 4973  -75.91043
## 4974  -93.19631
## 4975 -120.37958
## 4976  -86.01005
## 4977  -95.52393
## 4978 -118.28262
## 4979  -95.55683
## 4980 -121.59116
## 4981  -88.99390
## 4982 -118.24712
## 4983  -89.04494
## 4984 -122.28465
## 4985 -122.46362
## 4986 -119.29445
## 4987 -117.57773
## 4988  -83.34844
## 4989  -76.25256
## 4990  -76.19301
## 4991  -83.26884
## 4992 -118.96185
## 4993  -83.37435
## 4994 -119.12047
## 4995  -89.66061
## 4996  -88.22527
## 4997  -97.80689
## 4998 -100.65735
## 4999 -100.65935
## 5000 -118.32263
## 5001  -95.63070
## 5002  -95.63070
## 5003 -100.80357
## 5004 -122.32416
## 5005 -106.08974
## 5006  -80.11536
## 5007  -97.00529
## 5008  -92.63799
## 5009  -82.56376
## 5010 -118.07161
## 5011  -84.53941
## 5012  -94.98024
## 5013  -97.39698
## 5014  -87.95812
## 5015  -97.13591
## 5016  -77.07935
## 5017 -120.01284
## 5018  -86.85080
## 5019  -97.75474
## 5020  -97.84414
## 5021  -97.96673
## 5022  -97.81546
## 5023  -97.85478
## 5024  -97.63653
## 5025 -121.96084
## 5026  -97.68342
## 5027  -97.75605
## 5028  -97.70919
## 5029  -97.75454
## 5030 -121.96138
## 5031  -95.59262
## 5032 -121.96082
## 5033  -81.84166
## 5034  -74.80644
## 5035  -96.65797
## 5036  -83.15936
## 5037 -118.25391
## 5038  -82.49841
## 5039  -98.18028
## 5040  -95.82265
## 5041 -122.92402
## 5042 -122.92402
## 5043  -88.55341
## 5044 -123.29909
## 5045  -83.15335
## 5046  -97.67527
## 5047 -124.10912
## 5048 -111.23595
## 5049 -119.33513
## 5050 -119.31164
## 5051 -119.31164
## 5052 -119.33521
## 5053 -119.35727
## 5054 -119.48539
## 5055 -121.47978
## 5056  -97.51324
## 5057 -120.38526
## 5058  -88.72687
## 5059  -80.07998
## 5060  -76.62140
## 5061  -97.30957
## 5062  -83.64195
## 5063  -80.31037
## 5064 -119.83493
## 5065  -83.88006
## 5066  -81.54552
## 5067  -80.95076
## 5068  -78.12013
## 5069  -97.12196
## 5070  -80.16879
## 5071 -109.58612
## 5072  -87.52182
## 5073 -117.81608
## 5074 -117.17960
## 5075 -121.75816
## 5076  -83.61759
## 5077 -117.15882
## 5078 -114.60637
## 5079 -112.00208
## 5080 -121.78204
## 5081  -81.82705
## 5082  -85.75861
## 5083  -88.11724
## 5084  -83.03319
## 5085 -119.14250
## 5086 -109.86303
## 5087 -123.22433
## 5088  -74.47026
## 5089  -95.87134
## 5090  -83.28908
## 5091  -83.39933
## 5092  -83.82026
## 5093  -87.94481
## 5094 -116.56747
## 5095  -82.19380
## 5096  -74.37035
## 5097  -93.10701
## 5098  -99.45105
## 5099  -85.33670
## 5100  -81.46981
## 5101  -81.19280
## 5102  -97.73925
## 5103 -104.52782
## 5104  -88.99623
## 5105  -88.22526
## 5106  -95.17246
## 5107  -96.00534
## 5108 -121.26323
## 5109  -74.18926
## 5110 -122.90113
## 5111  -73.95078
## 5112 -122.80430
## 5113  -98.56880
## 5114  -95.97535
## 5115 -118.12931
## 5116 -106.41497
## 5117 -117.22376
## 5118 -117.24697
## 5119 -117.22417
## 5120 -120.55239
## 5121 -115.54009
## 5122 -120.33206
## 5123 -117.97205
## 5124 -120.61773
## 5125 -117.02221
## 5126 -120.86048
## 5127 -117.97205
## 5128  -87.15704
## 5129 -119.23258
## 5130 -123.18617
## 5131 -117.03190
## 5132 -121.92091
## 5133  -87.15660
## 5134 -111.89145
## 5135 -120.86145
## 5136 -120.50877
## 5137  -97.45359
## 5138 -121.65648
## 5139 -122.30188
## 5140 -120.85720
## 5141 -122.62901
## 5142 -122.62901
## 5143 -149.16792
## 5144 -119.91023
## 5145 -111.74988
## 5146  -92.14173
## 5147  -85.84916
## 5148  -94.32024
## 5149 -117.61449
## 5150  -98.21802
## 5151 -117.96111
## 5152 -116.63205
## 5153  -95.71134
## 5154  -95.70680
## 5155 -122.58382
## 5156 -122.58382
## 5157  -87.43518
## 5158  -84.39044
## 5159 -104.99581
## 5160  -88.04044
## 5161 -121.90460
## 5162 -121.23062
## 5163  -97.10396
## 5164 -116.77508
## 5165  -83.07575
## 5166 -118.26212
## 5167 -100.40296
## 5168  -99.92466
## 5169 -100.25869
## 5170  -99.92472
## 5171 -100.25869
## 5172  -83.28908
## 5173  -90.19468
## 5174 -122.13172
## 5175  -77.96413
## 5176  -85.53038
## 5177  -96.91992
## 5178  -79.39708
## 5179 -121.25492
## 5180  -96.99286
## 5181 -118.34824
## 5182  -83.08745
## 5183  -81.35820
## 5184 -117.72321
## 5185 -121.87491
## 5186 -121.33320
## 5187  -94.07130
## 5188  -73.73649
## 5189  -88.03119
## 5190 -119.01537
## 5191  -74.98801
## 5192 -121.74088
## 5193 -118.47760
## 5194 -102.06030
## 5195 -119.73009
## 5196  -76.05963
## 5197  -82.48053
## 5198  -98.16384
## 5199 -108.05038
## 5200 -106.55519
## 5201 -122.45292
## 5202 -117.80881
## 5203 -104.77991
## 5204 -121.96427
## 5205 -114.62310
## 5206 -119.00928
## 5207 -118.17982
## 5208 -122.32480
## 5209 -120.99633
## 5210  -83.24430
## 5211 -121.41852
## 5212 -107.99971
## 5213 -117.24132
## 5214 -119.08205
## 5215  -95.49707
## 5216  -96.74188
## 5217  -93.24647
## 5218  -85.95375
## 5219  -93.24599
## 5220  -81.14278
## 5221  -74.89202
## 5222  -94.87470
## 5223  -94.87470
## 5224  -96.06803
## 5225  -93.10789
## 5226  -93.42111
## 5227  -94.57865
## 5228  -86.84528
## 5229  -85.68558
## 5230  -79.38899
## 5231  -97.15442
## 5232  -97.16922
## 5233  -93.79502
## 5234  -93.82697
## 5235 -121.22539
## 5236 -114.75793
## 5237  -84.37921
## 5238  -87.78969
## 5239  -87.26530
## 5240 -122.28234
## 5241  -94.57940
## 5242 -100.30850
## 5243 -100.30900
## 5244 -100.30769
## 5245 -100.30850
## 5246 -100.71815
## 5247  -99.96139
## 5248  -99.92469
## 5249 -100.30769
## 5250 -100.86313
## 5251 -100.83769
## 5252 -100.83770
## 5253 -100.83770
## 5254  -95.92582
## 5255  -93.71431
## 5256  -97.75244
## 5257 -121.28002
## 5258 -121.31096
## 5259  -86.09615
## 5260  -86.10363
## 5261  -86.12543
## 5262  -86.16403
## 5263  -74.29854
##                                                  Title.I.School.Status
## 1                                 2-Title I targeted assistance school
## 2                                 2-Title I targeted assistance school
## 3                                                                  n/a
## 4                                               6-Not a Title I school
## 5                                               6-Not a Title I school
## 6                                                                  n/a
## 7                                               6-Not a Title I school
## 8                                                                  n/a
## 9                                                                  n/a
## 10                                                                 n/a
## 11                                                                 n/a
## 12                                                                 n/a
## 13                                                                 n/a
## 14                                              6-Not a Title I school
## 15                                                                 n/a
## 16                                                                 n/a
## 17                                                                 n/a
## 18                                                                 n/a
## 19                                              6-Not a Title I school
## 20                                         5-Title I schoolwide school
## 21                                                                 n/a
## 22                                                                 n/a
## 23                                                                 n/a
## 24                     4-Title I schoolwide eligible school-No program
## 25                                                                 n/a
## 26                                         5-Title I schoolwide school
## 27                                         5-Title I schoolwide school
## 28                                                                 n/a
## 29                                              6-Not a Title I school
## 30                                         5-Title I schoolwide school
## 31                                         5-Title I schoolwide school
## 32                                         5-Title I schoolwide school
## 33            1-Title I targeted assistance eligible school-No program
## 34                                         5-Title I schoolwide school
## 35                                              6-Not a Title I school
## 36                                              6-Not a Title I school
## 37                                                                 n/a
## 38                                         5-Title I schoolwide school
## 39                                         5-Title I schoolwide school
## 40                                         5-Title I schoolwide school
## 41            1-Title I targeted assistance eligible school-No program
## 42                                         5-Title I schoolwide school
## 43                                                                 n/a
## 44                                                                 n/a
## 45                                              6-Not a Title I school
## 46                     4-Title I schoolwide eligible school-No program
## 47            1-Title I targeted assistance eligible school-No program
## 48            1-Title I targeted assistance eligible school-No program
## 49            1-Title I targeted assistance eligible school-No program
## 50                                              6-Not a Title I school
## 51                                                                 n/a
## 52                                         5-Title I schoolwide school
## 53                                                                 n/a
## 54                     4-Title I schoolwide eligible school-No program
## 55                                2-Title I targeted assistance school
## 56                                                                 n/a
## 57                                         5-Title I schoolwide school
## 58                     4-Title I schoolwide eligible school-No program
## 59                                              6-Not a Title I school
## 60                                         5-Title I schoolwide school
## 61                                                                 n/a
## 62                                              6-Not a Title I school
## 63                                                                 n/a
## 64                                         5-Title I schoolwide school
## 65                     4-Title I schoolwide eligible school-No program
## 66                                              6-Not a Title I school
## 67                     4-Title I schoolwide eligible school-No program
## 68                                         5-Title I schoolwide school
## 69                                                                 n/a
## 70                                                                 n/a
## 71                     4-Title I schoolwide eligible school-No program
## 72                                         5-Title I schoolwide school
## 73                                         5-Title I schoolwide school
## 74                                         5-Title I schoolwide school
## 75                                         5-Title I schoolwide school
## 76                                                                 n/a
## 77                                2-Title I targeted assistance school
## 78            1-Title I targeted assistance eligible school-No program
## 79                                2-Title I targeted assistance school
## 80                                         5-Title I schoolwide school
## 81                                         5-Title I schoolwide school
## 82                     4-Title I schoolwide eligible school-No program
## 83                                         5-Title I schoolwide school
## 84                     4-Title I schoolwide eligible school-No program
## 85                     4-Title I schoolwide eligible school-No program
## 86                                              6-Not a Title I school
## 87                                                                 n/a
## 88                                              6-Not a Title I school
## 89                     4-Title I schoolwide eligible school-No program
## 90            1-Title I targeted assistance eligible school-No program
## 91                                              6-Not a Title I school
## 92                                                                 n/a
## 93                                              6-Not a Title I school
## 94                                              6-Not a Title I school
## 95                                              6-Not a Title I school
## 96                                         5-Title I schoolwide school
## 97                                2-Title I targeted assistance school
## 98                                         5-Title I schoolwide school
## 99                                2-Title I targeted assistance school
## 100                               2-Title I targeted assistance school
## 101                                             6-Not a Title I school
## 102                                             6-Not a Title I school
## 103                                             6-Not a Title I school
## 104  3-Title I schoolwide eligible-Title I targeted assistance program
## 105                                                                n/a
## 106                                        5-Title I schoolwide school
## 107                                                                n/a
## 108                                                                n/a
## 109                                                                n/a
## 110                                                                n/a
## 111                                                                n/a
## 112                                             6-Not a Title I school
## 113                                                                n/a
## 114                                                                n/a
## 115                                                                n/a
## 116                                             6-Not a Title I school
## 117                                                                n/a
## 118                    4-Title I schoolwide eligible school-No program
## 119                                        5-Title I schoolwide school
## 120                                                                n/a
## 121                                        5-Title I schoolwide school
## 122                                                                n/a
## 123                                                                n/a
## 124                                        5-Title I schoolwide school
## 125                                             6-Not a Title I school
## 126                               2-Title I targeted assistance school
## 127                                                                n/a
## 128                    4-Title I schoolwide eligible school-No program
## 129                                        5-Title I schoolwide school
## 130           1-Title I targeted assistance eligible school-No program
## 131                                             6-Not a Title I school
## 132                                        5-Title I schoolwide school
## 133                                             6-Not a Title I school
## 134                                             6-Not a Title I school
## 135                                                                n/a
## 136                                             6-Not a Title I school
## 137                                        5-Title I schoolwide school
## 138                                        5-Title I schoolwide school
## 139           1-Title I targeted assistance eligible school-No program
## 140                                        5-Title I schoolwide school
## 141                                        5-Title I schoolwide school
## 142                                             6-Not a Title I school
## 143                                                                n/a
## 144                                        5-Title I schoolwide school
## 145                                        5-Title I schoolwide school
## 146                               2-Title I targeted assistance school
## 147                                                                n/a
## 148                                                                n/a
## 149                                                                n/a
## 150                                                                n/a
## 151                                                                n/a
## 152                                                                n/a
## 153                                                                n/a
## 154                                                                n/a
## 155                                                                n/a
## 156                                                                n/a
## 157                                                                n/a
## 158                                                                n/a
## 159                                                                n/a
## 160                                                                n/a
## 161                                        5-Title I schoolwide school
## 162                                        5-Title I schoolwide school
## 163                                        5-Title I schoolwide school
## 164                                        5-Title I schoolwide school
## 165                                                                n/a
## 166                                                                n/a
## 167                                                                n/a
## 168                                                                n/a
## 169                                                                n/a
## 170                                                                n/a
## 171                                                                n/a
## 172                                                                n/a
## 173                                                                n/a
## 174                                                                n/a
## 175                                        5-Title I schoolwide school
## 176                                                                n/a
## 177                                                                n/a
## 178                                                                n/a
## 179                                                                n/a
## 180                                                                n/a
## 181                                             6-Not a Title I school
## 182                    4-Title I schoolwide eligible school-No program
## 183                                                                n/a
## 184                                        5-Title I schoolwide school
## 185                                        5-Title I schoolwide school
## 186                                             6-Not a Title I school
## 187                    4-Title I schoolwide eligible school-No program
## 188                                                                n/a
## 189                                                                n/a
## 190                                             6-Not a Title I school
## 191                                             6-Not a Title I school
## 192                                        5-Title I schoolwide school
## 193                                        5-Title I schoolwide school
## 194                                             6-Not a Title I school
## 195                                             6-Not a Title I school
## 196                                             6-Not a Title I school
## 197                                                                n/a
## 198                                             6-Not a Title I school
## 199                                                                n/a
## 200                                             6-Not a Title I school
## 201                                             6-Not a Title I school
## 202                                                                n/a
## 203                                             6-Not a Title I school
## 204                                             6-Not a Title I school
## 205                                             6-Not a Title I school
## 206                                             6-Not a Title I school
## 207           1-Title I targeted assistance eligible school-No program
## 208           1-Title I targeted assistance eligible school-No program
## 209                                                                n/a
## 210                                                                n/a
## 211                    4-Title I schoolwide eligible school-No program
## 212                                                                n/a
## 213                                                                n/a
## 214                               2-Title I targeted assistance school
## 215                                        5-Title I schoolwide school
## 216                                             6-Not a Title I school
## 217                               2-Title I targeted assistance school
## 218                                        5-Title I schoolwide school
## 219                                        5-Title I schoolwide school
## 220                                             6-Not a Title I school
## 221                    4-Title I schoolwide eligible school-No program
## 222                                             6-Not a Title I school
## 223                    4-Title I schoolwide eligible school-No program
## 224                                             6-Not a Title I school
## 225                                                                n/a
## 226                                             6-Not a Title I school
## 227                                             6-Not a Title I school
## 228                                                                n/a
## 229           1-Title I targeted assistance eligible school-No program
## 230                                             6-Not a Title I school
## 231                                             6-Not a Title I school
## 232                                                                n/a
## 233                                                                n/a
## 234                                             6-Not a Title I school
## 235                    4-Title I schoolwide eligible school-No program
## 236                                             6-Not a Title I school
## 237                                        5-Title I schoolwide school
## 238                                        5-Title I schoolwide school
## 239                                                                n/a
## 240                                                                n/a
## 241                                                                n/a
## 242                                             6-Not a Title I school
## 243                                             6-Not a Title I school
## 244                                                                n/a
## 245                                             6-Not a Title I school
## 246                                             6-Not a Title I school
## 247                                             6-Not a Title I school
## 248                    4-Title I schoolwide eligible school-No program
## 249                                             6-Not a Title I school
## 250                                             6-Not a Title I school
## 251                                             6-Not a Title I school
## 252                                        5-Title I schoolwide school
## 253                                                                n/a
## 254                               2-Title I targeted assistance school
## 255                                                                n/a
## 256                                             6-Not a Title I school
## 257                                                                n/a
## 258                                             6-Not a Title I school
## 259                               2-Title I targeted assistance school
## 260                                                                n/a
## 261                                                                n/a
## 262                                                                n/a
## 263                                                                n/a
## 264                                                                n/a
## 265                    4-Title I schoolwide eligible school-No program
## 266                                             6-Not a Title I school
## 267                                             6-Not a Title I school
## 268                                                                n/a
## 269                                             6-Not a Title I school
## 270                    4-Title I schoolwide eligible school-No program
## 271                                             6-Not a Title I school
## 272                                             6-Not a Title I school
## 273                                                                n/a
## 274                                             6-Not a Title I school
## 275                                             6-Not a Title I school
## 276                                             6-Not a Title I school
## 277                                                                n/a
## 278                                                                n/a
## 279           1-Title I targeted assistance eligible school-No program
## 280                                             6-Not a Title I school
## 281                                                                n/a
## 282                                             6-Not a Title I school
## 283                                             6-Not a Title I school
## 284                               2-Title I targeted assistance school
## 285                               2-Title I targeted assistance school
## 286                    4-Title I schoolwide eligible school-No program
## 287                                             6-Not a Title I school
## 288                                        5-Title I schoolwide school
## 289                                             6-Not a Title I school
## 290                                        5-Title I schoolwide school
## 291                                                                n/a
## 292                                        5-Title I schoolwide school
## 293                                             6-Not a Title I school
## 294                                             6-Not a Title I school
## 295                                             6-Not a Title I school
## 296                                             6-Not a Title I school
## 297                                             6-Not a Title I school
## 298                                             6-Not a Title I school
## 299                                             6-Not a Title I school
## 300                                             6-Not a Title I school
## 301                                             6-Not a Title I school
## 302           1-Title I targeted assistance eligible school-No program
## 303                    4-Title I schoolwide eligible school-No program
## 304                                             6-Not a Title I school
## 305                                             6-Not a Title I school
## 306                                             6-Not a Title I school
## 307                                             6-Not a Title I school
## 308                                        5-Title I schoolwide school
## 309                                        5-Title I schoolwide school
## 310                                                               <NA>
## 311                                             6-Not a Title I school
## 312                               2-Title I targeted assistance school
## 313                    4-Title I schoolwide eligible school-No program
## 314           1-Title I targeted assistance eligible school-No program
## 315                                        5-Title I schoolwide school
## 316                                                               <NA>
## 317                                        5-Title I schoolwide school
## 318                                             6-Not a Title I school
## 319                                             6-Not a Title I school
## 320                                                                n/a
## 321                                             6-Not a Title I school
## 322                                        5-Title I schoolwide school
## 323                                                                n/a
## 324                                        5-Title I schoolwide school
## 325                                                                n/a
## 326                                        5-Title I schoolwide school
## 327                                        5-Title I schoolwide school
## 328                    4-Title I schoolwide eligible school-No program
## 329                                                                n/a
## 330                                                                n/a
## 331                                             6-Not a Title I school
## 332                                        5-Title I schoolwide school
## 333                                        5-Title I schoolwide school
## 334                                                                n/a
## 335                                                                n/a
## 336                                                                n/a
## 337                                             6-Not a Title I school
## 338                                             6-Not a Title I school
## 339                                             6-Not a Title I school
## 340                                             6-Not a Title I school
## 341                                                                n/a
## 342                                             6-Not a Title I school
## 343                                             6-Not a Title I school
## 344                               2-Title I targeted assistance school
## 345           1-Title I targeted assistance eligible school-No program
## 346                                             6-Not a Title I school
## 347                                                                n/a
## 348                                        5-Title I schoolwide school
## 349                                                                n/a
## 350                               2-Title I targeted assistance school
## 351                                        5-Title I schoolwide school
## 352                                             6-Not a Title I school
## 353                                             6-Not a Title I school
## 354                               2-Title I targeted assistance school
## 355                                                                n/a
## 356                               2-Title I targeted assistance school
## 357                                        5-Title I schoolwide school
## 358                                             6-Not a Title I school
## 359                                             6-Not a Title I school
## 360                                             6-Not a Title I school
## 361                                        5-Title I schoolwide school
## 362                                             6-Not a Title I school
## 363           1-Title I targeted assistance eligible school-No program
## 364                                                                n/a
## 365                               2-Title I targeted assistance school
## 366                                        5-Title I schoolwide school
## 367                                        5-Title I schoolwide school
## 368                                                                n/a
## 369                                                                n/a
## 370                                             6-Not a Title I school
## 371                                             6-Not a Title I school
## 372                    4-Title I schoolwide eligible school-No program
## 373           1-Title I targeted assistance eligible school-No program
## 374                    4-Title I schoolwide eligible school-No program
## 375                    4-Title I schoolwide eligible school-No program
## 376                                             6-Not a Title I school
## 377                                                                n/a
## 378                                        5-Title I schoolwide school
## 379                                             6-Not a Title I school
## 380                                                                n/a
## 381                                                                n/a
## 382                                                                n/a
## 383                                                                n/a
## 384                                                                n/a
## 385                                             6-Not a Title I school
## 386                                             6-Not a Title I school
## 387                                             6-Not a Title I school
## 388                                             6-Not a Title I school
## 389                                             6-Not a Title I school
## 390                                                                n/a
## 391                                        5-Title I schoolwide school
## 392                                             6-Not a Title I school
## 393                                             6-Not a Title I school
## 394                                        5-Title I schoolwide school
## 395                                        5-Title I schoolwide school
## 396                                             6-Not a Title I school
## 397                                             6-Not a Title I school
## 398                                             6-Not a Title I school
## 399                                             6-Not a Title I school
## 400                                             6-Not a Title I school
## 401                                                                n/a
## 402                                                                n/a
## 403                                             6-Not a Title I school
## 404                                                                n/a
## 405                                             6-Not a Title I school
## 406                                                                n/a
## 407           1-Title I targeted assistance eligible school-No program
## 408                                                               <NA>
## 409                                             6-Not a Title I school
## 410                                                                n/a
## 411                                                               <NA>
## 412                                             6-Not a Title I school
## 413                               2-Title I targeted assistance school
## 414                                             6-Not a Title I school
## 415                                        5-Title I schoolwide school
## 416                                        5-Title I schoolwide school
## 417                                        5-Title I schoolwide school
## 418                                             6-Not a Title I school
## 419                                             6-Not a Title I school
## 420                                        5-Title I schoolwide school
## 421                                                                n/a
## 422                                        5-Title I schoolwide school
## 423                                             6-Not a Title I school
## 424                                             6-Not a Title I school
## 425                                                                n/a
## 426  3-Title I schoolwide eligible-Title I targeted assistance program
## 427                                        5-Title I schoolwide school
## 428           1-Title I targeted assistance eligible school-No program
## 429                                             6-Not a Title I school
## 430                                                                n/a
## 431                                             6-Not a Title I school
## 432                                                                n/a
## 433                    4-Title I schoolwide eligible school-No program
## 434                                        5-Title I schoolwide school
## 435                                        5-Title I schoolwide school
## 436                                        5-Title I schoolwide school
## 437                                             6-Not a Title I school
## 438                    4-Title I schoolwide eligible school-No program
## 439                                             6-Not a Title I school
## 440                                        5-Title I schoolwide school
## 441           1-Title I targeted assistance eligible school-No program
## 442                    4-Title I schoolwide eligible school-No program
## 443                                        5-Title I schoolwide school
## 444                                             6-Not a Title I school
## 445                                                                n/a
## 446                                             6-Not a Title I school
## 447                                             6-Not a Title I school
## 448                                        5-Title I schoolwide school
## 449                               2-Title I targeted assistance school
## 450                                                                n/a
## 451                                                                n/a
## 452                    4-Title I schoolwide eligible school-No program
## 453                                             6-Not a Title I school
## 454                                             6-Not a Title I school
## 455                                             6-Not a Title I school
## 456                                                                n/a
## 457                                             6-Not a Title I school
## 458                                             6-Not a Title I school
## 459                                                                n/a
## 460                                             6-Not a Title I school
## 461                    4-Title I schoolwide eligible school-No program
## 462                    4-Title I schoolwide eligible school-No program
## 463                                                                n/a
## 464                                             6-Not a Title I school
## 465                                             6-Not a Title I school
## 466                                             6-Not a Title I school
## 467                                                                n/a
## 468                               2-Title I targeted assistance school
## 469                                             6-Not a Title I school
## 470                                                                n/a
## 471                                                                n/a
## 472                                        5-Title I schoolwide school
## 473                                             6-Not a Title I school
## 474                                             6-Not a Title I school
## 475                    4-Title I schoolwide eligible school-No program
## 476                                             6-Not a Title I school
## 477                                             6-Not a Title I school
## 478           1-Title I targeted assistance eligible school-No program
## 479                                        5-Title I schoolwide school
## 480                    4-Title I schoolwide eligible school-No program
## 481                                        5-Title I schoolwide school
## 482                                        5-Title I schoolwide school
## 483                                                                n/a
## 484                                             6-Not a Title I school
## 485                                        5-Title I schoolwide school
## 486                                             6-Not a Title I school
## 487                                        5-Title I schoolwide school
## 488                                                                n/a
## 489                    4-Title I schoolwide eligible school-No program
## 490                               2-Title I targeted assistance school
## 491                                                                n/a
## 492                                             6-Not a Title I school
## 493                                             6-Not a Title I school
## 494                                                                n/a
## 495                                        5-Title I schoolwide school
## 496                                        5-Title I schoolwide school
## 497                                                                n/a
## 498                                                                n/a
## 499                                                                n/a
## 500                                                                n/a
## 501                                             6-Not a Title I school
## 502                                                                n/a
## 503                                                                n/a
## 504                                             6-Not a Title I school
## 505                                                                n/a
## 506                                                                n/a
## 507                                                                n/a
## 508                                                                n/a
## 509                                             6-Not a Title I school
## 510                    4-Title I schoolwide eligible school-No program
## 511                                        5-Title I schoolwide school
## 512                                             6-Not a Title I school
## 513                                             6-Not a Title I school
## 514                               2-Title I targeted assistance school
## 515                                             6-Not a Title I school
## 516                    4-Title I schoolwide eligible school-No program
## 517                                             6-Not a Title I school
## 518                               2-Title I targeted assistance school
## 519                                        5-Title I schoolwide school
## 520                                                                n/a
## 521                                        5-Title I schoolwide school
## 522                                             6-Not a Title I school
## 523                    4-Title I schoolwide eligible school-No program
## 524                               2-Title I targeted assistance school
## 525                               2-Title I targeted assistance school
## 526  3-Title I schoolwide eligible-Title I targeted assistance program
## 527           1-Title I targeted assistance eligible school-No program
## 528                                             6-Not a Title I school
## 529                                                               <NA>
## 530                                                               <NA>
## 531                                        5-Title I schoolwide school
## 532                    4-Title I schoolwide eligible school-No program
## 533                                                                n/a
## 534                                             6-Not a Title I school
## 535                                             6-Not a Title I school
## 536                                                                n/a
## 537                                        5-Title I schoolwide school
## 538                                             6-Not a Title I school
## 539                                        5-Title I schoolwide school
## 540                    4-Title I schoolwide eligible school-No program
## 541                                                                n/a
## 542                                             6-Not a Title I school
## 543                                             6-Not a Title I school
## 544                                             6-Not a Title I school
## 545                                             6-Not a Title I school
## 546                                                                n/a
## 547                                                                n/a
## 548                                                                n/a
## 549                                             6-Not a Title I school
## 550                                             6-Not a Title I school
## 551                                             6-Not a Title I school
## 552                               2-Title I targeted assistance school
## 553                                        5-Title I schoolwide school
## 554                                             6-Not a Title I school
## 555                                                                n/a
## 556                                        5-Title I schoolwide school
## 557                                                                n/a
## 558                    4-Title I schoolwide eligible school-No program
## 559                                             6-Not a Title I school
## 560                                                                n/a
## 561                                        5-Title I schoolwide school
## 562                                                                n/a
## 563                                        5-Title I schoolwide school
## 564                               2-Title I targeted assistance school
## 565                                        5-Title I schoolwide school
## 566                                             6-Not a Title I school
## 567                    4-Title I schoolwide eligible school-No program
## 568                                        5-Title I schoolwide school
## 569                                        5-Title I schoolwide school
## 570                                             6-Not a Title I school
## 571                                             6-Not a Title I school
## 572                                             6-Not a Title I school
## 573                                             6-Not a Title I school
## 574                                                                n/a
## 575                                        5-Title I schoolwide school
## 576                                                                n/a
## 577           1-Title I targeted assistance eligible school-No program
## 578                                             6-Not a Title I school
## 579                                        5-Title I schoolwide school
## 580                                        5-Title I schoolwide school
## 581                               2-Title I targeted assistance school
## 582                               2-Title I targeted assistance school
## 583                                             6-Not a Title I school
## 584                                        5-Title I schoolwide school
## 585                    4-Title I schoolwide eligible school-No program
## 586                                                                n/a
## 587                                                                n/a
## 588                                                                n/a
## 589                    4-Title I schoolwide eligible school-No program
## 590                    4-Title I schoolwide eligible school-No program
## 591                                                                n/a
## 592                                        5-Title I schoolwide school
## 593                                                                n/a
## 594                                        5-Title I schoolwide school
## 595                                        5-Title I schoolwide school
## 596                    4-Title I schoolwide eligible school-No program
## 597                    4-Title I schoolwide eligible school-No program
## 598                                                                n/a
## 599                                                                n/a
## 600                                        5-Title I schoolwide school
## 601                                        5-Title I schoolwide school
## 602                                        5-Title I schoolwide school
## 603                                             6-Not a Title I school
## 604                                             6-Not a Title I school
## 605                                             6-Not a Title I school
## 606                    4-Title I schoolwide eligible school-No program
## 607                                             6-Not a Title I school
## 608                                        5-Title I schoolwide school
## 609                                                                n/a
## 610                                        5-Title I schoolwide school
## 611           1-Title I targeted assistance eligible school-No program
## 612                                             6-Not a Title I school
## 613                                        5-Title I schoolwide school
## 614                                             6-Not a Title I school
## 615                                        5-Title I schoolwide school
## 616                                             6-Not a Title I school
## 617                                                                n/a
## 618                                             6-Not a Title I school
## 619                                             6-Not a Title I school
## 620                                             6-Not a Title I school
## 621                    4-Title I schoolwide eligible school-No program
## 622                                        5-Title I schoolwide school
## 623                                             6-Not a Title I school
## 624                                        5-Title I schoolwide school
## 625                                             6-Not a Title I school
## 626                                        5-Title I schoolwide school
## 627                                             6-Not a Title I school
## 628                                                                n/a
## 629                                             6-Not a Title I school
## 630                                                                n/a
## 631                                                                n/a
## 632                                             6-Not a Title I school
## 633                                                                n/a
## 634                                             6-Not a Title I school
## 635                                             6-Not a Title I school
## 636                                             6-Not a Title I school
## 637                                        5-Title I schoolwide school
## 638                                        5-Title I schoolwide school
## 639                                        5-Title I schoolwide school
## 640                                        5-Title I schoolwide school
## 641                    4-Title I schoolwide eligible school-No program
## 642                               2-Title I targeted assistance school
## 643                                                                n/a
## 644                                             6-Not a Title I school
## 645                                             6-Not a Title I school
## 646                                                                n/a
## 647                                        5-Title I schoolwide school
## 648                                        5-Title I schoolwide school
## 649                                             6-Not a Title I school
## 650                                        5-Title I schoolwide school
## 651                                             6-Not a Title I school
## 652                                        5-Title I schoolwide school
## 653                                             6-Not a Title I school
## 654                                             6-Not a Title I school
## 655                                             6-Not a Title I school
## 656                    4-Title I schoolwide eligible school-No program
## 657                                             6-Not a Title I school
## 658                                        5-Title I schoolwide school
## 659                                             6-Not a Title I school
## 660                                             6-Not a Title I school
## 661                                        5-Title I schoolwide school
## 662                               2-Title I targeted assistance school
## 663                                             6-Not a Title I school
## 664                                             6-Not a Title I school
## 665                               2-Title I targeted assistance school
## 666                               2-Title I targeted assistance school
## 667                                             6-Not a Title I school
## 668                                             6-Not a Title I school
## 669                                        5-Title I schoolwide school
## 670                                             6-Not a Title I school
## 671           1-Title I targeted assistance eligible school-No program
## 672                                        5-Title I schoolwide school
## 673                                        5-Title I schoolwide school
## 674                                        5-Title I schoolwide school
## 675                                             6-Not a Title I school
## 676                                        5-Title I schoolwide school
## 677                                        5-Title I schoolwide school
## 678                                        5-Title I schoolwide school
## 679                                        5-Title I schoolwide school
## 680                                                                n/a
## 681                                                                n/a
## 682                                             6-Not a Title I school
## 683                                             6-Not a Title I school
## 684                                             6-Not a Title I school
## 685           1-Title I targeted assistance eligible school-No program
## 686                                        5-Title I schoolwide school
## 687                                                                n/a
## 688                                        5-Title I schoolwide school
## 689                                             6-Not a Title I school
## 690                                             6-Not a Title I school
## 691                                        5-Title I schoolwide school
## 692                                                                n/a
## 693                                             6-Not a Title I school
## 694                                             6-Not a Title I school
## 695                                             6-Not a Title I school
## 696                                             6-Not a Title I school
## 697                                             6-Not a Title I school
## 698                                        5-Title I schoolwide school
## 699                                                                n/a
## 700                                        5-Title I schoolwide school
## 701                                        5-Title I schoolwide school
## 702                    4-Title I schoolwide eligible school-No program
## 703                                                               <NA>
## 704                                                                n/a
## 705                                             6-Not a Title I school
## 706                                                                n/a
## 707                                             6-Not a Title I school
## 708                                             6-Not a Title I school
## 709  3-Title I schoolwide eligible-Title I targeted assistance program
## 710                                        5-Title I schoolwide school
## 711                                                                n/a
## 712                                                               <NA>
## 713                                             6-Not a Title I school
## 714                                                                n/a
## 715                                                                n/a
## 716                               2-Title I targeted assistance school
## 717                                        5-Title I schoolwide school
## 718                               2-Title I targeted assistance school
## 719                                                                n/a
## 720                                                                n/a
## 721                                        5-Title I schoolwide school
## 722                                        5-Title I schoolwide school
## 723                                        5-Title I schoolwide school
## 724           1-Title I targeted assistance eligible school-No program
## 725                               2-Title I targeted assistance school
## 726                                        5-Title I schoolwide school
## 727                                             6-Not a Title I school
## 728                               2-Title I targeted assistance school
## 729                               2-Title I targeted assistance school
## 730                                        5-Title I schoolwide school
## 731                                        5-Title I schoolwide school
## 732                                                                n/a
## 733                    4-Title I schoolwide eligible school-No program
## 734                                                                n/a
## 735           1-Title I targeted assistance eligible school-No program
## 736                                                                n/a
## 737                    4-Title I schoolwide eligible school-No program
## 738                                             6-Not a Title I school
## 739                                        5-Title I schoolwide school
## 740                                             6-Not a Title I school
## 741                                                                n/a
## 742                                             6-Not a Title I school
## 743                                                                n/a
## 744                                        5-Title I schoolwide school
## 745                               2-Title I targeted assistance school
## 746                                        5-Title I schoolwide school
## 747                               2-Title I targeted assistance school
## 748                                                                n/a
## 749                                        5-Title I schoolwide school
## 750                                                                n/a
## 751           1-Title I targeted assistance eligible school-No program
## 752                                             6-Not a Title I school
## 753           1-Title I targeted assistance eligible school-No program
## 754                                             6-Not a Title I school
## 755                                             6-Not a Title I school
## 756                                             6-Not a Title I school
## 757                                             6-Not a Title I school
## 758                                             6-Not a Title I school
## 759                                             6-Not a Title I school
## 760                               2-Title I targeted assistance school
## 761                                             6-Not a Title I school
## 762                                        5-Title I schoolwide school
## 763                               2-Title I targeted assistance school
## 764                                                               <NA>
## 765                                                                n/a
## 766                                                               <NA>
## 767                                                               <NA>
## 768                                                               <NA>
## 769                    4-Title I schoolwide eligible school-No program
## 770                                             6-Not a Title I school
## 771                                             6-Not a Title I school
## 772                                                                n/a
## 773                                             6-Not a Title I school
## 774                                             6-Not a Title I school
## 775                                                                n/a
## 776                                             6-Not a Title I school
## 777                                             6-Not a Title I school
## 778                                                                n/a
## 779                                             6-Not a Title I school
## 780                                             6-Not a Title I school
## 781                                        5-Title I schoolwide school
## 782  3-Title I schoolwide eligible-Title I targeted assistance program
## 783                               2-Title I targeted assistance school
## 784                                             6-Not a Title I school
## 785                                        5-Title I schoolwide school
## 786                                                                n/a
## 787                                                                n/a
## 788                                                                n/a
## 789                                                                n/a
## 790                                                                n/a
## 791                               2-Title I targeted assistance school
## 792                                        5-Title I schoolwide school
## 793                                        5-Title I schoolwide school
## 794                                             6-Not a Title I school
## 795                                        5-Title I schoolwide school
## 796                                             6-Not a Title I school
## 797                    4-Title I schoolwide eligible school-No program
## 798                                             6-Not a Title I school
## 799                                                               <NA>
## 800                                                               <NA>
## 801                                             6-Not a Title I school
## 802                                                                n/a
## 803                                        5-Title I schoolwide school
## 804                                                                n/a
## 805                                             6-Not a Title I school
## 806                               2-Title I targeted assistance school
## 807                                             6-Not a Title I school
## 808                                        5-Title I schoolwide school
## 809                                        5-Title I schoolwide school
## 810           1-Title I targeted assistance eligible school-No program
## 811                                                                n/a
## 812                    4-Title I schoolwide eligible school-No program
## 813                                                                n/a
## 814                                        5-Title I schoolwide school
## 815                                                                n/a
## 816                                                                n/a
## 817                                             6-Not a Title I school
## 818                                             6-Not a Title I school
## 819                                                                n/a
## 820                                                                n/a
## 821                                                                n/a
## 822                                        5-Title I schoolwide school
## 823                                             6-Not a Title I school
## 824                    4-Title I schoolwide eligible school-No program
## 825                                                                n/a
## 826                                        5-Title I schoolwide school
## 827                                             6-Not a Title I school
## 828                                        5-Title I schoolwide school
## 829           1-Title I targeted assistance eligible school-No program
## 830                                             6-Not a Title I school
## 831                                                                n/a
## 832                               2-Title I targeted assistance school
## 833                                             6-Not a Title I school
## 834                               2-Title I targeted assistance school
## 835                                             6-Not a Title I school
## 836                                                                n/a
## 837                                                                n/a
## 838                                                                n/a
## 839                                                                n/a
## 840                                                                n/a
## 841                    4-Title I schoolwide eligible school-No program
## 842                                        5-Title I schoolwide school
## 843                                             6-Not a Title I school
## 844                               2-Title I targeted assistance school
## 845                                             6-Not a Title I school
## 846                                                                n/a
## 847                                             6-Not a Title I school
## 848                                             6-Not a Title I school
## 849                                        5-Title I schoolwide school
## 850                                        5-Title I schoolwide school
## 851                                                                n/a
## 852                                             6-Not a Title I school
## 853                                             6-Not a Title I school
## 854                                             6-Not a Title I school
## 855                                        5-Title I schoolwide school
## 856                               2-Title I targeted assistance school
## 857                                        5-Title I schoolwide school
## 858                                        5-Title I schoolwide school
## 859           1-Title I targeted assistance eligible school-No program
## 860                               2-Title I targeted assistance school
## 861                                             6-Not a Title I school
## 862           1-Title I targeted assistance eligible school-No program
## 863                                                                n/a
## 864                                             6-Not a Title I school
## 865                    4-Title I schoolwide eligible school-No program
## 866                                                                n/a
## 867                                                                n/a
## 868                                             6-Not a Title I school
## 869                                             6-Not a Title I school
## 870                                        5-Title I schoolwide school
## 871                                        5-Title I schoolwide school
## 872                                             6-Not a Title I school
## 873                    4-Title I schoolwide eligible school-No program
## 874                                             6-Not a Title I school
## 875                                             6-Not a Title I school
## 876                               2-Title I targeted assistance school
## 877                                             6-Not a Title I school
## 878                                             6-Not a Title I school
## 879                                             6-Not a Title I school
## 880                                             6-Not a Title I school
## 881                               2-Title I targeted assistance school
## 882                                                                n/a
## 883                                                                n/a
## 884                                                                n/a
## 885                               2-Title I targeted assistance school
## 886                    4-Title I schoolwide eligible school-No program
## 887                                                                n/a
## 888                                                                n/a
## 889                                                                n/a
## 890                                             6-Not a Title I school
## 891                    4-Title I schoolwide eligible school-No program
## 892                                             6-Not a Title I school
## 893                                        5-Title I schoolwide school
## 894                                                                n/a
## 895                                                                n/a
## 896                               2-Title I targeted assistance school
## 897                    4-Title I schoolwide eligible school-No program
## 898                                                                n/a
## 899                               2-Title I targeted assistance school
## 900                               2-Title I targeted assistance school
## 901                                        5-Title I schoolwide school
## 902                                        5-Title I schoolwide school
## 903                    4-Title I schoolwide eligible school-No program
## 904                                        5-Title I schoolwide school
## 905                                        5-Title I schoolwide school
## 906                                        5-Title I schoolwide school
## 907                                        5-Title I schoolwide school
## 908                                             6-Not a Title I school
## 909                    4-Title I schoolwide eligible school-No program
## 910           1-Title I targeted assistance eligible school-No program
## 911                                        5-Title I schoolwide school
## 912                               2-Title I targeted assistance school
## 913                                                                n/a
## 914                               2-Title I targeted assistance school
## 915           1-Title I targeted assistance eligible school-No program
## 916                                                                n/a
## 917                                                                n/a
## 918                                                                n/a
## 919                                             6-Not a Title I school
## 920                                                                n/a
## 921                                             6-Not a Title I school
## 922                                                                n/a
## 923                                             6-Not a Title I school
## 924                                             6-Not a Title I school
## 925                                                                n/a
## 926                                                                n/a
## 927                               2-Title I targeted assistance school
## 928                                        5-Title I schoolwide school
## 929                                             6-Not a Title I school
## 930                                             6-Not a Title I school
## 931                                             6-Not a Title I school
## 932                                        5-Title I schoolwide school
## 933                                        5-Title I schoolwide school
## 934                                        5-Title I schoolwide school
## 935                                             6-Not a Title I school
## 936                                                                n/a
## 937                               2-Title I targeted assistance school
## 938                                        5-Title I schoolwide school
## 939                                        5-Title I schoolwide school
## 940                                        5-Title I schoolwide school
## 941                                                                n/a
## 942                                             6-Not a Title I school
## 943                               2-Title I targeted assistance school
## 944                                             6-Not a Title I school
## 945                                                                n/a
## 946                                                                n/a
## 947                                                                n/a
## 948                                                                n/a
## 949                                                                n/a
## 950                                                                n/a
## 951                                                                n/a
## 952                                                                n/a
## 953                                             6-Not a Title I school
## 954                                                                n/a
## 955                                             6-Not a Title I school
## 956                                             6-Not a Title I school
## 957                                             6-Not a Title I school
## 958                                                                n/a
## 959                                             6-Not a Title I school
## 960                                             6-Not a Title I school
## 961                    4-Title I schoolwide eligible school-No program
## 962                    4-Title I schoolwide eligible school-No program
## 963                                             6-Not a Title I school
## 964                                        5-Title I schoolwide school
## 965                    4-Title I schoolwide eligible school-No program
## 966           1-Title I targeted assistance eligible school-No program
## 967                                             6-Not a Title I school
## 968                                             6-Not a Title I school
## 969                                             6-Not a Title I school
## 970                                        5-Title I schoolwide school
## 971                                        5-Title I schoolwide school
## 972                                        5-Title I schoolwide school
## 973                                             6-Not a Title I school
## 974                                             6-Not a Title I school
## 975           1-Title I targeted assistance eligible school-No program
## 976                                        5-Title I schoolwide school
## 977                                                                n/a
## 978                                             6-Not a Title I school
## 979                                        5-Title I schoolwide school
## 980                                        5-Title I schoolwide school
## 981                                             6-Not a Title I school
## 982                               2-Title I targeted assistance school
## 983                                             6-Not a Title I school
## 984                                             6-Not a Title I school
## 985                                        5-Title I schoolwide school
## 986                                             6-Not a Title I school
## 987                                                               <NA>
## 988                                                               <NA>
## 989                                                                n/a
## 990           1-Title I targeted assistance eligible school-No program
## 991                                                                n/a
## 992                               2-Title I targeted assistance school
## 993                                        5-Title I schoolwide school
## 994                                                                n/a
## 995                                        5-Title I schoolwide school
## 996                    4-Title I schoolwide eligible school-No program
## 997                    4-Title I schoolwide eligible school-No program
## 998                                        5-Title I schoolwide school
## 999                                             6-Not a Title I school
## 1000                                                               n/a
## 1001                                                               n/a
## 1002                                            6-Not a Title I school
## 1003                                            6-Not a Title I school
## 1004                   4-Title I schoolwide eligible school-No program
## 1005                                                               n/a
## 1006                                            6-Not a Title I school
## 1007                                                               n/a
## 1008                              2-Title I targeted assistance school
## 1009                   4-Title I schoolwide eligible school-No program
## 1010                                                               n/a
## 1011                                            6-Not a Title I school
## 1012                              2-Title I targeted assistance school
## 1013                              2-Title I targeted assistance school
## 1014                                            6-Not a Title I school
## 1015                                       5-Title I schoolwide school
## 1016                                                               n/a
## 1017                   4-Title I schoolwide eligible school-No program
## 1018                                            6-Not a Title I school
## 1019                                            6-Not a Title I school
## 1020                   4-Title I schoolwide eligible school-No program
## 1021                                            6-Not a Title I school
## 1022                                            6-Not a Title I school
## 1023                                            6-Not a Title I school
## 1024                                       5-Title I schoolwide school
## 1025                                                               n/a
## 1026                                            6-Not a Title I school
## 1027                                            6-Not a Title I school
## 1028                                                               n/a
## 1029                                            6-Not a Title I school
## 1030                                            6-Not a Title I school
## 1031                                       5-Title I schoolwide school
## 1032                                       5-Title I schoolwide school
## 1033                                       5-Title I schoolwide school
## 1034                                       5-Title I schoolwide school
## 1035                                       5-Title I schoolwide school
## 1036                                                               n/a
## 1037                                       5-Title I schoolwide school
## 1038          1-Title I targeted assistance eligible school-No program
## 1039                                            6-Not a Title I school
## 1040                   4-Title I schoolwide eligible school-No program
## 1041                                            6-Not a Title I school
## 1042                                            6-Not a Title I school
## 1043                                            6-Not a Title I school
## 1044                                            6-Not a Title I school
## 1045                                            6-Not a Title I school
## 1046                                       5-Title I schoolwide school
## 1047                                       5-Title I schoolwide school
## 1048                                            6-Not a Title I school
## 1049                                       5-Title I schoolwide school
## 1050                                                               n/a
## 1051                   4-Title I schoolwide eligible school-No program
## 1052          1-Title I targeted assistance eligible school-No program
## 1053                                                               n/a
## 1054                                                               n/a
## 1055                                            6-Not a Title I school
## 1056                                            6-Not a Title I school
## 1057                                            6-Not a Title I school
## 1058                                            6-Not a Title I school
## 1059                                            6-Not a Title I school
## 1060                                                               n/a
## 1061                              2-Title I targeted assistance school
## 1062                                            6-Not a Title I school
## 1063          1-Title I targeted assistance eligible school-No program
## 1064                                            6-Not a Title I school
## 1065                                       5-Title I schoolwide school
## 1066                                       5-Title I schoolwide school
## 1067                                                               n/a
## 1068                                                               n/a
## 1069                                            6-Not a Title I school
## 1070                                                               n/a
## 1071                                            6-Not a Title I school
## 1072                                                               n/a
## 1073                                            6-Not a Title I school
## 1074                                            6-Not a Title I school
## 1075                                            6-Not a Title I school
## 1076                                                               n/a
## 1077                                            6-Not a Title I school
## 1078                   4-Title I schoolwide eligible school-No program
## 1079                                            6-Not a Title I school
## 1080                                                               n/a
## 1081                                       5-Title I schoolwide school
## 1082                                                               n/a
## 1083                                            6-Not a Title I school
## 1084                                       5-Title I schoolwide school
## 1085                   4-Title I schoolwide eligible school-No program
## 1086                                                               n/a
## 1087                                            6-Not a Title I school
## 1088                                                               n/a
## 1089                                                               n/a
## 1090                                                               n/a
## 1091                                                               n/a
## 1092                                            6-Not a Title I school
## 1093                                            6-Not a Title I school
## 1094                                                               n/a
## 1095                                            6-Not a Title I school
## 1096                                                               n/a
## 1097                                            6-Not a Title I school
## 1098                                       5-Title I schoolwide school
## 1099                                                               n/a
## 1100                                            6-Not a Title I school
## 1101                                            6-Not a Title I school
## 1102                                                               n/a
## 1103                                            6-Not a Title I school
## 1104                                                               n/a
## 1105                                            6-Not a Title I school
## 1106                                            6-Not a Title I school
## 1107                                            6-Not a Title I school
## 1108                                            6-Not a Title I school
## 1109                                            6-Not a Title I school
## 1110                                            6-Not a Title I school
## 1111                                            6-Not a Title I school
## 1112                                            6-Not a Title I school
## 1113          1-Title I targeted assistance eligible school-No program
## 1114                              2-Title I targeted assistance school
## 1115                                            6-Not a Title I school
## 1116                                            6-Not a Title I school
## 1117                                            6-Not a Title I school
## 1118                              2-Title I targeted assistance school
## 1119                              2-Title I targeted assistance school
## 1120                   4-Title I schoolwide eligible school-No program
## 1121                   4-Title I schoolwide eligible school-No program
## 1122          1-Title I targeted assistance eligible school-No program
## 1123                                       5-Title I schoolwide school
## 1124                                            6-Not a Title I school
## 1125                                            6-Not a Title I school
## 1126                                                              <NA>
## 1127                              2-Title I targeted assistance school
## 1128          1-Title I targeted assistance eligible school-No program
## 1129                                       5-Title I schoolwide school
## 1130                              2-Title I targeted assistance school
## 1131                                       5-Title I schoolwide school
## 1132                                            6-Not a Title I school
## 1133                   4-Title I schoolwide eligible school-No program
## 1134                                                               n/a
## 1135                              2-Title I targeted assistance school
## 1136                              2-Title I targeted assistance school
## 1137                   4-Title I schoolwide eligible school-No program
## 1138                                            6-Not a Title I school
## 1139                                                               n/a
## 1140                                            6-Not a Title I school
## 1141                                       5-Title I schoolwide school
## 1142                                                               n/a
## 1143                                            6-Not a Title I school
## 1144                                       5-Title I schoolwide school
## 1145          1-Title I targeted assistance eligible school-No program
## 1146                                            6-Not a Title I school
## 1147                                       5-Title I schoolwide school
## 1148                              2-Title I targeted assistance school
## 1149                                       5-Title I schoolwide school
## 1150                                       5-Title I schoolwide school
## 1151                                       5-Title I schoolwide school
## 1152                                       5-Title I schoolwide school
## 1153                                       5-Title I schoolwide school
## 1154                                       5-Title I schoolwide school
## 1155                   4-Title I schoolwide eligible school-No program
## 1156                                       5-Title I schoolwide school
## 1157                              2-Title I targeted assistance school
## 1158          1-Title I targeted assistance eligible school-No program
## 1159                              2-Title I targeted assistance school
## 1160                                            6-Not a Title I school
## 1161                                                               n/a
## 1162                              2-Title I targeted assistance school
## 1163                                                               n/a
## 1164          1-Title I targeted assistance eligible school-No program
## 1165                                            6-Not a Title I school
## 1166                                       5-Title I schoolwide school
## 1167                                       5-Title I schoolwide school
## 1168                                            6-Not a Title I school
## 1169                                            6-Not a Title I school
## 1170                              2-Title I targeted assistance school
## 1171                                            6-Not a Title I school
## 1172                                                               n/a
## 1173                   4-Title I schoolwide eligible school-No program
## 1174                                            6-Not a Title I school
## 1175                                       5-Title I schoolwide school
## 1176                                                               n/a
## 1177                                                               n/a
## 1178                                       5-Title I schoolwide school
## 1179                                            6-Not a Title I school
## 1180                                       5-Title I schoolwide school
## 1181                                            6-Not a Title I school
## 1182                                            6-Not a Title I school
## 1183                                            6-Not a Title I school
## 1184                                            6-Not a Title I school
## 1185                              2-Title I targeted assistance school
## 1186                                       5-Title I schoolwide school
## 1187                                            6-Not a Title I school
## 1188                              2-Title I targeted assistance school
## 1189                                                               n/a
## 1190                                            6-Not a Title I school
## 1191                              2-Title I targeted assistance school
## 1192                                            6-Not a Title I school
## 1193                   4-Title I schoolwide eligible school-No program
## 1194                                       5-Title I schoolwide school
## 1195                   4-Title I schoolwide eligible school-No program
## 1196                                                               n/a
## 1197                                                               n/a
## 1198                                            6-Not a Title I school
## 1199                                            6-Not a Title I school
## 1200                                       5-Title I schoolwide school
## 1201                                                              <NA>
## 1202                                            6-Not a Title I school
## 1203                                       5-Title I schoolwide school
## 1204                                       5-Title I schoolwide school
## 1205                              2-Title I targeted assistance school
## 1206                                                               n/a
## 1207                                                              <NA>
## 1208                                                               n/a
## 1209                                            6-Not a Title I school
## 1210                                            6-Not a Title I school
## 1211                                       5-Title I schoolwide school
## 1212                                       5-Title I schoolwide school
## 1213                                       5-Title I schoolwide school
## 1214                                       5-Title I schoolwide school
## 1215          1-Title I targeted assistance eligible school-No program
## 1216                                            6-Not a Title I school
## 1217                                                               n/a
## 1218                                            6-Not a Title I school
## 1219                                            6-Not a Title I school
## 1220                                                               n/a
## 1221                                            6-Not a Title I school
## 1222                   4-Title I schoolwide eligible school-No program
## 1223                                                              <NA>
## 1224                                                               n/a
## 1225                                            6-Not a Title I school
## 1226                                            6-Not a Title I school
## 1227                                            6-Not a Title I school
## 1228                                            6-Not a Title I school
## 1229                                                               n/a
## 1230          1-Title I targeted assistance eligible school-No program
## 1231          1-Title I targeted assistance eligible school-No program
## 1232                                                               n/a
## 1233                                       5-Title I schoolwide school
## 1234                                            6-Not a Title I school
## 1235                                       5-Title I schoolwide school
## 1236                                       5-Title I schoolwide school
## 1237                                            6-Not a Title I school
## 1238                   4-Title I schoolwide eligible school-No program
## 1239                   4-Title I schoolwide eligible school-No program
## 1240                                            6-Not a Title I school
## 1241                                            6-Not a Title I school
## 1242                                            6-Not a Title I school
## 1243                                       5-Title I schoolwide school
## 1244                                       5-Title I schoolwide school
## 1245                              2-Title I targeted assistance school
## 1246                                            6-Not a Title I school
## 1247                                                               n/a
## 1248                                       5-Title I schoolwide school
## 1249                   4-Title I schoolwide eligible school-No program
## 1250                                       5-Title I schoolwide school
## 1251          1-Title I targeted assistance eligible school-No program
## 1252                   4-Title I schoolwide eligible school-No program
## 1253                   4-Title I schoolwide eligible school-No program
## 1254                                       5-Title I schoolwide school
## 1255          1-Title I targeted assistance eligible school-No program
## 1256                   4-Title I schoolwide eligible school-No program
## 1257                              2-Title I targeted assistance school
## 1258                   4-Title I schoolwide eligible school-No program
## 1259 3-Title I schoolwide eligible-Title I targeted assistance program
## 1260                                                               n/a
## 1261 3-Title I schoolwide eligible-Title I targeted assistance program
## 1262                                       5-Title I schoolwide school
## 1263                                       5-Title I schoolwide school
## 1264                                            6-Not a Title I school
## 1265                                       5-Title I schoolwide school
## 1266                   4-Title I schoolwide eligible school-No program
## 1267                                       5-Title I schoolwide school
## 1268                              2-Title I targeted assistance school
## 1269                                                               n/a
## 1270                                                               n/a
## 1271                                                               n/a
## 1272                                                               n/a
## 1273          1-Title I targeted assistance eligible school-No program
## 1274                   4-Title I schoolwide eligible school-No program
## 1275                                       5-Title I schoolwide school
## 1276                                                               n/a
## 1277                                            6-Not a Title I school
## 1278                                                              <NA>
## 1279                                                               n/a
## 1280                                                               n/a
## 1281                                       5-Title I schoolwide school
## 1282                                            6-Not a Title I school
## 1283                                            6-Not a Title I school
## 1284                   4-Title I schoolwide eligible school-No program
## 1285                                            6-Not a Title I school
## 1286                                            6-Not a Title I school
## 1287                   4-Title I schoolwide eligible school-No program
## 1288                                            6-Not a Title I school
## 1289                                                               n/a
## 1290          1-Title I targeted assistance eligible school-No program
## 1291                                            6-Not a Title I school
## 1292                                                               n/a
## 1293                                            6-Not a Title I school
## 1294                                            6-Not a Title I school
## 1295          1-Title I targeted assistance eligible school-No program
## 1296                                                               n/a
## 1297                                                               n/a
## 1298                                            6-Not a Title I school
## 1299                                            6-Not a Title I school
## 1300                                            6-Not a Title I school
## 1301                                       5-Title I schoolwide school
## 1302                                            6-Not a Title I school
## 1303                              2-Title I targeted assistance school
## 1304                                       5-Title I schoolwide school
## 1305                                                               n/a
## 1306                                            6-Not a Title I school
## 1307                                       5-Title I schoolwide school
## 1308                                       5-Title I schoolwide school
## 1309                                       5-Title I schoolwide school
## 1310                                       5-Title I schoolwide school
## 1311                                       5-Title I schoolwide school
## 1312                                            6-Not a Title I school
## 1313                                                               n/a
## 1314                                                               n/a
## 1315                                            6-Not a Title I school
## 1316                                            6-Not a Title I school
## 1317                                       5-Title I schoolwide school
## 1318                                            6-Not a Title I school
## 1319                              2-Title I targeted assistance school
## 1320                                            6-Not a Title I school
## 1321                                            6-Not a Title I school
## 1322                                            6-Not a Title I school
## 1323                   4-Title I schoolwide eligible school-No program
## 1324                              2-Title I targeted assistance school
## 1325                              2-Title I targeted assistance school
## 1326                                            6-Not a Title I school
## 1327          1-Title I targeted assistance eligible school-No program
## 1328                   4-Title I schoolwide eligible school-No program
## 1329                                       5-Title I schoolwide school
## 1330                   4-Title I schoolwide eligible school-No program
## 1331                                            6-Not a Title I school
## 1332                                            6-Not a Title I school
## 1333                                                               n/a
## 1334                                            6-Not a Title I school
## 1335                                                               n/a
## 1336                                            6-Not a Title I school
## 1337                                            6-Not a Title I school
## 1338                                            6-Not a Title I school
## 1339                              2-Title I targeted assistance school
## 1340                                            6-Not a Title I school
## 1341                                            6-Not a Title I school
## 1342 3-Title I schoolwide eligible-Title I targeted assistance program
## 1343                                       5-Title I schoolwide school
## 1344                              2-Title I targeted assistance school
## 1345                                       5-Title I schoolwide school
## 1346                              2-Title I targeted assistance school
## 1347                                            6-Not a Title I school
## 1348                                       5-Title I schoolwide school
## 1349                                       5-Title I schoolwide school
## 1350                                       5-Title I schoolwide school
## 1351                              2-Title I targeted assistance school
## 1352                              2-Title I targeted assistance school
## 1353                                       5-Title I schoolwide school
## 1354                                       5-Title I schoolwide school
## 1355          1-Title I targeted assistance eligible school-No program
## 1356                   4-Title I schoolwide eligible school-No program
## 1357                                                               n/a
## 1358                                       5-Title I schoolwide school
## 1359                                            6-Not a Title I school
## 1360                                       5-Title I schoolwide school
## 1361                                            6-Not a Title I school
## 1362                                                               n/a
## 1363                                            6-Not a Title I school
## 1364                                                               n/a
## 1365                                                               n/a
## 1366                                            6-Not a Title I school
## 1367                                                               n/a
## 1368                                                               n/a
## 1369                                            6-Not a Title I school
## 1370                                                               n/a
## 1371                                                               n/a
## 1372                                                               n/a
## 1373                                                               n/a
## 1374                                            6-Not a Title I school
## 1375                                            6-Not a Title I school
## 1376                                       5-Title I schoolwide school
## 1377                                                               n/a
## 1378                                                               n/a
## 1379                                                               n/a
## 1380                   4-Title I schoolwide eligible school-No program
## 1381                                            6-Not a Title I school
## 1382                                       5-Title I schoolwide school
## 1383                              2-Title I targeted assistance school
## 1384                              2-Title I targeted assistance school
## 1385                                            6-Not a Title I school
## 1386                                       5-Title I schoolwide school
## 1387                                       5-Title I schoolwide school
## 1388                              2-Title I targeted assistance school
## 1389                                       5-Title I schoolwide school
## 1390                                                               n/a
## 1391                                       5-Title I schoolwide school
## 1392                   4-Title I schoolwide eligible school-No program
## 1393                              2-Title I targeted assistance school
## 1394                                                               n/a
## 1395                                            6-Not a Title I school
## 1396                                            6-Not a Title I school
## 1397                                            6-Not a Title I school
## 1398                                            6-Not a Title I school
## 1399                                            6-Not a Title I school
## 1400                                                               n/a
## 1401                                       5-Title I schoolwide school
## 1402                                       5-Title I schoolwide school
## 1403                                       5-Title I schoolwide school
## 1404                                       5-Title I schoolwide school
## 1405                                       5-Title I schoolwide school
## 1406                   4-Title I schoolwide eligible school-No program
## 1407          1-Title I targeted assistance eligible school-No program
## 1408                                                               n/a
## 1409                                            6-Not a Title I school
## 1410                                       5-Title I schoolwide school
## 1411                                       5-Title I schoolwide school
## 1412                   4-Title I schoolwide eligible school-No program
## 1413                                       5-Title I schoolwide school
## 1414                                                               n/a
## 1415                                            6-Not a Title I school
## 1416                   4-Title I schoolwide eligible school-No program
## 1417                              2-Title I targeted assistance school
## 1418                   4-Title I schoolwide eligible school-No program
## 1419                                            6-Not a Title I school
## 1420          1-Title I targeted assistance eligible school-No program
## 1421                                            6-Not a Title I school
## 1422                                            6-Not a Title I school
## 1423                                            6-Not a Title I school
## 1424                                                               n/a
## 1425                                                               n/a
## 1426                   4-Title I schoolwide eligible school-No program
## 1427                   4-Title I schoolwide eligible school-No program
## 1428          1-Title I targeted assistance eligible school-No program
## 1429                                            6-Not a Title I school
## 1430                                            6-Not a Title I school
## 1431                                            6-Not a Title I school
## 1432                                       5-Title I schoolwide school
## 1433                                            6-Not a Title I school
## 1434                   4-Title I schoolwide eligible school-No program
## 1435                                       5-Title I schoolwide school
## 1436                                                               n/a
## 1437                                            6-Not a Title I school
## 1438                                                               n/a
## 1439                                                               n/a
## 1440                                       5-Title I schoolwide school
## 1441                                       5-Title I schoolwide school
## 1442                                                               n/a
## 1443                                            6-Not a Title I school
## 1444          1-Title I targeted assistance eligible school-No program
## 1445                   4-Title I schoolwide eligible school-No program
## 1446                                       5-Title I schoolwide school
## 1447                                                               n/a
## 1448                                                               n/a
## 1449          1-Title I targeted assistance eligible school-No program
## 1450                                       5-Title I schoolwide school
## 1451                                       5-Title I schoolwide school
## 1452                                       5-Title I schoolwide school
## 1453                                            6-Not a Title I school
## 1454                                                               n/a
## 1455                                                               n/a
## 1456                                                               n/a
## 1457                   4-Title I schoolwide eligible school-No program
## 1458                                                               n/a
## 1459                                                              <NA>
## 1460                                            6-Not a Title I school
## 1461                                                               n/a
## 1462                                       5-Title I schoolwide school
## 1463                                       5-Title I schoolwide school
## 1464                                            6-Not a Title I school
## 1465                              2-Title I targeted assistance school
## 1466                                                               n/a
## 1467                                       5-Title I schoolwide school
## 1468                                       5-Title I schoolwide school
## 1469          1-Title I targeted assistance eligible school-No program
## 1470          1-Title I targeted assistance eligible school-No program
## 1471                                       5-Title I schoolwide school
## 1472                                                               n/a
## 1473                                       5-Title I schoolwide school
## 1474                                       5-Title I schoolwide school
## 1475                                            6-Not a Title I school
## 1476                   4-Title I schoolwide eligible school-No program
## 1477                                       5-Title I schoolwide school
## 1478                                       5-Title I schoolwide school
## 1479          1-Title I targeted assistance eligible school-No program
## 1480                                            6-Not a Title I school
## 1481                                                               n/a
## 1482                                            6-Not a Title I school
## 1483                                                               n/a
## 1484                                            6-Not a Title I school
## 1485                                            6-Not a Title I school
## 1486                                            6-Not a Title I school
## 1487                   4-Title I schoolwide eligible school-No program
## 1488                                            6-Not a Title I school
## 1489                              2-Title I targeted assistance school
## 1490                                            6-Not a Title I school
## 1491                                                               n/a
## 1492                                                               n/a
## 1493                                                               n/a
## 1494                                                               n/a
## 1495                                            6-Not a Title I school
## 1496                   4-Title I schoolwide eligible school-No program
## 1497                              2-Title I targeted assistance school
## 1498                                            6-Not a Title I school
## 1499                                                               n/a
## 1500                                            6-Not a Title I school
## 1501                              2-Title I targeted assistance school
## 1502                                            6-Not a Title I school
## 1503                                       5-Title I schoolwide school
## 1504                                       5-Title I schoolwide school
## 1505                              2-Title I targeted assistance school
## 1506                                       5-Title I schoolwide school
## 1507                              2-Title I targeted assistance school
## 1508                              2-Title I targeted assistance school
## 1509                                            6-Not a Title I school
## 1510                                       5-Title I schoolwide school
## 1511                                            6-Not a Title I school
## 1512                                                               n/a
## 1513                                                               n/a
## 1514                                            6-Not a Title I school
## 1515                                            6-Not a Title I school
## 1516                                                               n/a
## 1517                                            6-Not a Title I school
## 1518                              2-Title I targeted assistance school
## 1519                                            6-Not a Title I school
## 1520                              2-Title I targeted assistance school
## 1521          1-Title I targeted assistance eligible school-No program
## 1522                                       5-Title I schoolwide school
## 1523                                                               n/a
## 1524                              2-Title I targeted assistance school
## 1525                                                               n/a
## 1526                                                               n/a
## 1527          1-Title I targeted assistance eligible school-No program
## 1528                                            6-Not a Title I school
## 1529                                       5-Title I schoolwide school
## 1530                                            6-Not a Title I school
## 1531                                                               n/a
## 1532                                       5-Title I schoolwide school
## 1533                                       5-Title I schoolwide school
## 1534                                                               n/a
## 1535                                       5-Title I schoolwide school
## 1536                                       5-Title I schoolwide school
## 1537                                            6-Not a Title I school
## 1538          1-Title I targeted assistance eligible school-No program
## 1539                                            6-Not a Title I school
## 1540          1-Title I targeted assistance eligible school-No program
## 1541                                            6-Not a Title I school
## 1542                              2-Title I targeted assistance school
## 1543                                       5-Title I schoolwide school
## 1544                                                               n/a
## 1545                                            6-Not a Title I school
## 1546                                                               n/a
## 1547                                                               n/a
## 1548                                            6-Not a Title I school
## 1549                                            6-Not a Title I school
## 1550                                            6-Not a Title I school
## 1551                                       5-Title I schoolwide school
## 1552                                                               n/a
## 1553                                            6-Not a Title I school
## 1554                                                               n/a
## 1555                                                               n/a
## 1556                                                               n/a
## 1557                   4-Title I schoolwide eligible school-No program
## 1558                   4-Title I schoolwide eligible school-No program
## 1559                   4-Title I schoolwide eligible school-No program
## 1560                                                               n/a
## 1561                                                               n/a
## 1562                                                               n/a
## 1563          1-Title I targeted assistance eligible school-No program
## 1564                                       5-Title I schoolwide school
## 1565                                       5-Title I schoolwide school
## 1566                                       5-Title I schoolwide school
## 1567                                                               n/a
## 1568                                                               n/a
## 1569                                            6-Not a Title I school
## 1570                                            6-Not a Title I school
## 1571          1-Title I targeted assistance eligible school-No program
## 1572                                       5-Title I schoolwide school
## 1573                              2-Title I targeted assistance school
## 1574                                       5-Title I schoolwide school
## 1575                                            6-Not a Title I school
## 1576                                                               n/a
## 1577                                            6-Not a Title I school
## 1578                                            6-Not a Title I school
## 1579                              2-Title I targeted assistance school
## 1580                                       5-Title I schoolwide school
## 1581                                       5-Title I schoolwide school
## 1582                              2-Title I targeted assistance school
## 1583                              2-Title I targeted assistance school
## 1584                                            6-Not a Title I school
## 1585                                                               n/a
## 1586                                       5-Title I schoolwide school
## 1587                                                               n/a
## 1588                                            6-Not a Title I school
## 1589                                            6-Not a Title I school
## 1590                                            6-Not a Title I school
## 1591                                       5-Title I schoolwide school
## 1592          1-Title I targeted assistance eligible school-No program
## 1593                                       5-Title I schoolwide school
## 1594                              2-Title I targeted assistance school
## 1595                                                               n/a
## 1596                                                               n/a
## 1597                                                               n/a
## 1598          1-Title I targeted assistance eligible school-No program
## 1599                                       5-Title I schoolwide school
## 1600                                       5-Title I schoolwide school
## 1601                   4-Title I schoolwide eligible school-No program
## 1602                                       5-Title I schoolwide school
## 1603                                       5-Title I schoolwide school
## 1604                                       5-Title I schoolwide school
## 1605                   4-Title I schoolwide eligible school-No program
## 1606          1-Title I targeted assistance eligible school-No program
## 1607                                            6-Not a Title I school
## 1608                                            6-Not a Title I school
## 1609                                                               n/a
## 1610                                       5-Title I schoolwide school
## 1611                                                               n/a
## 1612                                       5-Title I schoolwide school
## 1613                                            6-Not a Title I school
## 1614                   4-Title I schoolwide eligible school-No program
## 1615                                       5-Title I schoolwide school
## 1616                   4-Title I schoolwide eligible school-No program
## 1617                                       5-Title I schoolwide school
## 1618                                                               n/a
## 1619          1-Title I targeted assistance eligible school-No program
## 1620                   4-Title I schoolwide eligible school-No program
## 1621                                       5-Title I schoolwide school
## 1622                              2-Title I targeted assistance school
## 1623                                                               n/a
## 1624                                            6-Not a Title I school
## 1625                                            6-Not a Title I school
## 1626                                            6-Not a Title I school
## 1627                                       5-Title I schoolwide school
## 1628                                            6-Not a Title I school
## 1629                                            6-Not a Title I school
## 1630                                       5-Title I schoolwide school
## 1631                                                               n/a
## 1632                                            6-Not a Title I school
## 1633                                            6-Not a Title I school
## 1634                                            6-Not a Title I school
## 1635                                            6-Not a Title I school
## 1636                                                               n/a
## 1637                                       5-Title I schoolwide school
## 1638                                       5-Title I schoolwide school
## 1639                                            6-Not a Title I school
## 1640                                                              <NA>
## 1641                                            6-Not a Title I school
## 1642                                                              <NA>
## 1643                                                              <NA>
## 1644          1-Title I targeted assistance eligible school-No program
## 1645                                            6-Not a Title I school
## 1646                                            6-Not a Title I school
## 1647                   4-Title I schoolwide eligible school-No program
## 1648                              2-Title I targeted assistance school
## 1649                                            6-Not a Title I school
## 1650                                            6-Not a Title I school
## 1651                                       5-Title I schoolwide school
## 1652                                            6-Not a Title I school
## 1653                                            6-Not a Title I school
## 1654                                            6-Not a Title I school
## 1655                                       5-Title I schoolwide school
## 1656                              2-Title I targeted assistance school
## 1657                                            6-Not a Title I school
## 1658                                                               n/a
## 1659                                                               n/a
## 1660                   4-Title I schoolwide eligible school-No program
## 1661                                            6-Not a Title I school
## 1662                                       5-Title I schoolwide school
## 1663                                            6-Not a Title I school
## 1664                                            6-Not a Title I school
## 1665                                            6-Not a Title I school
## 1666                                       5-Title I schoolwide school
## 1667                              2-Title I targeted assistance school
## 1668                              2-Title I targeted assistance school
## 1669                              2-Title I targeted assistance school
## 1670                                       5-Title I schoolwide school
## 1671                                       5-Title I schoolwide school
## 1672                                       5-Title I schoolwide school
## 1673                                       5-Title I schoolwide school
## 1674                                            6-Not a Title I school
## 1675                                            6-Not a Title I school
## 1676                                       5-Title I schoolwide school
## 1677                                                               n/a
## 1678                                            6-Not a Title I school
## 1679                                            6-Not a Title I school
## 1680                                            6-Not a Title I school
## 1681                                       5-Title I schoolwide school
## 1682                                            6-Not a Title I school
## 1683                   4-Title I schoolwide eligible school-No program
## 1684                                                               n/a
## 1685                                                               n/a
## 1686                                       5-Title I schoolwide school
## 1687                                            6-Not a Title I school
## 1688                                            6-Not a Title I school
## 1689                                            6-Not a Title I school
## 1690                                            6-Not a Title I school
## 1691                                            6-Not a Title I school
## 1692                                                               n/a
## 1693                                                               n/a
## 1694                                       5-Title I schoolwide school
## 1695                                            6-Not a Title I school
## 1696                                                               n/a
## 1697                                                               n/a
## 1698                                                               n/a
## 1699                                       5-Title I schoolwide school
## 1700                                            6-Not a Title I school
## 1701                                            6-Not a Title I school
## 1702                                            6-Not a Title I school
## 1703                                            6-Not a Title I school
## 1704                                            6-Not a Title I school
## 1705                                            6-Not a Title I school
## 1706                                            6-Not a Title I school
## 1707                                                               n/a
## 1708                                            6-Not a Title I school
## 1709                                                               n/a
## 1710                                            6-Not a Title I school
## 1711                                                               n/a
## 1712                                       5-Title I schoolwide school
## 1713                                                               n/a
## 1714                                            6-Not a Title I school
## 1715                                                               n/a
## 1716                                                               n/a
## 1717                                                               n/a
## 1718                                                               n/a
## 1719                                                               n/a
## 1720                              2-Title I targeted assistance school
## 1721                                       5-Title I schoolwide school
## 1722                              2-Title I targeted assistance school
## 1723                                            6-Not a Title I school
## 1724                                                               n/a
## 1725                                            6-Not a Title I school
## 1726                                                               n/a
## 1727                                            6-Not a Title I school
## 1728                                                               n/a
## 1729                                                               n/a
## 1730                                       5-Title I schoolwide school
## 1731                                            6-Not a Title I school
## 1732                              2-Title I targeted assistance school
## 1733                              2-Title I targeted assistance school
## 1734                                            6-Not a Title I school
## 1735                                                               n/a
## 1736                   4-Title I schoolwide eligible school-No program
## 1737                                            6-Not a Title I school
## 1738                                                               n/a
## 1739                                            6-Not a Title I school
## 1740                                                               n/a
## 1741                                            6-Not a Title I school
## 1742                                                               n/a
## 1743                                       5-Title I schoolwide school
## 1744                                       5-Title I schoolwide school
## 1745                                            6-Not a Title I school
## 1746                                       5-Title I schoolwide school
## 1747                                                               n/a
## 1748                                            6-Not a Title I school
## 1749                                                               n/a
## 1750                                                               n/a
## 1751                              2-Title I targeted assistance school
## 1752                                            6-Not a Title I school
## 1753                                       5-Title I schoolwide school
## 1754                                            6-Not a Title I school
## 1755                                            6-Not a Title I school
## 1756                                       5-Title I schoolwide school
## 1757                                                               n/a
## 1758                   4-Title I schoolwide eligible school-No program
## 1759                                            6-Not a Title I school
## 1760                                       5-Title I schoolwide school
## 1761                              2-Title I targeted assistance school
## 1762                              2-Title I targeted assistance school
## 1763                                            6-Not a Title I school
## 1764                   4-Title I schoolwide eligible school-No program
## 1765                              2-Title I targeted assistance school
## 1766                                            6-Not a Title I school
## 1767                              2-Title I targeted assistance school
## 1768                                       5-Title I schoolwide school
## 1769                   4-Title I schoolwide eligible school-No program
## 1770                                            6-Not a Title I school
## 1771                                            6-Not a Title I school
## 1772                                                               n/a
## 1773                   4-Title I schoolwide eligible school-No program
## 1774                                                               n/a
## 1775                                            6-Not a Title I school
## 1776          1-Title I targeted assistance eligible school-No program
## 1777                                                               n/a
## 1778                                            6-Not a Title I school
## 1779                                            6-Not a Title I school
## 1780                                       5-Title I schoolwide school
## 1781                                       5-Title I schoolwide school
## 1782                                                               n/a
## 1783                                                               n/a
## 1784                                            6-Not a Title I school
## 1785                                                               n/a
## 1786                                                               n/a
## 1787                                            6-Not a Title I school
## 1788                                            6-Not a Title I school
## 1789                   4-Title I schoolwide eligible school-No program
## 1790                                       5-Title I schoolwide school
## 1791          1-Title I targeted assistance eligible school-No program
## 1792                                            6-Not a Title I school
## 1793                              2-Title I targeted assistance school
## 1794                                            6-Not a Title I school
## 1795                                            6-Not a Title I school
## 1796                                            6-Not a Title I school
## 1797                                            6-Not a Title I school
## 1798                                       5-Title I schoolwide school
## 1799                                            6-Not a Title I school
## 1800                              2-Title I targeted assistance school
## 1801                                            6-Not a Title I school
## 1802                   4-Title I schoolwide eligible school-No program
## 1803          1-Title I targeted assistance eligible school-No program
## 1804                              2-Title I targeted assistance school
## 1805                                                               n/a
## 1806                   4-Title I schoolwide eligible school-No program
## 1807                                                               n/a
## 1808                                                               n/a
## 1809                                                               n/a
## 1810                                            6-Not a Title I school
## 1811                                            6-Not a Title I school
## 1812                                            6-Not a Title I school
## 1813                                            6-Not a Title I school
## 1814                                       5-Title I schoolwide school
## 1815                                       5-Title I schoolwide school
## 1816                   4-Title I schoolwide eligible school-No program
## 1817                              2-Title I targeted assistance school
## 1818                              2-Title I targeted assistance school
## 1819                              2-Title I targeted assistance school
## 1820                              2-Title I targeted assistance school
## 1821                                            6-Not a Title I school
## 1822                                            6-Not a Title I school
## 1823                                                               n/a
## 1824                                       5-Title I schoolwide school
## 1825                                       5-Title I schoolwide school
## 1826                                       5-Title I schoolwide school
## 1827                   4-Title I schoolwide eligible school-No program
## 1828                                       5-Title I schoolwide school
## 1829                   4-Title I schoolwide eligible school-No program
## 1830                                            6-Not a Title I school
## 1831                                       5-Title I schoolwide school
## 1832                   4-Title I schoolwide eligible school-No program
## 1833                   4-Title I schoolwide eligible school-No program
## 1834                                            6-Not a Title I school
## 1835                   4-Title I schoolwide eligible school-No program
## 1836                                            6-Not a Title I school
## 1837                                       5-Title I schoolwide school
## 1838                                            6-Not a Title I school
## 1839                                            6-Not a Title I school
## 1840                                       5-Title I schoolwide school
## 1841                              2-Title I targeted assistance school
## 1842                              2-Title I targeted assistance school
## 1843                                            6-Not a Title I school
## 1844                                                               n/a
## 1845                                            6-Not a Title I school
## 1846                                                               n/a
## 1847                                            6-Not a Title I school
## 1848                              2-Title I targeted assistance school
## 1849                                       5-Title I schoolwide school
## 1850                              2-Title I targeted assistance school
## 1851                              2-Title I targeted assistance school
## 1852                                       5-Title I schoolwide school
## 1853                                       5-Title I schoolwide school
## 1854                                            6-Not a Title I school
## 1855                   4-Title I schoolwide eligible school-No program
## 1856                                            6-Not a Title I school
## 1857                                                               n/a
## 1858                                       5-Title I schoolwide school
## 1859          1-Title I targeted assistance eligible school-No program
## 1860                                                               n/a
## 1861                                       5-Title I schoolwide school
## 1862                                            6-Not a Title I school
## 1863                                            6-Not a Title I school
## 1864          1-Title I targeted assistance eligible school-No program
## 1865                                            6-Not a Title I school
## 1866                   4-Title I schoolwide eligible school-No program
## 1867                                                               n/a
## 1868                                            6-Not a Title I school
## 1869                                                               n/a
## 1870                                            6-Not a Title I school
## 1871                                                               n/a
## 1872                                                               n/a
## 1873                                       5-Title I schoolwide school
## 1874                                       5-Title I schoolwide school
## 1875                   4-Title I schoolwide eligible school-No program
## 1876                                       5-Title I schoolwide school
## 1877                                            6-Not a Title I school
## 1878                                            6-Not a Title I school
## 1879                                            6-Not a Title I school
## 1880                                            6-Not a Title I school
## 1881                                                               n/a
## 1882                                            6-Not a Title I school
## 1883                                                               n/a
## 1884                                                              <NA>
## 1885                                            6-Not a Title I school
## 1886                                       5-Title I schoolwide school
## 1887                                       5-Title I schoolwide school
## 1888                                            6-Not a Title I school
## 1889                                       5-Title I schoolwide school
## 1890                   4-Title I schoolwide eligible school-No program
## 1891                                            6-Not a Title I school
## 1892                                            6-Not a Title I school
## 1893                                            6-Not a Title I school
## 1894                                       5-Title I schoolwide school
## 1895                                                               n/a
## 1896                                                               n/a
## 1897                                            6-Not a Title I school
## 1898                                            6-Not a Title I school
## 1899                                       5-Title I schoolwide school
## 1900                                       5-Title I schoolwide school
## 1901                                            6-Not a Title I school
## 1902                                       5-Title I schoolwide school
## 1903                                            6-Not a Title I school
## 1904                                       5-Title I schoolwide school
## 1905                                       5-Title I schoolwide school
## 1906                   4-Title I schoolwide eligible school-No program
## 1907                                                               n/a
## 1908                                       5-Title I schoolwide school
## 1909                                            6-Not a Title I school
## 1910                                       5-Title I schoolwide school
## 1911                              2-Title I targeted assistance school
## 1912                                       5-Title I schoolwide school
## 1913                                            6-Not a Title I school
## 1914                   4-Title I schoolwide eligible school-No program
## 1915                   4-Title I schoolwide eligible school-No program
## 1916                                       5-Title I schoolwide school
## 1917                                            6-Not a Title I school
## 1918                                            6-Not a Title I school
## 1919                                            6-Not a Title I school
## 1920                                                               n/a
## 1921                                                               n/a
## 1922                                                               n/a
## 1923                                       5-Title I schoolwide school
## 1924                                       5-Title I schoolwide school
## 1925                                            6-Not a Title I school
## 1926                                       5-Title I schoolwide school
## 1927                              2-Title I targeted assistance school
## 1928                                       5-Title I schoolwide school
## 1929                                            6-Not a Title I school
## 1930                                                               n/a
## 1931          1-Title I targeted assistance eligible school-No program
## 1932                                                               n/a
## 1933                                                               n/a
## 1934                                                               n/a
## 1935                                            6-Not a Title I school
## 1936                                            6-Not a Title I school
## 1937                   4-Title I schoolwide eligible school-No program
## 1938                                                               n/a
## 1939                                            6-Not a Title I school
## 1940          1-Title I targeted assistance eligible school-No program
## 1941                                                               n/a
## 1942                                       5-Title I schoolwide school
## 1943                                       5-Title I schoolwide school
## 1944                                       5-Title I schoolwide school
## 1945                                       5-Title I schoolwide school
## 1946                                            6-Not a Title I school
## 1947                                            6-Not a Title I school
## 1948                                       5-Title I schoolwide school
## 1949                                                              <NA>
## 1950                                       5-Title I schoolwide school
## 1951                                       5-Title I schoolwide school
## 1952                                                               n/a
## 1953                                            6-Not a Title I school
## 1954                                       5-Title I schoolwide school
## 1955                                       5-Title I schoolwide school
## 1956                                       5-Title I schoolwide school
## 1957                                            6-Not a Title I school
## 1958                                            6-Not a Title I school
## 1959                                            6-Not a Title I school
## 1960                                       5-Title I schoolwide school
## 1961                                            6-Not a Title I school
## 1962                                            6-Not a Title I school
## 1963                                       5-Title I schoolwide school
## 1964                                       5-Title I schoolwide school
## 1965                                                               n/a
## 1966                                                               n/a
## 1967                                                               n/a
## 1968                                                               n/a
## 1969                   4-Title I schoolwide eligible school-No program
## 1970          1-Title I targeted assistance eligible school-No program
## 1971                              2-Title I targeted assistance school
## 1972                              2-Title I targeted assistance school
## 1973                                                              <NA>
## 1974                                            6-Not a Title I school
## 1975                                       5-Title I schoolwide school
## 1976                                       5-Title I schoolwide school
## 1977                                                               n/a
## 1978                                       5-Title I schoolwide school
## 1979                                                               n/a
## 1980                                       5-Title I schoolwide school
## 1981                                            6-Not a Title I school
## 1982                                            6-Not a Title I school
## 1983                   4-Title I schoolwide eligible school-No program
## 1984                                            6-Not a Title I school
## 1985                                            6-Not a Title I school
## 1986                                       5-Title I schoolwide school
## 1987                   4-Title I schoolwide eligible school-No program
## 1988                              2-Title I targeted assistance school
## 1989                                            6-Not a Title I school
## 1990                                                               n/a
## 1991                                            6-Not a Title I school
## 1992                                                               n/a
## 1993                                                               n/a
## 1994                                       5-Title I schoolwide school
## 1995                                       5-Title I schoolwide school
## 1996                                       5-Title I schoolwide school
## 1997                                                               n/a
## 1998                                       5-Title I schoolwide school
## 1999                                                               n/a
## 2000                                            6-Not a Title I school
## 2001                   4-Title I schoolwide eligible school-No program
## 2002                                            6-Not a Title I school
## 2003                                            6-Not a Title I school
## 2004                   4-Title I schoolwide eligible school-No program
## 2005                                                               n/a
## 2006                                            6-Not a Title I school
## 2007                                                               n/a
## 2008                                                               n/a
## 2009                                            6-Not a Title I school
## 2010                                                               n/a
## 2011                                            6-Not a Title I school
## 2012                                            6-Not a Title I school
## 2013                                                               n/a
## 2014                                            6-Not a Title I school
## 2015                                            6-Not a Title I school
## 2016                                                              <NA>
## 2017                                            6-Not a Title I school
## 2018                   4-Title I schoolwide eligible school-No program
## 2019                                            6-Not a Title I school
## 2020          1-Title I targeted assistance eligible school-No program
## 2021                                            6-Not a Title I school
## 2022                                            6-Not a Title I school
## 2023                                       5-Title I schoolwide school
## 2024                                            6-Not a Title I school
## 2025                   4-Title I schoolwide eligible school-No program
## 2026                                       5-Title I schoolwide school
## 2027                                       5-Title I schoolwide school
## 2028                                                               n/a
## 2029                                                               n/a
## 2030                                            6-Not a Title I school
## 2031                                                              <NA>
## 2032          1-Title I targeted assistance eligible school-No program
## 2033                   4-Title I schoolwide eligible school-No program
## 2034                                            6-Not a Title I school
## 2035                                            6-Not a Title I school
## 2036                                       5-Title I schoolwide school
## 2037                                       5-Title I schoolwide school
## 2038                                                               n/a
## 2039                                            6-Not a Title I school
## 2040                                       5-Title I schoolwide school
## 2041                                                               n/a
## 2042                                            6-Not a Title I school
## 2043                                                               n/a
## 2044 3-Title I schoolwide eligible-Title I targeted assistance program
## 2045                                            6-Not a Title I school
## 2046                                            6-Not a Title I school
## 2047                                       5-Title I schoolwide school
## 2048                   4-Title I schoolwide eligible school-No program
## 2049                                       5-Title I schoolwide school
## 2050                                            6-Not a Title I school
## 2051                   4-Title I schoolwide eligible school-No program
## 2052                                            6-Not a Title I school
## 2053                                            6-Not a Title I school
## 2054                                            6-Not a Title I school
## 2055                                                               n/a
## 2056                                                               n/a
## 2057                                                               n/a
## 2058                                            6-Not a Title I school
## 2059                                                               n/a
## 2060                                       5-Title I schoolwide school
## 2061                                                               n/a
## 2062                   4-Title I schoolwide eligible school-No program
## 2063                                            6-Not a Title I school
## 2064                                                               n/a
## 2065                                            6-Not a Title I school
## 2066                                            6-Not a Title I school
## 2067                              2-Title I targeted assistance school
## 2068                              2-Title I targeted assistance school
## 2069                              2-Title I targeted assistance school
## 2070                                            6-Not a Title I school
## 2071                   4-Title I schoolwide eligible school-No program
## 2072                                            6-Not a Title I school
## 2073                                            6-Not a Title I school
## 2074                              2-Title I targeted assistance school
## 2075                                            6-Not a Title I school
## 2076                                       5-Title I schoolwide school
## 2077                                                               n/a
## 2078                                                               n/a
## 2079                                                               n/a
## 2080                                                               n/a
## 2081                                            6-Not a Title I school
## 2082                                                               n/a
## 2083                                            6-Not a Title I school
## 2084                                            6-Not a Title I school
## 2085                                            6-Not a Title I school
## 2086                                       5-Title I schoolwide school
## 2087                                                               n/a
## 2088                                                               n/a
## 2089                                            6-Not a Title I school
## 2090                                       5-Title I schoolwide school
## 2091          1-Title I targeted assistance eligible school-No program
## 2092                                                               n/a
## 2093                                            6-Not a Title I school
## 2094                                                               n/a
## 2095                                                               n/a
## 2096                                            6-Not a Title I school
## 2097                                            6-Not a Title I school
## 2098                                            6-Not a Title I school
## 2099                                            6-Not a Title I school
## 2100                                                               n/a
## 2101                                       5-Title I schoolwide school
## 2102                                       5-Title I schoolwide school
## 2103                                       5-Title I schoolwide school
## 2104                   4-Title I schoolwide eligible school-No program
## 2105                                            6-Not a Title I school
## 2106                                            6-Not a Title I school
## 2107                                            6-Not a Title I school
## 2108                                                               n/a
## 2109                   4-Title I schoolwide eligible school-No program
## 2110                                                              <NA>
## 2111                                            6-Not a Title I school
## 2112                              2-Title I targeted assistance school
## 2113                              2-Title I targeted assistance school
## 2114                                                               n/a
## 2115                   4-Title I schoolwide eligible school-No program
## 2116                                       5-Title I schoolwide school
## 2117                                            6-Not a Title I school
## 2118                                                               n/a
## 2119                                            6-Not a Title I school
## 2120                                                               n/a
## 2121                                                               n/a
## 2122                                                               n/a
## 2123                                            6-Not a Title I school
## 2124                                                               n/a
## 2125                                                               n/a
## 2126                   4-Title I schoolwide eligible school-No program
## 2127                                       5-Title I schoolwide school
## 2128                                            6-Not a Title I school
## 2129                                            6-Not a Title I school
## 2130                   4-Title I schoolwide eligible school-No program
## 2131                              2-Title I targeted assistance school
## 2132                              2-Title I targeted assistance school
## 2133                                            6-Not a Title I school
## 2134                   4-Title I schoolwide eligible school-No program
## 2135                   4-Title I schoolwide eligible school-No program
## 2136                                       5-Title I schoolwide school
## 2137                                            6-Not a Title I school
## 2138                   4-Title I schoolwide eligible school-No program
## 2139                                            6-Not a Title I school
## 2140                   4-Title I schoolwide eligible school-No program
## 2141                                       5-Title I schoolwide school
## 2142                   4-Title I schoolwide eligible school-No program
## 2143                   4-Title I schoolwide eligible school-No program
## 2144                                       5-Title I schoolwide school
## 2145                                       5-Title I schoolwide school
## 2146                                                               n/a
## 2147                                            6-Not a Title I school
## 2148                                                               n/a
## 2149                                                               n/a
## 2150          1-Title I targeted assistance eligible school-No program
## 2151                                       5-Title I schoolwide school
## 2152                                                               n/a
## 2153                                            6-Not a Title I school
## 2154                                       5-Title I schoolwide school
## 2155                   4-Title I schoolwide eligible school-No program
## 2156                                       5-Title I schoolwide school
## 2157                                                               n/a
## 2158                                       5-Title I schoolwide school
## 2159                                       5-Title I schoolwide school
## 2160                                       5-Title I schoolwide school
## 2161                                            6-Not a Title I school
## 2162                                       5-Title I schoolwide school
## 2163                              2-Title I targeted assistance school
## 2164                              2-Title I targeted assistance school
## 2165                                            6-Not a Title I school
## 2166                                       5-Title I schoolwide school
## 2167                   4-Title I schoolwide eligible school-No program
## 2168                   4-Title I schoolwide eligible school-No program
## 2169                                                               n/a
## 2170                                            6-Not a Title I school
## 2171                                                               n/a
## 2172                                            6-Not a Title I school
## 2173                                                               n/a
## 2174                                            6-Not a Title I school
## 2175                                            6-Not a Title I school
## 2176                                            6-Not a Title I school
## 2177                                                               n/a
## 2178                                            6-Not a Title I school
## 2179 3-Title I schoolwide eligible-Title I targeted assistance program
## 2180                                            6-Not a Title I school
## 2181                                                               n/a
## 2182                              2-Title I targeted assistance school
## 2183                                                               n/a
## 2184          1-Title I targeted assistance eligible school-No program
## 2185                   4-Title I schoolwide eligible school-No program
## 2186                                            6-Not a Title I school
## 2187                                            6-Not a Title I school
## 2188                                            6-Not a Title I school
## 2189                                                               n/a
## 2190                                                               n/a
## 2191                                       5-Title I schoolwide school
## 2192                                                               n/a
## 2193                                       5-Title I schoolwide school
## 2194                                            6-Not a Title I school
## 2195                              2-Title I targeted assistance school
## 2196                                            6-Not a Title I school
## 2197                                            6-Not a Title I school
## 2198                                                               n/a
## 2199                                            6-Not a Title I school
## 2200                                            6-Not a Title I school
## 2201                                            6-Not a Title I school
## 2202                                            6-Not a Title I school
## 2203                                            6-Not a Title I school
## 2204                                            6-Not a Title I school
## 2205                                            6-Not a Title I school
## 2206                                                               n/a
## 2207                   4-Title I schoolwide eligible school-No program
## 2208                                            6-Not a Title I school
## 2209                                                               n/a
## 2210                   4-Title I schoolwide eligible school-No program
## 2211                                       5-Title I schoolwide school
## 2212                                                               n/a
## 2213                                                               n/a
## 2214                                                               n/a
## 2215                                                               n/a
## 2216                                            6-Not a Title I school
## 2217                                                               n/a
## 2218                                            6-Not a Title I school
## 2219                                                               n/a
## 2220          1-Title I targeted assistance eligible school-No program
## 2221                                       5-Title I schoolwide school
## 2222                                                               n/a
## 2223                                                               n/a
## 2224                                                               n/a
## 2225                                                               n/a
## 2226                                                               n/a
## 2227                                            6-Not a Title I school
## 2228                                            6-Not a Title I school
## 2229                                       5-Title I schoolwide school
## 2230                                                               n/a
## 2231                                            6-Not a Title I school
## 2232                                       5-Title I schoolwide school
## 2233                                            6-Not a Title I school
## 2234          1-Title I targeted assistance eligible school-No program
## 2235                              2-Title I targeted assistance school
## 2236          1-Title I targeted assistance eligible school-No program
## 2237                                            6-Not a Title I school
## 2238                                       5-Title I schoolwide school
## 2239                                            6-Not a Title I school
## 2240                              2-Title I targeted assistance school
## 2241                              2-Title I targeted assistance school
## 2242                                            6-Not a Title I school
## 2243                                                               n/a
## 2244                                                               n/a
## 2245                                            6-Not a Title I school
## 2246                                       5-Title I schoolwide school
## 2247                                                               n/a
## 2248                                            6-Not a Title I school
## 2249                                            6-Not a Title I school
## 2250                                            6-Not a Title I school
## 2251 3-Title I schoolwide eligible-Title I targeted assistance program
## 2252                                            6-Not a Title I school
## 2253                                            6-Not a Title I school
## 2254                                            6-Not a Title I school
## 2255                                       5-Title I schoolwide school
## 2256                                            6-Not a Title I school
## 2257                                                               n/a
## 2258                                                               n/a
## 2259                                                               n/a
## 2260                                                               n/a
## 2261                                            6-Not a Title I school
## 2262                   4-Title I schoolwide eligible school-No program
## 2263                                            6-Not a Title I school
## 2264                                            6-Not a Title I school
## 2265                   4-Title I schoolwide eligible school-No program
## 2266                                            6-Not a Title I school
## 2267                   4-Title I schoolwide eligible school-No program
## 2268                                            6-Not a Title I school
## 2269                                                               n/a
## 2270                              2-Title I targeted assistance school
## 2271                              2-Title I targeted assistance school
## 2272                                                               n/a
## 2273                                            6-Not a Title I school
## 2274                   4-Title I schoolwide eligible school-No program
## 2275                                       5-Title I schoolwide school
## 2276                                       5-Title I schoolwide school
## 2277                                            6-Not a Title I school
## 2278                                                               n/a
## 2279                                            6-Not a Title I school
## 2280                                       5-Title I schoolwide school
## 2281                                                               n/a
## 2282                                            6-Not a Title I school
## 2283                                            6-Not a Title I school
## 2284                                            6-Not a Title I school
## 2285                   4-Title I schoolwide eligible school-No program
## 2286                                       5-Title I schoolwide school
## 2287                                                               n/a
## 2288                   4-Title I schoolwide eligible school-No program
## 2289                                       5-Title I schoolwide school
## 2290                                            6-Not a Title I school
## 2291                                            6-Not a Title I school
## 2292                                            6-Not a Title I school
## 2293                                            6-Not a Title I school
## 2294                                            6-Not a Title I school
## 2295                                            6-Not a Title I school
## 2296                                            6-Not a Title I school
## 2297                                            6-Not a Title I school
## 2298                                            6-Not a Title I school
## 2299                                            6-Not a Title I school
## 2300                                                               n/a
## 2301                                       5-Title I schoolwide school
## 2302                                       5-Title I schoolwide school
## 2303                                       5-Title I schoolwide school
## 2304                                                               n/a
## 2305                                       5-Title I schoolwide school
## 2306                                                               n/a
## 2307                   4-Title I schoolwide eligible school-No program
## 2308                                                               n/a
## 2309                                                               n/a
## 2310                                                               n/a
## 2311                                                               n/a
## 2312                                                               n/a
## 2313          1-Title I targeted assistance eligible school-No program
## 2314                                                               n/a
## 2315                                            6-Not a Title I school
## 2316                   4-Title I schoolwide eligible school-No program
## 2317                                                               n/a
## 2318                                                               n/a
## 2319                                       5-Title I schoolwide school
## 2320                                       5-Title I schoolwide school
## 2321                                            6-Not a Title I school
## 2322                                            6-Not a Title I school
## 2323                                            6-Not a Title I school
## 2324                                       5-Title I schoolwide school
## 2325                                            6-Not a Title I school
## 2326                              2-Title I targeted assistance school
## 2327                              2-Title I targeted assistance school
## 2328                                            6-Not a Title I school
## 2329                                                               n/a
## 2330                                            6-Not a Title I school
## 2331                   4-Title I schoolwide eligible school-No program
## 2332                   4-Title I schoolwide eligible school-No program
## 2333                                                               n/a
## 2334                                       5-Title I schoolwide school
## 2335                                            6-Not a Title I school
## 2336                                            6-Not a Title I school
## 2337                                            6-Not a Title I school
## 2338                                            6-Not a Title I school
## 2339                                            6-Not a Title I school
## 2340                                                               n/a
## 2341                                            6-Not a Title I school
## 2342                                            6-Not a Title I school
## 2343                                            6-Not a Title I school
## 2344                                                               n/a
## 2345          1-Title I targeted assistance eligible school-No program
## 2346                   4-Title I schoolwide eligible school-No program
## 2347                                            6-Not a Title I school
## 2348                                                               n/a
## 2349                                       5-Title I schoolwide school
## 2350                              2-Title I targeted assistance school
## 2351                                            6-Not a Title I school
## 2352                                                               n/a
## 2353 3-Title I schoolwide eligible-Title I targeted assistance program
## 2354                                       5-Title I schoolwide school
## 2355                              2-Title I targeted assistance school
## 2356                              2-Title I targeted assistance school
## 2357                                            6-Not a Title I school
## 2358          1-Title I targeted assistance eligible school-No program
## 2359                                            6-Not a Title I school
## 2360                                            6-Not a Title I school
## 2361          1-Title I targeted assistance eligible school-No program
## 2362                                            6-Not a Title I school
## 2363                                       5-Title I schoolwide school
## 2364                                       5-Title I schoolwide school
## 2365                                       5-Title I schoolwide school
## 2366                                            6-Not a Title I school
## 2367                                                               n/a
## 2368                                       5-Title I schoolwide school
## 2369                   4-Title I schoolwide eligible school-No program
## 2370                                                               n/a
## 2371                                       5-Title I schoolwide school
## 2372                                                               n/a
## 2373                                            6-Not a Title I school
## 2374                                                               n/a
## 2375                                            6-Not a Title I school
## 2376                                            6-Not a Title I school
## 2377                                            6-Not a Title I school
## 2378                                            6-Not a Title I school
## 2379                                            6-Not a Title I school
## 2380                                       5-Title I schoolwide school
## 2381                   4-Title I schoolwide eligible school-No program
## 2382                              2-Title I targeted assistance school
## 2383                                            6-Not a Title I school
## 2384                                       5-Title I schoolwide school
## 2385          1-Title I targeted assistance eligible school-No program
## 2386                                                               n/a
## 2387                              2-Title I targeted assistance school
## 2388                   4-Title I schoolwide eligible school-No program
## 2389                                            6-Not a Title I school
## 2390                                            6-Not a Title I school
## 2391                                       5-Title I schoolwide school
## 2392                                            6-Not a Title I school
## 2393                                            6-Not a Title I school
## 2394                                       5-Title I schoolwide school
## 2395                              2-Title I targeted assistance school
## 2396                                                               n/a
## 2397                                            6-Not a Title I school
## 2398                                       5-Title I schoolwide school
## 2399                                            6-Not a Title I school
## 2400                                            6-Not a Title I school
## 2401                                            6-Not a Title I school
## 2402                                            6-Not a Title I school
## 2403                                            6-Not a Title I school
## 2404                                            6-Not a Title I school
## 2405                                       5-Title I schoolwide school
## 2406                                                               n/a
## 2407                   4-Title I schoolwide eligible school-No program
## 2408                                            6-Not a Title I school
## 2409                                            6-Not a Title I school
## 2410                                                               n/a
## 2411                              2-Title I targeted assistance school
## 2412                              2-Title I targeted assistance school
## 2413                   4-Title I schoolwide eligible school-No program
## 2414                                       5-Title I schoolwide school
## 2415                                                               n/a
## 2416                                            6-Not a Title I school
## 2417                                                               n/a
## 2418                                            6-Not a Title I school
## 2419          1-Title I targeted assistance eligible school-No program
## 2420          1-Title I targeted assistance eligible school-No program
## 2421                   4-Title I schoolwide eligible school-No program
## 2422                              2-Title I targeted assistance school
## 2423                                       5-Title I schoolwide school
## 2424                                                               n/a
## 2425                                                               n/a
## 2426                              2-Title I targeted assistance school
## 2427                              2-Title I targeted assistance school
## 2428                                                               n/a
## 2429                              2-Title I targeted assistance school
## 2430                                       5-Title I schoolwide school
## 2431                                            6-Not a Title I school
## 2432                                                               n/a
## 2433                                            6-Not a Title I school
## 2434                                                               n/a
## 2435                                            6-Not a Title I school
## 2436                                                               n/a
## 2437                   4-Title I schoolwide eligible school-No program
## 2438                                                              <NA>
## 2439                   4-Title I schoolwide eligible school-No program
## 2440                                       5-Title I schoolwide school
## 2441                   4-Title I schoolwide eligible school-No program
## 2442                                                               n/a
## 2443                                       5-Title I schoolwide school
## 2444                                       5-Title I schoolwide school
## 2445                                       5-Title I schoolwide school
## 2446                                            6-Not a Title I school
## 2447                                            6-Not a Title I school
## 2448                                       5-Title I schoolwide school
## 2449                                            6-Not a Title I school
## 2450                   4-Title I schoolwide eligible school-No program
## 2451                                            6-Not a Title I school
## 2452                                                               n/a
## 2453                                                               n/a
## 2454                                            6-Not a Title I school
## 2455                                            6-Not a Title I school
## 2456                                            6-Not a Title I school
## 2457                                            6-Not a Title I school
## 2458                                                               n/a
## 2459                                                               n/a
## 2460                                                               n/a
## 2461                                            6-Not a Title I school
## 2462                                            6-Not a Title I school
## 2463                   4-Title I schoolwide eligible school-No program
## 2464                                       5-Title I schoolwide school
## 2465                                                               n/a
## 2466                   4-Title I schoolwide eligible school-No program
## 2467          1-Title I targeted assistance eligible school-No program
## 2468                                            6-Not a Title I school
## 2469                                       5-Title I schoolwide school
## 2470                                                              <NA>
## 2471                                       5-Title I schoolwide school
## 2472                              2-Title I targeted assistance school
## 2473                                       5-Title I schoolwide school
## 2474                                       5-Title I schoolwide school
## 2475                                                               n/a
## 2476                                                               n/a
## 2477                                                               n/a
## 2478                                                               n/a
## 2479                                                               n/a
## 2480                                                               n/a
## 2481                                       5-Title I schoolwide school
## 2482                                            6-Not a Title I school
## 2483          1-Title I targeted assistance eligible school-No program
## 2484                                                               n/a
## 2485                                            6-Not a Title I school
## 2486                                                               n/a
## 2487                                                               n/a
## 2488                                            6-Not a Title I school
## 2489                                            6-Not a Title I school
## 2490                                                               n/a
## 2491                                                               n/a
## 2492                                                               n/a
## 2493                                            6-Not a Title I school
## 2494          1-Title I targeted assistance eligible school-No program
## 2495                   4-Title I schoolwide eligible school-No program
## 2496                                       5-Title I schoolwide school
## 2497                                                               n/a
## 2498                                                               n/a
## 2499                                            6-Not a Title I school
## 2500                                            6-Not a Title I school
## 2501                                       5-Title I schoolwide school
## 2502 3-Title I schoolwide eligible-Title I targeted assistance program
## 2503                                                               n/a
## 2504                                       5-Title I schoolwide school
## 2505                                       5-Title I schoolwide school
## 2506 3-Title I schoolwide eligible-Title I targeted assistance program
## 2507                                       5-Title I schoolwide school
## 2508                                       5-Title I schoolwide school
## 2509 3-Title I schoolwide eligible-Title I targeted assistance program
## 2510                                                              <NA>
## 2511                                            6-Not a Title I school
## 2512                                                               n/a
## 2513                                                               n/a
## 2514                                                               n/a
## 2515                                                               n/a
## 2516                                            6-Not a Title I school
## 2517                                            6-Not a Title I school
## 2518                                            6-Not a Title I school
## 2519                                            6-Not a Title I school
## 2520                                                               n/a
## 2521                                            6-Not a Title I school
## 2522                                            6-Not a Title I school
## 2523                                            6-Not a Title I school
## 2524                                            6-Not a Title I school
## 2525                                                              <NA>
## 2526                              2-Title I targeted assistance school
## 2527                                       5-Title I schoolwide school
## 2528                                                               n/a
## 2529                                       5-Title I schoolwide school
## 2530                                            6-Not a Title I school
## 2531                                            6-Not a Title I school
## 2532                                       5-Title I schoolwide school
## 2533                                       5-Title I schoolwide school
## 2534                                                               n/a
## 2535                                       5-Title I schoolwide school
## 2536                                            6-Not a Title I school
## 2537                                                               n/a
## 2538                                       5-Title I schoolwide school
## 2539                                       5-Title I schoolwide school
## 2540                                            6-Not a Title I school
## 2541                   4-Title I schoolwide eligible school-No program
## 2542                                            6-Not a Title I school
## 2543                                                               n/a
## 2544                                            6-Not a Title I school
## 2545                   4-Title I schoolwide eligible school-No program
## 2546                                                               n/a
## 2547                                            6-Not a Title I school
## 2548          1-Title I targeted assistance eligible school-No program
## 2549                                                               n/a
## 2550                                            6-Not a Title I school
## 2551                                       5-Title I schoolwide school
## 2552                   4-Title I schoolwide eligible school-No program
## 2553                   4-Title I schoolwide eligible school-No program
## 2554                                       5-Title I schoolwide school
## 2555                                       5-Title I schoolwide school
## 2556                                       5-Title I schoolwide school
## 2557                                                               n/a
## 2558                   4-Title I schoolwide eligible school-No program
## 2559          1-Title I targeted assistance eligible school-No program
## 2560                   4-Title I schoolwide eligible school-No program
## 2561                   4-Title I schoolwide eligible school-No program
## 2562                                       5-Title I schoolwide school
## 2563                                       5-Title I schoolwide school
## 2564          1-Title I targeted assistance eligible school-No program
## 2565                              2-Title I targeted assistance school
## 2566                   4-Title I schoolwide eligible school-No program
## 2567                                            6-Not a Title I school
## 2568                                            6-Not a Title I school
## 2569                                            6-Not a Title I school
## 2570                                            6-Not a Title I school
## 2571                                                               n/a
## 2572                                            6-Not a Title I school
## 2573                                            6-Not a Title I school
## 2574                                            6-Not a Title I school
## 2575                                                               n/a
## 2576                                                               n/a
## 2577                                            6-Not a Title I school
## 2578                                            6-Not a Title I school
## 2579                                            6-Not a Title I school
## 2580                                            6-Not a Title I school
## 2581                                            6-Not a Title I school
## 2582                                                               n/a
## 2583                                            6-Not a Title I school
## 2584                                            6-Not a Title I school
## 2585                                            6-Not a Title I school
## 2586                                            6-Not a Title I school
## 2587                   4-Title I schoolwide eligible school-No program
## 2588                                            6-Not a Title I school
## 2589                                                              <NA>
## 2590                                       5-Title I schoolwide school
## 2591                                            6-Not a Title I school
## 2592                                            6-Not a Title I school
## 2593                                            6-Not a Title I school
## 2594                                            6-Not a Title I school
## 2595                                            6-Not a Title I school
## 2596                                                               n/a
## 2597                                            6-Not a Title I school
## 2598                   4-Title I schoolwide eligible school-No program
## 2599                                                               n/a
## 2600                                                               n/a
## 2601                                            6-Not a Title I school
## 2602                                            6-Not a Title I school
## 2603                                                              <NA>
## 2604                                                               n/a
## 2605                                            6-Not a Title I school
## 2606                                       5-Title I schoolwide school
## 2607                                                               n/a
## 2608                                            6-Not a Title I school
## 2609                                            6-Not a Title I school
## 2610                                                               n/a
## 2611                                            6-Not a Title I school
## 2612                                                               n/a
## 2613                                            6-Not a Title I school
## 2614                                            6-Not a Title I school
## 2615                                            6-Not a Title I school
## 2616                                                               n/a
## 2617                   4-Title I schoolwide eligible school-No program
## 2618                                       5-Title I schoolwide school
## 2619                                       5-Title I schoolwide school
## 2620                                            6-Not a Title I school
## 2621                                            6-Not a Title I school
## 2622                                                               n/a
## 2623                                       5-Title I schoolwide school
## 2624                                                               n/a
## 2625                                            6-Not a Title I school
## 2626                              2-Title I targeted assistance school
## 2627                                            6-Not a Title I school
## 2628                                                               n/a
## 2629                   4-Title I schoolwide eligible school-No program
## 2630                                                               n/a
## 2631                                                               n/a
## 2632                                            6-Not a Title I school
## 2633                                            6-Not a Title I school
## 2634                   4-Title I schoolwide eligible school-No program
## 2635                                                               n/a
## 2636                                                               n/a
## 2637                                            6-Not a Title I school
## 2638                                       5-Title I schoolwide school
## 2639                              2-Title I targeted assistance school
## 2640                                                               n/a
## 2641                                            6-Not a Title I school
## 2642                                       5-Title I schoolwide school
## 2643                   4-Title I schoolwide eligible school-No program
## 2644                   4-Title I schoolwide eligible school-No program
## 2645                                       5-Title I schoolwide school
## 2646                   4-Title I schoolwide eligible school-No program
## 2647                                       5-Title I schoolwide school
## 2648                                            6-Not a Title I school
## 2649                                            6-Not a Title I school
## 2650                                       5-Title I schoolwide school
## 2651                                       5-Title I schoolwide school
## 2652                                       5-Title I schoolwide school
## 2653                                       5-Title I schoolwide school
## 2654                              2-Title I targeted assistance school
## 2655                                       5-Title I schoolwide school
## 2656                   4-Title I schoolwide eligible school-No program
## 2657                                       5-Title I schoolwide school
## 2658                              2-Title I targeted assistance school
## 2659                                       5-Title I schoolwide school
## 2660                                                               n/a
## 2661                                       5-Title I schoolwide school
## 2662                                            6-Not a Title I school
## 2663                                            6-Not a Title I school
## 2664                                                               n/a
## 2665                                            6-Not a Title I school
## 2666                                                               n/a
## 2667                              2-Title I targeted assistance school
## 2668                                            6-Not a Title I school
## 2669                                            6-Not a Title I school
## 2670                                            6-Not a Title I school
## 2671                                                               n/a
## 2672                                       5-Title I schoolwide school
## 2673                                       5-Title I schoolwide school
## 2674                                            6-Not a Title I school
## 2675                                                               n/a
## 2676 3-Title I schoolwide eligible-Title I targeted assistance program
## 2677          1-Title I targeted assistance eligible school-No program
## 2678                                            6-Not a Title I school
## 2679                                            6-Not a Title I school
## 2680                                            6-Not a Title I school
## 2681                                            6-Not a Title I school
## 2682                              2-Title I targeted assistance school
## 2683                              2-Title I targeted assistance school
## 2684                                            6-Not a Title I school
## 2685                                       5-Title I schoolwide school
## 2686                                       5-Title I schoolwide school
## 2687                              2-Title I targeted assistance school
## 2688                                       5-Title I schoolwide school
## 2689                                                               n/a
## 2690                                       5-Title I schoolwide school
## 2691                   4-Title I schoolwide eligible school-No program
## 2692                                       5-Title I schoolwide school
## 2693                                                               n/a
## 2694                              2-Title I targeted assistance school
## 2695                                            6-Not a Title I school
## 2696                   4-Title I schoolwide eligible school-No program
## 2697                   4-Title I schoolwide eligible school-No program
## 2698                                       5-Title I schoolwide school
## 2699                                            6-Not a Title I school
## 2700                                                               n/a
## 2701                                                               n/a
## 2702                                            6-Not a Title I school
## 2703                                            6-Not a Title I school
## 2704                   4-Title I schoolwide eligible school-No program
## 2705          1-Title I targeted assistance eligible school-No program
## 2706                                       5-Title I schoolwide school
## 2707                                       5-Title I schoolwide school
## 2708                                                               n/a
## 2709                                                               n/a
## 2710                                            6-Not a Title I school
## 2711                                            6-Not a Title I school
## 2712                                       5-Title I schoolwide school
## 2713                                            6-Not a Title I school
## 2714                                            6-Not a Title I school
## 2715                                            6-Not a Title I school
## 2716                                                               n/a
## 2717                              2-Title I targeted assistance school
## 2718                                            6-Not a Title I school
## 2719                                            6-Not a Title I school
## 2720                                       5-Title I schoolwide school
## 2721                   4-Title I schoolwide eligible school-No program
## 2722                              2-Title I targeted assistance school
## 2723                                            6-Not a Title I school
## 2724                                       5-Title I schoolwide school
## 2725                                                               n/a
## 2726                                                               n/a
## 2727                   4-Title I schoolwide eligible school-No program
## 2728                                       5-Title I schoolwide school
## 2729                                                               n/a
## 2730                                            6-Not a Title I school
## 2731                                                               n/a
## 2732                   4-Title I schoolwide eligible school-No program
## 2733                                            6-Not a Title I school
## 2734                                                               n/a
## 2735                                                               n/a
## 2736                                       5-Title I schoolwide school
## 2737                                            6-Not a Title I school
## 2738                                            6-Not a Title I school
## 2739                                            6-Not a Title I school
## 2740                                       5-Title I schoolwide school
## 2741                                                               n/a
## 2742          1-Title I targeted assistance eligible school-No program
## 2743                                            6-Not a Title I school
## 2744                                                               n/a
## 2745                                                               n/a
## 2746                                            6-Not a Title I school
## 2747                                                               n/a
## 2748                                            6-Not a Title I school
## 2749                                                               n/a
## 2750                   4-Title I schoolwide eligible school-No program
## 2751                                                               n/a
## 2752                   4-Title I schoolwide eligible school-No program
## 2753                   4-Title I schoolwide eligible school-No program
## 2754                                       5-Title I schoolwide school
## 2755                                            6-Not a Title I school
## 2756                                       5-Title I schoolwide school
## 2757                                       5-Title I schoolwide school
## 2758                                                               n/a
## 2759                                            6-Not a Title I school
## 2760                              2-Title I targeted assistance school
## 2761                                       5-Title I schoolwide school
## 2762                   4-Title I schoolwide eligible school-No program
## 2763                                            6-Not a Title I school
## 2764                                            6-Not a Title I school
## 2765                                       5-Title I schoolwide school
## 2766                                                               n/a
## 2767                                                               n/a
## 2768                                            6-Not a Title I school
## 2769                                            6-Not a Title I school
## 2770          1-Title I targeted assistance eligible school-No program
## 2771                                            6-Not a Title I school
## 2772                                                               n/a
## 2773                                            6-Not a Title I school
## 2774                                            6-Not a Title I school
## 2775                   4-Title I schoolwide eligible school-No program
## 2776                   4-Title I schoolwide eligible school-No program
## 2777                                       5-Title I schoolwide school
## 2778                                       5-Title I schoolwide school
## 2779                                            6-Not a Title I school
## 2780                                            6-Not a Title I school
## 2781                                            6-Not a Title I school
## 2782                                       5-Title I schoolwide school
## 2783                                            6-Not a Title I school
## 2784                                            6-Not a Title I school
## 2785                                            6-Not a Title I school
## 2786                                            6-Not a Title I school
## 2787                   4-Title I schoolwide eligible school-No program
## 2788                                       5-Title I schoolwide school
## 2789                                            6-Not a Title I school
## 2790                                       5-Title I schoolwide school
## 2791                   4-Title I schoolwide eligible school-No program
## 2792                                                               n/a
## 2793                   4-Title I schoolwide eligible school-No program
## 2794                                                               n/a
## 2795          1-Title I targeted assistance eligible school-No program
## 2796                                                               n/a
## 2797                   4-Title I schoolwide eligible school-No program
## 2798                                       5-Title I schoolwide school
## 2799                                            6-Not a Title I school
## 2800          1-Title I targeted assistance eligible school-No program
## 2801          1-Title I targeted assistance eligible school-No program
## 2802                                       5-Title I schoolwide school
## 2803          1-Title I targeted assistance eligible school-No program
## 2804                                       5-Title I schoolwide school
## 2805                                            6-Not a Title I school
## 2806                                            6-Not a Title I school
## 2807                              2-Title I targeted assistance school
## 2808                                                               n/a
## 2809                                       5-Title I schoolwide school
## 2810                                            6-Not a Title I school
## 2811                                                               n/a
## 2812                                            6-Not a Title I school
## 2813                                            6-Not a Title I school
## 2814                                       5-Title I schoolwide school
## 2815                                            6-Not a Title I school
## 2816                                            6-Not a Title I school
## 2817                                            6-Not a Title I school
## 2818                              2-Title I targeted assistance school
## 2819                                       5-Title I schoolwide school
## 2820                   4-Title I schoolwide eligible school-No program
## 2821                                            6-Not a Title I school
## 2822                                            6-Not a Title I school
## 2823                   4-Title I schoolwide eligible school-No program
## 2824                                                               n/a
## 2825                                            6-Not a Title I school
## 2826                                                               n/a
## 2827                              2-Title I targeted assistance school
## 2828                                                               n/a
## 2829                                       5-Title I schoolwide school
## 2830          1-Title I targeted assistance eligible school-No program
## 2831                                            6-Not a Title I school
## 2832                   4-Title I schoolwide eligible school-No program
## 2833                                       5-Title I schoolwide school
## 2834                              2-Title I targeted assistance school
## 2835          1-Title I targeted assistance eligible school-No program
## 2836                                            6-Not a Title I school
## 2837                                            6-Not a Title I school
## 2838                                            6-Not a Title I school
## 2839                                            6-Not a Title I school
## 2840                                            6-Not a Title I school
## 2841                                            6-Not a Title I school
## 2842                                            6-Not a Title I school
## 2843                   4-Title I schoolwide eligible school-No program
## 2844                              2-Title I targeted assistance school
## 2845                              2-Title I targeted assistance school
## 2846                                       5-Title I schoolwide school
## 2847                                       5-Title I schoolwide school
## 2848                   4-Title I schoolwide eligible school-No program
## 2849                                       5-Title I schoolwide school
## 2850                              2-Title I targeted assistance school
## 2851                                                               n/a
## 2852                   4-Title I schoolwide eligible school-No program
## 2853                                            6-Not a Title I school
## 2854                                       5-Title I schoolwide school
## 2855                                            6-Not a Title I school
## 2856                                            6-Not a Title I school
## 2857                   4-Title I schoolwide eligible school-No program
## 2858                                            6-Not a Title I school
## 2859          1-Title I targeted assistance eligible school-No program
## 2860                                            6-Not a Title I school
## 2861                                                               n/a
## 2862                                       5-Title I schoolwide school
## 2863                                       5-Title I schoolwide school
## 2864                   4-Title I schoolwide eligible school-No program
## 2865                                                               n/a
## 2866                                                               n/a
## 2867                                       5-Title I schoolwide school
## 2868                                            6-Not a Title I school
## 2869                                            6-Not a Title I school
## 2870                                                               n/a
## 2871          1-Title I targeted assistance eligible school-No program
## 2872                              2-Title I targeted assistance school
## 2873                                       5-Title I schoolwide school
## 2874                                                               n/a
## 2875                                       5-Title I schoolwide school
## 2876                                                               n/a
## 2877                                       5-Title I schoolwide school
## 2878                                                               n/a
## 2879                                       5-Title I schoolwide school
## 2880                                       5-Title I schoolwide school
## 2881                                            6-Not a Title I school
## 2882                                       5-Title I schoolwide school
## 2883                                       5-Title I schoolwide school
## 2884                                                               n/a
## 2885                                            6-Not a Title I school
## 2886                                                               n/a
## 2887                                                               n/a
## 2888                                            6-Not a Title I school
## 2889                                            6-Not a Title I school
## 2890                                                               n/a
## 2891                                       5-Title I schoolwide school
## 2892                                       5-Title I schoolwide school
## 2893                                                               n/a
## 2894                                            6-Not a Title I school
## 2895                                                               n/a
## 2896                                       5-Title I schoolwide school
## 2897                                                               n/a
## 2898                              2-Title I targeted assistance school
## 2899                                                               n/a
## 2900                                                               n/a
## 2901                                            6-Not a Title I school
## 2902                                            6-Not a Title I school
## 2903                                            6-Not a Title I school
## 2904                   4-Title I schoolwide eligible school-No program
## 2905                                                               n/a
## 2906                                                               n/a
## 2907                   4-Title I schoolwide eligible school-No program
## 2908                                                               n/a
## 2909                                       5-Title I schoolwide school
## 2910                              2-Title I targeted assistance school
## 2911                                                               n/a
## 2912                                                               n/a
## 2913                                            6-Not a Title I school
## 2914                                            6-Not a Title I school
## 2915                                            6-Not a Title I school
## 2916                                                               n/a
## 2917                                            6-Not a Title I school
## 2918                                                               n/a
## 2919                                                               n/a
## 2920                                                               n/a
## 2921                                            6-Not a Title I school
## 2922                              2-Title I targeted assistance school
## 2923                                            6-Not a Title I school
## 2924                              2-Title I targeted assistance school
## 2925                                            6-Not a Title I school
## 2926                                            6-Not a Title I school
## 2927                                       5-Title I schoolwide school
## 2928                                       5-Title I schoolwide school
## 2929                                       5-Title I schoolwide school
## 2930                                            6-Not a Title I school
## 2931                                                               n/a
## 2932                                                               n/a
## 2933                                            6-Not a Title I school
## 2934                                                               n/a
## 2935                                            6-Not a Title I school
## 2936                   4-Title I schoolwide eligible school-No program
## 2937                   4-Title I schoolwide eligible school-No program
## 2938                                            6-Not a Title I school
## 2939                                            6-Not a Title I school
## 2940                                       5-Title I schoolwide school
## 2941                                       5-Title I schoolwide school
## 2942                                       5-Title I schoolwide school
## 2943          1-Title I targeted assistance eligible school-No program
## 2944                                       5-Title I schoolwide school
## 2945                                       5-Title I schoolwide school
## 2946                                                               n/a
## 2947                                       5-Title I schoolwide school
## 2948          1-Title I targeted assistance eligible school-No program
## 2949                                       5-Title I schoolwide school
## 2950                                            6-Not a Title I school
## 2951                                            6-Not a Title I school
## 2952                                       5-Title I schoolwide school
## 2953                   4-Title I schoolwide eligible school-No program
## 2954          1-Title I targeted assistance eligible school-No program
## 2955                                                               n/a
## 2956                                                               n/a
## 2957                                            6-Not a Title I school
## 2958 3-Title I schoolwide eligible-Title I targeted assistance program
## 2959                                            6-Not a Title I school
## 2960                                            6-Not a Title I school
## 2961                                       5-Title I schoolwide school
## 2962                                            6-Not a Title I school
## 2963                                       5-Title I schoolwide school
## 2964                   4-Title I schoolwide eligible school-No program
## 2965                                            6-Not a Title I school
## 2966                   4-Title I schoolwide eligible school-No program
## 2967                              2-Title I targeted assistance school
## 2968                              2-Title I targeted assistance school
## 2969                                       5-Title I schoolwide school
## 2970                                       5-Title I schoolwide school
## 2971                                       5-Title I schoolwide school
## 2972                                       5-Title I schoolwide school
## 2973                                       5-Title I schoolwide school
## 2974                                       5-Title I schoolwide school
## 2975                                       5-Title I schoolwide school
## 2976                                       5-Title I schoolwide school
## 2977          1-Title I targeted assistance eligible school-No program
## 2978                                            6-Not a Title I school
## 2979                                            6-Not a Title I school
## 2980                                                               n/a
## 2981                                            6-Not a Title I school
## 2982                   4-Title I schoolwide eligible school-No program
## 2983                                            6-Not a Title I school
## 2984                                            6-Not a Title I school
## 2985                                                               n/a
## 2986                                                               n/a
## 2987                                            6-Not a Title I school
## 2988                                                               n/a
## 2989                                       5-Title I schoolwide school
## 2990                                            6-Not a Title I school
## 2991                                            6-Not a Title I school
## 2992                                            6-Not a Title I school
## 2993                                       5-Title I schoolwide school
## 2994                                            6-Not a Title I school
## 2995                                            6-Not a Title I school
## 2996                                            6-Not a Title I school
## 2997                                            6-Not a Title I school
## 2998                                                              <NA>
## 2999                                                               n/a
## 3000                                            6-Not a Title I school
## 3001                                            6-Not a Title I school
## 3002                                            6-Not a Title I school
## 3003                                            6-Not a Title I school
## 3004                                                               n/a
## 3005                   4-Title I schoolwide eligible school-No program
## 3006                              2-Title I targeted assistance school
## 3007                   4-Title I schoolwide eligible school-No program
## 3008                                            6-Not a Title I school
## 3009                                                               n/a
## 3010                              2-Title I targeted assistance school
## 3011                                            6-Not a Title I school
## 3012          1-Title I targeted assistance eligible school-No program
## 3013                   4-Title I schoolwide eligible school-No program
## 3014                              2-Title I targeted assistance school
## 3015                                       5-Title I schoolwide school
## 3016                                       5-Title I schoolwide school
## 3017                   4-Title I schoolwide eligible school-No program
## 3018                                            6-Not a Title I school
## 3019                                            6-Not a Title I school
## 3020                                       5-Title I schoolwide school
## 3021                                            6-Not a Title I school
## 3022                                            6-Not a Title I school
## 3023                                                               n/a
## 3024                                            6-Not a Title I school
## 3025          1-Title I targeted assistance eligible school-No program
## 3026                                       5-Title I schoolwide school
## 3027                                       5-Title I schoolwide school
## 3028                                            6-Not a Title I school
## 3029                                            6-Not a Title I school
## 3030                                       5-Title I schoolwide school
## 3031                   4-Title I schoolwide eligible school-No program
## 3032                                            6-Not a Title I school
## 3033                                            6-Not a Title I school
## 3034                                            6-Not a Title I school
## 3035                                       5-Title I schoolwide school
## 3036                                       5-Title I schoolwide school
## 3037                                                               n/a
## 3038                                                               n/a
## 3039                                       5-Title I schoolwide school
## 3040                                            6-Not a Title I school
## 3041                                            6-Not a Title I school
## 3042                   4-Title I schoolwide eligible school-No program
## 3043                                                               n/a
## 3044                                                               n/a
## 3045                                                               n/a
## 3046                                                               n/a
## 3047                                       5-Title I schoolwide school
## 3048                                                               n/a
## 3049                                            6-Not a Title I school
## 3050                                            6-Not a Title I school
## 3051                   4-Title I schoolwide eligible school-No program
## 3052                                            6-Not a Title I school
## 3053                                            6-Not a Title I school
## 3054                                       5-Title I schoolwide school
## 3055                                                               n/a
## 3056                                            6-Not a Title I school
## 3057                   4-Title I schoolwide eligible school-No program
## 3058                   4-Title I schoolwide eligible school-No program
## 3059                   4-Title I schoolwide eligible school-No program
## 3060                                       5-Title I schoolwide school
## 3061                                            6-Not a Title I school
## 3062                              2-Title I targeted assistance school
## 3063          1-Title I targeted assistance eligible school-No program
## 3064                                       5-Title I schoolwide school
## 3065                                                               n/a
## 3066          1-Title I targeted assistance eligible school-No program
## 3067                                       5-Title I schoolwide school
## 3068                              2-Title I targeted assistance school
## 3069                              2-Title I targeted assistance school
## 3070                                       5-Title I schoolwide school
## 3071                                            6-Not a Title I school
## 3072                                       5-Title I schoolwide school
## 3073                                                               n/a
## 3074                                       5-Title I schoolwide school
## 3075                                                               n/a
## 3076                                            6-Not a Title I school
## 3077                                       5-Title I schoolwide school
## 3078                                       5-Title I schoolwide school
## 3079                                                               n/a
## 3080                                       5-Title I schoolwide school
## 3081                   4-Title I schoolwide eligible school-No program
## 3082                   4-Title I schoolwide eligible school-No program
## 3083                                            6-Not a Title I school
## 3084                                                               n/a
## 3085                   4-Title I schoolwide eligible school-No program
## 3086                                            6-Not a Title I school
## 3087                                            6-Not a Title I school
## 3088                                            6-Not a Title I school
## 3089                                       5-Title I schoolwide school
## 3090                                            6-Not a Title I school
## 3091                              2-Title I targeted assistance school
## 3092                   4-Title I schoolwide eligible school-No program
## 3093          1-Title I targeted assistance eligible school-No program
## 3094                   4-Title I schoolwide eligible school-No program
## 3095                                            6-Not a Title I school
## 3096          1-Title I targeted assistance eligible school-No program
## 3097                                            6-Not a Title I school
## 3098                                       5-Title I schoolwide school
## 3099                                                               n/a
## 3100          1-Title I targeted assistance eligible school-No program
## 3101                                            6-Not a Title I school
## 3102                                            6-Not a Title I school
## 3103                                       5-Title I schoolwide school
## 3104                                            6-Not a Title I school
## 3105                                       5-Title I schoolwide school
## 3106                                       5-Title I schoolwide school
## 3107                                       5-Title I schoolwide school
## 3108                                            6-Not a Title I school
## 3109                              2-Title I targeted assistance school
## 3110                                            6-Not a Title I school
## 3111                                            6-Not a Title I school
## 3112                                            6-Not a Title I school
## 3113                                            6-Not a Title I school
## 3114                                            6-Not a Title I school
## 3115                              2-Title I targeted assistance school
## 3116                                       5-Title I schoolwide school
## 3117                                            6-Not a Title I school
## 3118                                                               n/a
## 3119                                       5-Title I schoolwide school
## 3120                                       5-Title I schoolwide school
## 3121                                       5-Title I schoolwide school
## 3122                                       5-Title I schoolwide school
## 3123                                       5-Title I schoolwide school
## 3124                                       5-Title I schoolwide school
## 3125                                                               n/a
## 3126                                            6-Not a Title I school
## 3127                                                               n/a
## 3128                                                               n/a
## 3129                                            6-Not a Title I school
## 3130                                            6-Not a Title I school
## 3131                                                              <NA>
## 3132 3-Title I schoolwide eligible-Title I targeted assistance program
## 3133                                       5-Title I schoolwide school
## 3134                   4-Title I schoolwide eligible school-No program
## 3135                                            6-Not a Title I school
## 3136                                       5-Title I schoolwide school
## 3137                                       5-Title I schoolwide school
## 3138                                       5-Title I schoolwide school
## 3139          1-Title I targeted assistance eligible school-No program
## 3140                                                               n/a
## 3141                              2-Title I targeted assistance school
## 3142                                            6-Not a Title I school
## 3143                              2-Title I targeted assistance school
## 3144                                            6-Not a Title I school
## 3145                                       5-Title I schoolwide school
## 3146                              2-Title I targeted assistance school
## 3147                                                               n/a
## 3148                                            6-Not a Title I school
## 3149                                       5-Title I schoolwide school
## 3150                   4-Title I schoolwide eligible school-No program
## 3151                                            6-Not a Title I school
## 3152                              2-Title I targeted assistance school
## 3153                                            6-Not a Title I school
## 3154                                                               n/a
## 3155                                                               n/a
## 3156                                            6-Not a Title I school
## 3157                   4-Title I schoolwide eligible school-No program
## 3158                                                               n/a
## 3159                                                               n/a
## 3160                                            6-Not a Title I school
## 3161                                       5-Title I schoolwide school
## 3162                                                               n/a
## 3163                                       5-Title I schoolwide school
## 3164                              2-Title I targeted assistance school
## 3165                                       5-Title I schoolwide school
## 3166          1-Title I targeted assistance eligible school-No program
## 3167                                            6-Not a Title I school
## 3168                              2-Title I targeted assistance school
## 3169                                            6-Not a Title I school
## 3170                                                               n/a
## 3171                                            6-Not a Title I school
## 3172                                            6-Not a Title I school
## 3173                                                               n/a
## 3174                                                               n/a
## 3175                                            6-Not a Title I school
## 3176                                                               n/a
## 3177                                                               n/a
## 3178                                            6-Not a Title I school
## 3179                                            6-Not a Title I school
## 3180                                                               n/a
## 3181                                            6-Not a Title I school
## 3182                                            6-Not a Title I school
## 3183                                                               n/a
## 3184                              2-Title I targeted assistance school
## 3185                                                               n/a
## 3186                                            6-Not a Title I school
## 3187                                            6-Not a Title I school
## 3188          1-Title I targeted assistance eligible school-No program
## 3189                                                              <NA>
## 3190                                       5-Title I schoolwide school
## 3191                              2-Title I targeted assistance school
## 3192                                                               n/a
## 3193                                       5-Title I schoolwide school
## 3194                                       5-Title I schoolwide school
## 3195                                       5-Title I schoolwide school
## 3196                                                              <NA>
## 3197                                                              <NA>
## 3198                                                               n/a
## 3199                                            6-Not a Title I school
## 3200          1-Title I targeted assistance eligible school-No program
## 3201                                                               n/a
## 3202                                            6-Not a Title I school
## 3203                                       5-Title I schoolwide school
## 3204                                            6-Not a Title I school
## 3205                                            6-Not a Title I school
## 3206                                            6-Not a Title I school
## 3207                                            6-Not a Title I school
## 3208                                       5-Title I schoolwide school
## 3209                                       5-Title I schoolwide school
## 3210          1-Title I targeted assistance eligible school-No program
## 3211                              2-Title I targeted assistance school
## 3212                              2-Title I targeted assistance school
## 3213                                                               n/a
## 3214                                            6-Not a Title I school
## 3215                   4-Title I schoolwide eligible school-No program
## 3216                              2-Title I targeted assistance school
## 3217                                            6-Not a Title I school
## 3218                                       5-Title I schoolwide school
## 3219                                                               n/a
## 3220                                            6-Not a Title I school
## 3221          1-Title I targeted assistance eligible school-No program
## 3222                                       5-Title I schoolwide school
## 3223                                                               n/a
## 3224                                            6-Not a Title I school
## 3225                                                               n/a
## 3226                                                              <NA>
## 3227                                                              <NA>
## 3228                                            6-Not a Title I school
## 3229                                                              <NA>
## 3230                                                               n/a
## 3231                                            6-Not a Title I school
## 3232                                            6-Not a Title I school
## 3233                                                               n/a
## 3234          1-Title I targeted assistance eligible school-No program
## 3235                   4-Title I schoolwide eligible school-No program
## 3236                                                               n/a
## 3237                   4-Title I schoolwide eligible school-No program
## 3238                                       5-Title I schoolwide school
## 3239                                       5-Title I schoolwide school
## 3240                                            6-Not a Title I school
## 3241                   4-Title I schoolwide eligible school-No program
## 3242                              2-Title I targeted assistance school
## 3243                                       5-Title I schoolwide school
## 3244                                            6-Not a Title I school
## 3245                                                               n/a
## 3246                                            6-Not a Title I school
## 3247                              2-Title I targeted assistance school
## 3248                                                               n/a
## 3249                                       5-Title I schoolwide school
## 3250                                            6-Not a Title I school
## 3251                                                               n/a
## 3252                                            6-Not a Title I school
## 3253                                       5-Title I schoolwide school
## 3254                                            6-Not a Title I school
## 3255                   4-Title I schoolwide eligible school-No program
## 3256                                       5-Title I schoolwide school
## 3257                              2-Title I targeted assistance school
## 3258                                            6-Not a Title I school
## 3259                                       5-Title I schoolwide school
## 3260                                       5-Title I schoolwide school
## 3261                   4-Title I schoolwide eligible school-No program
## 3262                                                              <NA>
## 3263                                            6-Not a Title I school
## 3264                                                               n/a
## 3265                                       5-Title I schoolwide school
## 3266                                       5-Title I schoolwide school
## 3267                                       5-Title I schoolwide school
## 3268                                       5-Title I schoolwide school
## 3269                                            6-Not a Title I school
## 3270                                            6-Not a Title I school
## 3271                                            6-Not a Title I school
## 3272                                       5-Title I schoolwide school
## 3273                                       5-Title I schoolwide school
## 3274          1-Title I targeted assistance eligible school-No program
## 3275                                       5-Title I schoolwide school
## 3276                              2-Title I targeted assistance school
## 3277                                            6-Not a Title I school
## 3278                                       5-Title I schoolwide school
## 3279                              2-Title I targeted assistance school
## 3280                                            6-Not a Title I school
## 3281                   4-Title I schoolwide eligible school-No program
## 3282                                                               n/a
## 3283                                            6-Not a Title I school
## 3284                                            6-Not a Title I school
## 3285          1-Title I targeted assistance eligible school-No program
## 3286                                       5-Title I schoolwide school
## 3287                                            6-Not a Title I school
## 3288                                            6-Not a Title I school
## 3289                                       5-Title I schoolwide school
## 3290                                                              <NA>
## 3291                                       5-Title I schoolwide school
## 3292                                                               n/a
## 3293                                            6-Not a Title I school
## 3294                                            6-Not a Title I school
## 3295                                                               n/a
## 3296                                                               n/a
## 3297                                                               n/a
## 3298                                                               n/a
## 3299                                       5-Title I schoolwide school
## 3300                                       5-Title I schoolwide school
## 3301                                                               n/a
## 3302                                            6-Not a Title I school
## 3303                   4-Title I schoolwide eligible school-No program
## 3304                                       5-Title I schoolwide school
## 3305                                            6-Not a Title I school
## 3306                                                               n/a
## 3307                                            6-Not a Title I school
## 3308                                                               n/a
## 3309                                                               n/a
## 3310                                            6-Not a Title I school
## 3311                                            6-Not a Title I school
## 3312                                                               n/a
## 3313                                                               n/a
## 3314                                                               n/a
## 3315                                            6-Not a Title I school
## 3316          1-Title I targeted assistance eligible school-No program
## 3317                                       5-Title I schoolwide school
## 3318                                       5-Title I schoolwide school
## 3319                                                               n/a
## 3320                                                               n/a
## 3321                                       5-Title I schoolwide school
## 3322                                       5-Title I schoolwide school
## 3323                                            6-Not a Title I school
## 3324                                            6-Not a Title I school
## 3325                                            6-Not a Title I school
## 3326                   4-Title I schoolwide eligible school-No program
## 3327                   4-Title I schoolwide eligible school-No program
## 3328                                       5-Title I schoolwide school
## 3329                                       5-Title I schoolwide school
## 3330                   4-Title I schoolwide eligible school-No program
## 3331                                            6-Not a Title I school
## 3332                                                               n/a
## 3333                                            6-Not a Title I school
## 3334                                                               n/a
## 3335                                                               n/a
## 3336                                                               n/a
## 3337                                                               n/a
## 3338                                            6-Not a Title I school
## 3339                                                               n/a
## 3340                                                               n/a
## 3341                                            6-Not a Title I school
## 3342                                                               n/a
## 3343          1-Title I targeted assistance eligible school-No program
## 3344                                       5-Title I schoolwide school
## 3345                                            6-Not a Title I school
## 3346                                                               n/a
## 3347                                                               n/a
## 3348                                                               n/a
## 3349                                            6-Not a Title I school
## 3350                                       5-Title I schoolwide school
## 3351                                                               n/a
## 3352                                       5-Title I schoolwide school
## 3353                                       5-Title I schoolwide school
## 3354                                                               n/a
## 3355                   4-Title I schoolwide eligible school-No program
## 3356                                            6-Not a Title I school
## 3357                                                               n/a
## 3358                   4-Title I schoolwide eligible school-No program
## 3359                              2-Title I targeted assistance school
## 3360                                       5-Title I schoolwide school
## 3361                                       5-Title I schoolwide school
## 3362                                            6-Not a Title I school
## 3363                                                               n/a
## 3364          1-Title I targeted assistance eligible school-No program
## 3365                                       5-Title I schoolwide school
## 3366                                                               n/a
## 3367                   4-Title I schoolwide eligible school-No program
## 3368                                                               n/a
## 3369                                                              <NA>
## 3370                                                               n/a
## 3371                                       5-Title I schoolwide school
## 3372                                            6-Not a Title I school
## 3373                              2-Title I targeted assistance school
## 3374                   4-Title I schoolwide eligible school-No program
## 3375                                       5-Title I schoolwide school
## 3376                                            6-Not a Title I school
## 3377                                            6-Not a Title I school
## 3378                              2-Title I targeted assistance school
## 3379                                                               n/a
## 3380                                                               n/a
## 3381                                                               n/a
## 3382                                                               n/a
## 3383                              2-Title I targeted assistance school
## 3384                                       5-Title I schoolwide school
## 3385                                                               n/a
## 3386                                            6-Not a Title I school
## 3387          1-Title I targeted assistance eligible school-No program
## 3388          1-Title I targeted assistance eligible school-No program
## 3389                   4-Title I schoolwide eligible school-No program
## 3390                                            6-Not a Title I school
## 3391                                            6-Not a Title I school
## 3392                                       5-Title I schoolwide school
## 3393                                                               n/a
## 3394 3-Title I schoolwide eligible-Title I targeted assistance program
## 3395                                       5-Title I schoolwide school
## 3396                                       5-Title I schoolwide school
## 3397                                       5-Title I schoolwide school
## 3398                                            6-Not a Title I school
## 3399                                            6-Not a Title I school
## 3400                                                               n/a
## 3401                                            6-Not a Title I school
## 3402                                                               n/a
## 3403                                       5-Title I schoolwide school
## 3404                              2-Title I targeted assistance school
## 3405                                                               n/a
## 3406                                                               n/a
## 3407                                            6-Not a Title I school
## 3408                                       5-Title I schoolwide school
## 3409                                                               n/a
## 3410                              2-Title I targeted assistance school
## 3411                                            6-Not a Title I school
## 3412                                            6-Not a Title I school
## 3413                                            6-Not a Title I school
## 3414                                                               n/a
## 3415                   4-Title I schoolwide eligible school-No program
## 3416                                                               n/a
## 3417                                            6-Not a Title I school
## 3418                                                               n/a
## 3419                                                               n/a
## 3420                   4-Title I schoolwide eligible school-No program
## 3421                                            6-Not a Title I school
## 3422                                                               n/a
## 3423                                                               n/a
## 3424                                                               n/a
## 3425                                            6-Not a Title I school
## 3426                                                               n/a
## 3427                                       5-Title I schoolwide school
## 3428                              2-Title I targeted assistance school
## 3429                   4-Title I schoolwide eligible school-No program
## 3430                                                               n/a
## 3431                                            6-Not a Title I school
## 3432                                       5-Title I schoolwide school
## 3433                                            6-Not a Title I school
## 3434                                                               n/a
## 3435                                            6-Not a Title I school
## 3436                                            6-Not a Title I school
## 3437                                            6-Not a Title I school
## 3438                                       5-Title I schoolwide school
## 3439                   4-Title I schoolwide eligible school-No program
## 3440                                                               n/a
## 3441                                       5-Title I schoolwide school
## 3442                                            6-Not a Title I school
## 3443                                            6-Not a Title I school
## 3444                                            6-Not a Title I school
## 3445          1-Title I targeted assistance eligible school-No program
## 3446                                                               n/a
## 3447                                       5-Title I schoolwide school
## 3448                   4-Title I schoolwide eligible school-No program
## 3449                   4-Title I schoolwide eligible school-No program
## 3450                                            6-Not a Title I school
## 3451                                       5-Title I schoolwide school
## 3452                                            6-Not a Title I school
## 3453          1-Title I targeted assistance eligible school-No program
## 3454                                            6-Not a Title I school
## 3455                                       5-Title I schoolwide school
## 3456                              2-Title I targeted assistance school
## 3457                                       5-Title I schoolwide school
## 3458                                       5-Title I schoolwide school
## 3459                                       5-Title I schoolwide school
## 3460                                            6-Not a Title I school
## 3461          1-Title I targeted assistance eligible school-No program
## 3462                              2-Title I targeted assistance school
## 3463                              2-Title I targeted assistance school
## 3464                                       5-Title I schoolwide school
## 3465                                       5-Title I schoolwide school
## 3466                                            6-Not a Title I school
## 3467                                                               n/a
## 3468                                                               n/a
## 3469                                                               n/a
## 3470                                            6-Not a Title I school
## 3471                                                               n/a
## 3472                                            6-Not a Title I school
## 3473                              2-Title I targeted assistance school
## 3474                                                               n/a
## 3475          1-Title I targeted assistance eligible school-No program
## 3476                                                               n/a
## 3477                                            6-Not a Title I school
## 3478                              2-Title I targeted assistance school
## 3479                                            6-Not a Title I school
## 3480                                                               n/a
## 3481                                                               n/a
## 3482                                            6-Not a Title I school
## 3483                                            6-Not a Title I school
## 3484                                            6-Not a Title I school
## 3485                                            6-Not a Title I school
## 3486                                            6-Not a Title I school
## 3487                                            6-Not a Title I school
## 3488                                            6-Not a Title I school
## 3489                                            6-Not a Title I school
## 3490                                            6-Not a Title I school
## 3491                              2-Title I targeted assistance school
## 3492                                                               n/a
## 3493                                            6-Not a Title I school
## 3494                                                               n/a
## 3495                                                               n/a
## 3496                   4-Title I schoolwide eligible school-No program
## 3497                                            6-Not a Title I school
## 3498                                            6-Not a Title I school
## 3499                                       5-Title I schoolwide school
## 3500                              2-Title I targeted assistance school
## 3501                                                               n/a
## 3502                              2-Title I targeted assistance school
## 3503                                                               n/a
## 3504                                                               n/a
## 3505                                            6-Not a Title I school
## 3506                                            6-Not a Title I school
## 3507                                            6-Not a Title I school
## 3508                                                               n/a
## 3509                                                               n/a
## 3510                                       5-Title I schoolwide school
## 3511                                       5-Title I schoolwide school
## 3512                                       5-Title I schoolwide school
## 3513                   4-Title I schoolwide eligible school-No program
## 3514                                            6-Not a Title I school
## 3515                                            6-Not a Title I school
## 3516                                                               n/a
## 3517                                       5-Title I schoolwide school
## 3518                              2-Title I targeted assistance school
## 3519                                            6-Not a Title I school
## 3520                                            6-Not a Title I school
## 3521                                                               n/a
## 3522                   4-Title I schoolwide eligible school-No program
## 3523                                            6-Not a Title I school
## 3524                                            6-Not a Title I school
## 3525                                            6-Not a Title I school
## 3526                                       5-Title I schoolwide school
## 3527                              2-Title I targeted assistance school
## 3528                                       5-Title I schoolwide school
## 3529                              2-Title I targeted assistance school
## 3530                                       5-Title I schoolwide school
## 3531                                            6-Not a Title I school
## 3532                                       5-Title I schoolwide school
## 3533                                       5-Title I schoolwide school
## 3534                                            6-Not a Title I school
## 3535                   4-Title I schoolwide eligible school-No program
## 3536                                       5-Title I schoolwide school
## 3537                                                               n/a
## 3538                              2-Title I targeted assistance school
## 3539                                       5-Title I schoolwide school
## 3540                                            6-Not a Title I school
## 3541          1-Title I targeted assistance eligible school-No program
## 3542          1-Title I targeted assistance eligible school-No program
## 3543                                            6-Not a Title I school
## 3544                                            6-Not a Title I school
## 3545                              2-Title I targeted assistance school
## 3546                                                              <NA>
## 3547                                                              <NA>
## 3548                                                              <NA>
## 3549                                       5-Title I schoolwide school
## 3550                                                               n/a
## 3551                                            6-Not a Title I school
## 3552                                            6-Not a Title I school
## 3553                                       5-Title I schoolwide school
## 3554                                            6-Not a Title I school
## 3555                   4-Title I schoolwide eligible school-No program
## 3556                                                               n/a
## 3557                                       5-Title I schoolwide school
## 3558                                            6-Not a Title I school
## 3559                                            6-Not a Title I school
## 3560                                                               n/a
## 3561                                       5-Title I schoolwide school
## 3562                                            6-Not a Title I school
## 3563                   4-Title I schoolwide eligible school-No program
## 3564                                            6-Not a Title I school
## 3565                   4-Title I schoolwide eligible school-No program
## 3566                                            6-Not a Title I school
## 3567                                       5-Title I schoolwide school
## 3568                                            6-Not a Title I school
## 3569                                            6-Not a Title I school
## 3570                                            6-Not a Title I school
## 3571                                       5-Title I schoolwide school
## 3572                                            6-Not a Title I school
## 3573                                       5-Title I schoolwide school
## 3574          1-Title I targeted assistance eligible school-No program
## 3575                                                               n/a
## 3576                                            6-Not a Title I school
## 3577                                            6-Not a Title I school
## 3578                                                              <NA>
## 3579                   4-Title I schoolwide eligible school-No program
## 3580                                       5-Title I schoolwide school
## 3581                                            6-Not a Title I school
## 3582                                                               n/a
## 3583                                            6-Not a Title I school
## 3584                   4-Title I schoolwide eligible school-No program
## 3585                                            6-Not a Title I school
## 3586                                                               n/a
## 3587                                            6-Not a Title I school
## 3588                   4-Title I schoolwide eligible school-No program
## 3589                                            6-Not a Title I school
## 3590                   4-Title I schoolwide eligible school-No program
## 3591                   4-Title I schoolwide eligible school-No program
## 3592                                            6-Not a Title I school
## 3593                   4-Title I schoolwide eligible school-No program
## 3594                                            6-Not a Title I school
## 3595                              2-Title I targeted assistance school
## 3596                   4-Title I schoolwide eligible school-No program
## 3597                                            6-Not a Title I school
## 3598                                                               n/a
## 3599                                                               n/a
## 3600                                            6-Not a Title I school
## 3601                                       5-Title I schoolwide school
## 3602                   4-Title I schoolwide eligible school-No program
## 3603                                                               n/a
## 3604                                                               n/a
## 3605                                                               n/a
## 3606                                            6-Not a Title I school
## 3607                                       5-Title I schoolwide school
## 3608                   4-Title I schoolwide eligible school-No program
## 3609                                                               n/a
## 3610                                       5-Title I schoolwide school
## 3611                   4-Title I schoolwide eligible school-No program
## 3612                                            6-Not a Title I school
## 3613                                       5-Title I schoolwide school
## 3614                                       5-Title I schoolwide school
## 3615                                            6-Not a Title I school
## 3616                                       5-Title I schoolwide school
## 3617                                            6-Not a Title I school
## 3618                                            6-Not a Title I school
## 3619                                            6-Not a Title I school
## 3620                                                               n/a
## 3621                                            6-Not a Title I school
## 3622                              2-Title I targeted assistance school
## 3623                                       5-Title I schoolwide school
## 3624                              2-Title I targeted assistance school
## 3625                   4-Title I schoolwide eligible school-No program
## 3626                                       5-Title I schoolwide school
## 3627                                            6-Not a Title I school
## 3628                                            6-Not a Title I school
## 3629                                       5-Title I schoolwide school
## 3630                                            6-Not a Title I school
## 3631          1-Title I targeted assistance eligible school-No program
## 3632          1-Title I targeted assistance eligible school-No program
## 3633                                       5-Title I schoolwide school
## 3634                                                               n/a
## 3635                                            6-Not a Title I school
## 3636                                            6-Not a Title I school
## 3637                                            6-Not a Title I school
## 3638                                            6-Not a Title I school
## 3639                                            6-Not a Title I school
## 3640                                                               n/a
## 3641                              2-Title I targeted assistance school
## 3642                                            6-Not a Title I school
## 3643                                                               n/a
## 3644                                            6-Not a Title I school
## 3645                                            6-Not a Title I school
## 3646                                       5-Title I schoolwide school
## 3647                                                               n/a
## 3648                                                               n/a
## 3649                                            6-Not a Title I school
## 3650                                                               n/a
## 3651                                       5-Title I schoolwide school
## 3652                                            6-Not a Title I school
## 3653                                                               n/a
## 3654                                            6-Not a Title I school
## 3655                                            6-Not a Title I school
## 3656                                                               n/a
## 3657                                            6-Not a Title I school
## 3658                                                               n/a
## 3659                                       5-Title I schoolwide school
## 3660                                                               n/a
## 3661                                       5-Title I schoolwide school
## 3662                                                               n/a
## 3663                                            6-Not a Title I school
## 3664                                            6-Not a Title I school
## 3665                                            6-Not a Title I school
## 3666                                            6-Not a Title I school
## 3667                                            6-Not a Title I school
## 3668                                            6-Not a Title I school
## 3669                                                               n/a
## 3670                                                               n/a
## 3671                                            6-Not a Title I school
## 3672                                            6-Not a Title I school
## 3673                                            6-Not a Title I school
## 3674                                                               n/a
## 3675                   4-Title I schoolwide eligible school-No program
## 3676                                            6-Not a Title I school
## 3677                                                               n/a
## 3678                                       5-Title I schoolwide school
## 3679                                            6-Not a Title I school
## 3680                   4-Title I schoolwide eligible school-No program
## 3681                                            6-Not a Title I school
## 3682                                            6-Not a Title I school
## 3683          1-Title I targeted assistance eligible school-No program
## 3684                                            6-Not a Title I school
## 3685                                            6-Not a Title I school
## 3686                                                               n/a
## 3687                                            6-Not a Title I school
## 3688                                            6-Not a Title I school
## 3689                                            6-Not a Title I school
## 3690                                            6-Not a Title I school
## 3691                                            6-Not a Title I school
## 3692                                            6-Not a Title I school
## 3693                                            6-Not a Title I school
## 3694                                            6-Not a Title I school
## 3695                                            6-Not a Title I school
## 3696                                            6-Not a Title I school
## 3697                                            6-Not a Title I school
## 3698                                            6-Not a Title I school
## 3699                              2-Title I targeted assistance school
## 3700                                       5-Title I schoolwide school
## 3701                              2-Title I targeted assistance school
## 3702                                                               n/a
## 3703                                       5-Title I schoolwide school
## 3704 3-Title I schoolwide eligible-Title I targeted assistance program
## 3705                                                               n/a
## 3706                                            6-Not a Title I school
## 3707          1-Title I targeted assistance eligible school-No program
## 3708                                            6-Not a Title I school
## 3709          1-Title I targeted assistance eligible school-No program
## 3710                                       5-Title I schoolwide school
## 3711                   4-Title I schoolwide eligible school-No program
## 3712                                            6-Not a Title I school
## 3713          1-Title I targeted assistance eligible school-No program
## 3714                                            6-Not a Title I school
## 3715                                            6-Not a Title I school
## 3716                                            6-Not a Title I school
## 3717                                            6-Not a Title I school
## 3718          1-Title I targeted assistance eligible school-No program
## 3719                              2-Title I targeted assistance school
## 3720                                       5-Title I schoolwide school
## 3721                              2-Title I targeted assistance school
## 3722                                            6-Not a Title I school
## 3723                                            6-Not a Title I school
## 3724                   4-Title I schoolwide eligible school-No program
## 3725                                            6-Not a Title I school
## 3726 3-Title I schoolwide eligible-Title I targeted assistance program
## 3727                                            6-Not a Title I school
## 3728                                       5-Title I schoolwide school
## 3729                                                               n/a
## 3730                                            6-Not a Title I school
## 3731                                            6-Not a Title I school
## 3732                                            6-Not a Title I school
## 3733                                            6-Not a Title I school
## 3734                                       5-Title I schoolwide school
## 3735                                            6-Not a Title I school
## 3736                                            6-Not a Title I school
## 3737                                            6-Not a Title I school
## 3738                   4-Title I schoolwide eligible school-No program
## 3739                   4-Title I schoolwide eligible school-No program
## 3740                   4-Title I schoolwide eligible school-No program
## 3741                                            6-Not a Title I school
## 3742                                            6-Not a Title I school
## 3743                                                               n/a
## 3744                                            6-Not a Title I school
## 3745                   4-Title I schoolwide eligible school-No program
## 3746                                                               n/a
## 3747                                            6-Not a Title I school
## 3748                                       5-Title I schoolwide school
## 3749                                       5-Title I schoolwide school
## 3750                                       5-Title I schoolwide school
## 3751                                            6-Not a Title I school
## 3752                                                               n/a
## 3753                                            6-Not a Title I school
## 3754                                                               n/a
## 3755                              2-Title I targeted assistance school
## 3756                                                              <NA>
## 3757                                                               n/a
## 3758                                            6-Not a Title I school
## 3759                   4-Title I schoolwide eligible school-No program
## 3760                   4-Title I schoolwide eligible school-No program
## 3761                                                               n/a
## 3762                                            6-Not a Title I school
## 3763                                            6-Not a Title I school
## 3764                   4-Title I schoolwide eligible school-No program
## 3765                              2-Title I targeted assistance school
## 3766                              2-Title I targeted assistance school
## 3767                              2-Title I targeted assistance school
## 3768                                            6-Not a Title I school
## 3769                   4-Title I schoolwide eligible school-No program
## 3770                                            6-Not a Title I school
## 3771                   4-Title I schoolwide eligible school-No program
## 3772                                       5-Title I schoolwide school
## 3773                                            6-Not a Title I school
## 3774                                            6-Not a Title I school
## 3775                   4-Title I schoolwide eligible school-No program
## 3776                                            6-Not a Title I school
## 3777                                            6-Not a Title I school
## 3778                              2-Title I targeted assistance school
## 3779                                            6-Not a Title I school
## 3780                                            6-Not a Title I school
## 3781                                            6-Not a Title I school
## 3782                                            6-Not a Title I school
## 3783          1-Title I targeted assistance eligible school-No program
## 3784                                                               n/a
## 3785                                            6-Not a Title I school
## 3786                                            6-Not a Title I school
## 3787                                            6-Not a Title I school
## 3788                                                               n/a
## 3789                                                               n/a
## 3790                                            6-Not a Title I school
## 3791                                            6-Not a Title I school
## 3792                                            6-Not a Title I school
## 3793                   4-Title I schoolwide eligible school-No program
## 3794                                       5-Title I schoolwide school
## 3795                              2-Title I targeted assistance school
## 3796                                       5-Title I schoolwide school
## 3797                                       5-Title I schoolwide school
## 3798                                       5-Title I schoolwide school
## 3799                   4-Title I schoolwide eligible school-No program
## 3800                                                               n/a
## 3801                              2-Title I targeted assistance school
## 3802                                                               n/a
## 3803                                            6-Not a Title I school
## 3804                                            6-Not a Title I school
## 3805                                            6-Not a Title I school
## 3806                                       5-Title I schoolwide school
## 3807          1-Title I targeted assistance eligible school-No program
## 3808                                       5-Title I schoolwide school
## 3809                   4-Title I schoolwide eligible school-No program
## 3810                                       5-Title I schoolwide school
## 3811                                                               n/a
## 3812                                            6-Not a Title I school
## 3813                                                               n/a
## 3814                              2-Title I targeted assistance school
## 3815                   4-Title I schoolwide eligible school-No program
## 3816                                                               n/a
## 3817                                                               n/a
## 3818                                       5-Title I schoolwide school
## 3819                                            6-Not a Title I school
## 3820                                       5-Title I schoolwide school
## 3821                                       5-Title I schoolwide school
## 3822                                            6-Not a Title I school
## 3823                                       5-Title I schoolwide school
## 3824                                       5-Title I schoolwide school
## 3825                                            6-Not a Title I school
## 3826                              2-Title I targeted assistance school
## 3827                   4-Title I schoolwide eligible school-No program
## 3828                                       5-Title I schoolwide school
## 3829                                       5-Title I schoolwide school
## 3830          1-Title I targeted assistance eligible school-No program
## 3831                   4-Title I schoolwide eligible school-No program
## 3832                   4-Title I schoolwide eligible school-No program
## 3833                                                               n/a
## 3834                                       5-Title I schoolwide school
## 3835                                       5-Title I schoolwide school
## 3836                   4-Title I schoolwide eligible school-No program
## 3837                              2-Title I targeted assistance school
## 3838                                       5-Title I schoolwide school
## 3839                                       5-Title I schoolwide school
## 3840                                            6-Not a Title I school
## 3841                   4-Title I schoolwide eligible school-No program
## 3842                              2-Title I targeted assistance school
## 3843                                                               n/a
## 3844                                            6-Not a Title I school
## 3845                              2-Title I targeted assistance school
## 3846                              2-Title I targeted assistance school
## 3847                                                               n/a
## 3848                                       5-Title I schoolwide school
## 3849                                       5-Title I schoolwide school
## 3850                                       5-Title I schoolwide school
## 3851                   4-Title I schoolwide eligible school-No program
## 3852                                                               n/a
## 3853                                                               n/a
## 3854                                                               n/a
## 3855                              2-Title I targeted assistance school
## 3856                                                               n/a
## 3857                                            6-Not a Title I school
## 3858                                       5-Title I schoolwide school
## 3859                                            6-Not a Title I school
## 3860                                       5-Title I schoolwide school
## 3861                                                              <NA>
## 3862 3-Title I schoolwide eligible-Title I targeted assistance program
## 3863                                                               n/a
## 3864                                            6-Not a Title I school
## 3865                                                               n/a
## 3866                   4-Title I schoolwide eligible school-No program
## 3867                                                               n/a
## 3868                                       5-Title I schoolwide school
## 3869                                                               n/a
## 3870                                                               n/a
## 3871                                                              <NA>
## 3872                                            6-Not a Title I school
## 3873                                       5-Title I schoolwide school
## 3874                                            6-Not a Title I school
## 3875                                       5-Title I schoolwide school
## 3876                                       5-Title I schoolwide school
## 3877                   4-Title I schoolwide eligible school-No program
## 3878                              2-Title I targeted assistance school
## 3879                              2-Title I targeted assistance school
## 3880                              2-Title I targeted assistance school
## 3881                              2-Title I targeted assistance school
## 3882                   4-Title I schoolwide eligible school-No program
## 3883                              2-Title I targeted assistance school
## 3884                                       5-Title I schoolwide school
## 3885                                       5-Title I schoolwide school
## 3886                                       5-Title I schoolwide school
## 3887                   4-Title I schoolwide eligible school-No program
## 3888                                            6-Not a Title I school
## 3889                              2-Title I targeted assistance school
## 3890                                       5-Title I schoolwide school
## 3891                   4-Title I schoolwide eligible school-No program
## 3892                                            6-Not a Title I school
## 3893                                            6-Not a Title I school
## 3894                                       5-Title I schoolwide school
## 3895                                                               n/a
## 3896                              2-Title I targeted assistance school
## 3897                              2-Title I targeted assistance school
## 3898                              2-Title I targeted assistance school
## 3899                              2-Title I targeted assistance school
## 3900                                                               n/a
## 3901                                            6-Not a Title I school
## 3902                                                               n/a
## 3903                                            6-Not a Title I school
## 3904                                            6-Not a Title I school
## 3905                                                               n/a
## 3906          1-Title I targeted assistance eligible school-No program
## 3907                                            6-Not a Title I school
## 3908                   4-Title I schoolwide eligible school-No program
## 3909                                                               n/a
## 3910                                                              <NA>
## 3911                                                              <NA>
## 3912                                                               n/a
## 3913                                       5-Title I schoolwide school
## 3914                                                               n/a
## 3915                                            6-Not a Title I school
## 3916                                            6-Not a Title I school
## 3917                                            6-Not a Title I school
## 3918                                            6-Not a Title I school
## 3919                                                               n/a
## 3920                                            6-Not a Title I school
## 3921                                            6-Not a Title I school
## 3922                                            6-Not a Title I school
## 3923                                            6-Not a Title I school
## 3924                   4-Title I schoolwide eligible school-No program
## 3925                                            6-Not a Title I school
## 3926                                            6-Not a Title I school
## 3927                                            6-Not a Title I school
## 3928          1-Title I targeted assistance eligible school-No program
## 3929                              2-Title I targeted assistance school
## 3930                                            6-Not a Title I school
## 3931                                                               n/a
## 3932                                       5-Title I schoolwide school
## 3933                                                               n/a
## 3934                                            6-Not a Title I school
## 3935                                            6-Not a Title I school
## 3936                                            6-Not a Title I school
## 3937                                                              <NA>
## 3938                                       5-Title I schoolwide school
## 3939                                       5-Title I schoolwide school
## 3940                                       5-Title I schoolwide school
## 3941                                       5-Title I schoolwide school
## 3942                                            6-Not a Title I school
## 3943                                            6-Not a Title I school
## 3944                                            6-Not a Title I school
## 3945                                                               n/a
## 3946                                            6-Not a Title I school
## 3947                                            6-Not a Title I school
## 3948                                            6-Not a Title I school
## 3949                                       5-Title I schoolwide school
## 3950                                            6-Not a Title I school
## 3951                                            6-Not a Title I school
## 3952                   4-Title I schoolwide eligible school-No program
## 3953                              2-Title I targeted assistance school
## 3954                                       5-Title I schoolwide school
## 3955          1-Title I targeted assistance eligible school-No program
## 3956                                       5-Title I schoolwide school
## 3957                              2-Title I targeted assistance school
## 3958                                       5-Title I schoolwide school
## 3959                                                               n/a
## 3960                                            6-Not a Title I school
## 3961                                            6-Not a Title I school
## 3962                                       5-Title I schoolwide school
## 3963                                       5-Title I schoolwide school
## 3964                                       5-Title I schoolwide school
## 3965                                       5-Title I schoolwide school
## 3966                                       5-Title I schoolwide school
## 3967                                       5-Title I schoolwide school
## 3968                                       5-Title I schoolwide school
## 3969                   4-Title I schoolwide eligible school-No program
## 3970                                       5-Title I schoolwide school
## 3971                                       5-Title I schoolwide school
## 3972                                       5-Title I schoolwide school
## 3973                                       5-Title I schoolwide school
## 3974                                            6-Not a Title I school
## 3975                   4-Title I schoolwide eligible school-No program
## 3976                                       5-Title I schoolwide school
## 3977                                            6-Not a Title I school
## 3978                                       5-Title I schoolwide school
## 3979                                       5-Title I schoolwide school
## 3980                                       5-Title I schoolwide school
## 3981                   4-Title I schoolwide eligible school-No program
## 3982                   4-Title I schoolwide eligible school-No program
## 3983                                       5-Title I schoolwide school
## 3984                                       5-Title I schoolwide school
## 3985                                            6-Not a Title I school
## 3986                                       5-Title I schoolwide school
## 3987                                       5-Title I schoolwide school
## 3988                                       5-Title I schoolwide school
## 3989                   4-Title I schoolwide eligible school-No program
## 3990                                       5-Title I schoolwide school
## 3991                                       5-Title I schoolwide school
## 3992                                            6-Not a Title I school
## 3993                                       5-Title I schoolwide school
## 3994                                       5-Title I schoolwide school
## 3995                                                               n/a
## 3996                                       5-Title I schoolwide school
## 3997                              2-Title I targeted assistance school
## 3998                                                               n/a
## 3999                                                               n/a
## 4000                   4-Title I schoolwide eligible school-No program
## 4001                                            6-Not a Title I school
## 4002                                            6-Not a Title I school
## 4003                                                               n/a
## 4004                   4-Title I schoolwide eligible school-No program
## 4005          1-Title I targeted assistance eligible school-No program
## 4006                                            6-Not a Title I school
## 4007                                            6-Not a Title I school
## 4008                                                               n/a
## 4009                                                               n/a
## 4010                              2-Title I targeted assistance school
## 4011                              2-Title I targeted assistance school
## 4012                                                               n/a
## 4013                                                               n/a
## 4014                              2-Title I targeted assistance school
## 4015                                            6-Not a Title I school
## 4016                                       5-Title I schoolwide school
## 4017                                                               n/a
## 4018                                                               n/a
## 4019                                       5-Title I schoolwide school
## 4020                                            6-Not a Title I school
## 4021                                            6-Not a Title I school
## 4022                                            6-Not a Title I school
## 4023                                                               n/a
## 4024                                            6-Not a Title I school
## 4025                                            6-Not a Title I school
## 4026                                                               n/a
## 4027                                                               n/a
## 4028                                            6-Not a Title I school
## 4029                                       5-Title I schoolwide school
## 4030                                                               n/a
## 4031                                                              <NA>
## 4032                                                              <NA>
## 4033                                                              <NA>
## 4034                                                              <NA>
## 4035                                                              <NA>
## 4036                                                              <NA>
## 4037                              2-Title I targeted assistance school
## 4038                                       5-Title I schoolwide school
## 4039                                       5-Title I schoolwide school
## 4040          1-Title I targeted assistance eligible school-No program
## 4041                                                               n/a
## 4042                                            6-Not a Title I school
## 4043                                       5-Title I schoolwide school
## 4044                                                               n/a
## 4045          1-Title I targeted assistance eligible school-No program
## 4046                                       5-Title I schoolwide school
## 4047                                       5-Title I schoolwide school
## 4048                                            6-Not a Title I school
## 4049                                                               n/a
## 4050                                       5-Title I schoolwide school
## 4051                                       5-Title I schoolwide school
## 4052                                            6-Not a Title I school
## 4053                                       5-Title I schoolwide school
## 4054                                            6-Not a Title I school
## 4055                                       5-Title I schoolwide school
## 4056                   4-Title I schoolwide eligible school-No program
## 4057                                                               n/a
## 4058                                            6-Not a Title I school
## 4059                                            6-Not a Title I school
## 4060                                            6-Not a Title I school
## 4061                                            6-Not a Title I school
## 4062                                            6-Not a Title I school
## 4063                                            6-Not a Title I school
## 4064                                            6-Not a Title I school
## 4065                                                               n/a
## 4066                   4-Title I schoolwide eligible school-No program
## 4067                                            6-Not a Title I school
## 4068                                                               n/a
## 4069                              2-Title I targeted assistance school
## 4070                                                               n/a
## 4071                                       5-Title I schoolwide school
## 4072                                            6-Not a Title I school
## 4073                                            6-Not a Title I school
## 4074                                       5-Title I schoolwide school
## 4075                                                               n/a
## 4076                                            6-Not a Title I school
## 4077                                            6-Not a Title I school
## 4078                                            6-Not a Title I school
## 4079                   4-Title I schoolwide eligible school-No program
## 4080                                       5-Title I schoolwide school
## 4081                                       5-Title I schoolwide school
## 4082                                            6-Not a Title I school
## 4083                   4-Title I schoolwide eligible school-No program
## 4084                              2-Title I targeted assistance school
## 4085                                            6-Not a Title I school
## 4086                                            6-Not a Title I school
## 4087                                            6-Not a Title I school
## 4088                                                               n/a
## 4089                                            6-Not a Title I school
## 4090                                            6-Not a Title I school
## 4091                                            6-Not a Title I school
## 4092                                                               n/a
## 4093                              2-Title I targeted assistance school
## 4094                   4-Title I schoolwide eligible school-No program
## 4095                                            6-Not a Title I school
## 4096                                       5-Title I schoolwide school
## 4097                                            6-Not a Title I school
## 4098                                            6-Not a Title I school
## 4099                                       5-Title I schoolwide school
## 4100                   4-Title I schoolwide eligible school-No program
## 4101                              2-Title I targeted assistance school
## 4102                                       5-Title I schoolwide school
## 4103          1-Title I targeted assistance eligible school-No program
## 4104                                            6-Not a Title I school
## 4105          1-Title I targeted assistance eligible school-No program
## 4106                                            6-Not a Title I school
## 4107                                                               n/a
## 4108                                            6-Not a Title I school
## 4109                                            6-Not a Title I school
## 4110                   4-Title I schoolwide eligible school-No program
## 4111                                                               n/a
## 4112                                       5-Title I schoolwide school
## 4113                   4-Title I schoolwide eligible school-No program
## 4114                              2-Title I targeted assistance school
## 4115                                            6-Not a Title I school
## 4116                                                               n/a
## 4117                                                               n/a
## 4118                                       5-Title I schoolwide school
## 4119                                                               n/a
## 4120                                            6-Not a Title I school
## 4121                                            6-Not a Title I school
## 4122                                                               n/a
## 4123                                                               n/a
## 4124                                       5-Title I schoolwide school
## 4125                                       5-Title I schoolwide school
## 4126                                       5-Title I schoolwide school
## 4127                   4-Title I schoolwide eligible school-No program
## 4128                                                               n/a
## 4129                                                               n/a
## 4130                                                               n/a
## 4131                                            6-Not a Title I school
## 4132                                            6-Not a Title I school
## 4133                                       5-Title I schoolwide school
## 4134                                       5-Title I schoolwide school
## 4135                                       5-Title I schoolwide school
## 4136                                                               n/a
## 4137                                       5-Title I schoolwide school
## 4138                                                               n/a
## 4139                                            6-Not a Title I school
## 4140                                                               n/a
## 4141                                            6-Not a Title I school
## 4142                                                               n/a
## 4143                              2-Title I targeted assistance school
## 4144                                            6-Not a Title I school
## 4145                                                               n/a
## 4146                                                               n/a
## 4147                                            6-Not a Title I school
## 4148                              2-Title I targeted assistance school
## 4149          1-Title I targeted assistance eligible school-No program
## 4150                                       5-Title I schoolwide school
## 4151                                                               n/a
## 4152                                                               n/a
## 4153                                       5-Title I schoolwide school
## 4154                                       5-Title I schoolwide school
## 4155          1-Title I targeted assistance eligible school-No program
## 4156                                                               n/a
## 4157                                                               n/a
## 4158                                            6-Not a Title I school
## 4159                                            6-Not a Title I school
## 4160                                            6-Not a Title I school
## 4161                                            6-Not a Title I school
## 4162                                            6-Not a Title I school
## 4163                                            6-Not a Title I school
## 4164                                                               n/a
## 4165                                                               n/a
## 4166                                            6-Not a Title I school
## 4167                                            6-Not a Title I school
## 4168                                                               n/a
## 4169                                                               n/a
## 4170                                            6-Not a Title I school
## 4171                                                               n/a
## 4172                                                               n/a
## 4173                                            6-Not a Title I school
## 4174                                                               n/a
## 4175                                                               n/a
## 4176                                                               n/a
## 4177                                            6-Not a Title I school
## 4178                                            6-Not a Title I school
## 4179                                            6-Not a Title I school
## 4180                                       5-Title I schoolwide school
## 4181                                       5-Title I schoolwide school
## 4182                                       5-Title I schoolwide school
## 4183                              2-Title I targeted assistance school
## 4184                                            6-Not a Title I school
## 4185                                       5-Title I schoolwide school
## 4186                                            6-Not a Title I school
## 4187                                       5-Title I schoolwide school
## 4188                                       5-Title I schoolwide school
## 4189                                                               n/a
## 4190                                       5-Title I schoolwide school
## 4191                                       5-Title I schoolwide school
## 4192                                            6-Not a Title I school
## 4193                                            6-Not a Title I school
## 4194                                            6-Not a Title I school
## 4195                                            6-Not a Title I school
## 4196                                            6-Not a Title I school
## 4197                                                               n/a
## 4198                                                               n/a
## 4199                                       5-Title I schoolwide school
## 4200                                            6-Not a Title I school
## 4201          1-Title I targeted assistance eligible school-No program
## 4202                                                               n/a
## 4203                                       5-Title I schoolwide school
## 4204                                       5-Title I schoolwide school
## 4205                   4-Title I schoolwide eligible school-No program
## 4206                                       5-Title I schoolwide school
## 4207 3-Title I schoolwide eligible-Title I targeted assistance program
## 4208                                       5-Title I schoolwide school
## 4209                   4-Title I schoolwide eligible school-No program
## 4210                                            6-Not a Title I school
## 4211                                       5-Title I schoolwide school
## 4212                              2-Title I targeted assistance school
## 4213                                            6-Not a Title I school
## 4214                                       5-Title I schoolwide school
## 4215                                       5-Title I schoolwide school
## 4216                                       5-Title I schoolwide school
## 4217                                       5-Title I schoolwide school
## 4218                                       5-Title I schoolwide school
## 4219                                       5-Title I schoolwide school
## 4220                   4-Title I schoolwide eligible school-No program
## 4221                                       5-Title I schoolwide school
## 4222                   4-Title I schoolwide eligible school-No program
## 4223                                       5-Title I schoolwide school
## 4224                                       5-Title I schoolwide school
## 4225                                            6-Not a Title I school
## 4226                   4-Title I schoolwide eligible school-No program
## 4227                                       5-Title I schoolwide school
## 4228          1-Title I targeted assistance eligible school-No program
## 4229                                                               n/a
## 4230                                       5-Title I schoolwide school
## 4231                                                               n/a
## 4232                                                               n/a
## 4233                                       5-Title I schoolwide school
## 4234                   4-Title I schoolwide eligible school-No program
## 4235                                       5-Title I schoolwide school
## 4236                                       5-Title I schoolwide school
## 4237                                            6-Not a Title I school
## 4238          1-Title I targeted assistance eligible school-No program
## 4239                              2-Title I targeted assistance school
## 4240          1-Title I targeted assistance eligible school-No program
## 4241                              2-Title I targeted assistance school
## 4242                              2-Title I targeted assistance school
## 4243                                       5-Title I schoolwide school
## 4244                                            6-Not a Title I school
## 4245                                                               n/a
## 4246                                            6-Not a Title I school
## 4247                                                               n/a
## 4248                                       5-Title I schoolwide school
## 4249                                       5-Title I schoolwide school
## 4250                                                               n/a
## 4251                                                               n/a
## 4252                                            6-Not a Title I school
## 4253                                       5-Title I schoolwide school
## 4254                                            6-Not a Title I school
## 4255          1-Title I targeted assistance eligible school-No program
## 4256                                       5-Title I schoolwide school
## 4257                                            6-Not a Title I school
## 4258                                            6-Not a Title I school
## 4259                                                               n/a
## 4260                   4-Title I schoolwide eligible school-No program
## 4261                                       5-Title I schoolwide school
## 4262                                       5-Title I schoolwide school
## 4263          1-Title I targeted assistance eligible school-No program
## 4264                                       5-Title I schoolwide school
## 4265                                       5-Title I schoolwide school
## 4266                                                              <NA>
## 4267                                       5-Title I schoolwide school
## 4268                                       5-Title I schoolwide school
## 4269                                       5-Title I schoolwide school
## 4270                                            6-Not a Title I school
## 4271                                                               n/a
## 4272                                                               n/a
## 4273                                            6-Not a Title I school
## 4274                                       5-Title I schoolwide school
## 4275                                                               n/a
## 4276                                            6-Not a Title I school
## 4277                                       5-Title I schoolwide school
## 4278                                       5-Title I schoolwide school
## 4279                                       5-Title I schoolwide school
## 4280                                       5-Title I schoolwide school
## 4281                                                               n/a
## 4282                                                               n/a
## 4283                                       5-Title I schoolwide school
## 4284                   4-Title I schoolwide eligible school-No program
## 4285                                                               n/a
## 4286                                       5-Title I schoolwide school
## 4287                                            6-Not a Title I school
## 4288                                       5-Title I schoolwide school
## 4289                                                               n/a
## 4290                   4-Title I schoolwide eligible school-No program
## 4291                                                               n/a
## 4292                              2-Title I targeted assistance school
## 4293                                       5-Title I schoolwide school
## 4294                                            6-Not a Title I school
## 4295                                       5-Title I schoolwide school
## 4296                                       5-Title I schoolwide school
## 4297                   4-Title I schoolwide eligible school-No program
## 4298                              2-Title I targeted assistance school
## 4299                                            6-Not a Title I school
## 4300                   4-Title I schoolwide eligible school-No program
## 4301                                       5-Title I schoolwide school
## 4302                                            6-Not a Title I school
## 4303                                       5-Title I schoolwide school
## 4304          1-Title I targeted assistance eligible school-No program
## 4305                              2-Title I targeted assistance school
## 4306                                            6-Not a Title I school
## 4307                                            6-Not a Title I school
## 4308                                            6-Not a Title I school
## 4309                                                               n/a
## 4310                                                               n/a
## 4311                                            6-Not a Title I school
## 4312                                            6-Not a Title I school
## 4313                                            6-Not a Title I school
## 4314                                            6-Not a Title I school
## 4315          1-Title I targeted assistance eligible school-No program
## 4316                                            6-Not a Title I school
## 4317          1-Title I targeted assistance eligible school-No program
## 4318                                                               n/a
## 4319                                       5-Title I schoolwide school
## 4320                                       5-Title I schoolwide school
## 4321                                       5-Title I schoolwide school
## 4322                   4-Title I schoolwide eligible school-No program
## 4323                                                               n/a
## 4324          1-Title I targeted assistance eligible school-No program
## 4325                                            6-Not a Title I school
## 4326                                            6-Not a Title I school
## 4327                                                               n/a
## 4328                                            6-Not a Title I school
## 4329                   4-Title I schoolwide eligible school-No program
## 4330                              2-Title I targeted assistance school
## 4331                                       5-Title I schoolwide school
## 4332                                       5-Title I schoolwide school
## 4333                                                               n/a
## 4334                                                               n/a
## 4335                   4-Title I schoolwide eligible school-No program
## 4336                                            6-Not a Title I school
## 4337          1-Title I targeted assistance eligible school-No program
## 4338                                                               n/a
## 4339                                                               n/a
## 4340                                                               n/a
## 4341                                            6-Not a Title I school
## 4342                                            6-Not a Title I school
## 4343                                            6-Not a Title I school
## 4344                                            6-Not a Title I school
## 4345                                            6-Not a Title I school
## 4346                                            6-Not a Title I school
## 4347                                            6-Not a Title I school
## 4348                                                               n/a
## 4349                                                               n/a
## 4350                                                               n/a
## 4351                                                               n/a
## 4352                                                               n/a
## 4353                                                               n/a
## 4354                   4-Title I schoolwide eligible school-No program
## 4355                                       5-Title I schoolwide school
## 4356                                                               n/a
## 4357                                       5-Title I schoolwide school
## 4358                                            6-Not a Title I school
## 4359                                       5-Title I schoolwide school
## 4360                                       5-Title I schoolwide school
## 4361                   4-Title I schoolwide eligible school-No program
## 4362                                       5-Title I schoolwide school
## 4363                                                              <NA>
## 4364                   4-Title I schoolwide eligible school-No program
## 4365                                       5-Title I schoolwide school
## 4366                                            6-Not a Title I school
## 4367                                       5-Title I schoolwide school
## 4368          1-Title I targeted assistance eligible school-No program
## 4369                                       5-Title I schoolwide school
## 4370                                            6-Not a Title I school
## 4371                                            6-Not a Title I school
## 4372                                            6-Not a Title I school
## 4373                   4-Title I schoolwide eligible school-No program
## 4374                              2-Title I targeted assistance school
## 4375                                                               n/a
## 4376                                            6-Not a Title I school
## 4377                                            6-Not a Title I school
## 4378                                       5-Title I schoolwide school
## 4379                                                               n/a
## 4380                                            6-Not a Title I school
## 4381                                            6-Not a Title I school
## 4382                                       5-Title I schoolwide school
## 4383                                       5-Title I schoolwide school
## 4384                                       5-Title I schoolwide school
## 4385                                       5-Title I schoolwide school
## 4386                                       5-Title I schoolwide school
## 4387                                            6-Not a Title I school
## 4388                                            6-Not a Title I school
## 4389                                            6-Not a Title I school
## 4390                                            6-Not a Title I school
## 4391                                                               n/a
## 4392                                            6-Not a Title I school
## 4393                                            6-Not a Title I school
## 4394                                                               n/a
## 4395                                            6-Not a Title I school
## 4396                                       5-Title I schoolwide school
## 4397                                       5-Title I schoolwide school
## 4398                                       5-Title I schoolwide school
## 4399                                       5-Title I schoolwide school
## 4400                                       5-Title I schoolwide school
## 4401                                       5-Title I schoolwide school
## 4402          1-Title I targeted assistance eligible school-No program
## 4403                                       5-Title I schoolwide school
## 4404                                       5-Title I schoolwide school
## 4405                                       5-Title I schoolwide school
## 4406                                       5-Title I schoolwide school
## 4407                                       5-Title I schoolwide school
## 4408                                       5-Title I schoolwide school
## 4409                                       5-Title I schoolwide school
## 4410                                       5-Title I schoolwide school
## 4411                                                               n/a
## 4412                                                              <NA>
## 4413                                       5-Title I schoolwide school
## 4414                                       5-Title I schoolwide school
## 4415                                       5-Title I schoolwide school
## 4416                                                               n/a
## 4417                              2-Title I targeted assistance school
## 4418                                       5-Title I schoolwide school
## 4419                                       5-Title I schoolwide school
## 4420                                       5-Title I schoolwide school
## 4421                                       5-Title I schoolwide school
## 4422                                                               n/a
## 4423                                       5-Title I schoolwide school
## 4424                                            6-Not a Title I school
## 4425                                            6-Not a Title I school
## 4426                                            6-Not a Title I school
## 4427                                            6-Not a Title I school
## 4428                                       5-Title I schoolwide school
## 4429                                                              <NA>
## 4430                                                              <NA>
## 4431          1-Title I targeted assistance eligible school-No program
## 4432                                       5-Title I schoolwide school
## 4433                                       5-Title I schoolwide school
## 4434                                       5-Title I schoolwide school
## 4435                              2-Title I targeted assistance school
## 4436                              2-Title I targeted assistance school
## 4437                                       5-Title I schoolwide school
## 4438                                       5-Title I schoolwide school
## 4439                                            6-Not a Title I school
## 4440                                                               n/a
## 4441                                            6-Not a Title I school
## 4442                                       5-Title I schoolwide school
## 4443                                       5-Title I schoolwide school
## 4444                                                               n/a
## 4445                                       5-Title I schoolwide school
## 4446                                            6-Not a Title I school
## 4447                                            6-Not a Title I school
## 4448                                                               n/a
## 4449                                            6-Not a Title I school
## 4450                                            6-Not a Title I school
## 4451                                       5-Title I schoolwide school
## 4452                                            6-Not a Title I school
## 4453                                       5-Title I schoolwide school
## 4454                                                               n/a
## 4455                                       5-Title I schoolwide school
## 4456                                                              <NA>
## 4457                                       5-Title I schoolwide school
## 4458                                       5-Title I schoolwide school
## 4459                                            6-Not a Title I school
## 4460                                            6-Not a Title I school
## 4461                                                               n/a
## 4462                                            6-Not a Title I school
## 4463                                       5-Title I schoolwide school
## 4464                                                               n/a
## 4465                   4-Title I schoolwide eligible school-No program
## 4466          1-Title I targeted assistance eligible school-No program
## 4467                                       5-Title I schoolwide school
## 4468                                       5-Title I schoolwide school
## 4469                   4-Title I schoolwide eligible school-No program
## 4470                                                               n/a
## 4471                                                               n/a
## 4472                                            6-Not a Title I school
## 4473                                            6-Not a Title I school
## 4474                                            6-Not a Title I school
## 4475                                       5-Title I schoolwide school
## 4476          1-Title I targeted assistance eligible school-No program
## 4477          1-Title I targeted assistance eligible school-No program
## 4478                                            6-Not a Title I school
## 4479                   4-Title I schoolwide eligible school-No program
## 4480                                                               n/a
## 4481          1-Title I targeted assistance eligible school-No program
## 4482                                       5-Title I schoolwide school
## 4483                                                               n/a
## 4484                                            6-Not a Title I school
## 4485                                            6-Not a Title I school
## 4486                                       5-Title I schoolwide school
## 4487          1-Title I targeted assistance eligible school-No program
## 4488                                            6-Not a Title I school
## 4489                                                               n/a
## 4490                                            6-Not a Title I school
## 4491                                                               n/a
## 4492                   4-Title I schoolwide eligible school-No program
## 4493                                       5-Title I schoolwide school
## 4494                                       5-Title I schoolwide school
## 4495                                       5-Title I schoolwide school
## 4496                                       5-Title I schoolwide school
## 4497                                                               n/a
## 4498                                            6-Not a Title I school
## 4499                                            6-Not a Title I school
## 4500                                                               n/a
## 4501                                                               n/a
## 4502                              2-Title I targeted assistance school
## 4503          1-Title I targeted assistance eligible school-No program
## 4504                                            6-Not a Title I school
## 4505                                       5-Title I schoolwide school
## 4506                   4-Title I schoolwide eligible school-No program
## 4507                                                               n/a
## 4508                                       5-Title I schoolwide school
## 4509                                       5-Title I schoolwide school
## 4510                                            6-Not a Title I school
## 4511                   4-Title I schoolwide eligible school-No program
## 4512                                       5-Title I schoolwide school
## 4513                                       5-Title I schoolwide school
## 4514                   4-Title I schoolwide eligible school-No program
## 4515                                            6-Not a Title I school
## 4516                                            6-Not a Title I school
## 4517                                                               n/a
## 4518                                            6-Not a Title I school
## 4519                                                               n/a
## 4520                                            6-Not a Title I school
## 4521                   4-Title I schoolwide eligible school-No program
## 4522                                            6-Not a Title I school
## 4523                                            6-Not a Title I school
## 4524                                                               n/a
## 4525                              2-Title I targeted assistance school
## 4526                                       5-Title I schoolwide school
## 4527                                            6-Not a Title I school
## 4528                                       5-Title I schoolwide school
## 4529                                                               n/a
## 4530                                       5-Title I schoolwide school
## 4531                              2-Title I targeted assistance school
## 4532                   4-Title I schoolwide eligible school-No program
## 4533          1-Title I targeted assistance eligible school-No program
## 4534                                            6-Not a Title I school
## 4535                                            6-Not a Title I school
## 4536                                                               n/a
## 4537                              2-Title I targeted assistance school
## 4538                                                               n/a
## 4539                                                               n/a
## 4540                                            6-Not a Title I school
## 4541                                                               n/a
## 4542                                       5-Title I schoolwide school
## 4543          1-Title I targeted assistance eligible school-No program
## 4544                                            6-Not a Title I school
## 4545                                       5-Title I schoolwide school
## 4546                                            6-Not a Title I school
## 4547                                                               n/a
## 4548                                            6-Not a Title I school
## 4549                                            6-Not a Title I school
## 4550                                            6-Not a Title I school
## 4551                   4-Title I schoolwide eligible school-No program
## 4552                                                               n/a
## 4553                   4-Title I schoolwide eligible school-No program
## 4554                                                               n/a
## 4555                                       5-Title I schoolwide school
## 4556                                       5-Title I schoolwide school
## 4557                              2-Title I targeted assistance school
## 4558                                       5-Title I schoolwide school
## 4559                              2-Title I targeted assistance school
## 4560                              2-Title I targeted assistance school
## 4561                              2-Title I targeted assistance school
## 4562                              2-Title I targeted assistance school
## 4563                                            6-Not a Title I school
## 4564                                            6-Not a Title I school
## 4565                                       5-Title I schoolwide school
## 4566                   4-Title I schoolwide eligible school-No program
## 4567                                            6-Not a Title I school
## 4568                              2-Title I targeted assistance school
## 4569          1-Title I targeted assistance eligible school-No program
## 4570          1-Title I targeted assistance eligible school-No program
## 4571          1-Title I targeted assistance eligible school-No program
## 4572                                       5-Title I schoolwide school
## 4573                   4-Title I schoolwide eligible school-No program
## 4574                                       5-Title I schoolwide school
## 4575                   4-Title I schoolwide eligible school-No program
## 4576                                                               n/a
## 4577                                            6-Not a Title I school
## 4578                                                               n/a
## 4579                                            6-Not a Title I school
## 4580                   4-Title I schoolwide eligible school-No program
## 4581                                            6-Not a Title I school
## 4582                                            6-Not a Title I school
## 4583                                            6-Not a Title I school
## 4584                                                               n/a
## 4585                                            6-Not a Title I school
## 4586                                       5-Title I schoolwide school
## 4587                                            6-Not a Title I school
## 4588                                                               n/a
## 4589                   4-Title I schoolwide eligible school-No program
## 4590                                            6-Not a Title I school
## 4591                                            6-Not a Title I school
## 4592                                                               n/a
## 4593                                            6-Not a Title I school
## 4594                                            6-Not a Title I school
## 4595                                            6-Not a Title I school
## 4596                                                               n/a
## 4597                                                               n/a
## 4598                                            6-Not a Title I school
## 4599                                            6-Not a Title I school
## 4600                                       5-Title I schoolwide school
## 4601                                       5-Title I schoolwide school
## 4602                                       5-Title I schoolwide school
## 4603                                            6-Not a Title I school
## 4604                              2-Title I targeted assistance school
## 4605                                       5-Title I schoolwide school
## 4606                              2-Title I targeted assistance school
## 4607                                                               n/a
## 4608                                       5-Title I schoolwide school
## 4609          1-Title I targeted assistance eligible school-No program
## 4610                                                              <NA>
## 4611                                                              <NA>
## 4612                                       5-Title I schoolwide school
## 4613                                            6-Not a Title I school
## 4614                              2-Title I targeted assistance school
## 4615                                       5-Title I schoolwide school
## 4616                                       5-Title I schoolwide school
## 4617                                                               n/a
## 4618                                                               n/a
## 4619                   4-Title I schoolwide eligible school-No program
## 4620                                                               n/a
## 4621                                            6-Not a Title I school
## 4622                                       5-Title I schoolwide school
## 4623                                       5-Title I schoolwide school
## 4624                                            6-Not a Title I school
## 4625                                            6-Not a Title I school
## 4626                                                               n/a
## 4627                                       5-Title I schoolwide school
## 4628                   4-Title I schoolwide eligible school-No program
## 4629                                            6-Not a Title I school
## 4630                   4-Title I schoolwide eligible school-No program
## 4631                                       5-Title I schoolwide school
## 4632                              2-Title I targeted assistance school
## 4633                   4-Title I schoolwide eligible school-No program
## 4634                                       5-Title I schoolwide school
## 4635                                                               n/a
## 4636                                       5-Title I schoolwide school
## 4637                                                               n/a
## 4638                                       5-Title I schoolwide school
## 4639                                                               n/a
## 4640                                            6-Not a Title I school
## 4641                                                              <NA>
## 4642                                            6-Not a Title I school
## 4643                                                               n/a
## 4644                                            6-Not a Title I school
## 4645                                                              <NA>
## 4646                                                               n/a
## 4647                   4-Title I schoolwide eligible school-No program
## 4648                                                               n/a
## 4649                                            6-Not a Title I school
## 4650                                            6-Not a Title I school
## 4651                                                               n/a
## 4652                                                               n/a
## 4653                                            6-Not a Title I school
## 4654                                            6-Not a Title I school
## 4655                                            6-Not a Title I school
## 4656                                            6-Not a Title I school
## 4657                                       5-Title I schoolwide school
## 4658                                       5-Title I schoolwide school
## 4659                                       5-Title I schoolwide school
## 4660                                       5-Title I schoolwide school
## 4661                                            6-Not a Title I school
## 4662                                       5-Title I schoolwide school
## 4663                                            6-Not a Title I school
## 4664                                            6-Not a Title I school
## 4665                                            6-Not a Title I school
## 4666                                                               n/a
## 4667                                            6-Not a Title I school
## 4668                                            6-Not a Title I school
## 4669                                            6-Not a Title I school
## 4670          1-Title I targeted assistance eligible school-No program
## 4671                                                               n/a
## 4672                                                               n/a
## 4673          1-Title I targeted assistance eligible school-No program
## 4674                   4-Title I schoolwide eligible school-No program
## 4675                                                               n/a
## 4676                                                               n/a
## 4677                                       5-Title I schoolwide school
## 4678                                                               n/a
## 4679 3-Title I schoolwide eligible-Title I targeted assistance program
## 4680                                                               n/a
## 4681                                            6-Not a Title I school
## 4682                                            6-Not a Title I school
## 4683                   4-Title I schoolwide eligible school-No program
## 4684                                                               n/a
## 4685                                                               n/a
## 4686                                                               n/a
## 4687                                            6-Not a Title I school
## 4688                                       5-Title I schoolwide school
## 4689                                       5-Title I schoolwide school
## 4690                                                               n/a
## 4691                                       5-Title I schoolwide school
## 4692                                            6-Not a Title I school
## 4693                              2-Title I targeted assistance school
## 4694                                            6-Not a Title I school
## 4695                                            6-Not a Title I school
## 4696                                            6-Not a Title I school
## 4697                                                               n/a
## 4698                                            6-Not a Title I school
## 4699                                            6-Not a Title I school
## 4700                                                               n/a
## 4701                                       5-Title I schoolwide school
## 4702                                                               n/a
## 4703                                       5-Title I schoolwide school
## 4704                                       5-Title I schoolwide school
## 4705                                            6-Not a Title I school
## 4706                                       5-Title I schoolwide school
## 4707                                            6-Not a Title I school
## 4708                                            6-Not a Title I school
## 4709                                            6-Not a Title I school
## 4710                                                               n/a
## 4711                                                               n/a
## 4712                                       5-Title I schoolwide school
## 4713                                                               n/a
## 4714                                       5-Title I schoolwide school
## 4715                                       5-Title I schoolwide school
## 4716                              2-Title I targeted assistance school
## 4717                                            6-Not a Title I school
## 4718                                       5-Title I schoolwide school
## 4719                                       5-Title I schoolwide school
## 4720                   4-Title I schoolwide eligible school-No program
## 4721                                            6-Not a Title I school
## 4722                                       5-Title I schoolwide school
## 4723                                            6-Not a Title I school
## 4724                                            6-Not a Title I school
## 4725                                            6-Not a Title I school
## 4726                                            6-Not a Title I school
## 4727                   4-Title I schoolwide eligible school-No program
## 4728                   4-Title I schoolwide eligible school-No program
## 4729                                            6-Not a Title I school
## 4730                                            6-Not a Title I school
## 4731                                       5-Title I schoolwide school
## 4732                                            6-Not a Title I school
## 4733                                                               n/a
## 4734                                            6-Not a Title I school
## 4735                                       5-Title I schoolwide school
## 4736                                                               n/a
## 4737                                       5-Title I schoolwide school
## 4738                                            6-Not a Title I school
## 4739                                            6-Not a Title I school
## 4740                                            6-Not a Title I school
## 4741                                            6-Not a Title I school
## 4742                                                               n/a
## 4743                                       5-Title I schoolwide school
## 4744                                                               n/a
## 4745                                       5-Title I schoolwide school
## 4746                                            6-Not a Title I school
## 4747                                            6-Not a Title I school
## 4748                   4-Title I schoolwide eligible school-No program
## 4749                   4-Title I schoolwide eligible school-No program
## 4750                                            6-Not a Title I school
## 4751                                            6-Not a Title I school
## 4752                                                               n/a
## 4753                                            6-Not a Title I school
## 4754                                            6-Not a Title I school
## 4755                                            6-Not a Title I school
## 4756                                                               n/a
## 4757                                                               n/a
## 4758                                            6-Not a Title I school
## 4759                                                               n/a
## 4760                                            6-Not a Title I school
## 4761                                                               n/a
## 4762                                                               n/a
## 4763                                            6-Not a Title I school
## 4764                                            6-Not a Title I school
## 4765                                            6-Not a Title I school
## 4766                                            6-Not a Title I school
## 4767                                            6-Not a Title I school
## 4768                                            6-Not a Title I school
## 4769                                            6-Not a Title I school
## 4770                                            6-Not a Title I school
## 4771                                            6-Not a Title I school
## 4772                                            6-Not a Title I school
## 4773                                            6-Not a Title I school
## 4774                                            6-Not a Title I school
## 4775                                            6-Not a Title I school
## 4776                                            6-Not a Title I school
## 4777                                            6-Not a Title I school
## 4778                                                               n/a
## 4779                                            6-Not a Title I school
## 4780                                            6-Not a Title I school
## 4781                                       5-Title I schoolwide school
## 4782                                            6-Not a Title I school
## 4783                                            6-Not a Title I school
## 4784                                                               n/a
## 4785                                            6-Not a Title I school
## 4786                                       5-Title I schoolwide school
## 4787                                            6-Not a Title I school
## 4788                                            6-Not a Title I school
## 4789                                            6-Not a Title I school
## 4790                                            6-Not a Title I school
## 4791                                            6-Not a Title I school
## 4792                                            6-Not a Title I school
## 4793                                       5-Title I schoolwide school
## 4794                              2-Title I targeted assistance school
## 4795                                            6-Not a Title I school
## 4796                                       5-Title I schoolwide school
## 4797                                       5-Title I schoolwide school
## 4798                                            6-Not a Title I school
## 4799          1-Title I targeted assistance eligible school-No program
## 4800                                            6-Not a Title I school
## 4801                                            6-Not a Title I school
## 4802                              2-Title I targeted assistance school
## 4803                                            6-Not a Title I school
## 4804                                            6-Not a Title I school
## 4805                   4-Title I schoolwide eligible school-No program
## 4806                                            6-Not a Title I school
## 4807                                            6-Not a Title I school
## 4808                                       5-Title I schoolwide school
## 4809                                       5-Title I schoolwide school
## 4810                                            6-Not a Title I school
## 4811          1-Title I targeted assistance eligible school-No program
## 4812          1-Title I targeted assistance eligible school-No program
## 4813                                                               n/a
## 4814                                            6-Not a Title I school
## 4815                   4-Title I schoolwide eligible school-No program
## 4816                                            6-Not a Title I school
## 4817                                       5-Title I schoolwide school
## 4818          1-Title I targeted assistance eligible school-No program
## 4819                                                               n/a
## 4820                                       5-Title I schoolwide school
## 4821          1-Title I targeted assistance eligible school-No program
## 4822          1-Title I targeted assistance eligible school-No program
## 4823                                       5-Title I schoolwide school
## 4824                                            6-Not a Title I school
## 4825          1-Title I targeted assistance eligible school-No program
## 4826                                            6-Not a Title I school
## 4827                                            6-Not a Title I school
## 4828                                            6-Not a Title I school
## 4829          1-Title I targeted assistance eligible school-No program
## 4830                                            6-Not a Title I school
## 4831                                            6-Not a Title I school
## 4832                                            6-Not a Title I school
## 4833                                            6-Not a Title I school
## 4834                                            6-Not a Title I school
## 4835                                                               n/a
## 4836          1-Title I targeted assistance eligible school-No program
## 4837                                            6-Not a Title I school
## 4838                                       5-Title I schoolwide school
## 4839                   4-Title I schoolwide eligible school-No program
## 4840                                       5-Title I schoolwide school
## 4841                   4-Title I schoolwide eligible school-No program
## 4842                   4-Title I schoolwide eligible school-No program
## 4843                                            6-Not a Title I school
## 4844                                       5-Title I schoolwide school
## 4845                                                               n/a
## 4846                                                               n/a
## 4847                                                               n/a
## 4848                                       5-Title I schoolwide school
## 4849                   4-Title I schoolwide eligible school-No program
## 4850                                                               n/a
## 4851                   4-Title I schoolwide eligible school-No program
## 4852                              2-Title I targeted assistance school
## 4853                   4-Title I schoolwide eligible school-No program
## 4854                                            6-Not a Title I school
## 4855                                            6-Not a Title I school
## 4856                                            6-Not a Title I school
## 4857                                            6-Not a Title I school
## 4858                                       5-Title I schoolwide school
## 4859                                                               n/a
## 4860                                                               n/a
## 4861                                                               n/a
## 4862                                            6-Not a Title I school
## 4863                                            6-Not a Title I school
## 4864                                            6-Not a Title I school
## 4865                                                               n/a
## 4866                                            6-Not a Title I school
## 4867                                            6-Not a Title I school
## 4868                                                               n/a
## 4869                                            6-Not a Title I school
## 4870                                            6-Not a Title I school
## 4871                                                               n/a
## 4872                                                               n/a
## 4873                                                               n/a
## 4874                                            6-Not a Title I school
## 4875                                                               n/a
## 4876                                            6-Not a Title I school
## 4877                                            6-Not a Title I school
## 4878                                            6-Not a Title I school
## 4879                   4-Title I schoolwide eligible school-No program
## 4880                                            6-Not a Title I school
## 4881                                                               n/a
## 4882                                                               n/a
## 4883                                       5-Title I schoolwide school
## 4884                                                               n/a
## 4885                                            6-Not a Title I school
## 4886                                            6-Not a Title I school
## 4887                                                               n/a
## 4888                   4-Title I schoolwide eligible school-No program
## 4889                   4-Title I schoolwide eligible school-No program
## 4890                   4-Title I schoolwide eligible school-No program
## 4891                                            6-Not a Title I school
## 4892                                            6-Not a Title I school
## 4893                                            6-Not a Title I school
## 4894                                            6-Not a Title I school
## 4895                                            6-Not a Title I school
## 4896                                                               n/a
## 4897                                       5-Title I schoolwide school
## 4898                                       5-Title I schoolwide school
## 4899                   4-Title I schoolwide eligible school-No program
## 4900                                       5-Title I schoolwide school
## 4901                                            6-Not a Title I school
## 4902                                       5-Title I schoolwide school
## 4903          1-Title I targeted assistance eligible school-No program
## 4904                              2-Title I targeted assistance school
## 4905                              2-Title I targeted assistance school
## 4906                   4-Title I schoolwide eligible school-No program
## 4907                                            6-Not a Title I school
## 4908                                            6-Not a Title I school
## 4909                                       5-Title I schoolwide school
## 4910                                       5-Title I schoolwide school
## 4911                                            6-Not a Title I school
## 4912          1-Title I targeted assistance eligible school-No program
## 4913                                            6-Not a Title I school
## 4914                                       5-Title I schoolwide school
## 4915                                            6-Not a Title I school
## 4916                   4-Title I schoolwide eligible school-No program
## 4917                                                               n/a
## 4918                   4-Title I schoolwide eligible school-No program
## 4919                              2-Title I targeted assistance school
## 4920                              2-Title I targeted assistance school
## 4921                                            6-Not a Title I school
## 4922                                       5-Title I schoolwide school
## 4923                                            6-Not a Title I school
## 4924          1-Title I targeted assistance eligible school-No program
## 4925                                            6-Not a Title I school
## 4926                                            6-Not a Title I school
## 4927                                       5-Title I schoolwide school
## 4928                                       5-Title I schoolwide school
## 4929                   4-Title I schoolwide eligible school-No program
## 4930                   4-Title I schoolwide eligible school-No program
## 4931                                            6-Not a Title I school
## 4932                                            6-Not a Title I school
## 4933                   4-Title I schoolwide eligible school-No program
## 4934                                                               n/a
## 4935                                            6-Not a Title I school
## 4936                                            6-Not a Title I school
## 4937                   4-Title I schoolwide eligible school-No program
## 4938                                                               n/a
## 4939                                                               n/a
## 4940                                                               n/a
## 4941                                            6-Not a Title I school
## 4942                                            6-Not a Title I school
## 4943                                                               n/a
## 4944                                                               n/a
## 4945                                            6-Not a Title I school
## 4946                                            6-Not a Title I school
## 4947                   4-Title I schoolwide eligible school-No program
## 4948                   4-Title I schoolwide eligible school-No program
## 4949                   4-Title I schoolwide eligible school-No program
## 4950                   4-Title I schoolwide eligible school-No program
## 4951                   4-Title I schoolwide eligible school-No program
## 4952                                            6-Not a Title I school
## 4953                                       5-Title I schoolwide school
## 4954                                            6-Not a Title I school
## 4955                   4-Title I schoolwide eligible school-No program
## 4956                   4-Title I schoolwide eligible school-No program
## 4957                   4-Title I schoolwide eligible school-No program
## 4958                                       5-Title I schoolwide school
## 4959                                            6-Not a Title I school
## 4960                                       5-Title I schoolwide school
## 4961                                       5-Title I schoolwide school
## 4962                                                               n/a
## 4963                                                               n/a
## 4964                                            6-Not a Title I school
## 4965                   4-Title I schoolwide eligible school-No program
## 4966                                       5-Title I schoolwide school
## 4967                                                               n/a
## 4968                                            6-Not a Title I school
## 4969                                            6-Not a Title I school
## 4970                   4-Title I schoolwide eligible school-No program
## 4971                                            6-Not a Title I school
## 4972                                            6-Not a Title I school
## 4973                                                               n/a
## 4974                                            6-Not a Title I school
## 4975                                            6-Not a Title I school
## 4976                                                               n/a
## 4977                                                               n/a
## 4978                                       5-Title I schoolwide school
## 4979                                       5-Title I schoolwide school
## 4980                                                              <NA>
## 4981                                            6-Not a Title I school
## 4982                                       5-Title I schoolwide school
## 4983                                                               n/a
## 4984                                            6-Not a Title I school
## 4985          1-Title I targeted assistance eligible school-No program
## 4986                                            6-Not a Title I school
## 4987                   4-Title I schoolwide eligible school-No program
## 4988                                            6-Not a Title I school
## 4989                                                               n/a
## 4990                                                               n/a
## 4991                   4-Title I schoolwide eligible school-No program
## 4992                                       5-Title I schoolwide school
## 4993                                            6-Not a Title I school
## 4994                                                               n/a
## 4995                                            6-Not a Title I school
## 4996                                                               n/a
## 4997                                            6-Not a Title I school
## 4998                                       5-Title I schoolwide school
## 4999 3-Title I schoolwide eligible-Title I targeted assistance program
## 5000                                       5-Title I schoolwide school
## 5001                                                               n/a
## 5002                                            6-Not a Title I school
## 5003                   4-Title I schoolwide eligible school-No program
## 5004                                            6-Not a Title I school
## 5005                                                               n/a
## 5006                   4-Title I schoolwide eligible school-No program
## 5007                                                               n/a
## 5008                                            6-Not a Title I school
## 5009                   4-Title I schoolwide eligible school-No program
## 5010          1-Title I targeted assistance eligible school-No program
## 5011                                            6-Not a Title I school
## 5012                                            6-Not a Title I school
## 5013                                            6-Not a Title I school
## 5014                                       5-Title I schoolwide school
## 5015                                                               n/a
## 5016                                                               n/a
## 5017                              2-Title I targeted assistance school
## 5018                                       5-Title I schoolwide school
## 5019                                                               n/a
## 5020                                                               n/a
## 5021                                                               n/a
## 5022                                                               n/a
## 5023                                                               n/a
## 5024                                            6-Not a Title I school
## 5025          1-Title I targeted assistance eligible school-No program
## 5026                                            6-Not a Title I school
## 5027                                            6-Not a Title I school
## 5028                                                               n/a
## 5029                                            6-Not a Title I school
## 5030          1-Title I targeted assistance eligible school-No program
## 5031                   4-Title I schoolwide eligible school-No program
## 5032          1-Title I targeted assistance eligible school-No program
## 5033                                            6-Not a Title I school
## 5034                                                               n/a
## 5035                                            6-Not a Title I school
## 5036                                       5-Title I schoolwide school
## 5037                                       5-Title I schoolwide school
## 5038                                       5-Title I schoolwide school
## 5039                                       5-Title I schoolwide school
## 5040                                       5-Title I schoolwide school
## 5041                                                               n/a
## 5042                                                               n/a
## 5043                                            6-Not a Title I school
## 5044                                                               n/a
## 5045                                                               n/a
## 5046                                                               n/a
## 5047                              2-Title I targeted assistance school
## 5048                                            6-Not a Title I school
## 5049                                            6-Not a Title I school
## 5050                              2-Title I targeted assistance school
## 5051                              2-Title I targeted assistance school
## 5052                                            6-Not a Title I school
## 5053                                       5-Title I schoolwide school
## 5054                                                               n/a
## 5055                              2-Title I targeted assistance school
## 5056                   4-Title I schoolwide eligible school-No program
## 5057                              2-Title I targeted assistance school
## 5058                                                               n/a
## 5059                                            6-Not a Title I school
## 5060                                                               n/a
## 5061                   4-Title I schoolwide eligible school-No program
## 5062                                            6-Not a Title I school
## 5063                                            6-Not a Title I school
## 5064                                       5-Title I schoolwide school
## 5065                                                               n/a
## 5066                   4-Title I schoolwide eligible school-No program
## 5067                                       5-Title I schoolwide school
## 5068                                                               n/a
## 5069                                            6-Not a Title I school
## 5070                                       5-Title I schoolwide school
## 5071                                                               n/a
## 5072                                                               n/a
## 5073                                            6-Not a Title I school
## 5074                                       5-Title I schoolwide school
## 5075          1-Title I targeted assistance eligible school-No program
## 5076                                            6-Not a Title I school
## 5077                                       5-Title I schoolwide school
## 5078                                       5-Title I schoolwide school
## 5079                                            6-Not a Title I school
## 5080                              2-Title I targeted assistance school
## 5081                                       5-Title I schoolwide school
## 5082                                            6-Not a Title I school
## 5083                                                               n/a
## 5084                                            6-Not a Title I school
## 5085                                            6-Not a Title I school
## 5086                              2-Title I targeted assistance school
## 5087                                       5-Title I schoolwide school
## 5088                                                               n/a
## 5089                                                               n/a
## 5090                                            6-Not a Title I school
## 5091                   4-Title I schoolwide eligible school-No program
## 5092                                            6-Not a Title I school
## 5093                                            6-Not a Title I school
## 5094                                       5-Title I schoolwide school
## 5095                                            6-Not a Title I school
## 5096                                                              <NA>
## 5097                                       5-Title I schoolwide school
## 5098                                       5-Title I schoolwide school
## 5099                                            6-Not a Title I school
## 5100          1-Title I targeted assistance eligible school-No program
## 5101                                            6-Not a Title I school
## 5102                                            6-Not a Title I school
## 5103                                       5-Title I schoolwide school
## 5104                                            6-Not a Title I school
## 5105                                            6-Not a Title I school
## 5106                   4-Title I schoolwide eligible school-No program
## 5107                                                               n/a
## 5108                                            6-Not a Title I school
## 5109                                       5-Title I schoolwide school
## 5110          1-Title I targeted assistance eligible school-No program
## 5111                                       5-Title I schoolwide school
## 5112                                            6-Not a Title I school
## 5113                                            6-Not a Title I school
## 5114                                                               n/a
## 5115                                       5-Title I schoolwide school
## 5116                                            6-Not a Title I school
## 5117                                       5-Title I schoolwide school
## 5118                                       5-Title I schoolwide school
## 5119                                       5-Title I schoolwide school
## 5120                                       5-Title I schoolwide school
## 5121                              2-Title I targeted assistance school
## 5122                                            6-Not a Title I school
## 5123                                       5-Title I schoolwide school
## 5124                                       5-Title I schoolwide school
## 5125                                            6-Not a Title I school
## 5126                              2-Title I targeted assistance school
## 5127                                       5-Title I schoolwide school
## 5128                                            6-Not a Title I school
## 5129                                       5-Title I schoolwide school
## 5130                                       5-Title I schoolwide school
## 5131                                       5-Title I schoolwide school
## 5132                              2-Title I targeted assistance school
## 5133                                            6-Not a Title I school
## 5134                                            6-Not a Title I school
## 5135                                       5-Title I schoolwide school
## 5136                                       5-Title I schoolwide school
## 5137                                                               n/a
## 5138                                       5-Title I schoolwide school
## 5139          1-Title I targeted assistance eligible school-No program
## 5140                                            6-Not a Title I school
## 5141                                                               n/a
## 5142                                            6-Not a Title I school
## 5143 3-Title I schoolwide eligible-Title I targeted assistance program
## 5144                              2-Title I targeted assistance school
## 5145                   4-Title I schoolwide eligible school-No program
## 5146                                                               n/a
## 5147                                            6-Not a Title I school
## 5148                                                               n/a
## 5149          1-Title I targeted assistance eligible school-No program
## 5150                                                               n/a
## 5151                                       5-Title I schoolwide school
## 5152                                       5-Title I schoolwide school
## 5153                                                               n/a
## 5154                                            6-Not a Title I school
## 5155                                            6-Not a Title I school
## 5156                   4-Title I schoolwide eligible school-No program
## 5157          1-Title I targeted assistance eligible school-No program
## 5158                                            6-Not a Title I school
## 5159                                            6-Not a Title I school
## 5160                                            6-Not a Title I school
## 5161          1-Title I targeted assistance eligible school-No program
## 5162                                                              <NA>
## 5163                   4-Title I schoolwide eligible school-No program
## 5164                                       5-Title I schoolwide school
## 5165                                            6-Not a Title I school
## 5166                                            6-Not a Title I school
## 5167                                                               n/a
## 5168                                                               n/a
## 5169                                                               n/a
## 5170                                            6-Not a Title I school
## 5171                                                               n/a
## 5172                                            6-Not a Title I school
## 5173                                                               n/a
## 5174                                       5-Title I schoolwide school
## 5175                                                               n/a
## 5176                                            6-Not a Title I school
## 5177                                            6-Not a Title I school
## 5178                                                               n/a
## 5179                                       5-Title I schoolwide school
## 5180                                                               n/a
## 5181                                       5-Title I schoolwide school
## 5182                                            6-Not a Title I school
## 5183                                            6-Not a Title I school
## 5184                                       5-Title I schoolwide school
## 5185                              2-Title I targeted assistance school
## 5186                                       5-Title I schoolwide school
## 5187                                            6-Not a Title I school
## 5188                                            6-Not a Title I school
## 5189                              2-Title I targeted assistance school
## 5190                                       5-Title I schoolwide school
## 5191                                                              <NA>
## 5192          1-Title I targeted assistance eligible school-No program
## 5193                                       5-Title I schoolwide school
## 5194                                       5-Title I schoolwide school
## 5195                                       5-Title I schoolwide school
## 5196                                                               n/a
## 5197                              2-Title I targeted assistance school
## 5198                                                               n/a
## 5199                                            6-Not a Title I school
## 5200                                       5-Title I schoolwide school
## 5201                   4-Title I schoolwide eligible school-No program
## 5202                                       5-Title I schoolwide school
## 5203                                       5-Title I schoolwide school
## 5204                                       5-Title I schoolwide school
## 5205                                       5-Title I schoolwide school
## 5206                                       5-Title I schoolwide school
## 5207                                       5-Title I schoolwide school
## 5208                                            6-Not a Title I school
## 5209          1-Title I targeted assistance eligible school-No program
## 5210                                       5-Title I schoolwide school
## 5211                                       5-Title I schoolwide school
## 5212                                       5-Title I schoolwide school
## 5213                                            6-Not a Title I school
## 5214                                       5-Title I schoolwide school
## 5215                                                               n/a
## 5216                                                               n/a
## 5217                                       5-Title I schoolwide school
## 5218          1-Title I targeted assistance eligible school-No program
## 5219                                                               n/a
## 5220                                            6-Not a Title I school
## 5221                                                              <NA>
## 5222                                                               n/a
## 5223                                                               n/a
## 5224                   4-Title I schoolwide eligible school-No program
## 5225                                                               n/a
## 5226                                                               n/a
## 5227                                       5-Title I schoolwide school
## 5228                                       5-Title I schoolwide school
## 5229                                                               n/a
## 5230                                                               n/a
## 5231                                       5-Title I schoolwide school
## 5232                                       5-Title I schoolwide school
## 5233                              2-Title I targeted assistance school
## 5234                              2-Title I targeted assistance school
## 5235                                            6-Not a Title I school
## 5236                                            6-Not a Title I school
## 5237                   4-Title I schoolwide eligible school-No program
## 5238                                            6-Not a Title I school
## 5239                                                               n/a
## 5240          1-Title I targeted assistance eligible school-No program
## 5241                                                               n/a
## 5242                                                               n/a
## 5243                                            6-Not a Title I school
## 5244                                            6-Not a Title I school
## 5245                                                               n/a
## 5246                                                               n/a
## 5247                                            6-Not a Title I school
## 5248                                            6-Not a Title I school
## 5249                                            6-Not a Title I school
## 5250                                       5-Title I schoolwide school
## 5251                                                               n/a
## 5252                                                               n/a
## 5253                                            6-Not a Title I school
## 5254                                            6-Not a Title I school
## 5255          1-Title I targeted assistance eligible school-No program
## 5256                                                               n/a
## 5257          1-Title I targeted assistance eligible school-No program
## 5258                                                               n/a
## 5259                                       5-Title I schoolwide school
## 5260                                            6-Not a Title I school
## 5261                                       5-Title I schoolwide school
## 5262                                            6-Not a Title I school
## 5263                                                              <NA>
##                 Updated.Status
## 1                       1-Open
## 2                       1-Open
## 3                      4-Added
## 4                       1-Open
## 5                       1-Open
## 6                       1-Open
## 7                       1-Open
## 8                       1-Open
## 9                       1-Open
## 10                      1-Open
## 11                      1-Open
## 12                      1-Open
## 13                      1-Open
## 14                      1-Open
## 15                      1-Open
## 16                      1-Open
## 17                      1-Open
## 18                      1-Open
## 19                      1-Open
## 20                      1-Open
## 21                      1-Open
## 22                      1-Open
## 23                      1-Open
## 24                      1-Open
## 25                      1-Open
## 26                      1-Open
## 27                      1-Open
## 28                      1-Open
## 29                      1-Open
## 30                      1-Open
## 31                      1-Open
## 32                      1-Open
## 33                      1-Open
## 34                      1-Open
## 35                      1-Open
## 36                      1-Open
## 37                  6-Inactive
## 38                      1-Open
## 39                      1-Open
## 40                      1-Open
## 41                      1-Open
## 42                      1-Open
## 43                  6-Inactive
## 44                  6-Inactive
## 45                      1-Open
## 46                      1-Open
## 47                      1-Open
## 48                      1-Open
## 49                      1-Open
## 50                      1-Open
## 51                      1-Open
## 52                      1-Open
## 53                      1-Open
## 54                      1-Open
## 55                      1-Open
## 56                  6-Inactive
## 57                      1-Open
## 58                      1-Open
## 59                      1-Open
## 60                      1-Open
## 61                      1-Open
## 62                      1-Open
## 63                      1-Open
## 64                      1-Open
## 65                      1-Open
## 66                      1-Open
## 67                      1-Open
## 68                      1-Open
## 69                      1-Open
## 70                    7-Future
## 71                      1-Open
## 72                      1-Open
## 73                      1-Open
## 74                      1-Open
## 75                      1-Open
## 76                      1-Open
## 77                      1-Open
## 78                      1-Open
## 79                      1-Open
## 80                      1-Open
## 81                      1-Open
## 82                      1-Open
## 83                      1-Open
## 84                      1-Open
## 85                      1-Open
## 86                       3-New
## 87                      1-Open
## 88                      1-Open
## 89                      1-Open
## 90                      1-Open
## 91                      1-Open
## 92                      1-Open
## 93                      1-Open
## 94                      1-Open
## 95                      1-Open
## 96                      1-Open
## 97                       3-New
## 98                      1-Open
## 99                      1-Open
## 100                     1-Open
## 101                     1-Open
## 102                     1-Open
## 103                     1-Open
## 104                     1-Open
## 105                     1-Open
## 106                     1-Open
## 107                     1-Open
## 108                 6-Inactive
## 109                     1-Open
## 110                     1-Open
## 111                 6-Inactive
## 112                     1-Open
## 113                     1-Open
## 114                     1-Open
## 115                     1-Open
## 116                     1-Open
## 117                     1-Open
## 118                     1-Open
## 119                     1-Open
## 120                 6-Inactive
## 121                     1-Open
## 122                     1-Open
## 123                     1-Open
## 124                     1-Open
## 125                     1-Open
## 126                     1-Open
## 127                     1-Open
## 128                     1-Open
## 129                     1-Open
## 130                     1-Open
## 131                     1-Open
## 132                     1-Open
## 133                     1-Open
## 134                     1-Open
## 135                     1-Open
## 136                     1-Open
## 137                     1-Open
## 138                     1-Open
## 139                     1-Open
## 140                     1-Open
## 141                     1-Open
## 142                     1-Open
## 143                     1-Open
## 144                     1-Open
## 145                     1-Open
## 146                     1-Open
## 147                     1-Open
## 148                     1-Open
## 149                     1-Open
## 150                     1-Open
## 151                     1-Open
## 152                     1-Open
## 153                     1-Open
## 154                     1-Open
## 155                     1-Open
## 156                     1-Open
## 157                     1-Open
## 158                     1-Open
## 159                     1-Open
## 160                     1-Open
## 161                     1-Open
## 162                     1-Open
## 163                     1-Open
## 164                     1-Open
## 165                     1-Open
## 166                     1-Open
## 167                     1-Open
## 168                     1-Open
## 169                     1-Open
## 170                     1-Open
## 171                     1-Open
## 172                     1-Open
## 173                     1-Open
## 174                     1-Open
## 175                     1-Open
## 176                     1-Open
## 177                     1-Open
## 178                     1-Open
## 179                     1-Open
## 180                     1-Open
## 181                     1-Open
## 182                     1-Open
## 183                     1-Open
## 184                     1-Open
## 185                     1-Open
## 186                     1-Open
## 187                     1-Open
## 188                     1-Open
## 189                     1-Open
## 190                     1-Open
## 191                     1-Open
## 192                     1-Open
## 193                     1-Open
## 194                     1-Open
## 195                     1-Open
## 196                     1-Open
## 197                     1-Open
## 198                     1-Open
## 199                 6-Inactive
## 200                     1-Open
## 201                     1-Open
## 202                     1-Open
## 203                     1-Open
## 204                      3-New
## 205                     1-Open
## 206                     1-Open
## 207                     1-Open
## 208                     1-Open
## 209                     1-Open
## 210                     1-Open
## 211                     1-Open
## 212                     1-Open
## 213                     1-Open
## 214                     1-Open
## 215                     1-Open
## 216                     1-Open
## 217                     1-Open
## 218                     1-Open
## 219                     1-Open
## 220                     1-Open
## 221                     1-Open
## 222                     1-Open
## 223                     1-Open
## 224                     1-Open
## 225                     1-Open
## 226                     1-Open
## 227                     1-Open
## 228                     1-Open
## 229                     1-Open
## 230                     1-Open
## 231                     1-Open
## 232                     1-Open
## 233                     1-Open
## 234                     1-Open
## 235                     1-Open
## 236                     1-Open
## 237                     1-Open
## 238                     1-Open
## 239                     1-Open
## 240                     1-Open
## 241                     1-Open
## 242                     1-Open
## 243                     1-Open
## 244                     1-Open
## 245                     1-Open
## 246                     1-Open
## 247                     1-Open
## 248                     1-Open
## 249                     1-Open
## 250                     1-Open
## 251                     1-Open
## 252                     1-Open
## 253                     1-Open
## 254                     1-Open
## 255                     1-Open
## 256                     1-Open
## 257                     1-Open
## 258                     1-Open
## 259                     1-Open
## 260                     1-Open
## 261                     1-Open
## 262                     1-Open
## 263                     1-Open
## 264                     1-Open
## 265                     1-Open
## 266                     1-Open
## 267                     1-Open
## 268                 6-Inactive
## 269                     1-Open
## 270                     1-Open
## 271                     1-Open
## 272                     1-Open
## 273                 6-Inactive
## 274                     1-Open
## 275                     1-Open
## 276                     1-Open
## 277                     1-Open
## 278                     1-Open
## 279                     1-Open
## 280                      3-New
## 281                     1-Open
## 282                     1-Open
## 283                      3-New
## 284                     1-Open
## 285                     1-Open
## 286                     1-Open
## 287                     1-Open
## 288                     1-Open
## 289                     1-Open
## 290                     1-Open
## 291                     1-Open
## 292                     1-Open
## 293                     1-Open
## 294                     1-Open
## 295                     1-Open
## 296                     1-Open
## 297                     1-Open
## 298                     1-Open
## 299                     1-Open
## 300                     1-Open
## 301                     1-Open
## 302                     1-Open
## 303                     1-Open
## 304                     1-Open
## 305                     1-Open
## 306                     1-Open
## 307                     1-Open
## 308                     1-Open
## 309                     1-Open
## 310                     1-Open
## 311                      3-New
## 312                     1-Open
## 313                     1-Open
## 314                     1-Open
## 315                     1-Open
## 316                     1-Open
## 317                     1-Open
## 318                     1-Open
## 319                     1-Open
## 320                     1-Open
## 321                     1-Open
## 322                     1-Open
## 323                     1-Open
## 324                     1-Open
## 325                     1-Open
## 326                     1-Open
## 327                     1-Open
## 328                     1-Open
## 329                     1-Open
## 330                     1-Open
## 331                     1-Open
## 332                     1-Open
## 333                     1-Open
## 334                 6-Inactive
## 335                     1-Open
## 336                     1-Open
## 337                     1-Open
## 338                     1-Open
## 339                     1-Open
## 340                     1-Open
## 341                     1-Open
## 342                     1-Open
## 343                     1-Open
## 344                     1-Open
## 345                     1-Open
## 346                     1-Open
## 347                     1-Open
## 348                     1-Open
## 349                 6-Inactive
## 350                     1-Open
## 351                     1-Open
## 352                     1-Open
## 353                      3-New
## 354                     1-Open
## 355                     1-Open
## 356                     1-Open
## 357                     1-Open
## 358                     1-Open
## 359                     1-Open
## 360                     1-Open
## 361                     1-Open
## 362                      3-New
## 363                     1-Open
## 364                     1-Open
## 365                     1-Open
## 366                     1-Open
## 367                     1-Open
## 368                     1-Open
## 369                     1-Open
## 370                     1-Open
## 371                     1-Open
## 372                     1-Open
## 373                     1-Open
## 374                     1-Open
## 375                     1-Open
## 376                     1-Open
## 377                      3-New
## 378                     1-Open
## 379                     1-Open
## 380                     1-Open
## 381                     1-Open
## 382                     1-Open
## 383                     1-Open
## 384                     1-Open
## 385                     1-Open
## 386                     1-Open
## 387                     1-Open
## 388                     1-Open
## 389                     1-Open
## 390                     1-Open
## 391                     1-Open
## 392                     1-Open
## 393                     1-Open
## 394                     1-Open
## 395                     1-Open
## 396                     1-Open
## 397                     1-Open
## 398                     1-Open
## 399                     1-Open
## 400                     1-Open
## 401                 6-Inactive
## 402                 6-Inactive
## 403                     1-Open
## 404                 6-Inactive
## 405                     1-Open
## 406                 6-Inactive
## 407                     1-Open
## 408                     1-Open
## 409                     1-Open
## 410                     1-Open
## 411                     1-Open
## 412                     1-Open
## 413                     1-Open
## 414                     1-Open
## 415                     1-Open
## 416                     1-Open
## 417                     1-Open
## 418                     1-Open
## 419                     1-Open
## 420                     1-Open
## 421                     1-Open
## 422                     1-Open
## 423                     1-Open
## 424                     1-Open
## 425                     1-Open
## 426                     1-Open
## 427                     1-Open
## 428                     1-Open
## 429                     1-Open
## 430                 6-Inactive
## 431                     1-Open
## 432                     1-Open
## 433                     1-Open
## 434                     1-Open
## 435                     1-Open
## 436                     1-Open
## 437                     1-Open
## 438                     1-Open
## 439                      3-New
## 440                     1-Open
## 441                     1-Open
## 442                     1-Open
## 443                     1-Open
## 444                     1-Open
## 445                     1-Open
## 446                     1-Open
## 447                     1-Open
## 448                     1-Open
## 449                     1-Open
## 450                 6-Inactive
## 451                     1-Open
## 452                     1-Open
## 453                     1-Open
## 454                     1-Open
## 455                     1-Open
## 456                     1-Open
## 457                     1-Open
## 458                     1-Open
## 459                 6-Inactive
## 460                      3-New
## 461                     1-Open
## 462                     1-Open
## 463                     1-Open
## 464                     1-Open
## 465                     1-Open
## 466                     1-Open
## 467                     1-Open
## 468                     1-Open
## 469                     1-Open
## 470                 6-Inactive
## 471                     1-Open
## 472                     1-Open
## 473                     1-Open
## 474                     1-Open
## 475                     1-Open
## 476                     1-Open
## 477                     1-Open
## 478                     1-Open
## 479                     1-Open
## 480                     1-Open
## 481                     1-Open
## 482                     1-Open
## 483                     1-Open
## 484                     1-Open
## 485                     1-Open
## 486                     1-Open
## 487                     1-Open
## 488                     1-Open
## 489                     1-Open
## 490                     1-Open
## 491                     1-Open
## 492                     1-Open
## 493                     1-Open
## 494                     1-Open
## 495                     1-Open
## 496                     1-Open
## 497                 6-Inactive
## 498                 6-Inactive
## 499                 6-Inactive
## 500                 6-Inactive
## 501                     1-Open
## 502                     1-Open
## 503                 6-Inactive
## 504                     1-Open
## 505                 6-Inactive
## 506                 6-Inactive
## 507                 6-Inactive
## 508                 6-Inactive
## 509                     1-Open
## 510                     1-Open
## 511                     1-Open
## 512                     1-Open
## 513                     1-Open
## 514                     1-Open
## 515                     1-Open
## 516                     1-Open
## 517                     1-Open
## 518                     1-Open
## 519                     1-Open
## 520                     1-Open
## 521                     1-Open
## 522                     1-Open
## 523                     1-Open
## 524                     1-Open
## 525                     1-Open
## 526                     1-Open
## 527                     1-Open
## 528                     1-Open
## 529                     1-Open
## 530                     1-Open
## 531                     1-Open
## 532                     1-Open
## 533                     1-Open
## 534                     1-Open
## 535                     1-Open
## 536                     1-Open
## 537                     1-Open
## 538                     1-Open
## 539                     1-Open
## 540                     1-Open
## 541                 6-Inactive
## 542                     1-Open
## 543                     1-Open
## 544                     1-Open
## 545                     1-Open
## 546                 6-Inactive
## 547                 6-Inactive
## 548                 6-Inactive
## 549                     1-Open
## 550                     1-Open
## 551                     1-Open
## 552                     1-Open
## 553                     1-Open
## 554                     1-Open
## 555                     1-Open
## 556                     1-Open
## 557                     1-Open
## 558                     1-Open
## 559                     1-Open
## 560                 6-Inactive
## 561                     1-Open
## 562                 6-Inactive
## 563                     1-Open
## 564                     1-Open
## 565                     1-Open
## 566                     1-Open
## 567                     1-Open
## 568                     1-Open
## 569                     1-Open
## 570                     1-Open
## 571                     1-Open
## 572                     1-Open
## 573                     1-Open
## 574                     1-Open
## 575                     1-Open
## 576                     1-Open
## 577                     1-Open
## 578                     1-Open
## 579                     1-Open
## 580                     1-Open
## 581                     1-Open
## 582                     1-Open
## 583                     1-Open
## 584                     1-Open
## 585                     1-Open
## 586                     1-Open
## 587                     1-Open
## 588                      3-New
## 589                     1-Open
## 590                     1-Open
## 591                     1-Open
## 592                     1-Open
## 593                     1-Open
## 594                     1-Open
## 595                     1-Open
## 596                     1-Open
## 597                     1-Open
## 598                     1-Open
## 599                     1-Open
## 600                     1-Open
## 601                     1-Open
## 602                     1-Open
## 603                     1-Open
## 604                     1-Open
## 605                     1-Open
## 606                     1-Open
## 607                     1-Open
## 608                     1-Open
## 609                     1-Open
## 610                     1-Open
## 611                     1-Open
## 612                     1-Open
## 613                     1-Open
## 614                     1-Open
## 615                     1-Open
## 616                     1-Open
## 617                     1-Open
## 618                     1-Open
## 619                     1-Open
## 620                     1-Open
## 621                     1-Open
## 622                      3-New
## 623                     1-Open
## 624                     1-Open
## 625                     1-Open
## 626                     1-Open
## 627                     1-Open
## 628                 6-Inactive
## 629                     1-Open
## 630                 6-Inactive
## 631                 6-Inactive
## 632                     1-Open
## 633                 6-Inactive
## 634                     1-Open
## 635                     1-Open
## 636                     1-Open
## 637                     1-Open
## 638                     1-Open
## 639                     1-Open
## 640                     1-Open
## 641                     1-Open
## 642                     1-Open
## 643                     1-Open
## 644                     1-Open
## 645                     1-Open
## 646                     1-Open
## 647                     1-Open
## 648                     1-Open
## 649                     1-Open
## 650                     1-Open
## 651                     1-Open
## 652                     1-Open
## 653                     1-Open
## 654                     1-Open
## 655                     1-Open
## 656                     1-Open
## 657                     1-Open
## 658                     1-Open
## 659                     1-Open
## 660                     1-Open
## 661                     1-Open
## 662                     1-Open
## 663                     1-Open
## 664                     1-Open
## 665                     1-Open
## 666                     1-Open
## 667                     1-Open
## 668                     1-Open
## 669                     1-Open
## 670                     1-Open
## 671                     1-Open
## 672                     1-Open
## 673                     1-Open
## 674                     1-Open
## 675                     1-Open
## 676                     1-Open
## 677                     1-Open
## 678                     1-Open
## 679                     1-Open
## 680                     1-Open
## 681                     1-Open
## 682                     1-Open
## 683                     1-Open
## 684                     1-Open
## 685                     1-Open
## 686                     1-Open
## 687                     1-Open
## 688                     1-Open
## 689                     1-Open
## 690                      3-New
## 691                     1-Open
## 692                     1-Open
## 693                     1-Open
## 694                     1-Open
## 695                     1-Open
## 696                     1-Open
## 697                     1-Open
## 698                     1-Open
## 699                     1-Open
## 700                     1-Open
## 701                     1-Open
## 702                     1-Open
## 703                     1-Open
## 704                     1-Open
## 705                     1-Open
## 706                     1-Open
## 707                     1-Open
## 708                     1-Open
## 709                     1-Open
## 710                     1-Open
## 711                     1-Open
## 712                     1-Open
## 713                     1-Open
## 714                     1-Open
## 715                     1-Open
## 716                     1-Open
## 717                     1-Open
## 718                     1-Open
## 719                     1-Open
## 720                     1-Open
## 721                     1-Open
## 722                     1-Open
## 723                     1-Open
## 724                     1-Open
## 725                     1-Open
## 726                     1-Open
## 727                     1-Open
## 728                     1-Open
## 729                     1-Open
## 730                     1-Open
## 731                     1-Open
## 732                     1-Open
## 733                     1-Open
## 734                     1-Open
## 735                     1-Open
## 736                     1-Open
## 737                     1-Open
## 738                     1-Open
## 739                     1-Open
## 740                     1-Open
## 741                 6-Inactive
## 742                     1-Open
## 743                     1-Open
## 744                     1-Open
## 745                     1-Open
## 746                     1-Open
## 747                     1-Open
## 748                     1-Open
## 749                     1-Open
## 750                     1-Open
## 751                     1-Open
## 752                     1-Open
## 753                     1-Open
## 754                     1-Open
## 755                     1-Open
## 756                     1-Open
## 757                     1-Open
## 758                     1-Open
## 759                     1-Open
## 760                     1-Open
## 761                     1-Open
## 762                     1-Open
## 763                     1-Open
## 764                     1-Open
## 765                     1-Open
## 766                     1-Open
## 767                     1-Open
## 768                     1-Open
## 769                     1-Open
## 770                     1-Open
## 771                     1-Open
## 772                 6-Inactive
## 773                     1-Open
## 774                     1-Open
## 775                 6-Inactive
## 776                     1-Open
## 777                     1-Open
## 778                 6-Inactive
## 779                     1-Open
## 780                     1-Open
## 781                     1-Open
## 782                     1-Open
## 783                     1-Open
## 784                     1-Open
## 785                     1-Open
## 786                      3-New
## 787                     1-Open
## 788                     1-Open
## 789                     1-Open
## 790                 6-Inactive
## 791                     1-Open
## 792                     1-Open
## 793                     1-Open
## 794                     1-Open
## 795                     1-Open
## 796                     1-Open
## 797                     1-Open
## 798                     1-Open
## 799                     1-Open
## 800                     1-Open
## 801                     1-Open
## 802                     1-Open
## 803                     1-Open
## 804                   7-Future
## 805                     1-Open
## 806                     1-Open
## 807                     1-Open
## 808                     1-Open
## 809                     1-Open
## 810                     1-Open
## 811                     1-Open
## 812                     1-Open
## 813                 6-Inactive
## 814                     1-Open
## 815                     1-Open
## 816                     1-Open
## 817                     1-Open
## 818                     1-Open
## 819                     1-Open
## 820                     1-Open
## 821                     1-Open
## 822                     1-Open
## 823                     1-Open
## 824                     1-Open
## 825                     1-Open
## 826                     1-Open
## 827                     1-Open
## 828                     1-Open
## 829                     1-Open
## 830                     1-Open
## 831                     1-Open
## 832                     1-Open
## 833                     1-Open
## 834                     1-Open
## 835                     1-Open
## 836                     1-Open
## 837                     1-Open
## 838                     1-Open
## 839                     1-Open
## 840                     1-Open
## 841                     1-Open
## 842                     1-Open
## 843                     1-Open
## 844                     1-Open
## 845                     1-Open
## 846                     1-Open
## 847                     1-Open
## 848                     1-Open
## 849                     1-Open
## 850                     1-Open
## 851                     1-Open
## 852                     1-Open
## 853                      3-New
## 854                     1-Open
## 855                     1-Open
## 856                     1-Open
## 857                     1-Open
## 858                     1-Open
## 859                     1-Open
## 860                     1-Open
## 861                      3-New
## 862                     1-Open
## 863                   7-Future
## 864                     1-Open
## 865                     1-Open
## 866                 6-Inactive
## 867                     1-Open
## 868                     1-Open
## 869                     1-Open
## 870                     1-Open
## 871                     1-Open
## 872                     1-Open
## 873                     1-Open
## 874                     1-Open
## 875                     1-Open
## 876                     1-Open
## 877                     1-Open
## 878                     1-Open
## 879                     1-Open
## 880                     1-Open
## 881                     1-Open
## 882                     1-Open
## 883                     1-Open
## 884                     1-Open
## 885                     1-Open
## 886                     1-Open
## 887                     1-Open
## 888                     1-Open
## 889                     1-Open
## 890                     1-Open
## 891                     1-Open
## 892                     1-Open
## 893                     1-Open
## 894                     1-Open
## 895                     1-Open
## 896                     1-Open
## 897                     1-Open
## 898                     1-Open
## 899                     1-Open
## 900                     1-Open
## 901                     1-Open
## 902                     1-Open
## 903                     1-Open
## 904                     1-Open
## 905                     1-Open
## 906                     1-Open
## 907                     1-Open
## 908                     1-Open
## 909                     1-Open
## 910                     1-Open
## 911                     1-Open
## 912                     1-Open
## 913                     1-Open
## 914                     1-Open
## 915                     1-Open
## 916                     1-Open
## 917                     1-Open
## 918                     1-Open
## 919                     1-Open
## 920                     1-Open
## 921                     1-Open
## 922                     1-Open
## 923                     1-Open
## 924                     1-Open
## 925                     1-Open
## 926                     1-Open
## 927                     1-Open
## 928                     1-Open
## 929                     1-Open
## 930                     1-Open
## 931                     1-Open
## 932                     1-Open
## 933                     1-Open
## 934                     1-Open
## 935                     1-Open
## 936                 6-Inactive
## 937                     1-Open
## 938                     1-Open
## 939                     1-Open
## 940                     1-Open
## 941                     1-Open
## 942                     1-Open
## 943                     1-Open
## 944                     1-Open
## 945                 6-Inactive
## 946                 6-Inactive
## 947                 6-Inactive
## 948                 6-Inactive
## 949                 6-Inactive
## 950                 6-Inactive
## 951                 6-Inactive
## 952                 6-Inactive
## 953                     1-Open
## 954                 6-Inactive
## 955                     1-Open
## 956                     1-Open
## 957                     1-Open
## 958                 6-Inactive
## 959                     1-Open
## 960                     1-Open
## 961                     1-Open
## 962                     1-Open
## 963                     1-Open
## 964                     1-Open
## 965                     1-Open
## 966                     1-Open
## 967                     1-Open
## 968                     1-Open
## 969                     1-Open
## 970                     1-Open
## 971                     1-Open
## 972                     1-Open
## 973                     1-Open
## 974                     1-Open
## 975                     1-Open
## 976                     1-Open
## 977                     1-Open
## 978                     1-Open
## 979                     1-Open
## 980                     1-Open
## 981                     1-Open
## 982                     1-Open
## 983                     1-Open
## 984                     1-Open
## 985                     1-Open
## 986                     1-Open
## 987                     1-Open
## 988                     1-Open
## 989                 6-Inactive
## 990                     1-Open
## 991                     1-Open
## 992                     1-Open
## 993                     1-Open
## 994                     1-Open
## 995                     1-Open
## 996                     1-Open
## 997                     1-Open
## 998                     1-Open
## 999                     1-Open
## 1000                    1-Open
## 1001                6-Inactive
## 1002                    1-Open
## 1003                    1-Open
## 1004                    1-Open
## 1005                    1-Open
## 1006                    1-Open
## 1007                    1-Open
## 1008                    1-Open
## 1009                    1-Open
## 1010                    1-Open
## 1011                    1-Open
## 1012                    1-Open
## 1013                    1-Open
## 1014                    1-Open
## 1015                    1-Open
## 1016                    1-Open
## 1017                    1-Open
## 1018                    1-Open
## 1019                    1-Open
## 1020                    1-Open
## 1021                    1-Open
## 1022                    1-Open
## 1023                    1-Open
## 1024                    1-Open
## 1025                    1-Open
## 1026                    1-Open
## 1027                    1-Open
## 1028                    1-Open
## 1029                    1-Open
## 1030                    1-Open
## 1031                    1-Open
## 1032                    1-Open
## 1033                    1-Open
## 1034                    1-Open
## 1035                    1-Open
## 1036                    1-Open
## 1037                    1-Open
## 1038                    1-Open
## 1039                    1-Open
## 1040                    1-Open
## 1041                    1-Open
## 1042                    1-Open
## 1043                    1-Open
## 1044                    1-Open
## 1045                    1-Open
## 1046                    1-Open
## 1047                    1-Open
## 1048                    1-Open
## 1049                    1-Open
## 1050                    1-Open
## 1051                    1-Open
## 1052                    1-Open
## 1053                6-Inactive
## 1054                    1-Open
## 1055                    1-Open
## 1056                    1-Open
## 1057                    1-Open
## 1058                     3-New
## 1059                    1-Open
## 1060                    1-Open
## 1061                    1-Open
## 1062                    1-Open
## 1063                    1-Open
## 1064                    1-Open
## 1065                    1-Open
## 1066                    1-Open
## 1067                    1-Open
## 1068                    1-Open
## 1069                     3-New
## 1070                    1-Open
## 1071                    1-Open
## 1072                6-Inactive
## 1073                    1-Open
## 1074                    1-Open
## 1075                    1-Open
## 1076                     3-New
## 1077                    1-Open
## 1078                    1-Open
## 1079                    1-Open
## 1080                    1-Open
## 1081                    1-Open
## 1082                6-Inactive
## 1083                    1-Open
## 1084                    1-Open
## 1085                    1-Open
## 1086                    1-Open
## 1087                    1-Open
## 1088                6-Inactive
## 1089                6-Inactive
## 1090                6-Inactive
## 1091                6-Inactive
## 1092                    1-Open
## 1093                    1-Open
## 1094                6-Inactive
## 1095                    1-Open
## 1096                6-Inactive
## 1097                    1-Open
## 1098                    1-Open
## 1099                6-Inactive
## 1100                    1-Open
## 1101                    1-Open
## 1102                  7-Future
## 1103                    1-Open
## 1104                    1-Open
## 1105                    1-Open
## 1106                    1-Open
## 1107                    1-Open
## 1108                     3-New
## 1109                    1-Open
## 1110                    1-Open
## 1111                    1-Open
## 1112                    1-Open
## 1113                    1-Open
## 1114                    1-Open
## 1115                    1-Open
## 1116                    1-Open
## 1117                    1-Open
## 1118                    1-Open
## 1119                    1-Open
## 1120                    1-Open
## 1121                    1-Open
## 1122                    1-Open
## 1123                    1-Open
## 1124                    1-Open
## 1125                    1-Open
## 1126                    1-Open
## 1127                    1-Open
## 1128                    1-Open
## 1129                    1-Open
## 1130                    1-Open
## 1131                    1-Open
## 1132                    1-Open
## 1133                    1-Open
## 1134                6-Inactive
## 1135                    1-Open
## 1136                    1-Open
## 1137                    1-Open
## 1138                    1-Open
## 1139                    1-Open
## 1140                    1-Open
## 1141                    1-Open
## 1142                    1-Open
## 1143                    1-Open
## 1144                    1-Open
## 1145                    1-Open
## 1146                     3-New
## 1147                    1-Open
## 1148                    1-Open
## 1149                    1-Open
## 1150                    1-Open
## 1151                    1-Open
## 1152                    1-Open
## 1153                    1-Open
## 1154                    1-Open
## 1155                    1-Open
## 1156                    1-Open
## 1157                    1-Open
## 1158                    1-Open
## 1159                    1-Open
## 1160                     3-New
## 1161                    1-Open
## 1162                    1-Open
## 1163                6-Inactive
## 1164 5-Changed Boundary/Agency
## 1165                    1-Open
## 1166                    1-Open
## 1167                    1-Open
## 1168                    1-Open
## 1169                    1-Open
## 1170                    1-Open
## 1171                    1-Open
## 1172                    1-Open
## 1173                    1-Open
## 1174                    1-Open
## 1175                    1-Open
## 1176                    1-Open
## 1177                    1-Open
## 1178                    1-Open
## 1179                    1-Open
## 1180                    1-Open
## 1181                    1-Open
## 1182                    1-Open
## 1183                    1-Open
## 1184                    1-Open
## 1185                    1-Open
## 1186                    1-Open
## 1187                    1-Open
## 1188                    1-Open
## 1189                    1-Open
## 1190                    1-Open
## 1191                    1-Open
## 1192                    1-Open
## 1193                    1-Open
## 1194                    1-Open
## 1195                    1-Open
## 1196                     3-New
## 1197                    1-Open
## 1198                    1-Open
## 1199                    1-Open
## 1200                    1-Open
## 1201                    1-Open
## 1202                    1-Open
## 1203                    1-Open
## 1204                    1-Open
## 1205                    1-Open
## 1206                    1-Open
## 1207                    1-Open
## 1208                6-Inactive
## 1209                    1-Open
## 1210                    1-Open
## 1211                    1-Open
## 1212                    1-Open
## 1213                    1-Open
## 1214                    1-Open
## 1215                    1-Open
## 1216                    1-Open
## 1217                    1-Open
## 1218                    1-Open
## 1219                    1-Open
## 1220                    1-Open
## 1221                    1-Open
## 1222                    1-Open
## 1223                    1-Open
## 1224                    1-Open
## 1225                     3-New
## 1226                    1-Open
## 1227                    1-Open
## 1228                    1-Open
## 1229                    1-Open
## 1230                    1-Open
## 1231                    1-Open
## 1232                    1-Open
## 1233                    1-Open
## 1234                    1-Open
## 1235                    1-Open
## 1236                    1-Open
## 1237                    1-Open
## 1238                    1-Open
## 1239                    1-Open
## 1240                    1-Open
## 1241                    1-Open
## 1242                    1-Open
## 1243                    1-Open
## 1244                    1-Open
## 1245                    1-Open
## 1246                    1-Open
## 1247                    1-Open
## 1248                    1-Open
## 1249                    1-Open
## 1250                    1-Open
## 1251                    1-Open
## 1252                    1-Open
## 1253                    1-Open
## 1254                    1-Open
## 1255                    1-Open
## 1256                    1-Open
## 1257                    1-Open
## 1258                    1-Open
## 1259                    1-Open
## 1260                    1-Open
## 1261                    1-Open
## 1262                    1-Open
## 1263                   4-Added
## 1264                    1-Open
## 1265                    1-Open
## 1266                    1-Open
## 1267                    1-Open
## 1268                    1-Open
## 1269                    1-Open
## 1270                    1-Open
## 1271                    1-Open
## 1272                    1-Open
## 1273                    1-Open
## 1274                    1-Open
## 1275                    1-Open
## 1276                    1-Open
## 1277                    1-Open
## 1278                    1-Open
## 1279                   4-Added
## 1280                    1-Open
## 1281                    1-Open
## 1282                    1-Open
## 1283                    1-Open
## 1284                    1-Open
## 1285                    1-Open
## 1286                    1-Open
## 1287                    1-Open
## 1288                    1-Open
## 1289                    1-Open
## 1290                    1-Open
## 1291                    1-Open
## 1292                6-Inactive
## 1293                    1-Open
## 1294                    1-Open
## 1295                    1-Open
## 1296                6-Inactive
## 1297                6-Inactive
## 1298                    1-Open
## 1299                    1-Open
## 1300                    1-Open
## 1301                    1-Open
## 1302                    1-Open
## 1303                    1-Open
## 1304                    1-Open
## 1305                    1-Open
## 1306                    1-Open
## 1307                    1-Open
## 1308                    1-Open
## 1309                    1-Open
## 1310                    1-Open
## 1311                    1-Open
## 1312                    1-Open
## 1313                6-Inactive
## 1314                6-Inactive
## 1315                    1-Open
## 1316                    1-Open
## 1317                    1-Open
## 1318                    1-Open
## 1319                    1-Open
## 1320                    1-Open
## 1321                    1-Open
## 1322                    1-Open
## 1323                    1-Open
## 1324                    1-Open
## 1325                    1-Open
## 1326                    1-Open
## 1327                    1-Open
## 1328                    1-Open
## 1329                    1-Open
## 1330                    1-Open
## 1331                    1-Open
## 1332                    1-Open
## 1333                    1-Open
## 1334                    1-Open
## 1335                6-Inactive
## 1336                    1-Open
## 1337                    1-Open
## 1338                    1-Open
## 1339                    1-Open
## 1340                    1-Open
## 1341                    1-Open
## 1342                    1-Open
## 1343                    1-Open
## 1344                    1-Open
## 1345                    1-Open
## 1346                    1-Open
## 1347                    1-Open
## 1348                   4-Added
## 1349                    1-Open
## 1350                    1-Open
## 1351                    1-Open
## 1352                    1-Open
## 1353                    1-Open
## 1354                    1-Open
## 1355                    1-Open
## 1356                    1-Open
## 1357                    1-Open
## 1358                    1-Open
## 1359                    1-Open
## 1360                    1-Open
## 1361                    1-Open
## 1362                6-Inactive
## 1363                    1-Open
## 1364                6-Inactive
## 1365                6-Inactive
## 1366                    1-Open
## 1367                6-Inactive
## 1368                6-Inactive
## 1369                    1-Open
## 1370                6-Inactive
## 1371                6-Inactive
## 1372                6-Inactive
## 1373                6-Inactive
## 1374                    1-Open
## 1375                    1-Open
## 1376                    1-Open
## 1377                    1-Open
## 1378                    1-Open
## 1379                    1-Open
## 1380                    1-Open
## 1381                    1-Open
## 1382                    1-Open
## 1383                    1-Open
## 1384                    1-Open
## 1385                    1-Open
## 1386                    1-Open
## 1387                    1-Open
## 1388                    1-Open
## 1389                    1-Open
## 1390                    1-Open
## 1391                    1-Open
## 1392                    1-Open
## 1393                    1-Open
## 1394                    1-Open
## 1395                    1-Open
## 1396                    1-Open
## 1397                    1-Open
## 1398                    1-Open
## 1399                    1-Open
## 1400                    1-Open
## 1401                    1-Open
## 1402                    1-Open
## 1403                    1-Open
## 1404                    1-Open
## 1405                    1-Open
## 1406                    1-Open
## 1407                    1-Open
## 1408                6-Inactive
## 1409                    1-Open
## 1410                    1-Open
## 1411                    1-Open
## 1412                    1-Open
## 1413                    1-Open
## 1414                    1-Open
## 1415                    1-Open
## 1416                    1-Open
## 1417                    1-Open
## 1418                    1-Open
## 1419                    1-Open
## 1420                    1-Open
## 1421                    1-Open
## 1422                    1-Open
## 1423                    1-Open
## 1424                    1-Open
## 1425                    1-Open
## 1426                    1-Open
## 1427                    1-Open
## 1428                    1-Open
## 1429                    1-Open
## 1430                    1-Open
## 1431                    1-Open
## 1432                    1-Open
## 1433                    1-Open
## 1434                    1-Open
## 1435                    1-Open
## 1436                    1-Open
## 1437                    1-Open
## 1438                    1-Open
## 1439                    1-Open
## 1440                    1-Open
## 1441                    1-Open
## 1442                     3-New
## 1443                    1-Open
## 1444                    1-Open
## 1445                    1-Open
## 1446                    1-Open
## 1447                    1-Open
## 1448                    1-Open
## 1449                    1-Open
## 1450                    1-Open
## 1451                    1-Open
## 1452                    1-Open
## 1453                    1-Open
## 1454                     3-New
## 1455                    1-Open
## 1456                    1-Open
## 1457                    1-Open
## 1458                    1-Open
## 1459                    1-Open
## 1460                    1-Open
## 1461                6-Inactive
## 1462                    1-Open
## 1463                    1-Open
## 1464                    1-Open
## 1465                    1-Open
## 1466                6-Inactive
## 1467                    1-Open
## 1468                    1-Open
## 1469                    1-Open
## 1470                    1-Open
## 1471                    1-Open
## 1472                     3-New
## 1473                    1-Open
## 1474                    1-Open
## 1475                    1-Open
## 1476                    1-Open
## 1477                    1-Open
## 1478                    1-Open
## 1479                    1-Open
## 1480                    1-Open
## 1481                    1-Open
## 1482                    1-Open
## 1483                    1-Open
## 1484                    1-Open
## 1485                    1-Open
## 1486                    1-Open
## 1487                    1-Open
## 1488                    1-Open
## 1489                    1-Open
## 1490                    1-Open
## 1491                    1-Open
## 1492                    1-Open
## 1493                    1-Open
## 1494                    1-Open
## 1495                    1-Open
## 1496                    1-Open
## 1497                    1-Open
## 1498                    1-Open
## 1499                    1-Open
## 1500                    1-Open
## 1501                    1-Open
## 1502                    1-Open
## 1503                    1-Open
## 1504                    1-Open
## 1505                    1-Open
## 1506                    1-Open
## 1507                    1-Open
## 1508                    1-Open
## 1509                    1-Open
## 1510                    1-Open
## 1511                    1-Open
## 1512                6-Inactive
## 1513                    1-Open
## 1514                    1-Open
## 1515                    1-Open
## 1516                    1-Open
## 1517                    1-Open
## 1518                    1-Open
## 1519                    1-Open
## 1520                    1-Open
## 1521                     3-New
## 1522                    1-Open
## 1523                    1-Open
## 1524                    1-Open
## 1525                    1-Open
## 1526                    1-Open
## 1527                    1-Open
## 1528                    1-Open
## 1529                    1-Open
## 1530                    1-Open
## 1531                6-Inactive
## 1532                    1-Open
## 1533                    1-Open
## 1534                    1-Open
## 1535                    1-Open
## 1536                    1-Open
## 1537                    1-Open
## 1538                    1-Open
## 1539                    1-Open
## 1540                    1-Open
## 1541                    1-Open
## 1542                    1-Open
## 1543                    1-Open
## 1544                    1-Open
## 1545                    1-Open
## 1546                    1-Open
## 1547                    1-Open
## 1548                    1-Open
## 1549                    1-Open
## 1550                    1-Open
## 1551                    1-Open
## 1552                    1-Open
## 1553                    1-Open
## 1554                    1-Open
## 1555                    1-Open
## 1556                    1-Open
## 1557                    1-Open
## 1558                    1-Open
## 1559                    1-Open
## 1560                    1-Open
## 1561                    1-Open
## 1562                    1-Open
## 1563                    1-Open
## 1564                    1-Open
## 1565                    1-Open
## 1566                    1-Open
## 1567                    1-Open
## 1568                    1-Open
## 1569                    1-Open
## 1570                    1-Open
## 1571                    1-Open
## 1572                    1-Open
## 1573                    1-Open
## 1574                    1-Open
## 1575                    1-Open
## 1576                    1-Open
## 1577                    1-Open
## 1578                    1-Open
## 1579                    1-Open
## 1580                    1-Open
## 1581                    1-Open
## 1582                    1-Open
## 1583                    1-Open
## 1584                    1-Open
## 1585                    1-Open
## 1586                    1-Open
## 1587                    1-Open
## 1588                    1-Open
## 1589                    1-Open
## 1590                    1-Open
## 1591                    1-Open
## 1592                    1-Open
## 1593                    1-Open
## 1594                    1-Open
## 1595                  7-Future
## 1596                6-Inactive
## 1597                    1-Open
## 1598                    1-Open
## 1599                    1-Open
## 1600                    1-Open
## 1601                    1-Open
## 1602                    1-Open
## 1603                    1-Open
## 1604                    1-Open
## 1605                    1-Open
## 1606                    1-Open
## 1607                    1-Open
## 1608                    1-Open
## 1609                     3-New
## 1610                    1-Open
## 1611                    1-Open
## 1612                    1-Open
## 1613                    1-Open
## 1614                    1-Open
## 1615                    1-Open
## 1616                    1-Open
## 1617                    1-Open
## 1618                    1-Open
## 1619                    1-Open
## 1620                    1-Open
## 1621                    1-Open
## 1622                    1-Open
## 1623                    1-Open
## 1624                    1-Open
## 1625                    1-Open
## 1626                    1-Open
## 1627                    1-Open
## 1628                    1-Open
## 1629                    1-Open
## 1630                    1-Open
## 1631                    1-Open
## 1632                    1-Open
## 1633                    1-Open
## 1634                    1-Open
## 1635                    1-Open
## 1636                    1-Open
## 1637                    1-Open
## 1638                    1-Open
## 1639                    1-Open
## 1640                    1-Open
## 1641                    1-Open
## 1642                    1-Open
## 1643                    1-Open
## 1644                    1-Open
## 1645                    1-Open
## 1646                    1-Open
## 1647                    1-Open
## 1648                    1-Open
## 1649                    1-Open
## 1650                    1-Open
## 1651                    1-Open
## 1652                    1-Open
## 1653                    1-Open
## 1654                     3-New
## 1655                    1-Open
## 1656                    1-Open
## 1657                    1-Open
## 1658                    1-Open
## 1659                    1-Open
## 1660                    1-Open
## 1661                    1-Open
## 1662                    1-Open
## 1663                    1-Open
## 1664                    1-Open
## 1665                    1-Open
## 1666                    1-Open
## 1667                    1-Open
## 1668                    1-Open
## 1669                    1-Open
## 1670                    1-Open
## 1671                    1-Open
## 1672                    1-Open
## 1673                    1-Open
## 1674                    1-Open
## 1675                    1-Open
## 1676                    1-Open
## 1677                6-Inactive
## 1678                    1-Open
## 1679                    1-Open
## 1680                    1-Open
## 1681                    1-Open
## 1682                    1-Open
## 1683                    1-Open
## 1684                6-Inactive
## 1685                8-Reopened
## 1686                    1-Open
## 1687                    1-Open
## 1688                    1-Open
## 1689                    1-Open
## 1690                    1-Open
## 1691                    1-Open
## 1692                    1-Open
## 1693                6-Inactive
## 1694                    1-Open
## 1695                    1-Open
## 1696                    1-Open
## 1697                    1-Open
## 1698                    1-Open
## 1699                    1-Open
## 1700                    1-Open
## 1701                    1-Open
## 1702                    1-Open
## 1703                    1-Open
## 1704                    1-Open
## 1705                    1-Open
## 1706                    1-Open
## 1707                6-Inactive
## 1708                    1-Open
## 1709                    1-Open
## 1710                    1-Open
## 1711                6-Inactive
## 1712                    1-Open
## 1713                6-Inactive
## 1714                    1-Open
## 1715                6-Inactive
## 1716                6-Inactive
## 1717                6-Inactive
## 1718                6-Inactive
## 1719                6-Inactive
## 1720                    1-Open
## 1721                    1-Open
## 1722                    1-Open
## 1723                    1-Open
## 1724                6-Inactive
## 1725                    1-Open
## 1726                6-Inactive
## 1727                    1-Open
## 1728                6-Inactive
## 1729                6-Inactive
## 1730                    1-Open
## 1731                    1-Open
## 1732                    1-Open
## 1733                    1-Open
## 1734                    1-Open
## 1735                     3-New
## 1736                    1-Open
## 1737                    1-Open
## 1738                    1-Open
## 1739                    1-Open
## 1740                    1-Open
## 1741                    1-Open
## 1742                    1-Open
## 1743                    1-Open
## 1744                    1-Open
## 1745                    1-Open
## 1746                    1-Open
## 1747                    1-Open
## 1748                    1-Open
## 1749                    1-Open
## 1750                    1-Open
## 1751                    1-Open
## 1752                    1-Open
## 1753                    1-Open
## 1754                    1-Open
## 1755                    1-Open
## 1756                    1-Open
## 1757                    1-Open
## 1758                    1-Open
## 1759                    1-Open
## 1760                    1-Open
## 1761                    1-Open
## 1762                    1-Open
## 1763                    1-Open
## 1764                    1-Open
## 1765                     3-New
## 1766                    1-Open
## 1767                    1-Open
## 1768                    1-Open
## 1769                    1-Open
## 1770                    1-Open
## 1771                    1-Open
## 1772                  7-Future
## 1773                    1-Open
## 1774                    1-Open
## 1775                    1-Open
## 1776                    1-Open
## 1777                    1-Open
## 1778                    1-Open
## 1779                    1-Open
## 1780                    1-Open
## 1781                    1-Open
## 1782                    1-Open
## 1783                6-Inactive
## 1784                    1-Open
## 1785                6-Inactive
## 1786                6-Inactive
## 1787                    1-Open
## 1788                    1-Open
## 1789                    1-Open
## 1790                    1-Open
## 1791                    1-Open
## 1792                    1-Open
## 1793                    1-Open
## 1794                    1-Open
## 1795                    1-Open
## 1796                    1-Open
## 1797                    1-Open
## 1798                    1-Open
## 1799                    1-Open
## 1800                    1-Open
## 1801                    1-Open
## 1802                    1-Open
## 1803                    1-Open
## 1804                    1-Open
## 1805                    1-Open
## 1806                    1-Open
## 1807                    1-Open
## 1808                6-Inactive
## 1809                6-Inactive
## 1810                    1-Open
## 1811                    1-Open
## 1812                    1-Open
## 1813                    1-Open
## 1814                    1-Open
## 1815                    1-Open
## 1816                    1-Open
## 1817                    1-Open
## 1818                    1-Open
## 1819                    1-Open
## 1820                    1-Open
## 1821                    1-Open
## 1822                    1-Open
## 1823                    1-Open
## 1824                    1-Open
## 1825                    1-Open
## 1826                    1-Open
## 1827                    1-Open
## 1828                    1-Open
## 1829                    1-Open
## 1830                    1-Open
## 1831                    1-Open
## 1832                    1-Open
## 1833                    1-Open
## 1834                    1-Open
## 1835                    1-Open
## 1836                    1-Open
## 1837                    1-Open
## 1838                     3-New
## 1839                    1-Open
## 1840                    1-Open
## 1841                    1-Open
## 1842                    1-Open
## 1843                    1-Open
## 1844                    1-Open
## 1845                    1-Open
## 1846                    1-Open
## 1847                    1-Open
## 1848                    1-Open
## 1849                    1-Open
## 1850                    1-Open
## 1851                    1-Open
## 1852                    1-Open
## 1853                    1-Open
## 1854                    1-Open
## 1855                    1-Open
## 1856                    1-Open
## 1857                    1-Open
## 1858                    1-Open
## 1859                    1-Open
## 1860                    1-Open
## 1861                    1-Open
## 1862                    1-Open
## 1863                    1-Open
## 1864                    1-Open
## 1865                    1-Open
## 1866                    1-Open
## 1867                    1-Open
## 1868                    1-Open
## 1869                6-Inactive
## 1870                    1-Open
## 1871                6-Inactive
## 1872                    1-Open
## 1873                    1-Open
## 1874                    1-Open
## 1875                    1-Open
## 1876                    1-Open
## 1877                    1-Open
## 1878                    1-Open
## 1879                    1-Open
## 1880                    1-Open
## 1881                6-Inactive
## 1882                    1-Open
## 1883                6-Inactive
## 1884                    1-Open
## 1885                    1-Open
## 1886                    1-Open
## 1887                    1-Open
## 1888                    1-Open
## 1889                    1-Open
## 1890                    1-Open
## 1891                    1-Open
## 1892                    1-Open
## 1893                     3-New
## 1894                    1-Open
## 1895                    1-Open
## 1896                    1-Open
## 1897                    1-Open
## 1898                    1-Open
## 1899                    1-Open
## 1900                    1-Open
## 1901                    1-Open
## 1902                    1-Open
## 1903                    1-Open
## 1904                    1-Open
## 1905                    1-Open
## 1906                    1-Open
## 1907                    1-Open
## 1908                    1-Open
## 1909                    1-Open
## 1910                    1-Open
## 1911                    1-Open
## 1912                    1-Open
## 1913                    1-Open
## 1914                    1-Open
## 1915                    1-Open
## 1916                    1-Open
## 1917                    1-Open
## 1918                    1-Open
## 1919                    1-Open
## 1920                    1-Open
## 1921                    1-Open
## 1922                   4-Added
## 1923                    1-Open
## 1924                    1-Open
## 1925                    1-Open
## 1926                    1-Open
## 1927                    1-Open
## 1928                    1-Open
## 1929                    1-Open
## 1930                6-Inactive
## 1931                    1-Open
## 1932                    1-Open
## 1933                    1-Open
## 1934                    1-Open
## 1935                    1-Open
## 1936                    1-Open
## 1937                    1-Open
## 1938                    1-Open
## 1939                    1-Open
## 1940                    1-Open
## 1941                     3-New
## 1942                    1-Open
## 1943                    1-Open
## 1944                    1-Open
## 1945                    1-Open
## 1946                    1-Open
## 1947                    1-Open
## 1948                    1-Open
## 1949                    1-Open
## 1950                    1-Open
## 1951                    1-Open
## 1952                    1-Open
## 1953                    1-Open
## 1954                    1-Open
## 1955                    1-Open
## 1956                    1-Open
## 1957                    1-Open
## 1958                    1-Open
## 1959                    1-Open
## 1960                    1-Open
## 1961                    1-Open
## 1962                    1-Open
## 1963                    1-Open
## 1964                    1-Open
## 1965                    1-Open
## 1966                    1-Open
## 1967                6-Inactive
## 1968                6-Inactive
## 1969                    1-Open
## 1970                    1-Open
## 1971                     3-New
## 1972                    1-Open
## 1973                    1-Open
## 1974                    1-Open
## 1975                    1-Open
## 1976                    1-Open
## 1977                    1-Open
## 1978                    1-Open
## 1979                    1-Open
## 1980                    1-Open
## 1981                    1-Open
## 1982                    1-Open
## 1983                    1-Open
## 1984                    1-Open
## 1985                    1-Open
## 1986                    1-Open
## 1987                    1-Open
## 1988                    1-Open
## 1989                    1-Open
## 1990                    1-Open
## 1991                    1-Open
## 1992                    1-Open
## 1993                    1-Open
## 1994                    1-Open
## 1995                    1-Open
## 1996                    1-Open
## 1997                    1-Open
## 1998                    1-Open
## 1999                6-Inactive
## 2000                    1-Open
## 2001                    1-Open
## 2002                    1-Open
## 2003                    1-Open
## 2004                    1-Open
## 2005                    1-Open
## 2006                    1-Open
## 2007                6-Inactive
## 2008                6-Inactive
## 2009                    1-Open
## 2010                    1-Open
## 2011                    1-Open
## 2012                    1-Open
## 2013                    1-Open
## 2014                    1-Open
## 2015                    1-Open
## 2016                    1-Open
## 2017                    1-Open
## 2018                    1-Open
## 2019                    1-Open
## 2020                    1-Open
## 2021                    1-Open
## 2022                    1-Open
## 2023                    1-Open
## 2024                    1-Open
## 2025                    1-Open
## 2026                    1-Open
## 2027                    1-Open
## 2028                6-Inactive
## 2029                    1-Open
## 2030                    1-Open
## 2031                    1-Open
## 2032                    1-Open
## 2033                    1-Open
## 2034                    1-Open
## 2035                    1-Open
## 2036                    1-Open
## 2037                    1-Open
## 2038                    1-Open
## 2039                    1-Open
## 2040                    1-Open
## 2041                    1-Open
## 2042                    1-Open
## 2043                    1-Open
## 2044                    1-Open
## 2045                    1-Open
## 2046                    1-Open
## 2047                    1-Open
## 2048                    1-Open
## 2049                    1-Open
## 2050                    1-Open
## 2051                    1-Open
## 2052                    1-Open
## 2053                    1-Open
## 2054                    1-Open
## 2055                6-Inactive
## 2056                6-Inactive
## 2057                6-Inactive
## 2058                    1-Open
## 2059                    1-Open
## 2060                    1-Open
## 2061                    1-Open
## 2062                    1-Open
## 2063                    1-Open
## 2064                    1-Open
## 2065                    1-Open
## 2066                    1-Open
## 2067                    1-Open
## 2068                    1-Open
## 2069                    1-Open
## 2070                    1-Open
## 2071                    1-Open
## 2072                    1-Open
## 2073                    1-Open
## 2074                    1-Open
## 2075                    1-Open
## 2076                    1-Open
## 2077                6-Inactive
## 2078                6-Inactive
## 2079                6-Inactive
## 2080                6-Inactive
## 2081                    1-Open
## 2082                6-Inactive
## 2083                    1-Open
## 2084                    1-Open
## 2085                    1-Open
## 2086                    1-Open
## 2087                    1-Open
## 2088                    1-Open
## 2089                    1-Open
## 2090                    1-Open
## 2091                    1-Open
## 2092                    1-Open
## 2093                    1-Open
## 2094                    1-Open
## 2095                6-Inactive
## 2096                    1-Open
## 2097                    1-Open
## 2098                    1-Open
## 2099                    1-Open
## 2100                6-Inactive
## 2101                    1-Open
## 2102                    1-Open
## 2103                    1-Open
## 2104                    1-Open
## 2105                    1-Open
## 2106                    1-Open
## 2107                    1-Open
## 2108                    1-Open
## 2109                    1-Open
## 2110                    1-Open
## 2111                    1-Open
## 2112                    1-Open
## 2113                    1-Open
## 2114                    1-Open
## 2115                    1-Open
## 2116                    1-Open
## 2117                    1-Open
## 2118                6-Inactive
## 2119                    1-Open
## 2120                    1-Open
## 2121                     3-New
## 2122                    1-Open
## 2123                    1-Open
## 2124                    1-Open
## 2125                6-Inactive
## 2126                    1-Open
## 2127                    1-Open
## 2128                    1-Open
## 2129                    1-Open
## 2130                    1-Open
## 2131                    1-Open
## 2132                    1-Open
## 2133                    1-Open
## 2134                    1-Open
## 2135                    1-Open
## 2136                    1-Open
## 2137                    1-Open
## 2138                    1-Open
## 2139                    1-Open
## 2140                     3-New
## 2141                    1-Open
## 2142                    1-Open
## 2143                    1-Open
## 2144                    1-Open
## 2145                    1-Open
## 2146                    1-Open
## 2147                    1-Open
## 2148                    1-Open
## 2149                    1-Open
## 2150                    1-Open
## 2151                    1-Open
## 2152                    1-Open
## 2153                    1-Open
## 2154                    1-Open
## 2155                    1-Open
## 2156                    1-Open
## 2157                    1-Open
## 2158                    1-Open
## 2159                    1-Open
## 2160                    1-Open
## 2161                    1-Open
## 2162                    1-Open
## 2163                    1-Open
## 2164                    1-Open
## 2165                    1-Open
## 2166                    1-Open
## 2167                    1-Open
## 2168                    1-Open
## 2169                6-Inactive
## 2170                    1-Open
## 2171                6-Inactive
## 2172                    1-Open
## 2173                6-Inactive
## 2174                    1-Open
## 2175                    1-Open
## 2176                    1-Open
## 2177                6-Inactive
## 2178                    1-Open
## 2179                    1-Open
## 2180                    1-Open
## 2181                    1-Open
## 2182                    1-Open
## 2183                    1-Open
## 2184                    1-Open
## 2185                    1-Open
## 2186                    1-Open
## 2187                    1-Open
## 2188                    1-Open
## 2189                    1-Open
## 2190                    1-Open
## 2191                    1-Open
## 2192                6-Inactive
## 2193                    1-Open
## 2194                    1-Open
## 2195                    1-Open
## 2196                    1-Open
## 2197                    1-Open
## 2198                    1-Open
## 2199                    1-Open
## 2200                    1-Open
## 2201                    1-Open
## 2202                    1-Open
## 2203                    1-Open
## 2204                    1-Open
## 2205                    1-Open
## 2206                6-Inactive
## 2207                    1-Open
## 2208                    1-Open
## 2209                6-Inactive
## 2210                    1-Open
## 2211                    1-Open
## 2212                    1-Open
## 2213                6-Inactive
## 2214                6-Inactive
## 2215                6-Inactive
## 2216                    1-Open
## 2217                6-Inactive
## 2218                    1-Open
## 2219                6-Inactive
## 2220                    1-Open
## 2221                    1-Open
## 2222                6-Inactive
## 2223                6-Inactive
## 2224                6-Inactive
## 2225                6-Inactive
## 2226                     3-New
## 2227                    1-Open
## 2228                    1-Open
## 2229                    1-Open
## 2230                    1-Open
## 2231                    1-Open
## 2232                    1-Open
## 2233                    1-Open
## 2234                    1-Open
## 2235                    1-Open
## 2236                    1-Open
## 2237                    1-Open
## 2238                    1-Open
## 2239                    1-Open
## 2240                    1-Open
## 2241                    1-Open
## 2242                    1-Open
## 2243                    1-Open
## 2244                    1-Open
## 2245                    1-Open
## 2246                    1-Open
## 2247                    1-Open
## 2248                    1-Open
## 2249                    1-Open
## 2250                    1-Open
## 2251                    1-Open
## 2252                    1-Open
## 2253                    1-Open
## 2254                    1-Open
## 2255                    1-Open
## 2256                    1-Open
## 2257                6-Inactive
## 2258                6-Inactive
## 2259                    1-Open
## 2260                    1-Open
## 2261                    1-Open
## 2262                    1-Open
## 2263                    1-Open
## 2264                    1-Open
## 2265                    1-Open
## 2266                    1-Open
## 2267                    1-Open
## 2268                    1-Open
## 2269                    1-Open
## 2270                    1-Open
## 2271                    1-Open
## 2272                    1-Open
## 2273                    1-Open
## 2274                    1-Open
## 2275                    1-Open
## 2276                    1-Open
## 2277                    1-Open
## 2278                    1-Open
## 2279                    1-Open
## 2280                    1-Open
## 2281                    1-Open
## 2282                    1-Open
## 2283                    1-Open
## 2284                    1-Open
## 2285                    1-Open
## 2286                    1-Open
## 2287                    1-Open
## 2288                    1-Open
## 2289                    1-Open
## 2290                    1-Open
## 2291                    1-Open
## 2292                    1-Open
## 2293                    1-Open
## 2294                    1-Open
## 2295                    1-Open
## 2296                    1-Open
## 2297                    1-Open
## 2298                    1-Open
## 2299                    1-Open
## 2300                     3-New
## 2301                    1-Open
## 2302                    1-Open
## 2303                    1-Open
## 2304                    1-Open
## 2305                    1-Open
## 2306                    1-Open
## 2307                    1-Open
## 2308                    1-Open
## 2309                    1-Open
## 2310                6-Inactive
## 2311                    1-Open
## 2312                    1-Open
## 2313                    1-Open
## 2314                    1-Open
## 2315                    1-Open
## 2316                    1-Open
## 2317                6-Inactive
## 2318                    1-Open
## 2319                    1-Open
## 2320                    1-Open
## 2321                    1-Open
## 2322                    1-Open
## 2323                    1-Open
## 2324                    1-Open
## 2325                    1-Open
## 2326                    1-Open
## 2327                    1-Open
## 2328                    1-Open
## 2329                    1-Open
## 2330                    1-Open
## 2331                    1-Open
## 2332                    1-Open
## 2333                    1-Open
## 2334                    1-Open
## 2335                    1-Open
## 2336                    1-Open
## 2337                    1-Open
## 2338                    1-Open
## 2339                    1-Open
## 2340                    1-Open
## 2341                    1-Open
## 2342                    1-Open
## 2343                    1-Open
## 2344                    1-Open
## 2345                    1-Open
## 2346                    1-Open
## 2347                    1-Open
## 2348                    1-Open
## 2349                    1-Open
## 2350                    1-Open
## 2351                    1-Open
## 2352                    1-Open
## 2353                    1-Open
## 2354                    1-Open
## 2355                    1-Open
## 2356                    1-Open
## 2357                    1-Open
## 2358                    1-Open
## 2359                    1-Open
## 2360                    1-Open
## 2361                    1-Open
## 2362                    1-Open
## 2363                    1-Open
## 2364                    1-Open
## 2365                    1-Open
## 2366                    1-Open
## 2367 5-Changed Boundary/Agency
## 2368                    1-Open
## 2369                    1-Open
## 2370                    1-Open
## 2371                    1-Open
## 2372                    1-Open
## 2373                    1-Open
## 2374                    1-Open
## 2375                    1-Open
## 2376                    1-Open
## 2377                    1-Open
## 2378                    1-Open
## 2379                    1-Open
## 2380                    1-Open
## 2381                    1-Open
## 2382                    1-Open
## 2383                    1-Open
## 2384                    1-Open
## 2385                    1-Open
## 2386                    1-Open
## 2387                    1-Open
## 2388                    1-Open
## 2389                     3-New
## 2390                    1-Open
## 2391                    1-Open
## 2392                    1-Open
## 2393                    1-Open
## 2394                    1-Open
## 2395                    1-Open
## 2396                    1-Open
## 2397                    1-Open
## 2398                    1-Open
## 2399                    1-Open
## 2400                    1-Open
## 2401                    1-Open
## 2402                    1-Open
## 2403                    1-Open
## 2404                    1-Open
## 2405                    1-Open
## 2406                6-Inactive
## 2407                    1-Open
## 2408                    1-Open
## 2409                    1-Open
## 2410                6-Inactive
## 2411                    1-Open
## 2412                    1-Open
## 2413                    1-Open
## 2414                    1-Open
## 2415                    1-Open
## 2416                    1-Open
## 2417                    1-Open
## 2418 5-Changed Boundary/Agency
## 2419                    1-Open
## 2420                    1-Open
## 2421                    1-Open
## 2422                    1-Open
## 2423                    1-Open
## 2424                    1-Open
## 2425                    1-Open
## 2426                    1-Open
## 2427                    1-Open
## 2428                    1-Open
## 2429                    1-Open
## 2430                    1-Open
## 2431                    1-Open
## 2432                    1-Open
## 2433                    1-Open
## 2434                6-Inactive
## 2435                    1-Open
## 2436                    1-Open
## 2437                    1-Open
## 2438                    1-Open
## 2439                    1-Open
## 2440                    1-Open
## 2441                    1-Open
## 2442                    1-Open
## 2443                    1-Open
## 2444                    1-Open
## 2445                    1-Open
## 2446                    1-Open
## 2447                    1-Open
## 2448                    1-Open
## 2449                    1-Open
## 2450                    1-Open
## 2451                    1-Open
## 2452                    1-Open
## 2453                    1-Open
## 2454                     3-New
## 2455                    1-Open
## 2456                    1-Open
## 2457                    1-Open
## 2458                    1-Open
## 2459                    1-Open
## 2460                    1-Open
## 2461                    1-Open
## 2462                    1-Open
## 2463                    1-Open
## 2464                    1-Open
## 2465                    1-Open
## 2466                    1-Open
## 2467                    1-Open
## 2468                    1-Open
## 2469                    1-Open
## 2470                    1-Open
## 2471                    1-Open
## 2472                    1-Open
## 2473                    1-Open
## 2474                    1-Open
## 2475                    1-Open
## 2476                    1-Open
## 2477                    1-Open
## 2478                    1-Open
## 2479                    1-Open
## 2480                    1-Open
## 2481                    1-Open
## 2482 5-Changed Boundary/Agency
## 2483                    1-Open
## 2484                6-Inactive
## 2485                    1-Open
## 2486                6-Inactive
## 2487                6-Inactive
## 2488                    1-Open
## 2489                    1-Open
## 2490                    1-Open
## 2491                    1-Open
## 2492                    1-Open
## 2493                    1-Open
## 2494                    1-Open
## 2495                    1-Open
## 2496                    1-Open
## 2497                    1-Open
## 2498                6-Inactive
## 2499                    1-Open
## 2500                    1-Open
## 2501                    1-Open
## 2502                     3-New
## 2503                     3-New
## 2504                    1-Open
## 2505                    1-Open
## 2506                    1-Open
## 2507                    1-Open
## 2508                    1-Open
## 2509                    1-Open
## 2510                    1-Open
## 2511                    1-Open
## 2512                6-Inactive
## 2513                6-Inactive
## 2514                6-Inactive
## 2515                6-Inactive
## 2516                    1-Open
## 2517                    1-Open
## 2518                    1-Open
## 2519                    1-Open
## 2520                6-Inactive
## 2521                    1-Open
## 2522                    1-Open
## 2523                    1-Open
## 2524                    1-Open
## 2525                    1-Open
## 2526                    1-Open
## 2527                    1-Open
## 2528                    1-Open
## 2529                    1-Open
## 2530                    1-Open
## 2531                    1-Open
## 2532                    1-Open
## 2533                    1-Open
## 2534                    1-Open
## 2535                    1-Open
## 2536                    1-Open
## 2537                6-Inactive
## 2538                    1-Open
## 2539                    1-Open
## 2540                    1-Open
## 2541                    1-Open
## 2542                    1-Open
## 2543                6-Inactive
## 2544                    1-Open
## 2545                    1-Open
## 2546                    1-Open
## 2547                    1-Open
## 2548                    1-Open
## 2549                    1-Open
## 2550                    1-Open
## 2551                    1-Open
## 2552                    1-Open
## 2553                    1-Open
## 2554                    1-Open
## 2555                    1-Open
## 2556                    1-Open
## 2557                    1-Open
## 2558                    1-Open
## 2559                    1-Open
## 2560                     3-New
## 2561                    1-Open
## 2562                    1-Open
## 2563                    1-Open
## 2564                    1-Open
## 2565                    1-Open
## 2566                    1-Open
## 2567                    1-Open
## 2568                    1-Open
## 2569                    1-Open
## 2570                    1-Open
## 2571                6-Inactive
## 2572                    1-Open
## 2573                    1-Open
## 2574                    1-Open
## 2575                6-Inactive
## 2576                    1-Open
## 2577                    1-Open
## 2578                    1-Open
## 2579                    1-Open
## 2580                    1-Open
## 2581                    1-Open
## 2582                6-Inactive
## 2583                    1-Open
## 2584                    1-Open
## 2585                    1-Open
## 2586                    1-Open
## 2587                    1-Open
## 2588                    1-Open
## 2589                    1-Open
## 2590                    1-Open
## 2591                    1-Open
## 2592                    1-Open
## 2593                    1-Open
## 2594                    1-Open
## 2595                    1-Open
## 2596                6-Inactive
## 2597                    1-Open
## 2598                    1-Open
## 2599                    1-Open
## 2600                    1-Open
## 2601                    1-Open
## 2602                    1-Open
## 2603                    1-Open
## 2604                    1-Open
## 2605                    1-Open
## 2606                    1-Open
## 2607                     3-New
## 2608                    1-Open
## 2609                    1-Open
## 2610                    1-Open
## 2611                    1-Open
## 2612                    1-Open
## 2613                    1-Open
## 2614                    1-Open
## 2615                    1-Open
## 2616                6-Inactive
## 2617                    1-Open
## 2618                    1-Open
## 2619                    1-Open
## 2620                    1-Open
## 2621                    1-Open
## 2622                6-Inactive
## 2623                    1-Open
## 2624                    1-Open
## 2625                    1-Open
## 2626                    1-Open
## 2627                    1-Open
## 2628                    1-Open
## 2629                    1-Open
## 2630                    1-Open
## 2631                    1-Open
## 2632                     3-New
## 2633                    1-Open
## 2634                    1-Open
## 2635                    1-Open
## 2636                   4-Added
## 2637                    1-Open
## 2638                    1-Open
## 2639                    1-Open
## 2640                    1-Open
## 2641                    1-Open
## 2642                    1-Open
## 2643                    1-Open
## 2644                    1-Open
## 2645                    1-Open
## 2646                    1-Open
## 2647                    1-Open
## 2648                    1-Open
## 2649                    1-Open
## 2650                    1-Open
## 2651                    1-Open
## 2652                    1-Open
## 2653                    1-Open
## 2654                    1-Open
## 2655                    1-Open
## 2656                    1-Open
## 2657                    1-Open
## 2658                    1-Open
## 2659                    1-Open
## 2660                    1-Open
## 2661                    1-Open
## 2662                    1-Open
## 2663                    1-Open
## 2664                6-Inactive
## 2665                    1-Open
## 2666                    1-Open
## 2667                    1-Open
## 2668                    1-Open
## 2669                    1-Open
## 2670                    1-Open
## 2671                     3-New
## 2672                    1-Open
## 2673                    1-Open
## 2674                    1-Open
## 2675                    1-Open
## 2676                    1-Open
## 2677                    1-Open
## 2678                    1-Open
## 2679                    1-Open
## 2680                    1-Open
## 2681                    1-Open
## 2682                    1-Open
## 2683                    1-Open
## 2684                    1-Open
## 2685                    1-Open
## 2686                    1-Open
## 2687                    1-Open
## 2688                    1-Open
## 2689                6-Inactive
## 2690                    1-Open
## 2691                    1-Open
## 2692                    1-Open
## 2693                    1-Open
## 2694                    1-Open
## 2695                    1-Open
## 2696                    1-Open
## 2697                    1-Open
## 2698                    1-Open
## 2699                     3-New
## 2700                    1-Open
## 2701                    1-Open
## 2702                    1-Open
## 2703                    1-Open
## 2704                    1-Open
## 2705                    1-Open
## 2706                    1-Open
## 2707                    1-Open
## 2708                    1-Open
## 2709                    1-Open
## 2710                    1-Open
## 2711                    1-Open
## 2712                     3-New
## 2713                    1-Open
## 2714                    1-Open
## 2715                     3-New
## 2716                    1-Open
## 2717                    1-Open
## 2718                    1-Open
## 2719                    1-Open
## 2720                    1-Open
## 2721                    1-Open
## 2722                    1-Open
## 2723                    1-Open
## 2724                    1-Open
## 2725                6-Inactive
## 2726                6-Inactive
## 2727                    1-Open
## 2728                    1-Open
## 2729                    1-Open
## 2730                    1-Open
## 2731                    1-Open
## 2732                    1-Open
## 2733                    1-Open
## 2734                    1-Open
## 2735                    1-Open
## 2736                    1-Open
## 2737                    1-Open
## 2738                    1-Open
## 2739                    1-Open
## 2740                    1-Open
## 2741                    1-Open
## 2742                    1-Open
## 2743                    1-Open
## 2744                    1-Open
## 2745                    1-Open
## 2746                    1-Open
## 2747                    1-Open
## 2748                    1-Open
## 2749                    1-Open
## 2750                    1-Open
## 2751                     3-New
## 2752                    1-Open
## 2753                    1-Open
## 2754                    1-Open
## 2755                    1-Open
## 2756                    1-Open
## 2757                    1-Open
## 2758                    1-Open
## 2759                    1-Open
## 2760                    1-Open
## 2761                    1-Open
## 2762                    1-Open
## 2763                    1-Open
## 2764                    1-Open
## 2765                    1-Open
## 2766                    1-Open
## 2767                    1-Open
## 2768                    1-Open
## 2769                    1-Open
## 2770                    1-Open
## 2771                    1-Open
## 2772                    1-Open
## 2773                    1-Open
## 2774                    1-Open
## 2775                    1-Open
## 2776                    1-Open
## 2777                    1-Open
## 2778                    1-Open
## 2779                    1-Open
## 2780                    1-Open
## 2781                    1-Open
## 2782                    1-Open
## 2783                    1-Open
## 2784                    1-Open
## 2785                    1-Open
## 2786                    1-Open
## 2787                    1-Open
## 2788                    1-Open
## 2789                    1-Open
## 2790                    1-Open
## 2791                    1-Open
## 2792                    1-Open
## 2793                    1-Open
## 2794                    1-Open
## 2795                    1-Open
## 2796                    1-Open
## 2797                    1-Open
## 2798                    1-Open
## 2799                    1-Open
## 2800                    1-Open
## 2801                    1-Open
## 2802                    1-Open
## 2803                    1-Open
## 2804                    1-Open
## 2805                    1-Open
## 2806                    1-Open
## 2807                    1-Open
## 2808                    1-Open
## 2809                    1-Open
## 2810                   4-Added
## 2811                    1-Open
## 2812                    1-Open
## 2813                    1-Open
## 2814                    1-Open
## 2815                    1-Open
## 2816                    1-Open
## 2817                    1-Open
## 2818                    1-Open
## 2819                    1-Open
## 2820                    1-Open
## 2821                    1-Open
## 2822                    1-Open
## 2823                    1-Open
## 2824                    1-Open
## 2825                    1-Open
## 2826                6-Inactive
## 2827                    1-Open
## 2828                    1-Open
## 2829                    1-Open
## 2830                    1-Open
## 2831                    1-Open
## 2832                    1-Open
## 2833                    1-Open
## 2834                    1-Open
## 2835                    1-Open
## 2836                    1-Open
## 2837                    1-Open
## 2838                    1-Open
## 2839                    1-Open
## 2840                    1-Open
## 2841                    1-Open
## 2842                    1-Open
## 2843                    1-Open
## 2844                    1-Open
## 2845                    1-Open
## 2846                    1-Open
## 2847                    1-Open
## 2848                    1-Open
## 2849                    1-Open
## 2850                    1-Open
## 2851                6-Inactive
## 2852                    1-Open
## 2853                    1-Open
## 2854                    1-Open
## 2855                    1-Open
## 2856                    1-Open
## 2857                    1-Open
## 2858                    1-Open
## 2859                    1-Open
## 2860                    1-Open
## 2861                8-Reopened
## 2862                    1-Open
## 2863                    1-Open
## 2864                    1-Open
## 2865                    1-Open
## 2866                    1-Open
## 2867                    1-Open
## 2868                    1-Open
## 2869                    1-Open
## 2870                    1-Open
## 2871                    1-Open
## 2872                    1-Open
## 2873                    1-Open
## 2874                    1-Open
## 2875                    1-Open
## 2876                    1-Open
## 2877                    1-Open
## 2878                    1-Open
## 2879                    1-Open
## 2880                    1-Open
## 2881                    1-Open
## 2882                    1-Open
## 2883                    1-Open
## 2884                6-Inactive
## 2885                    1-Open
## 2886                    1-Open
## 2887                    1-Open
## 2888                    1-Open
## 2889                    1-Open
## 2890                6-Inactive
## 2891                    1-Open
## 2892                    1-Open
## 2893                    1-Open
## 2894                    1-Open
## 2895                    1-Open
## 2896                    1-Open
## 2897                    1-Open
## 2898                    1-Open
## 2899                6-Inactive
## 2900                6-Inactive
## 2901                    1-Open
## 2902                    1-Open
## 2903                    1-Open
## 2904                    1-Open
## 2905                6-Inactive
## 2906                6-Inactive
## 2907                    1-Open
## 2908                    1-Open
## 2909                    1-Open
## 2910                    1-Open
## 2911                    1-Open
## 2912                    1-Open
## 2913                    1-Open
## 2914                    1-Open
## 2915                    1-Open
## 2916                    1-Open
## 2917                    1-Open
## 2918                    1-Open
## 2919                6-Inactive
## 2920                    1-Open
## 2921                    1-Open
## 2922                    1-Open
## 2923                    1-Open
## 2924                    1-Open
## 2925                    1-Open
## 2926                    1-Open
## 2927                    1-Open
## 2928                    1-Open
## 2929                    1-Open
## 2930                    1-Open
## 2931                    1-Open
## 2932                    1-Open
## 2933                    1-Open
## 2934                    1-Open
## 2935                    1-Open
## 2936                    1-Open
## 2937                    1-Open
## 2938                    1-Open
## 2939                    1-Open
## 2940                    1-Open
## 2941                    1-Open
## 2942                    1-Open
## 2943                    1-Open
## 2944                    1-Open
## 2945                    1-Open
## 2946                    1-Open
## 2947                    1-Open
## 2948                    1-Open
## 2949                    1-Open
## 2950                    1-Open
## 2951                    1-Open
## 2952                    1-Open
## 2953                    1-Open
## 2954                    1-Open
## 2955                    1-Open
## 2956                    1-Open
## 2957                    1-Open
## 2958                    1-Open
## 2959                    1-Open
## 2960                    1-Open
## 2961                    1-Open
## 2962                    1-Open
## 2963                    1-Open
## 2964                    1-Open
## 2965                    1-Open
## 2966                    1-Open
## 2967                    1-Open
## 2968                    1-Open
## 2969                    1-Open
## 2970                    1-Open
## 2971                    1-Open
## 2972                    1-Open
## 2973                    1-Open
## 2974                    1-Open
## 2975                    1-Open
## 2976                    1-Open
## 2977                    1-Open
## 2978                     3-New
## 2979                    1-Open
## 2980                    1-Open
## 2981                    1-Open
## 2982                    1-Open
## 2983                    1-Open
## 2984                    1-Open
## 2985                6-Inactive
## 2986                6-Inactive
## 2987                    1-Open
## 2988                    1-Open
## 2989                    1-Open
## 2990                    1-Open
## 2991                    1-Open
## 2992                    1-Open
## 2993                    1-Open
## 2994                    1-Open
## 2995                    1-Open
## 2996                    1-Open
## 2997                    1-Open
## 2998                    1-Open
## 2999                    1-Open
## 3000                    1-Open
## 3001                    1-Open
## 3002                    1-Open
## 3003                    1-Open
## 3004                    1-Open
## 3005                    1-Open
## 3006                    1-Open
## 3007                    1-Open
## 3008                    1-Open
## 3009                    1-Open
## 3010                    1-Open
## 3011                    1-Open
## 3012                    1-Open
## 3013                    1-Open
## 3014                    1-Open
## 3015                    1-Open
## 3016                    1-Open
## 3017                    1-Open
## 3018                    1-Open
## 3019                    1-Open
## 3020                    1-Open
## 3021                    1-Open
## 3022                    1-Open
## 3023                    1-Open
## 3024                    1-Open
## 3025                    1-Open
## 3026                    1-Open
## 3027                    1-Open
## 3028                    1-Open
## 3029                    1-Open
## 3030                    1-Open
## 3031                    1-Open
## 3032                    1-Open
## 3033                    1-Open
## 3034                    1-Open
## 3035                    1-Open
## 3036                    1-Open
## 3037                    1-Open
## 3038                6-Inactive
## 3039                    1-Open
## 3040                    1-Open
## 3041                    1-Open
## 3042                    1-Open
## 3043                6-Inactive
## 3044                6-Inactive
## 3045                6-Inactive
## 3046                6-Inactive
## 3047                    1-Open
## 3048                    1-Open
## 3049                    1-Open
## 3050                    1-Open
## 3051                    1-Open
## 3052                    1-Open
## 3053                    1-Open
## 3054                    1-Open
## 3055                    1-Open
## 3056                     3-New
## 3057                    1-Open
## 3058                    1-Open
## 3059                    1-Open
## 3060                    1-Open
## 3061                    1-Open
## 3062                    1-Open
## 3063                    1-Open
## 3064                    1-Open
## 3065                    1-Open
## 3066                    1-Open
## 3067                    1-Open
## 3068                    1-Open
## 3069                    1-Open
## 3070                    1-Open
## 3071                    1-Open
## 3072                    1-Open
## 3073                    1-Open
## 3074                    1-Open
## 3075                    1-Open
## 3076                    1-Open
## 3077                    1-Open
## 3078                    1-Open
## 3079                6-Inactive
## 3080                    1-Open
## 3081                    1-Open
## 3082                    1-Open
## 3083                    1-Open
## 3084                    1-Open
## 3085                    1-Open
## 3086                    1-Open
## 3087                    1-Open
## 3088                    1-Open
## 3089                    1-Open
## 3090                    1-Open
## 3091                    1-Open
## 3092                    1-Open
## 3093                    1-Open
## 3094                    1-Open
## 3095                    1-Open
## 3096                    1-Open
## 3097                    1-Open
## 3098                    1-Open
## 3099                    1-Open
## 3100                    1-Open
## 3101                    1-Open
## 3102                    1-Open
## 3103                    1-Open
## 3104                    1-Open
## 3105                    1-Open
## 3106                    1-Open
## 3107                    1-Open
## 3108                    1-Open
## 3109                    1-Open
## 3110                    1-Open
## 3111                    1-Open
## 3112                    1-Open
## 3113                    1-Open
## 3114                    1-Open
## 3115                    1-Open
## 3116                    1-Open
## 3117                    1-Open
## 3118                6-Inactive
## 3119                    1-Open
## 3120                    1-Open
## 3121                    1-Open
## 3122                    1-Open
## 3123                    1-Open
## 3124                    1-Open
## 3125                    1-Open
## 3126                    1-Open
## 3127                    1-Open
## 3128                    1-Open
## 3129                    1-Open
## 3130                    1-Open
## 3131                    1-Open
## 3132                    1-Open
## 3133                    1-Open
## 3134                    1-Open
## 3135                    1-Open
## 3136                    1-Open
## 3137                    1-Open
## 3138                    1-Open
## 3139                    1-Open
## 3140                    1-Open
## 3141                    1-Open
## 3142                    1-Open
## 3143                    1-Open
## 3144                    1-Open
## 3145                    1-Open
## 3146                    1-Open
## 3147                    1-Open
## 3148                    1-Open
## 3149                    1-Open
## 3150                    1-Open
## 3151                    1-Open
## 3152                    1-Open
## 3153                    1-Open
## 3154                    1-Open
## 3155                    1-Open
## 3156                    1-Open
## 3157                    1-Open
## 3158                6-Inactive
## 3159                    1-Open
## 3160                    1-Open
## 3161                    1-Open
## 3162                    1-Open
## 3163                    1-Open
## 3164                    1-Open
## 3165                    1-Open
## 3166                    1-Open
## 3167                     3-New
## 3168                    1-Open
## 3169                    1-Open
## 3170                    1-Open
## 3171                    1-Open
## 3172                    1-Open
## 3173                    1-Open
## 3174                    1-Open
## 3175                    1-Open
## 3176                    1-Open
## 3177                    1-Open
## 3178                    1-Open
## 3179                    1-Open
## 3180                    1-Open
## 3181                    1-Open
## 3182                    1-Open
## 3183                    1-Open
## 3184                    1-Open
## 3185                    1-Open
## 3186                    1-Open
## 3187                    1-Open
## 3188                    1-Open
## 3189                    1-Open
## 3190                    1-Open
## 3191                    1-Open
## 3192                    1-Open
## 3193                    1-Open
## 3194                    1-Open
## 3195                    1-Open
## 3196                    1-Open
## 3197                    1-Open
## 3198                    1-Open
## 3199                    1-Open
## 3200                    1-Open
## 3201                    1-Open
## 3202                    1-Open
## 3203                    1-Open
## 3204                    1-Open
## 3205                    1-Open
## 3206                    1-Open
## 3207                    1-Open
## 3208                    1-Open
## 3209                    1-Open
## 3210                    1-Open
## 3211                    1-Open
## 3212                    1-Open
## 3213                    1-Open
## 3214                    1-Open
## 3215                    1-Open
## 3216                    1-Open
## 3217                    1-Open
## 3218                    1-Open
## 3219                    1-Open
## 3220                    1-Open
## 3221                    1-Open
## 3222                    1-Open
## 3223                    1-Open
## 3224                    1-Open
## 3225                6-Inactive
## 3226                    1-Open
## 3227                    1-Open
## 3228                    1-Open
## 3229                    1-Open
## 3230                    1-Open
## 3231                    1-Open
## 3232                    1-Open
## 3233                    1-Open
## 3234                    1-Open
## 3235                    1-Open
## 3236                    1-Open
## 3237                    1-Open
## 3238                    1-Open
## 3239                    1-Open
## 3240                    1-Open
## 3241                    1-Open
## 3242                    1-Open
## 3243                    1-Open
## 3244                    1-Open
## 3245                    1-Open
## 3246                    1-Open
## 3247                    1-Open
## 3248                    1-Open
## 3249                    1-Open
## 3250                    1-Open
## 3251                6-Inactive
## 3252                    1-Open
## 3253                    1-Open
## 3254                    1-Open
## 3255                    1-Open
## 3256                    1-Open
## 3257                    1-Open
## 3258                    1-Open
## 3259                    1-Open
## 3260                    1-Open
## 3261                    1-Open
## 3262                    1-Open
## 3263                    1-Open
## 3264                    1-Open
## 3265                    1-Open
## 3266                    1-Open
## 3267                    1-Open
## 3268                    1-Open
## 3269                    1-Open
## 3270                    1-Open
## 3271                    1-Open
## 3272                    1-Open
## 3273                    1-Open
## 3274                    1-Open
## 3275                    1-Open
## 3276                    1-Open
## 3277                    1-Open
## 3278                    1-Open
## 3279                    1-Open
## 3280                     3-New
## 3281                    1-Open
## 3282                    1-Open
## 3283                     3-New
## 3284                    1-Open
## 3285                    1-Open
## 3286                    1-Open
## 3287                    1-Open
## 3288                    1-Open
## 3289                    1-Open
## 3290                    1-Open
## 3291                    1-Open
## 3292                    1-Open
## 3293                    1-Open
## 3294                    1-Open
## 3295                6-Inactive
## 3296                6-Inactive
## 3297                    1-Open
## 3298                6-Inactive
## 3299                    1-Open
## 3300                    1-Open
## 3301                    1-Open
## 3302                    1-Open
## 3303                    1-Open
## 3304                    1-Open
## 3305                    1-Open
## 3306                    1-Open
## 3307                    1-Open
## 3308                6-Inactive
## 3309                6-Inactive
## 3310                    1-Open
## 3311                    1-Open
## 3312                    1-Open
## 3313                    1-Open
## 3314                    1-Open
## 3315                    1-Open
## 3316                8-Reopened
## 3317                    1-Open
## 3318                    1-Open
## 3319                    1-Open
## 3320                    1-Open
## 3321                    1-Open
## 3322                    1-Open
## 3323                    1-Open
## 3324                    1-Open
## 3325                    1-Open
## 3326                    1-Open
## 3327                    1-Open
## 3328                    1-Open
## 3329                    1-Open
## 3330                    1-Open
## 3331                    1-Open
## 3332                6-Inactive
## 3333                    1-Open
## 3334                6-Inactive
## 3335                    1-Open
## 3336                6-Inactive
## 3337                    1-Open
## 3338                    1-Open
## 3339                    1-Open
## 3340                    1-Open
## 3341                    1-Open
## 3342                    1-Open
## 3343                    1-Open
## 3344                    1-Open
## 3345                     3-New
## 3346                    1-Open
## 3347                    1-Open
## 3348                    1-Open
## 3349                    1-Open
## 3350                    1-Open
## 3351                    1-Open
## 3352                    1-Open
## 3353                    1-Open
## 3354                    1-Open
## 3355                    1-Open
## 3356                    1-Open
## 3357                    1-Open
## 3358                    1-Open
## 3359                    1-Open
## 3360                    1-Open
## 3361                    1-Open
## 3362                    1-Open
## 3363                    1-Open
## 3364                    1-Open
## 3365                    1-Open
## 3366                6-Inactive
## 3367                    1-Open
## 3368                6-Inactive
## 3369                    1-Open
## 3370                8-Reopened
## 3371                    1-Open
## 3372                    1-Open
## 3373                    1-Open
## 3374                    1-Open
## 3375                    1-Open
## 3376                    1-Open
## 3377                    1-Open
## 3378                    1-Open
## 3379                    1-Open
## 3380                    1-Open
## 3381                    1-Open
## 3382                    1-Open
## 3383                    1-Open
## 3384                    1-Open
## 3385                    1-Open
## 3386                    1-Open
## 3387                    1-Open
## 3388                    1-Open
## 3389                    1-Open
## 3390                    1-Open
## 3391                    1-Open
## 3392                    1-Open
## 3393                    1-Open
## 3394                    1-Open
## 3395                    1-Open
## 3396                    1-Open
## 3397                    1-Open
## 3398                    1-Open
## 3399                    1-Open
## 3400                    1-Open
## 3401                    1-Open
## 3402                    1-Open
## 3403                    1-Open
## 3404                    1-Open
## 3405                    1-Open
## 3406                6-Inactive
## 3407                    1-Open
## 3408                    1-Open
## 3409                    1-Open
## 3410                    1-Open
## 3411                    1-Open
## 3412                    1-Open
## 3413                    1-Open
## 3414                6-Inactive
## 3415                    1-Open
## 3416                  7-Future
## 3417                    1-Open
## 3418                    1-Open
## 3419                    1-Open
## 3420                    1-Open
## 3421                    1-Open
## 3422                    1-Open
## 3423                    1-Open
## 3424                    1-Open
## 3425                    1-Open
## 3426                     3-New
## 3427                    1-Open
## 3428                    1-Open
## 3429                    1-Open
## 3430                    1-Open
## 3431                    1-Open
## 3432                    1-Open
## 3433                    1-Open
## 3434                    1-Open
## 3435                    1-Open
## 3436                    1-Open
## 3437                    1-Open
## 3438                    1-Open
## 3439                    1-Open
## 3440                6-Inactive
## 3441                    1-Open
## 3442                    1-Open
## 3443                    1-Open
## 3444                    1-Open
## 3445                    1-Open
## 3446                    1-Open
## 3447                    1-Open
## 3448                    1-Open
## 3449                    1-Open
## 3450                    1-Open
## 3451                    1-Open
## 3452                    1-Open
## 3453                    1-Open
## 3454                    1-Open
## 3455                    1-Open
## 3456                    1-Open
## 3457                    1-Open
## 3458                    1-Open
## 3459                    1-Open
## 3460                    1-Open
## 3461                    1-Open
## 3462                    1-Open
## 3463                    1-Open
## 3464                    1-Open
## 3465                    1-Open
## 3466                     3-New
## 3467                     3-New
## 3468                    1-Open
## 3469                    1-Open
## 3470                     3-New
## 3471                    1-Open
## 3472                    1-Open
## 3473                    1-Open
## 3474                    1-Open
## 3475                    1-Open
## 3476                    1-Open
## 3477                    1-Open
## 3478                    1-Open
## 3479                    1-Open
## 3480                    1-Open
## 3481                    1-Open
## 3482                    1-Open
## 3483                    1-Open
## 3484                    1-Open
## 3485                    1-Open
## 3486                    1-Open
## 3487                    1-Open
## 3488                    1-Open
## 3489                    1-Open
## 3490                    1-Open
## 3491                    1-Open
## 3492                     3-New
## 3493                    1-Open
## 3494                    1-Open
## 3495                    1-Open
## 3496                    1-Open
## 3497                    1-Open
## 3498                    1-Open
## 3499                    1-Open
## 3500                    1-Open
## 3501                    1-Open
## 3502                    1-Open
## 3503                6-Inactive
## 3504                6-Inactive
## 3505                    1-Open
## 3506                    1-Open
## 3507                    1-Open
## 3508                6-Inactive
## 3509                6-Inactive
## 3510                    1-Open
## 3511                    1-Open
## 3512                    1-Open
## 3513                    1-Open
## 3514                    1-Open
## 3515                    1-Open
## 3516                    1-Open
## 3517                    1-Open
## 3518                    1-Open
## 3519                    1-Open
## 3520                    1-Open
## 3521                    1-Open
## 3522                    1-Open
## 3523                    1-Open
## 3524                    1-Open
## 3525                    1-Open
## 3526                    1-Open
## 3527                    1-Open
## 3528                    1-Open
## 3529                    1-Open
## 3530                    1-Open
## 3531                    1-Open
## 3532                    1-Open
## 3533                    1-Open
## 3534                    1-Open
## 3535                    1-Open
## 3536                    1-Open
## 3537                    1-Open
## 3538                    1-Open
## 3539                    1-Open
## 3540                    1-Open
## 3541                    1-Open
## 3542                    1-Open
## 3543                    1-Open
## 3544                    1-Open
## 3545                    1-Open
## 3546                    1-Open
## 3547                    1-Open
## 3548                    1-Open
## 3549                    1-Open
## 3550                   4-Added
## 3551                    1-Open
## 3552                    1-Open
## 3553                    1-Open
## 3554                    1-Open
## 3555                    1-Open
## 3556                6-Inactive
## 3557                    1-Open
## 3558                    1-Open
## 3559                    1-Open
## 3560                    1-Open
## 3561                    1-Open
## 3562                    1-Open
## 3563                    1-Open
## 3564                    1-Open
## 3565                    1-Open
## 3566                    1-Open
## 3567                    1-Open
## 3568                    1-Open
## 3569                     3-New
## 3570                    1-Open
## 3571                    1-Open
## 3572                    1-Open
## 3573                    1-Open
## 3574                    1-Open
## 3575                    1-Open
## 3576                    1-Open
## 3577                    1-Open
## 3578                    1-Open
## 3579                    1-Open
## 3580                    1-Open
## 3581                    1-Open
## 3582                    1-Open
## 3583                    1-Open
## 3584                    1-Open
## 3585                    1-Open
## 3586                     3-New
## 3587                    1-Open
## 3588                    1-Open
## 3589                    1-Open
## 3590                    1-Open
## 3591                    1-Open
## 3592                    1-Open
## 3593                    1-Open
## 3594                    1-Open
## 3595                    1-Open
## 3596                    1-Open
## 3597                     3-New
## 3598                    1-Open
## 3599                    1-Open
## 3600                    1-Open
## 3601                    1-Open
## 3602                    1-Open
## 3603                    1-Open
## 3604                     3-New
## 3605                    1-Open
## 3606                    1-Open
## 3607                    1-Open
## 3608                    1-Open
## 3609                    1-Open
## 3610                    1-Open
## 3611                    1-Open
## 3612                    1-Open
## 3613                    1-Open
## 3614                    1-Open
## 3615                    1-Open
## 3616                    1-Open
## 3617                    1-Open
## 3618                    1-Open
## 3619                    1-Open
## 3620                    1-Open
## 3621                    1-Open
## 3622                    1-Open
## 3623                    1-Open
## 3624                    1-Open
## 3625                    1-Open
## 3626                    1-Open
## 3627                    1-Open
## 3628                    1-Open
## 3629                    1-Open
## 3630                    1-Open
## 3631                    1-Open
## 3632                    1-Open
## 3633                    1-Open
## 3634                    1-Open
## 3635                    1-Open
## 3636                    1-Open
## 3637                    1-Open
## 3638                    1-Open
## 3639                    1-Open
## 3640                    1-Open
## 3641                    1-Open
## 3642                    1-Open
## 3643                    1-Open
## 3644                    1-Open
## 3645                    1-Open
## 3646                    1-Open
## 3647                    1-Open
## 3648                    1-Open
## 3649                    1-Open
## 3650                    1-Open
## 3651                    1-Open
## 3652                    1-Open
## 3653                    1-Open
## 3654                    1-Open
## 3655                    1-Open
## 3656                    1-Open
## 3657                    1-Open
## 3658                    1-Open
## 3659                    1-Open
## 3660                    1-Open
## 3661                    1-Open
## 3662                    1-Open
## 3663                    1-Open
## 3664                    1-Open
## 3665                    1-Open
## 3666                    1-Open
## 3667                    1-Open
## 3668                    1-Open
## 3669                6-Inactive
## 3670                6-Inactive
## 3671                    1-Open
## 3672                    1-Open
## 3673                    1-Open
## 3674                6-Inactive
## 3675                    1-Open
## 3676                    1-Open
## 3677                    1-Open
## 3678                    1-Open
## 3679                    1-Open
## 3680                    1-Open
## 3681                    1-Open
## 3682                    1-Open
## 3683                    1-Open
## 3684                    1-Open
## 3685                    1-Open
## 3686                     3-New
## 3687                    1-Open
## 3688                    1-Open
## 3689                    1-Open
## 3690                    1-Open
## 3691                    1-Open
## 3692                    1-Open
## 3693                    1-Open
## 3694                    1-Open
## 3695                    1-Open
## 3696                    1-Open
## 3697                    1-Open
## 3698                    1-Open
## 3699                    1-Open
## 3700                    1-Open
## 3701                    1-Open
## 3702                    1-Open
## 3703                    1-Open
## 3704                    1-Open
## 3705                    1-Open
## 3706                    1-Open
## 3707                    1-Open
## 3708                    1-Open
## 3709                    1-Open
## 3710                    1-Open
## 3711                    1-Open
## 3712                    1-Open
## 3713                    1-Open
## 3714                    1-Open
## 3715                    1-Open
## 3716                    1-Open
## 3717                    1-Open
## 3718                    1-Open
## 3719                    1-Open
## 3720                    1-Open
## 3721                    1-Open
## 3722                    1-Open
## 3723                    1-Open
## 3724                    1-Open
## 3725                    1-Open
## 3726                    1-Open
## 3727                    1-Open
## 3728                    1-Open
## 3729                     3-New
## 3730                    1-Open
## 3731                    1-Open
## 3732                    1-Open
## 3733                    1-Open
## 3734                    1-Open
## 3735                    1-Open
## 3736                    1-Open
## 3737                    1-Open
## 3738                    1-Open
## 3739                    1-Open
## 3740                    1-Open
## 3741                    1-Open
## 3742                    1-Open
## 3743                    1-Open
## 3744                    1-Open
## 3745                    1-Open
## 3746                    1-Open
## 3747                     3-New
## 3748                    1-Open
## 3749                    1-Open
## 3750                    1-Open
## 3751                    1-Open
## 3752                    1-Open
## 3753                    1-Open
## 3754                    1-Open
## 3755                    1-Open
## 3756                    1-Open
## 3757                    1-Open
## 3758                    1-Open
## 3759                    1-Open
## 3760                    1-Open
## 3761                    1-Open
## 3762                    1-Open
## 3763                    1-Open
## 3764                    1-Open
## 3765                    1-Open
## 3766                    1-Open
## 3767                    1-Open
## 3768                    1-Open
## 3769                    1-Open
## 3770                    1-Open
## 3771                    1-Open
## 3772                    1-Open
## 3773                    1-Open
## 3774                    1-Open
## 3775                    1-Open
## 3776                    1-Open
## 3777                    1-Open
## 3778                    1-Open
## 3779                    1-Open
## 3780                    1-Open
## 3781                    1-Open
## 3782                    1-Open
## 3783                    1-Open
## 3784                    1-Open
## 3785                    1-Open
## 3786                    1-Open
## 3787                    1-Open
## 3788                     3-New
## 3789                6-Inactive
## 3790                    1-Open
## 3791                    1-Open
## 3792                    1-Open
## 3793                    1-Open
## 3794                    1-Open
## 3795                    1-Open
## 3796                    1-Open
## 3797                    1-Open
## 3798                    1-Open
## 3799                    1-Open
## 3800                    1-Open
## 3801                8-Reopened
## 3802                    1-Open
## 3803                    1-Open
## 3804                    1-Open
## 3805                    1-Open
## 3806                    1-Open
## 3807                    1-Open
## 3808                    1-Open
## 3809                    1-Open
## 3810                    1-Open
## 3811                    1-Open
## 3812                    1-Open
## 3813                    1-Open
## 3814                    1-Open
## 3815                    1-Open
## 3816                6-Inactive
## 3817                    1-Open
## 3818                    1-Open
## 3819                    1-Open
## 3820                    1-Open
## 3821                    1-Open
## 3822                    1-Open
## 3823                    1-Open
## 3824                    1-Open
## 3825                    1-Open
## 3826                    1-Open
## 3827                    1-Open
## 3828                    1-Open
## 3829                    1-Open
## 3830                    1-Open
## 3831                    1-Open
## 3832                    1-Open
## 3833                     3-New
## 3834                    1-Open
## 3835                    1-Open
## 3836                    1-Open
## 3837                    1-Open
## 3838                    1-Open
## 3839                    1-Open
## 3840                    1-Open
## 3841                    1-Open
## 3842                    1-Open
## 3843                6-Inactive
## 3844                    1-Open
## 3845                    1-Open
## 3846                    1-Open
## 3847                    1-Open
## 3848                    1-Open
## 3849                    1-Open
## 3850                    1-Open
## 3851                    1-Open
## 3852                    1-Open
## 3853                    1-Open
## 3854                    1-Open
## 3855                    1-Open
## 3856                    1-Open
## 3857                     3-New
## 3858                    1-Open
## 3859                    1-Open
## 3860                    1-Open
## 3861                    1-Open
## 3862                    1-Open
## 3863                    1-Open
## 3864                    1-Open
## 3865                    1-Open
## 3866                    1-Open
## 3867                    1-Open
## 3868                    1-Open
## 3869                    1-Open
## 3870                    1-Open
## 3871                    1-Open
## 3872                    1-Open
## 3873                    1-Open
## 3874                    1-Open
## 3875                    1-Open
## 3876                    1-Open
## 3877                    1-Open
## 3878                    1-Open
## 3879                    1-Open
## 3880                    1-Open
## 3881                    1-Open
## 3882                    1-Open
## 3883                    1-Open
## 3884                    1-Open
## 3885                    1-Open
## 3886                    1-Open
## 3887                    1-Open
## 3888                    1-Open
## 3889                    1-Open
## 3890                    1-Open
## 3891                    1-Open
## 3892                    1-Open
## 3893                    1-Open
## 3894                    1-Open
## 3895                    1-Open
## 3896                    1-Open
## 3897                    1-Open
## 3898                    1-Open
## 3899                    1-Open
## 3900                    1-Open
## 3901                    1-Open
## 3902                6-Inactive
## 3903                    1-Open
## 3904                    1-Open
## 3905                    1-Open
## 3906                    1-Open
## 3907                    1-Open
## 3908                    1-Open
## 3909                    1-Open
## 3910                    1-Open
## 3911                    1-Open
## 3912                    1-Open
## 3913                    1-Open
## 3914                    1-Open
## 3915                    1-Open
## 3916                    1-Open
## 3917                    1-Open
## 3918                    1-Open
## 3919                    1-Open
## 3920                    1-Open
## 3921                    1-Open
## 3922                    1-Open
## 3923                    1-Open
## 3924                    1-Open
## 3925                    1-Open
## 3926                    1-Open
## 3927                    1-Open
## 3928                    1-Open
## 3929                    1-Open
## 3930                    1-Open
## 3931                    1-Open
## 3932                    1-Open
## 3933                    1-Open
## 3934                    1-Open
## 3935                    1-Open
## 3936                    1-Open
## 3937                    1-Open
## 3938                    1-Open
## 3939                    1-Open
## 3940                    1-Open
## 3941                    1-Open
## 3942                    1-Open
## 3943                    1-Open
## 3944                    1-Open
## 3945                6-Inactive
## 3946                    1-Open
## 3947                    1-Open
## 3948                    1-Open
## 3949                   4-Added
## 3950                    1-Open
## 3951                    1-Open
## 3952                    1-Open
## 3953                    1-Open
## 3954                    1-Open
## 3955                    1-Open
## 3956                    1-Open
## 3957                    1-Open
## 3958                    1-Open
## 3959                    1-Open
## 3960                    1-Open
## 3961                    1-Open
## 3962                    1-Open
## 3963                    1-Open
## 3964                    1-Open
## 3965                    1-Open
## 3966                    1-Open
## 3967                    1-Open
## 3968                    1-Open
## 3969                    1-Open
## 3970                    1-Open
## 3971                    1-Open
## 3972                    1-Open
## 3973                    1-Open
## 3974                    1-Open
## 3975                    1-Open
## 3976                    1-Open
## 3977                    1-Open
## 3978                    1-Open
## 3979                    1-Open
## 3980                    1-Open
## 3981                    1-Open
## 3982                    1-Open
## 3983                    1-Open
## 3984                    1-Open
## 3985                    1-Open
## 3986                    1-Open
## 3987                    1-Open
## 3988                    1-Open
## 3989                    1-Open
## 3990                    1-Open
## 3991                    1-Open
## 3992                     3-New
## 3993                    1-Open
## 3994                    1-Open
## 3995                    1-Open
## 3996                    1-Open
## 3997                    1-Open
## 3998                    1-Open
## 3999                    1-Open
## 4000                    1-Open
## 4001                    1-Open
## 4002                    1-Open
## 4003                    1-Open
## 4004                    1-Open
## 4005                    1-Open
## 4006                    1-Open
## 4007                    1-Open
## 4008                    1-Open
## 4009                    1-Open
## 4010                    1-Open
## 4011                    1-Open
## 4012                    1-Open
## 4013                    1-Open
## 4014                    1-Open
## 4015                    1-Open
## 4016                    1-Open
## 4017                    1-Open
## 4018                    1-Open
## 4019                    1-Open
## 4020                    1-Open
## 4021                    1-Open
## 4022                    1-Open
## 4023                    1-Open
## 4024                    1-Open
## 4025                    1-Open
## 4026                    1-Open
## 4027                    1-Open
## 4028                    1-Open
## 4029                    1-Open
## 4030                    1-Open
## 4031                    1-Open
## 4032                    1-Open
## 4033                    1-Open
## 4034                    1-Open
## 4035                    1-Open
## 4036                    1-Open
## 4037                    1-Open
## 4038                    1-Open
## 4039                    1-Open
## 4040                    1-Open
## 4041                    1-Open
## 4042                    1-Open
## 4043                    1-Open
## 4044                    1-Open
## 4045                    1-Open
## 4046                    1-Open
## 4047                    1-Open
## 4048                    1-Open
## 4049                    1-Open
## 4050                    1-Open
## 4051                    1-Open
## 4052                    1-Open
## 4053                    1-Open
## 4054                    1-Open
## 4055                    1-Open
## 4056                    1-Open
## 4057                    1-Open
## 4058                    1-Open
## 4059                    1-Open
## 4060                     3-New
## 4061                    1-Open
## 4062                    1-Open
## 4063                    1-Open
## 4064                    1-Open
## 4065                    1-Open
## 4066                    1-Open
## 4067                    1-Open
## 4068                    1-Open
## 4069                    1-Open
## 4070                    1-Open
## 4071                    1-Open
## 4072                    1-Open
## 4073                    1-Open
## 4074                    1-Open
## 4075                    1-Open
## 4076                    1-Open
## 4077                    1-Open
## 4078                    1-Open
## 4079                    1-Open
## 4080                    1-Open
## 4081                    1-Open
## 4082                    1-Open
## 4083                    1-Open
## 4084                     3-New
## 4085                    1-Open
## 4086                    1-Open
## 4087                    1-Open
## 4088                    1-Open
## 4089                    1-Open
## 4090                    1-Open
## 4091                    1-Open
## 4092                    1-Open
## 4093                    1-Open
## 4094                    1-Open
## 4095                    1-Open
## 4096                    1-Open
## 4097                    1-Open
## 4098                    1-Open
## 4099                    1-Open
## 4100                    1-Open
## 4101                    1-Open
## 4102                    1-Open
## 4103                    1-Open
## 4104                    1-Open
## 4105                    1-Open
## 4106                    1-Open
## 4107                    1-Open
## 4108                    1-Open
## 4109                    1-Open
## 4110                    1-Open
## 4111                    1-Open
## 4112                    1-Open
## 4113                    1-Open
## 4114                    1-Open
## 4115                    1-Open
## 4116                6-Inactive
## 4117                6-Inactive
## 4118                    1-Open
## 4119                    1-Open
## 4120                    1-Open
## 4121                    1-Open
## 4122                    1-Open
## 4123                    1-Open
## 4124                    1-Open
## 4125                    1-Open
## 4126                    1-Open
## 4127                    1-Open
## 4128                  7-Future
## 4129                    1-Open
## 4130                    1-Open
## 4131                    1-Open
## 4132                    1-Open
## 4133                    1-Open
## 4134                    1-Open
## 4135                    1-Open
## 4136                    1-Open
## 4137                    1-Open
## 4138                6-Inactive
## 4139                    1-Open
## 4140                    1-Open
## 4141                    1-Open
## 4142                    1-Open
## 4143                    1-Open
## 4144                    1-Open
## 4145                    1-Open
## 4146                    1-Open
## 4147                    1-Open
## 4148                    1-Open
## 4149                    1-Open
## 4150                    1-Open
## 4151                    1-Open
## 4152                    1-Open
## 4153                    1-Open
## 4154                    1-Open
## 4155                    1-Open
## 4156                    1-Open
## 4157                    1-Open
## 4158                    1-Open
## 4159                    1-Open
## 4160                    1-Open
## 4161                    1-Open
## 4162                    1-Open
## 4163                    1-Open
## 4164                    1-Open
## 4165                    1-Open
## 4166                    1-Open
## 4167                    1-Open
## 4168                    1-Open
## 4169                    1-Open
## 4170                    1-Open
## 4171                6-Inactive
## 4172                    1-Open
## 4173                    1-Open
## 4174                    1-Open
## 4175                    1-Open
## 4176                     3-New
## 4177                    1-Open
## 4178                    1-Open
## 4179                    1-Open
## 4180                    1-Open
## 4181                    1-Open
## 4182                    1-Open
## 4183                    1-Open
## 4184                    1-Open
## 4185                    1-Open
## 4186                    1-Open
## 4187                    1-Open
## 4188                    1-Open
## 4189                    1-Open
## 4190                    1-Open
## 4191                    1-Open
## 4192                    1-Open
## 4193                    1-Open
## 4194                    1-Open
## 4195                    1-Open
## 4196                    1-Open
## 4197                    1-Open
## 4198                6-Inactive
## 4199                    1-Open
## 4200                    1-Open
## 4201                    1-Open
## 4202                    1-Open
## 4203                     3-New
## 4204                    1-Open
## 4205                    1-Open
## 4206                    1-Open
## 4207                    1-Open
## 4208                    1-Open
## 4209                    1-Open
## 4210                    1-Open
## 4211                    1-Open
## 4212                    1-Open
## 4213                    1-Open
## 4214                    1-Open
## 4215                    1-Open
## 4216                    1-Open
## 4217                    1-Open
## 4218                    1-Open
## 4219                    1-Open
## 4220                    1-Open
## 4221                    1-Open
## 4222                    1-Open
## 4223                    1-Open
## 4224                    1-Open
## 4225                    1-Open
## 4226                    1-Open
## 4227                    1-Open
## 4228                    1-Open
## 4229                    1-Open
## 4230                    1-Open
## 4231                    1-Open
## 4232                    1-Open
## 4233                    1-Open
## 4234                    1-Open
## 4235                    1-Open
## 4236                    1-Open
## 4237                    1-Open
## 4238                    1-Open
## 4239                    1-Open
## 4240                    1-Open
## 4241                    1-Open
## 4242                    1-Open
## 4243                    1-Open
## 4244                    1-Open
## 4245                6-Inactive
## 4246                    1-Open
## 4247                    1-Open
## 4248                    1-Open
## 4249                    1-Open
## 4250                    1-Open
## 4251                    1-Open
## 4252                    1-Open
## 4253                    1-Open
## 4254                    1-Open
## 4255                    1-Open
## 4256                    1-Open
## 4257                    1-Open
## 4258                    1-Open
## 4259                  7-Future
## 4260                    1-Open
## 4261                    1-Open
## 4262                    1-Open
## 4263                    1-Open
## 4264                    1-Open
## 4265                    1-Open
## 4266                    1-Open
## 4267                    1-Open
## 4268                    1-Open
## 4269                    1-Open
## 4270                    1-Open
## 4271                6-Inactive
## 4272                6-Inactive
## 4273                    1-Open
## 4274                    1-Open
## 4275                    1-Open
## 4276                     3-New
## 4277                    1-Open
## 4278                    1-Open
## 4279                    1-Open
## 4280                    1-Open
## 4281                    1-Open
## 4282                    1-Open
## 4283                    1-Open
## 4284                    1-Open
## 4285                    1-Open
## 4286                    1-Open
## 4287                    1-Open
## 4288                    1-Open
## 4289                    1-Open
## 4290                    1-Open
## 4291                    1-Open
## 4292                    1-Open
## 4293                    1-Open
## 4294                    1-Open
## 4295                    1-Open
## 4296                    1-Open
## 4297                    1-Open
## 4298                    1-Open
## 4299                    1-Open
## 4300                    1-Open
## 4301                    1-Open
## 4302                    1-Open
## 4303                    1-Open
## 4304                    1-Open
## 4305                    1-Open
## 4306                    1-Open
## 4307                    1-Open
## 4308                    1-Open
## 4309                    1-Open
## 4310                    1-Open
## 4311                    1-Open
## 4312                    1-Open
## 4313                    1-Open
## 4314                    1-Open
## 4315                    1-Open
## 4316                    1-Open
## 4317                    1-Open
## 4318                    1-Open
## 4319                    1-Open
## 4320                    1-Open
## 4321                    1-Open
## 4322                    1-Open
## 4323                    1-Open
## 4324                    1-Open
## 4325                    1-Open
## 4326                     3-New
## 4327                    1-Open
## 4328                    1-Open
## 4329                    1-Open
## 4330                    1-Open
## 4331                    1-Open
## 4332                    1-Open
## 4333                    1-Open
## 4334                    1-Open
## 4335                     3-New
## 4336                    1-Open
## 4337                    1-Open
## 4338                    1-Open
## 4339                    1-Open
## 4340                6-Inactive
## 4341                    1-Open
## 4342                    1-Open
## 4343                    1-Open
## 4344                    1-Open
## 4345                    1-Open
## 4346                    1-Open
## 4347                    1-Open
## 4348                    1-Open
## 4349                    1-Open
## 4350                    1-Open
## 4351                    1-Open
## 4352                    1-Open
## 4353                    1-Open
## 4354                    1-Open
## 4355                    1-Open
## 4356                    1-Open
## 4357                    1-Open
## 4358                    1-Open
## 4359                    1-Open
## 4360                    1-Open
## 4361                    1-Open
## 4362                    1-Open
## 4363                    1-Open
## 4364                    1-Open
## 4365                    1-Open
## 4366                    1-Open
## 4367                    1-Open
## 4368                    1-Open
## 4369                    1-Open
## 4370                    1-Open
## 4371                    1-Open
## 4372                    1-Open
## 4373                    1-Open
## 4374                    1-Open
## 4375                     3-New
## 4376                    1-Open
## 4377                    1-Open
## 4378                    1-Open
## 4379                    1-Open
## 4380                    1-Open
## 4381                    1-Open
## 4382                    1-Open
## 4383                    1-Open
## 4384                    1-Open
## 4385                    1-Open
## 4386                    1-Open
## 4387                    1-Open
## 4388                    1-Open
## 4389                    1-Open
## 4390                    1-Open
## 4391                    1-Open
## 4392                    1-Open
## 4393                    1-Open
## 4394                    1-Open
## 4395                    1-Open
## 4396                    1-Open
## 4397                    1-Open
## 4398                    1-Open
## 4399                    1-Open
## 4400                    1-Open
## 4401                    1-Open
## 4402                    1-Open
## 4403                    1-Open
## 4404                    1-Open
## 4405                    1-Open
## 4406                    1-Open
## 4407                    1-Open
## 4408                    1-Open
## 4409                    1-Open
## 4410                    1-Open
## 4411                6-Inactive
## 4412                    1-Open
## 4413                    1-Open
## 4414                    1-Open
## 4415                    1-Open
## 4416                    1-Open
## 4417                    1-Open
## 4418                    1-Open
## 4419                    1-Open
## 4420                    1-Open
## 4421                    1-Open
## 4422                    1-Open
## 4423                    1-Open
## 4424                    1-Open
## 4425                    1-Open
## 4426                    1-Open
## 4427                    1-Open
## 4428                    1-Open
## 4429                    1-Open
## 4430                    1-Open
## 4431                    1-Open
## 4432                    1-Open
## 4433                    1-Open
## 4434                    1-Open
## 4435                    1-Open
## 4436                    1-Open
## 4437                    1-Open
## 4438                    1-Open
## 4439                    1-Open
## 4440                6-Inactive
## 4441                    1-Open
## 4442                    1-Open
## 4443                    1-Open
## 4444                6-Inactive
## 4445                    1-Open
## 4446                    1-Open
## 4447                    1-Open
## 4448                    1-Open
## 4449                    1-Open
## 4450                    1-Open
## 4451                    1-Open
## 4452                    1-Open
## 4453                    1-Open
## 4454                    1-Open
## 4455                    1-Open
## 4456                    1-Open
## 4457                    1-Open
## 4458                    1-Open
## 4459                    1-Open
## 4460                    1-Open
## 4461                6-Inactive
## 4462                    1-Open
## 4463                    1-Open
## 4464                6-Inactive
## 4465                    1-Open
## 4466                    1-Open
## 4467                    1-Open
## 4468                    1-Open
## 4469                    1-Open
## 4470                6-Inactive
## 4471                    1-Open
## 4472                    1-Open
## 4473                     3-New
## 4474                    1-Open
## 4475                    1-Open
## 4476                    1-Open
## 4477                    1-Open
## 4478                    1-Open
## 4479                    1-Open
## 4480                    1-Open
## 4481                    1-Open
## 4482                    1-Open
## 4483                    1-Open
## 4484                    1-Open
## 4485                    1-Open
## 4486                    1-Open
## 4487                    1-Open
## 4488                    1-Open
## 4489                    1-Open
## 4490                    1-Open
## 4491                    1-Open
## 4492                    1-Open
## 4493                    1-Open
## 4494                    1-Open
## 4495                    1-Open
## 4496                    1-Open
## 4497                    1-Open
## 4498                    1-Open
## 4499                    1-Open
## 4500                    1-Open
## 4501                    1-Open
## 4502                    1-Open
## 4503                    1-Open
## 4504                    1-Open
## 4505                    1-Open
## 4506                    1-Open
## 4507                    1-Open
## 4508                    1-Open
## 4509                    1-Open
## 4510                    1-Open
## 4511                    1-Open
## 4512                    1-Open
## 4513                    1-Open
## 4514                    1-Open
## 4515                    1-Open
## 4516                    1-Open
## 4517                6-Inactive
## 4518                    1-Open
## 4519                6-Inactive
## 4520                    1-Open
## 4521                    1-Open
## 4522                    1-Open
## 4523                    1-Open
## 4524                    1-Open
## 4525                    1-Open
## 4526                    1-Open
## 4527                    1-Open
## 4528                    1-Open
## 4529                    1-Open
## 4530                    1-Open
## 4531                    1-Open
## 4532                    1-Open
## 4533                    1-Open
## 4534                    1-Open
## 4535                    1-Open
## 4536                6-Inactive
## 4537                    1-Open
## 4538                    1-Open
## 4539                    1-Open
## 4540                    1-Open
## 4541                    1-Open
## 4542                    1-Open
## 4543                    1-Open
## 4544                    1-Open
## 4545                    1-Open
## 4546                    1-Open
## 4547                    1-Open
## 4548                    1-Open
## 4549                    1-Open
## 4550                    1-Open
## 4551                    1-Open
## 4552                    1-Open
## 4553                    1-Open
## 4554                    1-Open
## 4555                    1-Open
## 4556                    1-Open
## 4557                    1-Open
## 4558                    1-Open
## 4559                    1-Open
## 4560                    1-Open
## 4561                    1-Open
## 4562                    1-Open
## 4563                    1-Open
## 4564                    1-Open
## 4565                    1-Open
## 4566                    1-Open
## 4567                    1-Open
## 4568                    1-Open
## 4569                    1-Open
## 4570                    1-Open
## 4571                    1-Open
## 4572                    1-Open
## 4573                    1-Open
## 4574                    1-Open
## 4575                    1-Open
## 4576                    1-Open
## 4577                    1-Open
## 4578                    1-Open
## 4579                    1-Open
## 4580                    1-Open
## 4581                    1-Open
## 4582                    1-Open
## 4583                8-Reopened
## 4584                6-Inactive
## 4585                     3-New
## 4586                    1-Open
## 4587                    1-Open
## 4588                    1-Open
## 4589                    1-Open
## 4590                    1-Open
## 4591                    1-Open
## 4592                    1-Open
## 4593                    1-Open
## 4594                    1-Open
## 4595                    1-Open
## 4596                6-Inactive
## 4597                6-Inactive
## 4598                    1-Open
## 4599                    1-Open
## 4600                    1-Open
## 4601                    1-Open
## 4602                    1-Open
## 4603                    1-Open
## 4604                    1-Open
## 4605                    1-Open
## 4606                    1-Open
## 4607                    1-Open
## 4608                    1-Open
## 4609                    1-Open
## 4610                    1-Open
## 4611                    1-Open
## 4612                    1-Open
## 4613                    1-Open
## 4614                     3-New
## 4615                    1-Open
## 4616                    1-Open
## 4617                    1-Open
## 4618                    1-Open
## 4619                    1-Open
## 4620                    1-Open
## 4621                    1-Open
## 4622                    1-Open
## 4623                    1-Open
## 4624                    1-Open
## 4625                    1-Open
## 4626                    1-Open
## 4627                    1-Open
## 4628                    1-Open
## 4629                    1-Open
## 4630                    1-Open
## 4631                    1-Open
## 4632                    1-Open
## 4633                    1-Open
## 4634                    1-Open
## 4635                    1-Open
## 4636                    1-Open
## 4637                    1-Open
## 4638                    1-Open
## 4639                    1-Open
## 4640                    1-Open
## 4641                    1-Open
## 4642                    1-Open
## 4643                    1-Open
## 4644                    1-Open
## 4645                    1-Open
## 4646                    1-Open
## 4647                    1-Open
## 4648                6-Inactive
## 4649                    1-Open
## 4650                    1-Open
## 4651                    1-Open
## 4652                    1-Open
## 4653                    1-Open
## 4654                    1-Open
## 4655                    1-Open
## 4656                    1-Open
## 4657                    1-Open
## 4658                    1-Open
## 4659                    1-Open
## 4660                    1-Open
## 4661                    1-Open
## 4662                    1-Open
## 4663                    1-Open
## 4664                    1-Open
## 4665                    1-Open
## 4666                6-Inactive
## 4667                    1-Open
## 4668                    1-Open
## 4669                    1-Open
## 4670                    1-Open
## 4671                6-Inactive
## 4672                    1-Open
## 4673                    1-Open
## 4674                    1-Open
## 4675                    1-Open
## 4676                    1-Open
## 4677                    1-Open
## 4678                    1-Open
## 4679                    1-Open
## 4680                    1-Open
## 4681                    1-Open
## 4682                    1-Open
## 4683                    1-Open
## 4684                    1-Open
## 4685                    1-Open
## 4686                6-Inactive
## 4687                    1-Open
## 4688                    1-Open
## 4689                    1-Open
## 4690                    1-Open
## 4691                    1-Open
## 4692                    1-Open
## 4693                    1-Open
## 4694                    1-Open
## 4695                    1-Open
## 4696                    1-Open
## 4697                6-Inactive
## 4698                    1-Open
## 4699                    1-Open
## 4700                    1-Open
## 4701                    1-Open
## 4702                    1-Open
## 4703                    1-Open
## 4704                    1-Open
## 4705                    1-Open
## 4706                    1-Open
## 4707                    1-Open
## 4708                    1-Open
## 4709                    1-Open
## 4710                     3-New
## 4711                    1-Open
## 4712                    1-Open
## 4713                    1-Open
## 4714                    1-Open
## 4715                    1-Open
## 4716                    1-Open
## 4717                    1-Open
## 4718                    1-Open
## 4719                    1-Open
## 4720                    1-Open
## 4721                    1-Open
## 4722                    1-Open
## 4723                    1-Open
## 4724                    1-Open
## 4725                    1-Open
## 4726                    1-Open
## 4727                    1-Open
## 4728                    1-Open
## 4729                    1-Open
## 4730                    1-Open
## 4731                    1-Open
## 4732                    1-Open
## 4733                    1-Open
## 4734                    1-Open
## 4735                    1-Open
## 4736                    1-Open
## 4737                    1-Open
## 4738                    1-Open
## 4739                    1-Open
## 4740                    1-Open
## 4741                    1-Open
## 4742                    1-Open
## 4743                    1-Open
## 4744                    1-Open
## 4745                    1-Open
## 4746                    1-Open
## 4747                    1-Open
## 4748                    1-Open
## 4749                    1-Open
## 4750                    1-Open
## 4751                    1-Open
## 4752                6-Inactive
## 4753                    1-Open
## 4754                    1-Open
## 4755                    1-Open
## 4756                    1-Open
## 4757                    1-Open
## 4758                    1-Open
## 4759                     3-New
## 4760                    1-Open
## 4761                    1-Open
## 4762                    1-Open
## 4763                    1-Open
## 4764                    1-Open
## 4765                    1-Open
## 4766                    1-Open
## 4767                    1-Open
## 4768                    1-Open
## 4769                    1-Open
## 4770                    1-Open
## 4771                    1-Open
## 4772                    1-Open
## 4773                    1-Open
## 4774                    1-Open
## 4775                    1-Open
## 4776                    1-Open
## 4777                    1-Open
## 4778                    1-Open
## 4779                    1-Open
## 4780                    1-Open
## 4781                    1-Open
## 4782                    1-Open
## 4783                    1-Open
## 4784                    1-Open
## 4785                     3-New
## 4786                    1-Open
## 4787                    1-Open
## 4788                    1-Open
## 4789                    1-Open
## 4790                    1-Open
## 4791                    1-Open
## 4792                    1-Open
## 4793                    1-Open
## 4794                    1-Open
## 4795                    1-Open
## 4796                    1-Open
## 4797                    1-Open
## 4798                    1-Open
## 4799                    1-Open
## 4800                    1-Open
## 4801                    1-Open
## 4802                    1-Open
## 4803                    1-Open
## 4804                    1-Open
## 4805                    1-Open
## 4806                    1-Open
## 4807                    1-Open
## 4808                    1-Open
## 4809                    1-Open
## 4810                    1-Open
## 4811                    1-Open
## 4812                    1-Open
## 4813                6-Inactive
## 4814                    1-Open
## 4815                    1-Open
## 4816                    1-Open
## 4817                    1-Open
## 4818                    1-Open
## 4819                    1-Open
## 4820                    1-Open
## 4821                    1-Open
## 4822                    1-Open
## 4823                    1-Open
## 4824                    1-Open
## 4825                    1-Open
## 4826                     3-New
## 4827                    1-Open
## 4828                    1-Open
## 4829                    1-Open
## 4830                    1-Open
## 4831                    1-Open
## 4832                    1-Open
## 4833                    1-Open
## 4834                    1-Open
## 4835                    1-Open
## 4836                    1-Open
## 4837                    1-Open
## 4838                    1-Open
## 4839                    1-Open
## 4840                    1-Open
## 4841                    1-Open
## 4842                    1-Open
## 4843                    1-Open
## 4844                    1-Open
## 4845                    1-Open
## 4846                    1-Open
## 4847                    1-Open
## 4848                    1-Open
## 4849                    1-Open
## 4850                    1-Open
## 4851                    1-Open
## 4852                    1-Open
## 4853                    1-Open
## 4854                    1-Open
## 4855                    1-Open
## 4856                    1-Open
## 4857                    1-Open
## 4858                    1-Open
## 4859                6-Inactive
## 4860                6-Inactive
## 4861                6-Inactive
## 4862                    1-Open
## 4863                    1-Open
## 4864                    1-Open
## 4865                6-Inactive
## 4866                    1-Open
## 4867                    1-Open
## 4868                6-Inactive
## 4869                    1-Open
## 4870                    1-Open
## 4871                6-Inactive
## 4872                6-Inactive
## 4873                6-Inactive
## 4874                    1-Open
## 4875                6-Inactive
## 4876                    1-Open
## 4877                    1-Open
## 4878                    1-Open
## 4879                     3-New
## 4880                    1-Open
## 4881                6-Inactive
## 4882                6-Inactive
## 4883                    1-Open
## 4884                    1-Open
## 4885                    1-Open
## 4886                    1-Open
## 4887                    1-Open
## 4888                    1-Open
## 4889                    1-Open
## 4890                    1-Open
## 4891                    1-Open
## 4892                    1-Open
## 4893                    1-Open
## 4894                    1-Open
## 4895                    1-Open
## 4896                    1-Open
## 4897                    1-Open
## 4898                    1-Open
## 4899                    1-Open
## 4900                    1-Open
## 4901                    1-Open
## 4902                    1-Open
## 4903                    1-Open
## 4904                    1-Open
## 4905                    1-Open
## 4906                    1-Open
## 4907                    1-Open
## 4908                    1-Open
## 4909                    1-Open
## 4910                    1-Open
## 4911                    1-Open
## 4912                    1-Open
## 4913                    1-Open
## 4914                    1-Open
## 4915                    1-Open
## 4916                    1-Open
## 4917                    1-Open
## 4918                    1-Open
## 4919                    1-Open
## 4920                    1-Open
## 4921                    1-Open
## 4922                    1-Open
## 4923                    1-Open
## 4924                    1-Open
## 4925                    1-Open
## 4926                    1-Open
## 4927                     3-New
## 4928                    1-Open
## 4929                    1-Open
## 4930                    1-Open
## 4931                    1-Open
## 4932                    1-Open
## 4933                    1-Open
## 4934                    1-Open
## 4935                    1-Open
## 4936                    1-Open
## 4937                    1-Open
## 4938                    1-Open
## 4939                    1-Open
## 4940                    1-Open
## 4941                    1-Open
## 4942                    1-Open
## 4943                    1-Open
## 4944                    1-Open
## 4945                    1-Open
## 4946                    1-Open
## 4947                    1-Open
## 4948                    1-Open
## 4949                    1-Open
## 4950                    1-Open
## 4951                    1-Open
## 4952                    1-Open
## 4953                    1-Open
## 4954                    1-Open
## 4955                    1-Open
## 4956                    1-Open
## 4957                    1-Open
## 4958                    1-Open
## 4959                    1-Open
## 4960                    1-Open
## 4961                    1-Open
## 4962                    1-Open
## 4963                    1-Open
## 4964                    1-Open
## 4965                    1-Open
## 4966                    1-Open
## 4967                    1-Open
## 4968                    1-Open
## 4969                    1-Open
## 4970                    1-Open
## 4971                    1-Open
## 4972                    1-Open
## 4973                    1-Open
## 4974                    1-Open
## 4975                    1-Open
## 4976                    1-Open
## 4977                    1-Open
## 4978                    1-Open
## 4979                    1-Open
## 4980                    1-Open
## 4981                    1-Open
## 4982                    1-Open
## 4983                    1-Open
## 4984                    1-Open
## 4985                    1-Open
## 4986                    1-Open
## 4987                    1-Open
## 4988                    1-Open
## 4989                    1-Open
## 4990                    1-Open
## 4991                    1-Open
## 4992                    1-Open
## 4993                    1-Open
## 4994                    1-Open
## 4995                    1-Open
## 4996                    1-Open
## 4997                    1-Open
## 4998                    1-Open
## 4999                     3-New
## 5000                    1-Open
## 5001                    1-Open
## 5002                    1-Open
## 5003                    1-Open
## 5004                    1-Open
## 5005                6-Inactive
## 5006                    1-Open
## 5007                    1-Open
## 5008                    1-Open
## 5009                    1-Open
## 5010                    1-Open
## 5011                    1-Open
## 5012                    1-Open
## 5013                    1-Open
## 5014                    1-Open
## 5015                    1-Open
## 5016                    1-Open
## 5017                    1-Open
## 5018                    1-Open
## 5019                6-Inactive
## 5020                6-Inactive
## 5021                6-Inactive
## 5022                6-Inactive
## 5023                6-Inactive
## 5024                    1-Open
## 5025                    1-Open
## 5026                    1-Open
## 5027                    1-Open
## 5028                6-Inactive
## 5029                    1-Open
## 5030                    1-Open
## 5031                    1-Open
## 5032                    1-Open
## 5033                    1-Open
## 5034                    1-Open
## 5035                    1-Open
## 5036                    1-Open
## 5037                    1-Open
## 5038                    1-Open
## 5039                    1-Open
## 5040                    1-Open
## 5041                    1-Open
## 5042                    1-Open
## 5043                    1-Open
## 5044                    1-Open
## 5045                    1-Open
## 5046                6-Inactive
## 5047                    1-Open
## 5048                    1-Open
## 5049                    1-Open
## 5050                    1-Open
## 5051                    1-Open
## 5052                    1-Open
## 5053                    1-Open
## 5054                    1-Open
## 5055                    1-Open
## 5056                    1-Open
## 5057                    1-Open
## 5058                    1-Open
## 5059                    1-Open
## 5060                    1-Open
## 5061                    1-Open
## 5062                    1-Open
## 5063                    1-Open
## 5064                    1-Open
## 5065                    1-Open
## 5066                    1-Open
## 5067                    1-Open
## 5068                    1-Open
## 5069                    1-Open
## 5070                    1-Open
## 5071                6-Inactive
## 5072                    1-Open
## 5073                    1-Open
## 5074                    1-Open
## 5075                    1-Open
## 5076                    1-Open
## 5077                    1-Open
## 5078                    1-Open
## 5079                    1-Open
## 5080                    1-Open
## 5081                    1-Open
## 5082                    1-Open
## 5083                    1-Open
## 5084                    1-Open
## 5085                    1-Open
## 5086                    1-Open
## 5087                    1-Open
## 5088                    1-Open
## 5089                    1-Open
## 5090                    1-Open
## 5091                    1-Open
## 5092                    1-Open
## 5093                    1-Open
## 5094                    1-Open
## 5095                    1-Open
## 5096                    1-Open
## 5097                    1-Open
## 5098                    1-Open
## 5099                    1-Open
## 5100                    1-Open
## 5101                    1-Open
## 5102                    1-Open
## 5103                    1-Open
## 5104                    1-Open
## 5105                    1-Open
## 5106                    1-Open
## 5107                    1-Open
## 5108                     3-New
## 5109                    1-Open
## 5110                    1-Open
## 5111                    1-Open
## 5112                    1-Open
## 5113                    1-Open
## 5114                    1-Open
## 5115                    1-Open
## 5116                    1-Open
## 5117                    1-Open
## 5118                    1-Open
## 5119                    1-Open
## 5120                    1-Open
## 5121                    1-Open
## 5122                    1-Open
## 5123                    1-Open
## 5124                    1-Open
## 5125                    1-Open
## 5126                    1-Open
## 5127                    1-Open
## 5128                    1-Open
## 5129                    1-Open
## 5130                    1-Open
## 5131                    1-Open
## 5132                    1-Open
## 5133                    1-Open
## 5134                    1-Open
## 5135                    1-Open
## 5136                    1-Open
## 5137                6-Inactive
## 5138                    1-Open
## 5139                    1-Open
## 5140                    1-Open
## 5141                    1-Open
## 5142                    1-Open
## 5143                    1-Open
## 5144                    1-Open
## 5145                    1-Open
## 5146                    1-Open
## 5147                    1-Open
## 5148                    1-Open
## 5149                    1-Open
## 5150                6-Inactive
## 5151                    1-Open
## 5152                    1-Open
## 5153                6-Inactive
## 5154                    1-Open
## 5155                    1-Open
## 5156                    1-Open
## 5157                    1-Open
## 5158                    1-Open
## 5159                    1-Open
## 5160                    1-Open
## 5161                    1-Open
## 5162                    1-Open
## 5163                    1-Open
## 5164                    1-Open
## 5165                    1-Open
## 5166                    1-Open
## 5167                6-Inactive
## 5168                6-Inactive
## 5169                6-Inactive
## 5170                    1-Open
## 5171                6-Inactive
## 5172                    1-Open
## 5173                    1-Open
## 5174                    1-Open
## 5175                    1-Open
## 5176                    1-Open
## 5177                    1-Open
## 5178                  7-Future
## 5179                    1-Open
## 5180                6-Inactive
## 5181                    1-Open
## 5182                    1-Open
## 5183                    1-Open
## 5184                    1-Open
## 5185                    1-Open
## 5186                    1-Open
## 5187                    1-Open
## 5188                    1-Open
## 5189                     3-New
## 5190                    1-Open
## 5191                    1-Open
## 5192                    1-Open
## 5193                    1-Open
## 5194                    1-Open
## 5195                    1-Open
## 5196                    1-Open
## 5197                    1-Open
## 5198                    1-Open
## 5199                    1-Open
## 5200                    1-Open
## 5201                    1-Open
## 5202                    1-Open
## 5203                    1-Open
## 5204                    1-Open
## 5205                    1-Open
## 5206                    1-Open
## 5207                    1-Open
## 5208                    1-Open
## 5209                    1-Open
## 5210                    1-Open
## 5211                    1-Open
## 5212                    1-Open
## 5213                    1-Open
## 5214                    1-Open
## 5215                    1-Open
## 5216                    1-Open
## 5217                    1-Open
## 5218                    1-Open
## 5219                    1-Open
## 5220                    1-Open
## 5221                    1-Open
## 5222                    1-Open
## 5223                    1-Open
## 5224                    1-Open
## 5225                    1-Open
## 5226                    1-Open
## 5227                    1-Open
## 5228                    1-Open
## 5229                  7-Future
## 5230                    1-Open
## 5231                    1-Open
## 5232                    1-Open
## 5233                    1-Open
## 5234                    1-Open
## 5235                    1-Open
## 5236                     3-New
## 5237                    1-Open
## 5238                    1-Open
## 5239                    1-Open
## 5240                    1-Open
## 5241                    1-Open
## 5242                6-Inactive
## 5243                    1-Open
## 5244                    1-Open
## 5245                6-Inactive
## 5246                6-Inactive
## 5247                    1-Open
## 5248                    1-Open
## 5249                    1-Open
## 5250                    1-Open
## 5251                6-Inactive
## 5252                6-Inactive
## 5253                    1-Open
## 5254                    1-Open
## 5255                    1-Open
## 5256                6-Inactive
## 5257                    1-Open
## 5258                    1-Open
## 5259                    1-Open
## 5260                    1-Open
## 5261                    1-Open
## 5262                    1-Open
## 5263                    1-Open
##                                                                         Agency.Type
## 1    1-Regular local school district that is NOT a component of a supervisory union
## 2    1-Regular local school district that is NOT a component of a supervisory union
## 3    1-Regular local school district that is NOT a component of a supervisory union
## 4    1-Regular local school district that is NOT a component of a supervisory union
## 5                                        4-Regional Education Service Agency (RESA)
## 6                                        4-Regional Education Service Agency (RESA)
## 7                                        4-Regional Education Service Agency (RESA)
## 8                                        4-Regional Education Service Agency (RESA)
## 9                                        4-Regional Education Service Agency (RESA)
## 10                                       4-Regional Education Service Agency (RESA)
## 11                                       4-Regional Education Service Agency (RESA)
## 12                                       4-Regional Education Service Agency (RESA)
## 13                                       4-Regional Education Service Agency (RESA)
## 14                                       4-Regional Education Service Agency (RESA)
## 15                                       4-Regional Education Service Agency (RESA)
## 16                                       4-Regional Education Service Agency (RESA)
## 17                                       4-Regional Education Service Agency (RESA)
## 18                                       4-Regional Education Service Agency (RESA)
## 19   1-Regular local school district that is NOT a component of a supervisory union
## 20   1-Regular local school district that is NOT a component of a supervisory union
## 21                                       4-Regional Education Service Agency (RESA)
## 22                                       4-Regional Education Service Agency (RESA)
## 23                                       4-Regional Education Service Agency (RESA)
## 24   1-Regular local school district that is NOT a component of a supervisory union
## 25   1-Regular local school district that is NOT a component of a supervisory union
## 26   1-Regular local school district that is NOT a component of a supervisory union
## 27   1-Regular local school district that is NOT a component of a supervisory union
## 28   1-Regular local school district that is NOT a component of a supervisory union
## 29                                       4-Regional Education Service Agency (RESA)
## 30   1-Regular local school district that is NOT a component of a supervisory union
## 31   1-Regular local school district that is NOT a component of a supervisory union
## 32           5-State agency providing elementary and/or secondary level instruction
## 33   1-Regular local school district that is NOT a component of a supervisory union
## 34   1-Regular local school district that is NOT a component of a supervisory union
## 35   1-Regular local school district that is NOT a component of a supervisory union
## 36   1-Regular local school district that is NOT a component of a supervisory union
## 37   1-Regular local school district that is NOT a component of a supervisory union
## 38   1-Regular local school district that is NOT a component of a supervisory union
## 39   1-Regular local school district that is NOT a component of a supervisory union
## 40   1-Regular local school district that is NOT a component of a supervisory union
## 41   1-Regular local school district that is NOT a component of a supervisory union
## 42                                                   7-Independent Charter District
## 43   1-Regular local school district that is NOT a component of a supervisory union
## 44   1-Regular local school district that is NOT a component of a supervisory union
## 45                                       4-Regional Education Service Agency (RESA)
## 46   1-Regular local school district that is NOT a component of a supervisory union
## 47   1-Regular local school district that is NOT a component of a supervisory union
## 48   1-Regular local school district that is NOT a component of a supervisory union
## 49   1-Regular local school district that is NOT a component of a supervisory union
## 50   1-Regular local school district that is NOT a component of a supervisory union
## 51   1-Regular local school district that is NOT a component of a supervisory union
## 52   1-Regular local school district that is NOT a component of a supervisory union
## 53   1-Regular local school district that is NOT a component of a supervisory union
## 54   1-Regular local school district that is NOT a component of a supervisory union
## 55   1-Regular local school district that is NOT a component of a supervisory union
## 56   1-Regular local school district that is NOT a component of a supervisory union
## 57                                                   7-Independent Charter District
## 58   1-Regular local school district that is NOT a component of a supervisory union
## 59   1-Regular local school district that is NOT a component of a supervisory union
## 60                                                   7-Independent Charter District
## 61   1-Regular local school district that is NOT a component of a supervisory union
## 62   1-Regular local school district that is NOT a component of a supervisory union
## 63           5-State agency providing elementary and/or secondary level instruction
## 64   1-Regular local school district that is NOT a component of a supervisory union
## 65   1-Regular local school district that is NOT a component of a supervisory union
## 66   1-Regular local school district that is NOT a component of a supervisory union
## 67   1-Regular local school district that is NOT a component of a supervisory union
## 68   1-Regular local school district that is NOT a component of a supervisory union
## 69                                                   7-Independent Charter District
## 70   1-Regular local school district that is NOT a component of a supervisory union
## 71   1-Regular local school district that is NOT a component of a supervisory union
## 72   1-Regular local school district that is NOT a component of a supervisory union
## 73   1-Regular local school district that is NOT a component of a supervisory union
## 74   1-Regular local school district that is NOT a component of a supervisory union
## 75   1-Regular local school district that is NOT a component of a supervisory union
## 76   1-Regular local school district that is NOT a component of a supervisory union
## 77   1-Regular local school district that is NOT a component of a supervisory union
## 78   1-Regular local school district that is NOT a component of a supervisory union
## 79   1-Regular local school district that is NOT a component of a supervisory union
## 80                                                   7-Independent Charter District
## 81   1-Regular local school district that is NOT a component of a supervisory union
## 82   1-Regular local school district that is NOT a component of a supervisory union
## 83   1-Regular local school district that is NOT a component of a supervisory union
## 84   1-Regular local school district that is NOT a component of a supervisory union
## 85   1-Regular local school district that is NOT a component of a supervisory union
## 86   1-Regular local school district that is NOT a component of a supervisory union
## 87   1-Regular local school district that is NOT a component of a supervisory union
## 88   1-Regular local school district that is NOT a component of a supervisory union
## 89   1-Regular local school district that is NOT a component of a supervisory union
## 90   1-Regular local school district that is NOT a component of a supervisory union
## 91   1-Regular local school district that is NOT a component of a supervisory union
## 92   1-Regular local school district that is NOT a component of a supervisory union
## 93   1-Regular local school district that is NOT a component of a supervisory union
## 94                                       4-Regional Education Service Agency (RESA)
## 95   1-Regular local school district that is NOT a component of a supervisory union
## 96   1-Regular local school district that is NOT a component of a supervisory union
## 97   1-Regular local school district that is NOT a component of a supervisory union
## 98   1-Regular local school district that is NOT a component of a supervisory union
## 99   1-Regular local school district that is NOT a component of a supervisory union
## 100  1-Regular local school district that is NOT a component of a supervisory union
## 101  1-Regular local school district that is NOT a component of a supervisory union
## 102  1-Regular local school district that is NOT a component of a supervisory union
## 103                                                      8-Other education agencies
## 104  1-Regular local school district that is NOT a component of a supervisory union
## 105  1-Regular local school district that is NOT a component of a supervisory union
## 106  1-Regular local school district that is NOT a component of a supervisory union
## 107  1-Regular local school district that is NOT a component of a supervisory union
## 108  1-Regular local school district that is NOT a component of a supervisory union
## 109          5-State agency providing elementary and/or secondary level instruction
## 110  1-Regular local school district that is NOT a component of a supervisory union
## 111  1-Regular local school district that is NOT a component of a supervisory union
## 112  1-Regular local school district that is NOT a component of a supervisory union
## 113  1-Regular local school district that is NOT a component of a supervisory union
## 114  1-Regular local school district that is NOT a component of a supervisory union
## 115  1-Regular local school district that is NOT a component of a supervisory union
## 116  1-Regular local school district that is NOT a component of a supervisory union
## 117  1-Regular local school district that is NOT a component of a supervisory union
## 118  1-Regular local school district that is NOT a component of a supervisory union
## 119  1-Regular local school district that is NOT a component of a supervisory union
## 120  1-Regular local school district that is NOT a component of a supervisory union
## 121  1-Regular local school district that is NOT a component of a supervisory union
## 122  1-Regular local school district that is NOT a component of a supervisory union
## 123  1-Regular local school district that is NOT a component of a supervisory union
## 124  1-Regular local school district that is NOT a component of a supervisory union
## 125  1-Regular local school district that is NOT a component of a supervisory union
## 126  1-Regular local school district that is NOT a component of a supervisory union
## 127  1-Regular local school district that is NOT a component of a supervisory union
## 128  1-Regular local school district that is NOT a component of a supervisory union
## 129  1-Regular local school district that is NOT a component of a supervisory union
## 130  1-Regular local school district that is NOT a component of a supervisory union
## 131  1-Regular local school district that is NOT a component of a supervisory union
## 132  1-Regular local school district that is NOT a component of a supervisory union
## 133  1-Regular local school district that is NOT a component of a supervisory union
## 134  1-Regular local school district that is NOT a component of a supervisory union
## 135  1-Regular local school district that is NOT a component of a supervisory union
## 136  1-Regular local school district that is NOT a component of a supervisory union
## 137  1-Regular local school district that is NOT a component of a supervisory union
## 138  1-Regular local school district that is NOT a component of a supervisory union
## 139  1-Regular local school district that is NOT a component of a supervisory union
## 140  1-Regular local school district that is NOT a component of a supervisory union
## 141  1-Regular local school district that is NOT a component of a supervisory union
## 142  1-Regular local school district that is NOT a component of a supervisory union
## 143          5-State agency providing elementary and/or secondary level instruction
## 144  1-Regular local school district that is NOT a component of a supervisory union
## 145  1-Regular local school district that is NOT a component of a supervisory union
## 146  1-Regular local school district that is NOT a component of a supervisory union
## 147                                      4-Regional Education Service Agency (RESA)
## 148                                      4-Regional Education Service Agency (RESA)
## 149                                      4-Regional Education Service Agency (RESA)
## 150                                      4-Regional Education Service Agency (RESA)
## 151                                      4-Regional Education Service Agency (RESA)
## 152  1-Regular local school district that is NOT a component of a supervisory union
## 153  1-Regular local school district that is NOT a component of a supervisory union
## 154  1-Regular local school district that is NOT a component of a supervisory union
## 155  1-Regular local school district that is NOT a component of a supervisory union
## 156  1-Regular local school district that is NOT a component of a supervisory union
## 157  1-Regular local school district that is NOT a component of a supervisory union
## 158  1-Regular local school district that is NOT a component of a supervisory union
## 159                                      4-Regional Education Service Agency (RESA)
## 160                                      4-Regional Education Service Agency (RESA)
## 161  1-Regular local school district that is NOT a component of a supervisory union
## 162  1-Regular local school district that is NOT a component of a supervisory union
## 163  1-Regular local school district that is NOT a component of a supervisory union
## 164  1-Regular local school district that is NOT a component of a supervisory union
## 165  1-Regular local school district that is NOT a component of a supervisory union
## 166  1-Regular local school district that is NOT a component of a supervisory union
## 167  1-Regular local school district that is NOT a component of a supervisory union
## 168  1-Regular local school district that is NOT a component of a supervisory union
## 169  1-Regular local school district that is NOT a component of a supervisory union
## 170  1-Regular local school district that is NOT a component of a supervisory union
## 171                                      4-Regional Education Service Agency (RESA)
## 172                                      4-Regional Education Service Agency (RESA)
## 173  1-Regular local school district that is NOT a component of a supervisory union
## 174  1-Regular local school district that is NOT a component of a supervisory union
## 175  1-Regular local school district that is NOT a component of a supervisory union
## 176  1-Regular local school district that is NOT a component of a supervisory union
## 177                                      4-Regional Education Service Agency (RESA)
## 178                                      4-Regional Education Service Agency (RESA)
## 179  1-Regular local school district that is NOT a component of a supervisory union
## 180  1-Regular local school district that is NOT a component of a supervisory union
## 181  1-Regular local school district that is NOT a component of a supervisory union
## 182  1-Regular local school district that is NOT a component of a supervisory union
## 183                                      4-Regional Education Service Agency (RESA)
## 184  1-Regular local school district that is NOT a component of a supervisory union
## 185  1-Regular local school district that is NOT a component of a supervisory union
## 186  1-Regular local school district that is NOT a component of a supervisory union
## 187  1-Regular local school district that is NOT a component of a supervisory union
## 188          5-State agency providing elementary and/or secondary level instruction
## 189          5-State agency providing elementary and/or secondary level instruction
## 190  1-Regular local school district that is NOT a component of a supervisory union
## 191  1-Regular local school district that is NOT a component of a supervisory union
## 192  1-Regular local school district that is NOT a component of a supervisory union
## 193  1-Regular local school district that is NOT a component of a supervisory union
## 194  1-Regular local school district that is NOT a component of a supervisory union
## 195  1-Regular local school district that is NOT a component of a supervisory union
## 196  1-Regular local school district that is NOT a component of a supervisory union
## 197  1-Regular local school district that is NOT a component of a supervisory union
## 198  1-Regular local school district that is NOT a component of a supervisory union
## 199  1-Regular local school district that is NOT a component of a supervisory union
## 200  1-Regular local school district that is NOT a component of a supervisory union
## 201  1-Regular local school district that is NOT a component of a supervisory union
## 202  1-Regular local school district that is NOT a component of a supervisory union
## 203  1-Regular local school district that is NOT a component of a supervisory union
## 204  1-Regular local school district that is NOT a component of a supervisory union
## 205                                      4-Regional Education Service Agency (RESA)
## 206  1-Regular local school district that is NOT a component of a supervisory union
## 207  1-Regular local school district that is NOT a component of a supervisory union
## 208  1-Regular local school district that is NOT a component of a supervisory union
## 209                                      4-Regional Education Service Agency (RESA)
## 210  1-Regular local school district that is NOT a component of a supervisory union
## 211  1-Regular local school district that is NOT a component of a supervisory union
## 212  1-Regular local school district that is NOT a component of a supervisory union
## 213  1-Regular local school district that is NOT a component of a supervisory union
## 214  1-Regular local school district that is NOT a component of a supervisory union
## 215  1-Regular local school district that is NOT a component of a supervisory union
## 216  1-Regular local school district that is NOT a component of a supervisory union
## 217  1-Regular local school district that is NOT a component of a supervisory union
## 218  1-Regular local school district that is NOT a component of a supervisory union
## 219  1-Regular local school district that is NOT a component of a supervisory union
## 220  1-Regular local school district that is NOT a component of a supervisory union
## 221  1-Regular local school district that is NOT a component of a supervisory union
## 222  1-Regular local school district that is NOT a component of a supervisory union
## 223  1-Regular local school district that is NOT a component of a supervisory union
## 224  1-Regular local school district that is NOT a component of a supervisory union
## 225  1-Regular local school district that is NOT a component of a supervisory union
## 226  1-Regular local school district that is NOT a component of a supervisory union
## 227  1-Regular local school district that is NOT a component of a supervisory union
## 228  1-Regular local school district that is NOT a component of a supervisory union
## 229  1-Regular local school district that is NOT a component of a supervisory union
## 230  1-Regular local school district that is NOT a component of a supervisory union
## 231  1-Regular local school district that is NOT a component of a supervisory union
## 232                                      4-Regional Education Service Agency (RESA)
## 233  1-Regular local school district that is NOT a component of a supervisory union
## 234  1-Regular local school district that is NOT a component of a supervisory union
## 235  1-Regular local school district that is NOT a component of a supervisory union
## 236  1-Regular local school district that is NOT a component of a supervisory union
## 237  1-Regular local school district that is NOT a component of a supervisory union
## 238                                                  7-Independent Charter District
## 239  1-Regular local school district that is NOT a component of a supervisory union
## 240  1-Regular local school district that is NOT a component of a supervisory union
## 241  1-Regular local school district that is NOT a component of a supervisory union
## 242  1-Regular local school district that is NOT a component of a supervisory union
## 243  1-Regular local school district that is NOT a component of a supervisory union
## 244  1-Regular local school district that is NOT a component of a supervisory union
## 245  1-Regular local school district that is NOT a component of a supervisory union
## 246                                                  7-Independent Charter District
## 247                                                  7-Independent Charter District
## 248  1-Regular local school district that is NOT a component of a supervisory union
## 249  1-Regular local school district that is NOT a component of a supervisory union
## 250              2-Local school district that is a component of a supervisory union
## 251  1-Regular local school district that is NOT a component of a supervisory union
## 252  1-Regular local school district that is NOT a component of a supervisory union
## 253  1-Regular local school district that is NOT a component of a supervisory union
## 254  1-Regular local school district that is NOT a component of a supervisory union
## 255  1-Regular local school district that is NOT a component of a supervisory union
## 256  1-Regular local school district that is NOT a component of a supervisory union
## 257  1-Regular local school district that is NOT a component of a supervisory union
## 258  1-Regular local school district that is NOT a component of a supervisory union
## 259  1-Regular local school district that is NOT a component of a supervisory union
## 260  1-Regular local school district that is NOT a component of a supervisory union
## 261  1-Regular local school district that is NOT a component of a supervisory union
## 262  1-Regular local school district that is NOT a component of a supervisory union
## 263  1-Regular local school district that is NOT a component of a supervisory union
## 264  1-Regular local school district that is NOT a component of a supervisory union
## 265  1-Regular local school district that is NOT a component of a supervisory union
## 266  1-Regular local school district that is NOT a component of a supervisory union
## 267  1-Regular local school district that is NOT a component of a supervisory union
## 268  1-Regular local school district that is NOT a component of a supervisory union
## 269  1-Regular local school district that is NOT a component of a supervisory union
## 270  1-Regular local school district that is NOT a component of a supervisory union
## 271  1-Regular local school district that is NOT a component of a supervisory union
## 272          5-State agency providing elementary and/or secondary level instruction
## 273  1-Regular local school district that is NOT a component of a supervisory union
## 274  1-Regular local school district that is NOT a component of a supervisory union
## 275  1-Regular local school district that is NOT a component of a supervisory union
## 276  1-Regular local school district that is NOT a component of a supervisory union
## 277  1-Regular local school district that is NOT a component of a supervisory union
## 278  1-Regular local school district that is NOT a component of a supervisory union
## 279  1-Regular local school district that is NOT a component of a supervisory union
## 280  1-Regular local school district that is NOT a component of a supervisory union
## 281  1-Regular local school district that is NOT a component of a supervisory union
## 282  1-Regular local school district that is NOT a component of a supervisory union
## 283  1-Regular local school district that is NOT a component of a supervisory union
## 284  1-Regular local school district that is NOT a component of a supervisory union
## 285  1-Regular local school district that is NOT a component of a supervisory union
## 286  1-Regular local school district that is NOT a component of a supervisory union
## 287                                                  7-Independent Charter District
## 288  1-Regular local school district that is NOT a component of a supervisory union
## 289  1-Regular local school district that is NOT a component of a supervisory union
## 290  1-Regular local school district that is NOT a component of a supervisory union
## 291  1-Regular local school district that is NOT a component of a supervisory union
## 292  1-Regular local school district that is NOT a component of a supervisory union
## 293  1-Regular local school district that is NOT a component of a supervisory union
## 294  1-Regular local school district that is NOT a component of a supervisory union
## 295  1-Regular local school district that is NOT a component of a supervisory union
## 296  1-Regular local school district that is NOT a component of a supervisory union
## 297  1-Regular local school district that is NOT a component of a supervisory union
## 298  1-Regular local school district that is NOT a component of a supervisory union
## 299  1-Regular local school district that is NOT a component of a supervisory union
## 300  1-Regular local school district that is NOT a component of a supervisory union
## 301  1-Regular local school district that is NOT a component of a supervisory union
## 302  1-Regular local school district that is NOT a component of a supervisory union
## 303  1-Regular local school district that is NOT a component of a supervisory union
## 304  1-Regular local school district that is NOT a component of a supervisory union
## 305  1-Regular local school district that is NOT a component of a supervisory union
## 306  1-Regular local school district that is NOT a component of a supervisory union
## 307  1-Regular local school district that is NOT a component of a supervisory union
## 308  1-Regular local school district that is NOT a component of a supervisory union
## 309  1-Regular local school district that is NOT a component of a supervisory union
## 310          5-State agency providing elementary and/or secondary level instruction
## 311  1-Regular local school district that is NOT a component of a supervisory union
## 312  1-Regular local school district that is NOT a component of a supervisory union
## 313  1-Regular local school district that is NOT a component of a supervisory union
## 314  1-Regular local school district that is NOT a component of a supervisory union
## 315  1-Regular local school district that is NOT a component of a supervisory union
## 316          5-State agency providing elementary and/or secondary level instruction
## 317  1-Regular local school district that is NOT a component of a supervisory union
## 318  1-Regular local school district that is NOT a component of a supervisory union
## 319  1-Regular local school district that is NOT a component of a supervisory union
## 320  1-Regular local school district that is NOT a component of a supervisory union
## 321                                                  7-Independent Charter District
## 322  1-Regular local school district that is NOT a component of a supervisory union
## 323  1-Regular local school district that is NOT a component of a supervisory union
## 324  1-Regular local school district that is NOT a component of a supervisory union
## 325  1-Regular local school district that is NOT a component of a supervisory union
## 326  1-Regular local school district that is NOT a component of a supervisory union
## 327  1-Regular local school district that is NOT a component of a supervisory union
## 328  1-Regular local school district that is NOT a component of a supervisory union
## 329  1-Regular local school district that is NOT a component of a supervisory union
## 330          5-State agency providing elementary and/or secondary level instruction
## 331                                      4-Regional Education Service Agency (RESA)
## 332  1-Regular local school district that is NOT a component of a supervisory union
## 333  1-Regular local school district that is NOT a component of a supervisory union
## 334  1-Regular local school district that is NOT a component of a supervisory union
## 335          5-State agency providing elementary and/or secondary level instruction
## 336          5-State agency providing elementary and/or secondary level instruction
## 337          5-State agency providing elementary and/or secondary level instruction
## 338          5-State agency providing elementary and/or secondary level instruction
## 339          5-State agency providing elementary and/or secondary level instruction
## 340          5-State agency providing elementary and/or secondary level instruction
## 341                                                      8-Other education agencies
## 342  1-Regular local school district that is NOT a component of a supervisory union
## 343  1-Regular local school district that is NOT a component of a supervisory union
## 344  1-Regular local school district that is NOT a component of a supervisory union
## 345  1-Regular local school district that is NOT a component of a supervisory union
## 346  1-Regular local school district that is NOT a component of a supervisory union
## 347  1-Regular local school district that is NOT a component of a supervisory union
## 348  1-Regular local school district that is NOT a component of a supervisory union
## 349  1-Regular local school district that is NOT a component of a supervisory union
## 350  1-Regular local school district that is NOT a component of a supervisory union
## 351  1-Regular local school district that is NOT a component of a supervisory union
## 352                                      4-Regional Education Service Agency (RESA)
## 353                                      4-Regional Education Service Agency (RESA)
## 354  1-Regular local school district that is NOT a component of a supervisory union
## 355  1-Regular local school district that is NOT a component of a supervisory union
## 356  1-Regular local school district that is NOT a component of a supervisory union
## 357  1-Regular local school district that is NOT a component of a supervisory union
## 358                                      4-Regional Education Service Agency (RESA)
## 359  1-Regular local school district that is NOT a component of a supervisory union
## 360              2-Local school district that is a component of a supervisory union
## 361  1-Regular local school district that is NOT a component of a supervisory union
## 362  1-Regular local school district that is NOT a component of a supervisory union
## 363  1-Regular local school district that is NOT a component of a supervisory union
## 364  1-Regular local school district that is NOT a component of a supervisory union
## 365  1-Regular local school district that is NOT a component of a supervisory union
## 366  1-Regular local school district that is NOT a component of a supervisory union
## 367  1-Regular local school district that is NOT a component of a supervisory union
## 368  1-Regular local school district that is NOT a component of a supervisory union
## 369  1-Regular local school district that is NOT a component of a supervisory union
## 370  1-Regular local school district that is NOT a component of a supervisory union
## 371  1-Regular local school district that is NOT a component of a supervisory union
## 372  1-Regular local school district that is NOT a component of a supervisory union
## 373  1-Regular local school district that is NOT a component of a supervisory union
## 374  1-Regular local school district that is NOT a component of a supervisory union
## 375  1-Regular local school district that is NOT a component of a supervisory union
## 376  1-Regular local school district that is NOT a component of a supervisory union
## 377  1-Regular local school district that is NOT a component of a supervisory union
## 378  1-Regular local school district that is NOT a component of a supervisory union
## 379  1-Regular local school district that is NOT a component of a supervisory union
## 380                                                      8-Other education agencies
## 381                                                      8-Other education agencies
## 382                                                      8-Other education agencies
## 383                                                      8-Other education agencies
## 384                                                      8-Other education agencies
## 385                                                      8-Other education agencies
## 386                                                      8-Other education agencies
## 387                                                      8-Other education agencies
## 388                                                      8-Other education agencies
## 389  1-Regular local school district that is NOT a component of a supervisory union
## 390  1-Regular local school district that is NOT a component of a supervisory union
## 391  1-Regular local school district that is NOT a component of a supervisory union
## 392  1-Regular local school district that is NOT a component of a supervisory union
## 393                                      4-Regional Education Service Agency (RESA)
## 394  1-Regular local school district that is NOT a component of a supervisory union
## 395  1-Regular local school district that is NOT a component of a supervisory union
## 396  1-Regular local school district that is NOT a component of a supervisory union
## 397                                      4-Regional Education Service Agency (RESA)
## 398                                      4-Regional Education Service Agency (RESA)
## 399  1-Regular local school district that is NOT a component of a supervisory union
## 400  1-Regular local school district that is NOT a component of a supervisory union
## 401  1-Regular local school district that is NOT a component of a supervisory union
## 402  1-Regular local school district that is NOT a component of a supervisory union
## 403  1-Regular local school district that is NOT a component of a supervisory union
## 404  1-Regular local school district that is NOT a component of a supervisory union
## 405  1-Regular local school district that is NOT a component of a supervisory union
## 406  1-Regular local school district that is NOT a component of a supervisory union
## 407  1-Regular local school district that is NOT a component of a supervisory union
## 408          5-State agency providing elementary and/or secondary level instruction
## 409                                            9-Specialized public school district
## 410          5-State agency providing elementary and/or secondary level instruction
## 411          5-State agency providing elementary and/or secondary level instruction
## 412  1-Regular local school district that is NOT a component of a supervisory union
## 413  1-Regular local school district that is NOT a component of a supervisory union
## 414  1-Regular local school district that is NOT a component of a supervisory union
## 415          5-State agency providing elementary and/or secondary level instruction
## 416          5-State agency providing elementary and/or secondary level instruction
## 417  1-Regular local school district that is NOT a component of a supervisory union
## 418  1-Regular local school district that is NOT a component of a supervisory union
## 419  1-Regular local school district that is NOT a component of a supervisory union
## 420  1-Regular local school district that is NOT a component of a supervisory union
## 421  1-Regular local school district that is NOT a component of a supervisory union
## 422                                                  7-Independent Charter District
## 423                                                  7-Independent Charter District
## 424  1-Regular local school district that is NOT a component of a supervisory union
## 425  1-Regular local school district that is NOT a component of a supervisory union
## 426  1-Regular local school district that is NOT a component of a supervisory union
## 427  1-Regular local school district that is NOT a component of a supervisory union
## 428  1-Regular local school district that is NOT a component of a supervisory union
## 429  1-Regular local school district that is NOT a component of a supervisory union
## 430  1-Regular local school district that is NOT a component of a supervisory union
## 431  1-Regular local school district that is NOT a component of a supervisory union
## 432  1-Regular local school district that is NOT a component of a supervisory union
## 433  1-Regular local school district that is NOT a component of a supervisory union
## 434                                                  7-Independent Charter District
## 435                                                  7-Independent Charter District
## 436                                                  7-Independent Charter District
## 437          5-State agency providing elementary and/or secondary level instruction
## 438  1-Regular local school district that is NOT a component of a supervisory union
## 439  1-Regular local school district that is NOT a component of a supervisory union
## 440  1-Regular local school district that is NOT a component of a supervisory union
## 441  1-Regular local school district that is NOT a component of a supervisory union
## 442  1-Regular local school district that is NOT a component of a supervisory union
## 443  1-Regular local school district that is NOT a component of a supervisory union
## 444  1-Regular local school district that is NOT a component of a supervisory union
## 445  1-Regular local school district that is NOT a component of a supervisory union
## 446  1-Regular local school district that is NOT a component of a supervisory union
## 447  1-Regular local school district that is NOT a component of a supervisory union
## 448  1-Regular local school district that is NOT a component of a supervisory union
## 449  1-Regular local school district that is NOT a component of a supervisory union
## 450  1-Regular local school district that is NOT a component of a supervisory union
## 451          5-State agency providing elementary and/or secondary level instruction
## 452  1-Regular local school district that is NOT a component of a supervisory union
## 453  1-Regular local school district that is NOT a component of a supervisory union
## 454  1-Regular local school district that is NOT a component of a supervisory union
## 455  1-Regular local school district that is NOT a component of a supervisory union
## 456          5-State agency providing elementary and/or secondary level instruction
## 457  1-Regular local school district that is NOT a component of a supervisory union
## 458  1-Regular local school district that is NOT a component of a supervisory union
## 459  1-Regular local school district that is NOT a component of a supervisory union
## 460  1-Regular local school district that is NOT a component of a supervisory union
## 461  1-Regular local school district that is NOT a component of a supervisory union
## 462  1-Regular local school district that is NOT a component of a supervisory union
## 463  1-Regular local school district that is NOT a component of a supervisory union
## 464  1-Regular local school district that is NOT a component of a supervisory union
## 465  1-Regular local school district that is NOT a component of a supervisory union
## 466  1-Regular local school district that is NOT a component of a supervisory union
## 467  1-Regular local school district that is NOT a component of a supervisory union
## 468  1-Regular local school district that is NOT a component of a supervisory union
## 469  1-Regular local school district that is NOT a component of a supervisory union
## 470  1-Regular local school district that is NOT a component of a supervisory union
## 471                                                      8-Other education agencies
## 472                                                  7-Independent Charter District
## 473  1-Regular local school district that is NOT a component of a supervisory union
## 474  1-Regular local school district that is NOT a component of a supervisory union
## 475  1-Regular local school district that is NOT a component of a supervisory union
## 476  1-Regular local school district that is NOT a component of a supervisory union
## 477  1-Regular local school district that is NOT a component of a supervisory union
## 478  1-Regular local school district that is NOT a component of a supervisory union
## 479                                                  7-Independent Charter District
## 480  1-Regular local school district that is NOT a component of a supervisory union
## 481  1-Regular local school district that is NOT a component of a supervisory union
## 482  1-Regular local school district that is NOT a component of a supervisory union
## 483                                      4-Regional Education Service Agency (RESA)
## 484  1-Regular local school district that is NOT a component of a supervisory union
## 485  1-Regular local school district that is NOT a component of a supervisory union
## 486  1-Regular local school district that is NOT a component of a supervisory union
## 487  1-Regular local school district that is NOT a component of a supervisory union
## 488  1-Regular local school district that is NOT a component of a supervisory union
## 489  1-Regular local school district that is NOT a component of a supervisory union
## 490  1-Regular local school district that is NOT a component of a supervisory union
## 491          5-State agency providing elementary and/or secondary level instruction
## 492  1-Regular local school district that is NOT a component of a supervisory union
## 493  1-Regular local school district that is NOT a component of a supervisory union
## 494  1-Regular local school district that is NOT a component of a supervisory union
## 495              2-Local school district that is a component of a supervisory union
## 496  1-Regular local school district that is NOT a component of a supervisory union
## 497  1-Regular local school district that is NOT a component of a supervisory union
## 498  1-Regular local school district that is NOT a component of a supervisory union
## 499  1-Regular local school district that is NOT a component of a supervisory union
## 500  1-Regular local school district that is NOT a component of a supervisory union
## 501  1-Regular local school district that is NOT a component of a supervisory union
## 502  1-Regular local school district that is NOT a component of a supervisory union
## 503  1-Regular local school district that is NOT a component of a supervisory union
## 504  1-Regular local school district that is NOT a component of a supervisory union
## 505  1-Regular local school district that is NOT a component of a supervisory union
## 506  1-Regular local school district that is NOT a component of a supervisory union
## 507  1-Regular local school district that is NOT a component of a supervisory union
## 508  1-Regular local school district that is NOT a component of a supervisory union
## 509          5-State agency providing elementary and/or secondary level instruction
## 510  1-Regular local school district that is NOT a component of a supervisory union
## 511  1-Regular local school district that is NOT a component of a supervisory union
## 512  1-Regular local school district that is NOT a component of a supervisory union
## 513  1-Regular local school district that is NOT a component of a supervisory union
## 514  1-Regular local school district that is NOT a component of a supervisory union
## 515  1-Regular local school district that is NOT a component of a supervisory union
## 516  1-Regular local school district that is NOT a component of a supervisory union
## 517  1-Regular local school district that is NOT a component of a supervisory union
## 518  1-Regular local school district that is NOT a component of a supervisory union
## 519  1-Regular local school district that is NOT a component of a supervisory union
## 520  1-Regular local school district that is NOT a component of a supervisory union
## 521  1-Regular local school district that is NOT a component of a supervisory union
## 522  1-Regular local school district that is NOT a component of a supervisory union
## 523  1-Regular local school district that is NOT a component of a supervisory union
## 524  1-Regular local school district that is NOT a component of a supervisory union
## 525  1-Regular local school district that is NOT a component of a supervisory union
## 526  1-Regular local school district that is NOT a component of a supervisory union
## 527  1-Regular local school district that is NOT a component of a supervisory union
## 528  1-Regular local school district that is NOT a component of a supervisory union
## 529          5-State agency providing elementary and/or secondary level instruction
## 530          5-State agency providing elementary and/or secondary level instruction
## 531  1-Regular local school district that is NOT a component of a supervisory union
## 532  1-Regular local school district that is NOT a component of a supervisory union
## 533  1-Regular local school district that is NOT a component of a supervisory union
## 534  1-Regular local school district that is NOT a component of a supervisory union
## 535  1-Regular local school district that is NOT a component of a supervisory union
## 536  1-Regular local school district that is NOT a component of a supervisory union
## 537  1-Regular local school district that is NOT a component of a supervisory union
## 538  1-Regular local school district that is NOT a component of a supervisory union
## 539  1-Regular local school district that is NOT a component of a supervisory union
## 540  1-Regular local school district that is NOT a component of a supervisory union
## 541  1-Regular local school district that is NOT a component of a supervisory union
## 542  1-Regular local school district that is NOT a component of a supervisory union
## 543  1-Regular local school district that is NOT a component of a supervisory union
## 544  1-Regular local school district that is NOT a component of a supervisory union
## 545  1-Regular local school district that is NOT a component of a supervisory union
## 546  1-Regular local school district that is NOT a component of a supervisory union
## 547  1-Regular local school district that is NOT a component of a supervisory union
## 548  1-Regular local school district that is NOT a component of a supervisory union
## 549  1-Regular local school district that is NOT a component of a supervisory union
## 550  1-Regular local school district that is NOT a component of a supervisory union
## 551  1-Regular local school district that is NOT a component of a supervisory union
## 552  1-Regular local school district that is NOT a component of a supervisory union
## 553  1-Regular local school district that is NOT a component of a supervisory union
## 554  1-Regular local school district that is NOT a component of a supervisory union
## 555  1-Regular local school district that is NOT a component of a supervisory union
## 556                                                  7-Independent Charter District
## 557  1-Regular local school district that is NOT a component of a supervisory union
## 558  1-Regular local school district that is NOT a component of a supervisory union
## 559  1-Regular local school district that is NOT a component of a supervisory union
## 560  1-Regular local school district that is NOT a component of a supervisory union
## 561  1-Regular local school district that is NOT a component of a supervisory union
## 562  1-Regular local school district that is NOT a component of a supervisory union
## 563          5-State agency providing elementary and/or secondary level instruction
## 564  1-Regular local school district that is NOT a component of a supervisory union
## 565  1-Regular local school district that is NOT a component of a supervisory union
## 566  1-Regular local school district that is NOT a component of a supervisory union
## 567  1-Regular local school district that is NOT a component of a supervisory union
## 568  1-Regular local school district that is NOT a component of a supervisory union
## 569  1-Regular local school district that is NOT a component of a supervisory union
## 570  1-Regular local school district that is NOT a component of a supervisory union
## 571                                      4-Regional Education Service Agency (RESA)
## 572                                      4-Regional Education Service Agency (RESA)
## 573  1-Regular local school district that is NOT a component of a supervisory union
## 574          5-State agency providing elementary and/or secondary level instruction
## 575  1-Regular local school district that is NOT a component of a supervisory union
## 576  1-Regular local school district that is NOT a component of a supervisory union
## 577  1-Regular local school district that is NOT a component of a supervisory union
## 578  1-Regular local school district that is NOT a component of a supervisory union
## 579  1-Regular local school district that is NOT a component of a supervisory union
## 580  1-Regular local school district that is NOT a component of a supervisory union
## 581                                                  7-Independent Charter District
## 582  1-Regular local school district that is NOT a component of a supervisory union
## 583  1-Regular local school district that is NOT a component of a supervisory union
## 584  1-Regular local school district that is NOT a component of a supervisory union
## 585  1-Regular local school district that is NOT a component of a supervisory union
## 586          5-State agency providing elementary and/or secondary level instruction
## 587  1-Regular local school district that is NOT a component of a supervisory union
## 588  1-Regular local school district that is NOT a component of a supervisory union
## 589  1-Regular local school district that is NOT a component of a supervisory union
## 590  1-Regular local school district that is NOT a component of a supervisory union
## 591          5-State agency providing elementary and/or secondary level instruction
## 592          5-State agency providing elementary and/or secondary level instruction
## 593  1-Regular local school district that is NOT a component of a supervisory union
## 594                                                  7-Independent Charter District
## 595  1-Regular local school district that is NOT a component of a supervisory union
## 596  1-Regular local school district that is NOT a component of a supervisory union
## 597  1-Regular local school district that is NOT a component of a supervisory union
## 598          5-State agency providing elementary and/or secondary level instruction
## 599          5-State agency providing elementary and/or secondary level instruction
## 600  1-Regular local school district that is NOT a component of a supervisory union
## 601  1-Regular local school district that is NOT a component of a supervisory union
## 602  1-Regular local school district that is NOT a component of a supervisory union
## 603  1-Regular local school district that is NOT a component of a supervisory union
## 604  1-Regular local school district that is NOT a component of a supervisory union
## 605  1-Regular local school district that is NOT a component of a supervisory union
## 606  1-Regular local school district that is NOT a component of a supervisory union
## 607  1-Regular local school district that is NOT a component of a supervisory union
## 608  1-Regular local school district that is NOT a component of a supervisory union
## 609  1-Regular local school district that is NOT a component of a supervisory union
## 610  1-Regular local school district that is NOT a component of a supervisory union
## 611  1-Regular local school district that is NOT a component of a supervisory union
## 612  1-Regular local school district that is NOT a component of a supervisory union
## 613  1-Regular local school district that is NOT a component of a supervisory union
## 614  1-Regular local school district that is NOT a component of a supervisory union
## 615  1-Regular local school district that is NOT a component of a supervisory union
## 616  1-Regular local school district that is NOT a component of a supervisory union
## 617                                      4-Regional Education Service Agency (RESA)
## 618  1-Regular local school district that is NOT a component of a supervisory union
## 619  1-Regular local school district that is NOT a component of a supervisory union
## 620  1-Regular local school district that is NOT a component of a supervisory union
## 621  1-Regular local school district that is NOT a component of a supervisory union
## 622  1-Regular local school district that is NOT a component of a supervisory union
## 623  1-Regular local school district that is NOT a component of a supervisory union
## 624  1-Regular local school district that is NOT a component of a supervisory union
## 625  1-Regular local school district that is NOT a component of a supervisory union
## 626  1-Regular local school district that is NOT a component of a supervisory union
## 627  1-Regular local school district that is NOT a component of a supervisory union
## 628  1-Regular local school district that is NOT a component of a supervisory union
## 629  1-Regular local school district that is NOT a component of a supervisory union
## 630  1-Regular local school district that is NOT a component of a supervisory union
## 631  1-Regular local school district that is NOT a component of a supervisory union
## 632  1-Regular local school district that is NOT a component of a supervisory union
## 633  1-Regular local school district that is NOT a component of a supervisory union
## 634  1-Regular local school district that is NOT a component of a supervisory union
## 635  1-Regular local school district that is NOT a component of a supervisory union
## 636  1-Regular local school district that is NOT a component of a supervisory union
## 637  1-Regular local school district that is NOT a component of a supervisory union
## 638                                                  7-Independent Charter District
## 639                                                  7-Independent Charter District
## 640                                                  7-Independent Charter District
## 641  1-Regular local school district that is NOT a component of a supervisory union
## 642  1-Regular local school district that is NOT a component of a supervisory union
## 643                                      4-Regional Education Service Agency (RESA)
## 644  1-Regular local school district that is NOT a component of a supervisory union
## 645  1-Regular local school district that is NOT a component of a supervisory union
## 646  1-Regular local school district that is NOT a component of a supervisory union
## 647  1-Regular local school district that is NOT a component of a supervisory union
## 648  1-Regular local school district that is NOT a component of a supervisory union
## 649  1-Regular local school district that is NOT a component of a supervisory union
## 650  1-Regular local school district that is NOT a component of a supervisory union
## 651          5-State agency providing elementary and/or secondary level instruction
## 652  1-Regular local school district that is NOT a component of a supervisory union
## 653  1-Regular local school district that is NOT a component of a supervisory union
## 654  1-Regular local school district that is NOT a component of a supervisory union
## 655  1-Regular local school district that is NOT a component of a supervisory union
## 656  1-Regular local school district that is NOT a component of a supervisory union
## 657  1-Regular local school district that is NOT a component of a supervisory union
## 658  1-Regular local school district that is NOT a component of a supervisory union
## 659  1-Regular local school district that is NOT a component of a supervisory union
## 660  1-Regular local school district that is NOT a component of a supervisory union
## 661  1-Regular local school district that is NOT a component of a supervisory union
## 662  1-Regular local school district that is NOT a component of a supervisory union
## 663  1-Regular local school district that is NOT a component of a supervisory union
## 664  1-Regular local school district that is NOT a component of a supervisory union
## 665  1-Regular local school district that is NOT a component of a supervisory union
## 666  1-Regular local school district that is NOT a component of a supervisory union
## 667  1-Regular local school district that is NOT a component of a supervisory union
## 668  1-Regular local school district that is NOT a component of a supervisory union
## 669  1-Regular local school district that is NOT a component of a supervisory union
## 670  1-Regular local school district that is NOT a component of a supervisory union
## 671  1-Regular local school district that is NOT a component of a supervisory union
## 672  1-Regular local school district that is NOT a component of a supervisory union
## 673  1-Regular local school district that is NOT a component of a supervisory union
## 674              2-Local school district that is a component of a supervisory union
## 675  1-Regular local school district that is NOT a component of a supervisory union
## 676              2-Local school district that is a component of a supervisory union
## 677  1-Regular local school district that is NOT a component of a supervisory union
## 678  1-Regular local school district that is NOT a component of a supervisory union
## 679  1-Regular local school district that is NOT a component of a supervisory union
## 680  1-Regular local school district that is NOT a component of a supervisory union
## 681          5-State agency providing elementary and/or secondary level instruction
## 682          5-State agency providing elementary and/or secondary level instruction
## 683  1-Regular local school district that is NOT a component of a supervisory union
## 684  1-Regular local school district that is NOT a component of a supervisory union
## 685  1-Regular local school district that is NOT a component of a supervisory union
## 686  1-Regular local school district that is NOT a component of a supervisory union
## 687  1-Regular local school district that is NOT a component of a supervisory union
## 688              2-Local school district that is a component of a supervisory union
## 689  1-Regular local school district that is NOT a component of a supervisory union
## 690  1-Regular local school district that is NOT a component of a supervisory union
## 691  1-Regular local school district that is NOT a component of a supervisory union
## 692  1-Regular local school district that is NOT a component of a supervisory union
## 693  1-Regular local school district that is NOT a component of a supervisory union
## 694  1-Regular local school district that is NOT a component of a supervisory union
## 695  1-Regular local school district that is NOT a component of a supervisory union
## 696  1-Regular local school district that is NOT a component of a supervisory union
## 697  1-Regular local school district that is NOT a component of a supervisory union
## 698  1-Regular local school district that is NOT a component of a supervisory union
## 699  1-Regular local school district that is NOT a component of a supervisory union
## 700  1-Regular local school district that is NOT a component of a supervisory union
## 701  1-Regular local school district that is NOT a component of a supervisory union
## 702  1-Regular local school district that is NOT a component of a supervisory union
## 703  1-Regular local school district that is NOT a component of a supervisory union
## 704  1-Regular local school district that is NOT a component of a supervisory union
## 705  1-Regular local school district that is NOT a component of a supervisory union
## 706  1-Regular local school district that is NOT a component of a supervisory union
## 707  1-Regular local school district that is NOT a component of a supervisory union
## 708  1-Regular local school district that is NOT a component of a supervisory union
## 709  1-Regular local school district that is NOT a component of a supervisory union
## 710  1-Regular local school district that is NOT a component of a supervisory union
## 711          5-State agency providing elementary and/or secondary level instruction
## 712          5-State agency providing elementary and/or secondary level instruction
## 713  1-Regular local school district that is NOT a component of a supervisory union
## 714          5-State agency providing elementary and/or secondary level instruction
## 715          5-State agency providing elementary and/or secondary level instruction
## 716  1-Regular local school district that is NOT a component of a supervisory union
## 717                                                  7-Independent Charter District
## 718  1-Regular local school district that is NOT a component of a supervisory union
## 719  1-Regular local school district that is NOT a component of a supervisory union
## 720  1-Regular local school district that is NOT a component of a supervisory union
## 721  1-Regular local school district that is NOT a component of a supervisory union
## 722  1-Regular local school district that is NOT a component of a supervisory union
## 723  1-Regular local school district that is NOT a component of a supervisory union
## 724  1-Regular local school district that is NOT a component of a supervisory union
## 725  1-Regular local school district that is NOT a component of a supervisory union
## 726  1-Regular local school district that is NOT a component of a supervisory union
## 727  1-Regular local school district that is NOT a component of a supervisory union
## 728  1-Regular local school district that is NOT a component of a supervisory union
## 729  1-Regular local school district that is NOT a component of a supervisory union
## 730  1-Regular local school district that is NOT a component of a supervisory union
## 731  1-Regular local school district that is NOT a component of a supervisory union
## 732  1-Regular local school district that is NOT a component of a supervisory union
## 733  1-Regular local school district that is NOT a component of a supervisory union
## 734  1-Regular local school district that is NOT a component of a supervisory union
## 735  1-Regular local school district that is NOT a component of a supervisory union
## 736  1-Regular local school district that is NOT a component of a supervisory union
## 737  1-Regular local school district that is NOT a component of a supervisory union
## 738  1-Regular local school district that is NOT a component of a supervisory union
## 739  1-Regular local school district that is NOT a component of a supervisory union
## 740  1-Regular local school district that is NOT a component of a supervisory union
## 741  1-Regular local school district that is NOT a component of a supervisory union
## 742  1-Regular local school district that is NOT a component of a supervisory union
## 743  1-Regular local school district that is NOT a component of a supervisory union
## 744  1-Regular local school district that is NOT a component of a supervisory union
## 745  1-Regular local school district that is NOT a component of a supervisory union
## 746  1-Regular local school district that is NOT a component of a supervisory union
## 747  1-Regular local school district that is NOT a component of a supervisory union
## 748  1-Regular local school district that is NOT a component of a supervisory union
## 749  1-Regular local school district that is NOT a component of a supervisory union
## 750  1-Regular local school district that is NOT a component of a supervisory union
## 751  1-Regular local school district that is NOT a component of a supervisory union
## 752  1-Regular local school district that is NOT a component of a supervisory union
## 753  1-Regular local school district that is NOT a component of a supervisory union
## 754  1-Regular local school district that is NOT a component of a supervisory union
## 755  1-Regular local school district that is NOT a component of a supervisory union
## 756  1-Regular local school district that is NOT a component of a supervisory union
## 757  1-Regular local school district that is NOT a component of a supervisory union
## 758                                                  7-Independent Charter District
## 759                                                  7-Independent Charter District
## 760  1-Regular local school district that is NOT a component of a supervisory union
## 761  1-Regular local school district that is NOT a component of a supervisory union
## 762  1-Regular local school district that is NOT a component of a supervisory union
## 763  1-Regular local school district that is NOT a component of a supervisory union
## 764          5-State agency providing elementary and/or secondary level instruction
## 765  1-Regular local school district that is NOT a component of a supervisory union
## 766          5-State agency providing elementary and/or secondary level instruction
## 767          5-State agency providing elementary and/or secondary level instruction
## 768          5-State agency providing elementary and/or secondary level instruction
## 769  1-Regular local school district that is NOT a component of a supervisory union
## 770  1-Regular local school district that is NOT a component of a supervisory union
## 771  1-Regular local school district that is NOT a component of a supervisory union
## 772  1-Regular local school district that is NOT a component of a supervisory union
## 773  1-Regular local school district that is NOT a component of a supervisory union
## 774  1-Regular local school district that is NOT a component of a supervisory union
## 775  1-Regular local school district that is NOT a component of a supervisory union
## 776  1-Regular local school district that is NOT a component of a supervisory union
## 777  1-Regular local school district that is NOT a component of a supervisory union
## 778  1-Regular local school district that is NOT a component of a supervisory union
## 779  1-Regular local school district that is NOT a component of a supervisory union
## 780          5-State agency providing elementary and/or secondary level instruction
## 781  1-Regular local school district that is NOT a component of a supervisory union
## 782  1-Regular local school district that is NOT a component of a supervisory union
## 783  1-Regular local school district that is NOT a component of a supervisory union
## 784  1-Regular local school district that is NOT a component of a supervisory union
## 785  1-Regular local school district that is NOT a component of a supervisory union
## 786  1-Regular local school district that is NOT a component of a supervisory union
## 787                                      4-Regional Education Service Agency (RESA)
## 788                                      4-Regional Education Service Agency (RESA)
## 789  1-Regular local school district that is NOT a component of a supervisory union
## 790  1-Regular local school district that is NOT a component of a supervisory union
## 791  1-Regular local school district that is NOT a component of a supervisory union
## 792  1-Regular local school district that is NOT a component of a supervisory union
## 793  1-Regular local school district that is NOT a component of a supervisory union
## 794                                                  7-Independent Charter District
## 795  1-Regular local school district that is NOT a component of a supervisory union
## 796  1-Regular local school district that is NOT a component of a supervisory union
## 797  1-Regular local school district that is NOT a component of a supervisory union
## 798  1-Regular local school district that is NOT a component of a supervisory union
## 799          5-State agency providing elementary and/or secondary level instruction
## 800          5-State agency providing elementary and/or secondary level instruction
## 801  1-Regular local school district that is NOT a component of a supervisory union
## 802  1-Regular local school district that is NOT a component of a supervisory union
## 803  1-Regular local school district that is NOT a component of a supervisory union
## 804  1-Regular local school district that is NOT a component of a supervisory union
## 805  1-Regular local school district that is NOT a component of a supervisory union
## 806  1-Regular local school district that is NOT a component of a supervisory union
## 807  1-Regular local school district that is NOT a component of a supervisory union
## 808  1-Regular local school district that is NOT a component of a supervisory union
## 809  1-Regular local school district that is NOT a component of a supervisory union
## 810  1-Regular local school district that is NOT a component of a supervisory union
## 811  1-Regular local school district that is NOT a component of a supervisory union
## 812  1-Regular local school district that is NOT a component of a supervisory union
## 813  1-Regular local school district that is NOT a component of a supervisory union
## 814  1-Regular local school district that is NOT a component of a supervisory union
## 815                                      4-Regional Education Service Agency (RESA)
## 816  1-Regular local school district that is NOT a component of a supervisory union
## 817  1-Regular local school district that is NOT a component of a supervisory union
## 818  1-Regular local school district that is NOT a component of a supervisory union
## 819  1-Regular local school district that is NOT a component of a supervisory union
## 820  1-Regular local school district that is NOT a component of a supervisory union
## 821  1-Regular local school district that is NOT a component of a supervisory union
## 822  1-Regular local school district that is NOT a component of a supervisory union
## 823  1-Regular local school district that is NOT a component of a supervisory union
## 824  1-Regular local school district that is NOT a component of a supervisory union
## 825  1-Regular local school district that is NOT a component of a supervisory union
## 826  1-Regular local school district that is NOT a component of a supervisory union
## 827  1-Regular local school district that is NOT a component of a supervisory union
## 828  1-Regular local school district that is NOT a component of a supervisory union
## 829  1-Regular local school district that is NOT a component of a supervisory union
## 830  1-Regular local school district that is NOT a component of a supervisory union
## 831  1-Regular local school district that is NOT a component of a supervisory union
## 832              2-Local school district that is a component of a supervisory union
## 833  1-Regular local school district that is NOT a component of a supervisory union
## 834  1-Regular local school district that is NOT a component of a supervisory union
## 835  1-Regular local school district that is NOT a component of a supervisory union
## 836  1-Regular local school district that is NOT a component of a supervisory union
## 837                                      4-Regional Education Service Agency (RESA)
## 838  1-Regular local school district that is NOT a component of a supervisory union
## 839  1-Regular local school district that is NOT a component of a supervisory union
## 840          5-State agency providing elementary and/or secondary level instruction
## 841  1-Regular local school district that is NOT a component of a supervisory union
## 842  1-Regular local school district that is NOT a component of a supervisory union
## 843  1-Regular local school district that is NOT a component of a supervisory union
## 844  1-Regular local school district that is NOT a component of a supervisory union
## 845  1-Regular local school district that is NOT a component of a supervisory union
## 846  1-Regular local school district that is NOT a component of a supervisory union
## 847  1-Regular local school district that is NOT a component of a supervisory union
## 848  1-Regular local school district that is NOT a component of a supervisory union
## 849  1-Regular local school district that is NOT a component of a supervisory union
## 850  1-Regular local school district that is NOT a component of a supervisory union
## 851  1-Regular local school district that is NOT a component of a supervisory union
## 852  1-Regular local school district that is NOT a component of a supervisory union
## 853  1-Regular local school district that is NOT a component of a supervisory union
## 854  1-Regular local school district that is NOT a component of a supervisory union
## 855              2-Local school district that is a component of a supervisory union
## 856                                                  7-Independent Charter District
## 857  1-Regular local school district that is NOT a component of a supervisory union
## 858  1-Regular local school district that is NOT a component of a supervisory union
## 859  1-Regular local school district that is NOT a component of a supervisory union
## 860  1-Regular local school district that is NOT a component of a supervisory union
## 861  1-Regular local school district that is NOT a component of a supervisory union
## 862  1-Regular local school district that is NOT a component of a supervisory union
## 863  1-Regular local school district that is NOT a component of a supervisory union
## 864          5-State agency providing elementary and/or secondary level instruction
## 865  1-Regular local school district that is NOT a component of a supervisory union
## 866  1-Regular local school district that is NOT a component of a supervisory union
## 867  1-Regular local school district that is NOT a component of a supervisory union
## 868                                      4-Regional Education Service Agency (RESA)
## 869  1-Regular local school district that is NOT a component of a supervisory union
## 870  1-Regular local school district that is NOT a component of a supervisory union
## 871  1-Regular local school district that is NOT a component of a supervisory union
## 872                                                  7-Independent Charter District
## 873  1-Regular local school district that is NOT a component of a supervisory union
## 874  1-Regular local school district that is NOT a component of a supervisory union
## 875  1-Regular local school district that is NOT a component of a supervisory union
## 876  1-Regular local school district that is NOT a component of a supervisory union
## 877                                            9-Specialized public school district
## 878  1-Regular local school district that is NOT a component of a supervisory union
## 879  1-Regular local school district that is NOT a component of a supervisory union
## 880  1-Regular local school district that is NOT a component of a supervisory union
## 881  1-Regular local school district that is NOT a component of a supervisory union
## 882  1-Regular local school district that is NOT a component of a supervisory union
## 883  1-Regular local school district that is NOT a component of a supervisory union
## 884  1-Regular local school district that is NOT a component of a supervisory union
## 885  1-Regular local school district that is NOT a component of a supervisory union
## 886  1-Regular local school district that is NOT a component of a supervisory union
## 887  1-Regular local school district that is NOT a component of a supervisory union
## 888  1-Regular local school district that is NOT a component of a supervisory union
## 889  1-Regular local school district that is NOT a component of a supervisory union
## 890                                      4-Regional Education Service Agency (RESA)
## 891  1-Regular local school district that is NOT a component of a supervisory union
## 892  1-Regular local school district that is NOT a component of a supervisory union
## 893  1-Regular local school district that is NOT a component of a supervisory union
## 894  1-Regular local school district that is NOT a component of a supervisory union
## 895  1-Regular local school district that is NOT a component of a supervisory union
## 896  1-Regular local school district that is NOT a component of a supervisory union
## 897  1-Regular local school district that is NOT a component of a supervisory union
## 898  1-Regular local school district that is NOT a component of a supervisory union
## 899  1-Regular local school district that is NOT a component of a supervisory union
## 900  1-Regular local school district that is NOT a component of a supervisory union
## 901  1-Regular local school district that is NOT a component of a supervisory union
## 902  1-Regular local school district that is NOT a component of a supervisory union
## 903  1-Regular local school district that is NOT a component of a supervisory union
## 904  1-Regular local school district that is NOT a component of a supervisory union
## 905  1-Regular local school district that is NOT a component of a supervisory union
## 906  1-Regular local school district that is NOT a component of a supervisory union
## 907  1-Regular local school district that is NOT a component of a supervisory union
## 908  1-Regular local school district that is NOT a component of a supervisory union
## 909  1-Regular local school district that is NOT a component of a supervisory union
## 910  1-Regular local school district that is NOT a component of a supervisory union
## 911  1-Regular local school district that is NOT a component of a supervisory union
## 912  1-Regular local school district that is NOT a component of a supervisory union
## 913          5-State agency providing elementary and/or secondary level instruction
## 914  1-Regular local school district that is NOT a component of a supervisory union
## 915  1-Regular local school district that is NOT a component of a supervisory union
## 916                                      4-Regional Education Service Agency (RESA)
## 917                                      4-Regional Education Service Agency (RESA)
## 918                                      4-Regional Education Service Agency (RESA)
## 919                                      4-Regional Education Service Agency (RESA)
## 920                                      4-Regional Education Service Agency (RESA)
## 921                                      4-Regional Education Service Agency (RESA)
## 922          5-State agency providing elementary and/or secondary level instruction
## 923  1-Regular local school district that is NOT a component of a supervisory union
## 924  1-Regular local school district that is NOT a component of a supervisory union
## 925  1-Regular local school district that is NOT a component of a supervisory union
## 926  1-Regular local school district that is NOT a component of a supervisory union
## 927  1-Regular local school district that is NOT a component of a supervisory union
## 928  1-Regular local school district that is NOT a component of a supervisory union
## 929          5-State agency providing elementary and/or secondary level instruction
## 930                                      4-Regional Education Service Agency (RESA)
## 931  1-Regular local school district that is NOT a component of a supervisory union
## 932  1-Regular local school district that is NOT a component of a supervisory union
## 933  1-Regular local school district that is NOT a component of a supervisory union
## 934  1-Regular local school district that is NOT a component of a supervisory union
## 935  1-Regular local school district that is NOT a component of a supervisory union
## 936  1-Regular local school district that is NOT a component of a supervisory union
## 937  1-Regular local school district that is NOT a component of a supervisory union
## 938  1-Regular local school district that is NOT a component of a supervisory union
## 939                                                  7-Independent Charter District
## 940  1-Regular local school district that is NOT a component of a supervisory union
## 941  1-Regular local school district that is NOT a component of a supervisory union
## 942  1-Regular local school district that is NOT a component of a supervisory union
## 943  1-Regular local school district that is NOT a component of a supervisory union
## 944  1-Regular local school district that is NOT a component of a supervisory union
## 945  1-Regular local school district that is NOT a component of a supervisory union
## 946  1-Regular local school district that is NOT a component of a supervisory union
## 947  1-Regular local school district that is NOT a component of a supervisory union
## 948  1-Regular local school district that is NOT a component of a supervisory union
## 949  1-Regular local school district that is NOT a component of a supervisory union
## 950  1-Regular local school district that is NOT a component of a supervisory union
## 951  1-Regular local school district that is NOT a component of a supervisory union
## 952  1-Regular local school district that is NOT a component of a supervisory union
## 953  1-Regular local school district that is NOT a component of a supervisory union
## 954  1-Regular local school district that is NOT a component of a supervisory union
## 955  1-Regular local school district that is NOT a component of a supervisory union
## 956  1-Regular local school district that is NOT a component of a supervisory union
## 957  1-Regular local school district that is NOT a component of a supervisory union
## 958  1-Regular local school district that is NOT a component of a supervisory union
## 959  1-Regular local school district that is NOT a component of a supervisory union
## 960  1-Regular local school district that is NOT a component of a supervisory union
## 961  1-Regular local school district that is NOT a component of a supervisory union
## 962  1-Regular local school district that is NOT a component of a supervisory union
## 963  1-Regular local school district that is NOT a component of a supervisory union
## 964  1-Regular local school district that is NOT a component of a supervisory union
## 965  1-Regular local school district that is NOT a component of a supervisory union
## 966  1-Regular local school district that is NOT a component of a supervisory union
## 967  1-Regular local school district that is NOT a component of a supervisory union
## 968  1-Regular local school district that is NOT a component of a supervisory union
## 969  1-Regular local school district that is NOT a component of a supervisory union
## 970  1-Regular local school district that is NOT a component of a supervisory union
## 971  1-Regular local school district that is NOT a component of a supervisory union
## 972  1-Regular local school district that is NOT a component of a supervisory union
## 973                                      4-Regional Education Service Agency (RESA)
## 974  1-Regular local school district that is NOT a component of a supervisory union
## 975  1-Regular local school district that is NOT a component of a supervisory union
## 976  1-Regular local school district that is NOT a component of a supervisory union
## 977  1-Regular local school district that is NOT a component of a supervisory union
## 978  1-Regular local school district that is NOT a component of a supervisory union
## 979  1-Regular local school district that is NOT a component of a supervisory union
## 980  1-Regular local school district that is NOT a component of a supervisory union
## 981  1-Regular local school district that is NOT a component of a supervisory union
## 982  1-Regular local school district that is NOT a component of a supervisory union
## 983  1-Regular local school district that is NOT a component of a supervisory union
## 984  1-Regular local school district that is NOT a component of a supervisory union
## 985  1-Regular local school district that is NOT a component of a supervisory union
## 986  1-Regular local school district that is NOT a component of a supervisory union
## 987          5-State agency providing elementary and/or secondary level instruction
## 988          5-State agency providing elementary and/or secondary level instruction
## 989          5-State agency providing elementary and/or secondary level instruction
## 990  1-Regular local school district that is NOT a component of a supervisory union
## 991  1-Regular local school district that is NOT a component of a supervisory union
## 992  1-Regular local school district that is NOT a component of a supervisory union
## 993  1-Regular local school district that is NOT a component of a supervisory union
## 994          5-State agency providing elementary and/or secondary level instruction
## 995  1-Regular local school district that is NOT a component of a supervisory union
## 996  1-Regular local school district that is NOT a component of a supervisory union
## 997  1-Regular local school district that is NOT a component of a supervisory union
## 998  1-Regular local school district that is NOT a component of a supervisory union
## 999  1-Regular local school district that is NOT a component of a supervisory union
## 1000                                     4-Regional Education Service Agency (RESA)
## 1001 1-Regular local school district that is NOT a component of a supervisory union
## 1002 1-Regular local school district that is NOT a component of a supervisory union
## 1003 1-Regular local school district that is NOT a component of a supervisory union
## 1004 1-Regular local school district that is NOT a component of a supervisory union
## 1005 1-Regular local school district that is NOT a component of a supervisory union
## 1006         5-State agency providing elementary and/or secondary level instruction
## 1007 1-Regular local school district that is NOT a component of a supervisory union
## 1008 1-Regular local school district that is NOT a component of a supervisory union
## 1009 1-Regular local school district that is NOT a component of a supervisory union
## 1010         5-State agency providing elementary and/or secondary level instruction
## 1011 1-Regular local school district that is NOT a component of a supervisory union
## 1012 1-Regular local school district that is NOT a component of a supervisory union
## 1013 1-Regular local school district that is NOT a component of a supervisory union
## 1014 1-Regular local school district that is NOT a component of a supervisory union
## 1015 1-Regular local school district that is NOT a component of a supervisory union
## 1016 1-Regular local school district that is NOT a component of a supervisory union
## 1017 1-Regular local school district that is NOT a component of a supervisory union
## 1018 1-Regular local school district that is NOT a component of a supervisory union
## 1019                                     4-Regional Education Service Agency (RESA)
## 1020 1-Regular local school district that is NOT a component of a supervisory union
## 1021 1-Regular local school district that is NOT a component of a supervisory union
## 1022 1-Regular local school district that is NOT a component of a supervisory union
## 1023 1-Regular local school district that is NOT a component of a supervisory union
## 1024 1-Regular local school district that is NOT a component of a supervisory union
## 1025 1-Regular local school district that is NOT a component of a supervisory union
## 1026 1-Regular local school district that is NOT a component of a supervisory union
## 1027 1-Regular local school district that is NOT a component of a supervisory union
## 1028 1-Regular local school district that is NOT a component of a supervisory union
## 1029 1-Regular local school district that is NOT a component of a supervisory union
## 1030 1-Regular local school district that is NOT a component of a supervisory union
## 1031 1-Regular local school district that is NOT a component of a supervisory union
## 1032 1-Regular local school district that is NOT a component of a supervisory union
## 1033 1-Regular local school district that is NOT a component of a supervisory union
## 1034 1-Regular local school district that is NOT a component of a supervisory union
## 1035 1-Regular local school district that is NOT a component of a supervisory union
## 1036 1-Regular local school district that is NOT a component of a supervisory union
## 1037 1-Regular local school district that is NOT a component of a supervisory union
## 1038 1-Regular local school district that is NOT a component of a supervisory union
## 1039                                                 7-Independent Charter District
## 1040 1-Regular local school district that is NOT a component of a supervisory union
## 1041 1-Regular local school district that is NOT a component of a supervisory union
## 1042 1-Regular local school district that is NOT a component of a supervisory union
## 1043 1-Regular local school district that is NOT a component of a supervisory union
## 1044 1-Regular local school district that is NOT a component of a supervisory union
## 1045 1-Regular local school district that is NOT a component of a supervisory union
## 1046         5-State agency providing elementary and/or secondary level instruction
## 1047 1-Regular local school district that is NOT a component of a supervisory union
## 1048 1-Regular local school district that is NOT a component of a supervisory union
## 1049 1-Regular local school district that is NOT a component of a supervisory union
## 1050 1-Regular local school district that is NOT a component of a supervisory union
## 1051 1-Regular local school district that is NOT a component of a supervisory union
## 1052 1-Regular local school district that is NOT a component of a supervisory union
## 1053 1-Regular local school district that is NOT a component of a supervisory union
## 1054 1-Regular local school district that is NOT a component of a supervisory union
## 1055 1-Regular local school district that is NOT a component of a supervisory union
## 1056 1-Regular local school district that is NOT a component of a supervisory union
## 1057 1-Regular local school district that is NOT a component of a supervisory union
## 1058 1-Regular local school district that is NOT a component of a supervisory union
## 1059 1-Regular local school district that is NOT a component of a supervisory union
## 1060                                     4-Regional Education Service Agency (RESA)
## 1061 1-Regular local school district that is NOT a component of a supervisory union
## 1062 1-Regular local school district that is NOT a component of a supervisory union
## 1063 1-Regular local school district that is NOT a component of a supervisory union
## 1064 1-Regular local school district that is NOT a component of a supervisory union
## 1065 1-Regular local school district that is NOT a component of a supervisory union
## 1066 1-Regular local school district that is NOT a component of a supervisory union
## 1067 1-Regular local school district that is NOT a component of a supervisory union
## 1068 1-Regular local school district that is NOT a component of a supervisory union
## 1069 1-Regular local school district that is NOT a component of a supervisory union
## 1070 1-Regular local school district that is NOT a component of a supervisory union
## 1071 1-Regular local school district that is NOT a component of a supervisory union
## 1072 1-Regular local school district that is NOT a component of a supervisory union
## 1073 1-Regular local school district that is NOT a component of a supervisory union
## 1074 1-Regular local school district that is NOT a component of a supervisory union
## 1075 1-Regular local school district that is NOT a component of a supervisory union
## 1076                                     4-Regional Education Service Agency (RESA)
## 1077 1-Regular local school district that is NOT a component of a supervisory union
## 1078 1-Regular local school district that is NOT a component of a supervisory union
## 1079 1-Regular local school district that is NOT a component of a supervisory union
## 1080 1-Regular local school district that is NOT a component of a supervisory union
## 1081 1-Regular local school district that is NOT a component of a supervisory union
## 1082 1-Regular local school district that is NOT a component of a supervisory union
## 1083 1-Regular local school district that is NOT a component of a supervisory union
## 1084 1-Regular local school district that is NOT a component of a supervisory union
## 1085 1-Regular local school district that is NOT a component of a supervisory union
## 1086 1-Regular local school district that is NOT a component of a supervisory union
## 1087 1-Regular local school district that is NOT a component of a supervisory union
## 1088 1-Regular local school district that is NOT a component of a supervisory union
## 1089 1-Regular local school district that is NOT a component of a supervisory union
## 1090 1-Regular local school district that is NOT a component of a supervisory union
## 1091 1-Regular local school district that is NOT a component of a supervisory union
## 1092 1-Regular local school district that is NOT a component of a supervisory union
## 1093 1-Regular local school district that is NOT a component of a supervisory union
## 1094 1-Regular local school district that is NOT a component of a supervisory union
## 1095 1-Regular local school district that is NOT a component of a supervisory union
## 1096 1-Regular local school district that is NOT a component of a supervisory union
## 1097 1-Regular local school district that is NOT a component of a supervisory union
## 1098 1-Regular local school district that is NOT a component of a supervisory union
## 1099 1-Regular local school district that is NOT a component of a supervisory union
## 1100 1-Regular local school district that is NOT a component of a supervisory union
## 1101 1-Regular local school district that is NOT a component of a supervisory union
## 1102 1-Regular local school district that is NOT a component of a supervisory union
## 1103 1-Regular local school district that is NOT a component of a supervisory union
## 1104 1-Regular local school district that is NOT a component of a supervisory union
## 1105         5-State agency providing elementary and/or secondary level instruction
## 1106 1-Regular local school district that is NOT a component of a supervisory union
## 1107         5-State agency providing elementary and/or secondary level instruction
## 1108 1-Regular local school district that is NOT a component of a supervisory union
## 1109 1-Regular local school district that is NOT a component of a supervisory union
## 1110 1-Regular local school district that is NOT a component of a supervisory union
## 1111 1-Regular local school district that is NOT a component of a supervisory union
## 1112 1-Regular local school district that is NOT a component of a supervisory union
## 1113 1-Regular local school district that is NOT a component of a supervisory union
## 1114 1-Regular local school district that is NOT a component of a supervisory union
## 1115 1-Regular local school district that is NOT a component of a supervisory union
## 1116 1-Regular local school district that is NOT a component of a supervisory union
## 1117 1-Regular local school district that is NOT a component of a supervisory union
## 1118 1-Regular local school district that is NOT a component of a supervisory union
## 1119 1-Regular local school district that is NOT a component of a supervisory union
## 1120 1-Regular local school district that is NOT a component of a supervisory union
## 1121 1-Regular local school district that is NOT a component of a supervisory union
## 1122 1-Regular local school district that is NOT a component of a supervisory union
## 1123 1-Regular local school district that is NOT a component of a supervisory union
## 1124                                                 7-Independent Charter District
## 1125 1-Regular local school district that is NOT a component of a supervisory union
## 1126 1-Regular local school district that is NOT a component of a supervisory union
## 1127 1-Regular local school district that is NOT a component of a supervisory union
## 1128 1-Regular local school district that is NOT a component of a supervisory union
## 1129 1-Regular local school district that is NOT a component of a supervisory union
## 1130 1-Regular local school district that is NOT a component of a supervisory union
## 1131 1-Regular local school district that is NOT a component of a supervisory union
## 1132 1-Regular local school district that is NOT a component of a supervisory union
## 1133 1-Regular local school district that is NOT a component of a supervisory union
## 1134 1-Regular local school district that is NOT a component of a supervisory union
## 1135 1-Regular local school district that is NOT a component of a supervisory union
## 1136 1-Regular local school district that is NOT a component of a supervisory union
## 1137 1-Regular local school district that is NOT a component of a supervisory union
## 1138 1-Regular local school district that is NOT a component of a supervisory union
## 1139 1-Regular local school district that is NOT a component of a supervisory union
## 1140 1-Regular local school district that is NOT a component of a supervisory union
## 1141 1-Regular local school district that is NOT a component of a supervisory union
## 1142 1-Regular local school district that is NOT a component of a supervisory union
## 1143 1-Regular local school district that is NOT a component of a supervisory union
## 1144 1-Regular local school district that is NOT a component of a supervisory union
## 1145 1-Regular local school district that is NOT a component of a supervisory union
## 1146 1-Regular local school district that is NOT a component of a supervisory union
## 1147 1-Regular local school district that is NOT a component of a supervisory union
## 1148 1-Regular local school district that is NOT a component of a supervisory union
## 1149 1-Regular local school district that is NOT a component of a supervisory union
## 1150 1-Regular local school district that is NOT a component of a supervisory union
## 1151 1-Regular local school district that is NOT a component of a supervisory union
## 1152 1-Regular local school district that is NOT a component of a supervisory union
## 1153 1-Regular local school district that is NOT a component of a supervisory union
## 1154                                                 7-Independent Charter District
## 1155 1-Regular local school district that is NOT a component of a supervisory union
## 1156             2-Local school district that is a component of a supervisory union
## 1157 1-Regular local school district that is NOT a component of a supervisory union
## 1158 1-Regular local school district that is NOT a component of a supervisory union
## 1159 1-Regular local school district that is NOT a component of a supervisory union
## 1160 1-Regular local school district that is NOT a component of a supervisory union
## 1161 1-Regular local school district that is NOT a component of a supervisory union
## 1162 1-Regular local school district that is NOT a component of a supervisory union
## 1163 1-Regular local school district that is NOT a component of a supervisory union
## 1164 1-Regular local school district that is NOT a component of a supervisory union
## 1165 1-Regular local school district that is NOT a component of a supervisory union
## 1166 1-Regular local school district that is NOT a component of a supervisory union
## 1167 1-Regular local school district that is NOT a component of a supervisory union
## 1168 1-Regular local school district that is NOT a component of a supervisory union
## 1169 1-Regular local school district that is NOT a component of a supervisory union
## 1170 1-Regular local school district that is NOT a component of a supervisory union
## 1171 1-Regular local school district that is NOT a component of a supervisory union
## 1172 1-Regular local school district that is NOT a component of a supervisory union
## 1173 1-Regular local school district that is NOT a component of a supervisory union
## 1174                                     4-Regional Education Service Agency (RESA)
## 1175 1-Regular local school district that is NOT a component of a supervisory union
## 1176         5-State agency providing elementary and/or secondary level instruction
## 1177 1-Regular local school district that is NOT a component of a supervisory union
## 1178 1-Regular local school district that is NOT a component of a supervisory union
## 1179                                     4-Regional Education Service Agency (RESA)
## 1180 1-Regular local school district that is NOT a component of a supervisory union
## 1181                                                 7-Independent Charter District
## 1182         5-State agency providing elementary and/or secondary level instruction
## 1183 1-Regular local school district that is NOT a component of a supervisory union
## 1184 1-Regular local school district that is NOT a component of a supervisory union
## 1185 1-Regular local school district that is NOT a component of a supervisory union
## 1186 1-Regular local school district that is NOT a component of a supervisory union
## 1187                                                 7-Independent Charter District
## 1188 1-Regular local school district that is NOT a component of a supervisory union
## 1189 1-Regular local school district that is NOT a component of a supervisory union
## 1190 1-Regular local school district that is NOT a component of a supervisory union
## 1191 1-Regular local school district that is NOT a component of a supervisory union
## 1192 1-Regular local school district that is NOT a component of a supervisory union
## 1193 1-Regular local school district that is NOT a component of a supervisory union
## 1194 1-Regular local school district that is NOT a component of a supervisory union
## 1195                                                 7-Independent Charter District
## 1196 1-Regular local school district that is NOT a component of a supervisory union
## 1197 1-Regular local school district that is NOT a component of a supervisory union
## 1198 1-Regular local school district that is NOT a component of a supervisory union
## 1199                                     4-Regional Education Service Agency (RESA)
## 1200             2-Local school district that is a component of a supervisory union
## 1201         5-State agency providing elementary and/or secondary level instruction
## 1202         5-State agency providing elementary and/or secondary level instruction
## 1203 1-Regular local school district that is NOT a component of a supervisory union
## 1204 1-Regular local school district that is NOT a component of a supervisory union
## 1205 1-Regular local school district that is NOT a component of a supervisory union
## 1206 1-Regular local school district that is NOT a component of a supervisory union
## 1207 1-Regular local school district that is NOT a component of a supervisory union
## 1208 1-Regular local school district that is NOT a component of a supervisory union
## 1209 1-Regular local school district that is NOT a component of a supervisory union
## 1210 1-Regular local school district that is NOT a component of a supervisory union
## 1211                                                 7-Independent Charter District
## 1212                                                 7-Independent Charter District
## 1213                                                 7-Independent Charter District
## 1214                                                 7-Independent Charter District
## 1215 1-Regular local school district that is NOT a component of a supervisory union
## 1216 1-Regular local school district that is NOT a component of a supervisory union
## 1217 1-Regular local school district that is NOT a component of a supervisory union
## 1218 1-Regular local school district that is NOT a component of a supervisory union
## 1219 1-Regular local school district that is NOT a component of a supervisory union
## 1220 1-Regular local school district that is NOT a component of a supervisory union
## 1221 1-Regular local school district that is NOT a component of a supervisory union
## 1222 1-Regular local school district that is NOT a component of a supervisory union
## 1223 1-Regular local school district that is NOT a component of a supervisory union
## 1224         5-State agency providing elementary and/or secondary level instruction
## 1225 1-Regular local school district that is NOT a component of a supervisory union
## 1226 1-Regular local school district that is NOT a component of a supervisory union
## 1227 1-Regular local school district that is NOT a component of a supervisory union
## 1228 1-Regular local school district that is NOT a component of a supervisory union
## 1229 1-Regular local school district that is NOT a component of a supervisory union
## 1230 1-Regular local school district that is NOT a component of a supervisory union
## 1231 1-Regular local school district that is NOT a component of a supervisory union
## 1232         5-State agency providing elementary and/or secondary level instruction
## 1233 1-Regular local school district that is NOT a component of a supervisory union
## 1234 1-Regular local school district that is NOT a component of a supervisory union
## 1235 1-Regular local school district that is NOT a component of a supervisory union
## 1236         5-State agency providing elementary and/or secondary level instruction
## 1237 1-Regular local school district that is NOT a component of a supervisory union
## 1238 1-Regular local school district that is NOT a component of a supervisory union
## 1239 1-Regular local school district that is NOT a component of a supervisory union
## 1240 1-Regular local school district that is NOT a component of a supervisory union
## 1241 1-Regular local school district that is NOT a component of a supervisory union
## 1242 1-Regular local school district that is NOT a component of a supervisory union
## 1243             2-Local school district that is a component of a supervisory union
## 1244 1-Regular local school district that is NOT a component of a supervisory union
## 1245 1-Regular local school district that is NOT a component of a supervisory union
## 1246 1-Regular local school district that is NOT a component of a supervisory union
## 1247                                     4-Regional Education Service Agency (RESA)
## 1248 1-Regular local school district that is NOT a component of a supervisory union
## 1249 1-Regular local school district that is NOT a component of a supervisory union
## 1250 1-Regular local school district that is NOT a component of a supervisory union
## 1251 1-Regular local school district that is NOT a component of a supervisory union
## 1252 1-Regular local school district that is NOT a component of a supervisory union
## 1253 1-Regular local school district that is NOT a component of a supervisory union
## 1254 1-Regular local school district that is NOT a component of a supervisory union
## 1255 1-Regular local school district that is NOT a component of a supervisory union
## 1256 1-Regular local school district that is NOT a component of a supervisory union
## 1257 1-Regular local school district that is NOT a component of a supervisory union
## 1258 1-Regular local school district that is NOT a component of a supervisory union
## 1259 1-Regular local school district that is NOT a component of a supervisory union
## 1260 1-Regular local school district that is NOT a component of a supervisory union
## 1261 1-Regular local school district that is NOT a component of a supervisory union
## 1262 1-Regular local school district that is NOT a component of a supervisory union
## 1263 1-Regular local school district that is NOT a component of a supervisory union
## 1264 1-Regular local school district that is NOT a component of a supervisory union
## 1265                                                 7-Independent Charter District
## 1266 1-Regular local school district that is NOT a component of a supervisory union
## 1267             2-Local school district that is a component of a supervisory union
## 1268 1-Regular local school district that is NOT a component of a supervisory union
## 1269 1-Regular local school district that is NOT a component of a supervisory union
## 1270 1-Regular local school district that is NOT a component of a supervisory union
## 1271 1-Regular local school district that is NOT a component of a supervisory union
## 1272 1-Regular local school district that is NOT a component of a supervisory union
## 1273 1-Regular local school district that is NOT a component of a supervisory union
## 1274 1-Regular local school district that is NOT a component of a supervisory union
## 1275                                                 7-Independent Charter District
## 1276         5-State agency providing elementary and/or secondary level instruction
## 1277 1-Regular local school district that is NOT a component of a supervisory union
## 1278         5-State agency providing elementary and/or secondary level instruction
## 1279         5-State agency providing elementary and/or secondary level instruction
## 1280 1-Regular local school district that is NOT a component of a supervisory union
## 1281 1-Regular local school district that is NOT a component of a supervisory union
## 1282 1-Regular local school district that is NOT a component of a supervisory union
## 1283 1-Regular local school district that is NOT a component of a supervisory union
## 1284 1-Regular local school district that is NOT a component of a supervisory union
## 1285 1-Regular local school district that is NOT a component of a supervisory union
## 1286 1-Regular local school district that is NOT a component of a supervisory union
## 1287 1-Regular local school district that is NOT a component of a supervisory union
## 1288 1-Regular local school district that is NOT a component of a supervisory union
## 1289 1-Regular local school district that is NOT a component of a supervisory union
## 1290                                                 7-Independent Charter District
## 1291 1-Regular local school district that is NOT a component of a supervisory union
## 1292 1-Regular local school district that is NOT a component of a supervisory union
## 1293 1-Regular local school district that is NOT a component of a supervisory union
## 1294 1-Regular local school district that is NOT a component of a supervisory union
## 1295 1-Regular local school district that is NOT a component of a supervisory union
## 1296 1-Regular local school district that is NOT a component of a supervisory union
## 1297 1-Regular local school district that is NOT a component of a supervisory union
## 1298 1-Regular local school district that is NOT a component of a supervisory union
## 1299 1-Regular local school district that is NOT a component of a supervisory union
## 1300 1-Regular local school district that is NOT a component of a supervisory union
## 1301 1-Regular local school district that is NOT a component of a supervisory union
## 1302                                     4-Regional Education Service Agency (RESA)
## 1303 1-Regular local school district that is NOT a component of a supervisory union
## 1304 1-Regular local school district that is NOT a component of a supervisory union
## 1305 1-Regular local school district that is NOT a component of a supervisory union
## 1306 1-Regular local school district that is NOT a component of a supervisory union
## 1307                                                 7-Independent Charter District
## 1308                                                 7-Independent Charter District
## 1309                                                 7-Independent Charter District
## 1310                                                 7-Independent Charter District
## 1311                                                 7-Independent Charter District
## 1312 1-Regular local school district that is NOT a component of a supervisory union
## 1313 1-Regular local school district that is NOT a component of a supervisory union
## 1314 1-Regular local school district that is NOT a component of a supervisory union
## 1315 1-Regular local school district that is NOT a component of a supervisory union
## 1316 1-Regular local school district that is NOT a component of a supervisory union
## 1317                                                 7-Independent Charter District
## 1318                                                 7-Independent Charter District
## 1319 1-Regular local school district that is NOT a component of a supervisory union
## 1320 1-Regular local school district that is NOT a component of a supervisory union
## 1321 1-Regular local school district that is NOT a component of a supervisory union
## 1322         5-State agency providing elementary and/or secondary level instruction
## 1323 1-Regular local school district that is NOT a component of a supervisory union
## 1324 1-Regular local school district that is NOT a component of a supervisory union
## 1325 1-Regular local school district that is NOT a component of a supervisory union
## 1326 1-Regular local school district that is NOT a component of a supervisory union
## 1327 1-Regular local school district that is NOT a component of a supervisory union
## 1328 1-Regular local school district that is NOT a component of a supervisory union
## 1329 1-Regular local school district that is NOT a component of a supervisory union
## 1330 1-Regular local school district that is NOT a component of a supervisory union
## 1331 1-Regular local school district that is NOT a component of a supervisory union
## 1332 1-Regular local school district that is NOT a component of a supervisory union
## 1333         5-State agency providing elementary and/or secondary level instruction
## 1334 1-Regular local school district that is NOT a component of a supervisory union
## 1335 1-Regular local school district that is NOT a component of a supervisory union
## 1336 1-Regular local school district that is NOT a component of a supervisory union
## 1337 1-Regular local school district that is NOT a component of a supervisory union
## 1338 1-Regular local school district that is NOT a component of a supervisory union
## 1339 1-Regular local school district that is NOT a component of a supervisory union
## 1340 1-Regular local school district that is NOT a component of a supervisory union
## 1341         5-State agency providing elementary and/or secondary level instruction
## 1342 1-Regular local school district that is NOT a component of a supervisory union
## 1343 1-Regular local school district that is NOT a component of a supervisory union
## 1344 1-Regular local school district that is NOT a component of a supervisory union
## 1345 1-Regular local school district that is NOT a component of a supervisory union
## 1346 1-Regular local school district that is NOT a component of a supervisory union
## 1347 1-Regular local school district that is NOT a component of a supervisory union
## 1348 1-Regular local school district that is NOT a component of a supervisory union
## 1349 1-Regular local school district that is NOT a component of a supervisory union
## 1350         5-State agency providing elementary and/or secondary level instruction
## 1351 1-Regular local school district that is NOT a component of a supervisory union
## 1352 1-Regular local school district that is NOT a component of a supervisory union
## 1353 1-Regular local school district that is NOT a component of a supervisory union
## 1354 1-Regular local school district that is NOT a component of a supervisory union
## 1355 1-Regular local school district that is NOT a component of a supervisory union
## 1356 1-Regular local school district that is NOT a component of a supervisory union
## 1357 1-Regular local school district that is NOT a component of a supervisory union
## 1358 1-Regular local school district that is NOT a component of a supervisory union
## 1359 1-Regular local school district that is NOT a component of a supervisory union
## 1360 1-Regular local school district that is NOT a component of a supervisory union
## 1361 1-Regular local school district that is NOT a component of a supervisory union
## 1362 1-Regular local school district that is NOT a component of a supervisory union
## 1363 1-Regular local school district that is NOT a component of a supervisory union
## 1364 1-Regular local school district that is NOT a component of a supervisory union
## 1365 1-Regular local school district that is NOT a component of a supervisory union
## 1366 1-Regular local school district that is NOT a component of a supervisory union
## 1367 1-Regular local school district that is NOT a component of a supervisory union
## 1368 1-Regular local school district that is NOT a component of a supervisory union
## 1369 1-Regular local school district that is NOT a component of a supervisory union
## 1370 1-Regular local school district that is NOT a component of a supervisory union
## 1371 1-Regular local school district that is NOT a component of a supervisory union
## 1372 1-Regular local school district that is NOT a component of a supervisory union
## 1373 1-Regular local school district that is NOT a component of a supervisory union
## 1374 1-Regular local school district that is NOT a component of a supervisory union
## 1375 1-Regular local school district that is NOT a component of a supervisory union
## 1376 1-Regular local school district that is NOT a component of a supervisory union
## 1377 1-Regular local school district that is NOT a component of a supervisory union
## 1378         5-State agency providing elementary and/or secondary level instruction
## 1379         5-State agency providing elementary and/or secondary level instruction
## 1380                                                 7-Independent Charter District
## 1381 1-Regular local school district that is NOT a component of a supervisory union
## 1382 1-Regular local school district that is NOT a component of a supervisory union
## 1383 1-Regular local school district that is NOT a component of a supervisory union
## 1384 1-Regular local school district that is NOT a component of a supervisory union
## 1385                                                 7-Independent Charter District
## 1386 1-Regular local school district that is NOT a component of a supervisory union
## 1387 1-Regular local school district that is NOT a component of a supervisory union
## 1388 1-Regular local school district that is NOT a component of a supervisory union
## 1389 1-Regular local school district that is NOT a component of a supervisory union
## 1390 1-Regular local school district that is NOT a component of a supervisory union
## 1391 1-Regular local school district that is NOT a component of a supervisory union
## 1392 1-Regular local school district that is NOT a component of a supervisory union
## 1393 1-Regular local school district that is NOT a component of a supervisory union
## 1394 1-Regular local school district that is NOT a component of a supervisory union
## 1395 1-Regular local school district that is NOT a component of a supervisory union
## 1396 1-Regular local school district that is NOT a component of a supervisory union
## 1397 1-Regular local school district that is NOT a component of a supervisory union
## 1398 1-Regular local school district that is NOT a component of a supervisory union
## 1399 1-Regular local school district that is NOT a component of a supervisory union
## 1400 1-Regular local school district that is NOT a component of a supervisory union
## 1401                                                 7-Independent Charter District
## 1402 1-Regular local school district that is NOT a component of a supervisory union
## 1403 1-Regular local school district that is NOT a component of a supervisory union
## 1404 1-Regular local school district that is NOT a component of a supervisory union
## 1405 1-Regular local school district that is NOT a component of a supervisory union
## 1406 1-Regular local school district that is NOT a component of a supervisory union
## 1407 1-Regular local school district that is NOT a component of a supervisory union
## 1408 1-Regular local school district that is NOT a component of a supervisory union
## 1409 1-Regular local school district that is NOT a component of a supervisory union
## 1410 1-Regular local school district that is NOT a component of a supervisory union
## 1411 1-Regular local school district that is NOT a component of a supervisory union
## 1412 1-Regular local school district that is NOT a component of a supervisory union
## 1413 1-Regular local school district that is NOT a component of a supervisory union
## 1414 1-Regular local school district that is NOT a component of a supervisory union
## 1415 1-Regular local school district that is NOT a component of a supervisory union
## 1416 1-Regular local school district that is NOT a component of a supervisory union
## 1417 1-Regular local school district that is NOT a component of a supervisory union
## 1418 1-Regular local school district that is NOT a component of a supervisory union
## 1419 1-Regular local school district that is NOT a component of a supervisory union
## 1420 1-Regular local school district that is NOT a component of a supervisory union
## 1421 1-Regular local school district that is NOT a component of a supervisory union
## 1422 1-Regular local school district that is NOT a component of a supervisory union
## 1423 1-Regular local school district that is NOT a component of a supervisory union
## 1424 1-Regular local school district that is NOT a component of a supervisory union
## 1425 1-Regular local school district that is NOT a component of a supervisory union
## 1426 1-Regular local school district that is NOT a component of a supervisory union
## 1427 1-Regular local school district that is NOT a component of a supervisory union
## 1428 1-Regular local school district that is NOT a component of a supervisory union
## 1429 1-Regular local school district that is NOT a component of a supervisory union
## 1430 1-Regular local school district that is NOT a component of a supervisory union
## 1431 1-Regular local school district that is NOT a component of a supervisory union
## 1432                                                 7-Independent Charter District
## 1433 1-Regular local school district that is NOT a component of a supervisory union
## 1434 1-Regular local school district that is NOT a component of a supervisory union
## 1435 1-Regular local school district that is NOT a component of a supervisory union
## 1436 1-Regular local school district that is NOT a component of a supervisory union
## 1437 1-Regular local school district that is NOT a component of a supervisory union
## 1438                                     4-Regional Education Service Agency (RESA)
## 1439 1-Regular local school district that is NOT a component of a supervisory union
## 1440 1-Regular local school district that is NOT a component of a supervisory union
## 1441 1-Regular local school district that is NOT a component of a supervisory union
## 1442 1-Regular local school district that is NOT a component of a supervisory union
## 1443 1-Regular local school district that is NOT a component of a supervisory union
## 1444 1-Regular local school district that is NOT a component of a supervisory union
## 1445 1-Regular local school district that is NOT a component of a supervisory union
## 1446 1-Regular local school district that is NOT a component of a supervisory union
## 1447         5-State agency providing elementary and/or secondary level instruction
## 1448 1-Regular local school district that is NOT a component of a supervisory union
## 1449 1-Regular local school district that is NOT a component of a supervisory union
## 1450 1-Regular local school district that is NOT a component of a supervisory union
## 1451 1-Regular local school district that is NOT a component of a supervisory union
## 1452 1-Regular local school district that is NOT a component of a supervisory union
## 1453 1-Regular local school district that is NOT a component of a supervisory union
## 1454 1-Regular local school district that is NOT a component of a supervisory union
## 1455 1-Regular local school district that is NOT a component of a supervisory union
## 1456                                     4-Regional Education Service Agency (RESA)
## 1457 1-Regular local school district that is NOT a component of a supervisory union
## 1458 1-Regular local school district that is NOT a component of a supervisory union
## 1459         5-State agency providing elementary and/or secondary level instruction
## 1460 1-Regular local school district that is NOT a component of a supervisory union
## 1461 1-Regular local school district that is NOT a component of a supervisory union
## 1462 1-Regular local school district that is NOT a component of a supervisory union
## 1463 1-Regular local school district that is NOT a component of a supervisory union
## 1464 1-Regular local school district that is NOT a component of a supervisory union
## 1465 1-Regular local school district that is NOT a component of a supervisory union
## 1466 1-Regular local school district that is NOT a component of a supervisory union
## 1467 1-Regular local school district that is NOT a component of a supervisory union
## 1468                                                 7-Independent Charter District
## 1469 1-Regular local school district that is NOT a component of a supervisory union
## 1470 1-Regular local school district that is NOT a component of a supervisory union
## 1471 1-Regular local school district that is NOT a component of a supervisory union
## 1472 1-Regular local school district that is NOT a component of a supervisory union
## 1473                                                 7-Independent Charter District
## 1474                                                 7-Independent Charter District
## 1475                                     4-Regional Education Service Agency (RESA)
## 1476 1-Regular local school district that is NOT a component of a supervisory union
## 1477 1-Regular local school district that is NOT a component of a supervisory union
## 1478 1-Regular local school district that is NOT a component of a supervisory union
## 1479 1-Regular local school district that is NOT a component of a supervisory union
## 1480 1-Regular local school district that is NOT a component of a supervisory union
## 1481 1-Regular local school district that is NOT a component of a supervisory union
## 1482                                     4-Regional Education Service Agency (RESA)
## 1483 1-Regular local school district that is NOT a component of a supervisory union
## 1484 1-Regular local school district that is NOT a component of a supervisory union
## 1485 1-Regular local school district that is NOT a component of a supervisory union
## 1486 1-Regular local school district that is NOT a component of a supervisory union
## 1487 1-Regular local school district that is NOT a component of a supervisory union
## 1488 1-Regular local school district that is NOT a component of a supervisory union
## 1489 1-Regular local school district that is NOT a component of a supervisory union
## 1490 1-Regular local school district that is NOT a component of a supervisory union
## 1491 1-Regular local school district that is NOT a component of a supervisory union
## 1492 1-Regular local school district that is NOT a component of a supervisory union
## 1493 1-Regular local school district that is NOT a component of a supervisory union
## 1494 1-Regular local school district that is NOT a component of a supervisory union
## 1495 1-Regular local school district that is NOT a component of a supervisory union
## 1496 1-Regular local school district that is NOT a component of a supervisory union
## 1497 1-Regular local school district that is NOT a component of a supervisory union
## 1498 1-Regular local school district that is NOT a component of a supervisory union
## 1499 1-Regular local school district that is NOT a component of a supervisory union
## 1500 1-Regular local school district that is NOT a component of a supervisory union
## 1501 1-Regular local school district that is NOT a component of a supervisory union
## 1502 1-Regular local school district that is NOT a component of a supervisory union
## 1503 1-Regular local school district that is NOT a component of a supervisory union
## 1504 1-Regular local school district that is NOT a component of a supervisory union
## 1505 1-Regular local school district that is NOT a component of a supervisory union
## 1506 1-Regular local school district that is NOT a component of a supervisory union
## 1507 1-Regular local school district that is NOT a component of a supervisory union
## 1508 1-Regular local school district that is NOT a component of a supervisory union
## 1509 1-Regular local school district that is NOT a component of a supervisory union
## 1510 1-Regular local school district that is NOT a component of a supervisory union
## 1511 1-Regular local school district that is NOT a component of a supervisory union
## 1512 1-Regular local school district that is NOT a component of a supervisory union
## 1513 1-Regular local school district that is NOT a component of a supervisory union
## 1514                                     4-Regional Education Service Agency (RESA)
## 1515 1-Regular local school district that is NOT a component of a supervisory union
## 1516 1-Regular local school district that is NOT a component of a supervisory union
## 1517 1-Regular local school district that is NOT a component of a supervisory union
## 1518 1-Regular local school district that is NOT a component of a supervisory union
## 1519 1-Regular local school district that is NOT a component of a supervisory union
## 1520 1-Regular local school district that is NOT a component of a supervisory union
## 1521 1-Regular local school district that is NOT a component of a supervisory union
## 1522 1-Regular local school district that is NOT a component of a supervisory union
## 1523 1-Regular local school district that is NOT a component of a supervisory union
## 1524 1-Regular local school district that is NOT a component of a supervisory union
## 1525         5-State agency providing elementary and/or secondary level instruction
## 1526         5-State agency providing elementary and/or secondary level instruction
## 1527 1-Regular local school district that is NOT a component of a supervisory union
## 1528                                     4-Regional Education Service Agency (RESA)
## 1529 1-Regular local school district that is NOT a component of a supervisory union
## 1530 1-Regular local school district that is NOT a component of a supervisory union
## 1531 1-Regular local school district that is NOT a component of a supervisory union
## 1532         5-State agency providing elementary and/or secondary level instruction
## 1533         5-State agency providing elementary and/or secondary level instruction
## 1534 1-Regular local school district that is NOT a component of a supervisory union
## 1535 1-Regular local school district that is NOT a component of a supervisory union
## 1536 1-Regular local school district that is NOT a component of a supervisory union
## 1537 1-Regular local school district that is NOT a component of a supervisory union
## 1538 1-Regular local school district that is NOT a component of a supervisory union
## 1539                                     4-Regional Education Service Agency (RESA)
## 1540 1-Regular local school district that is NOT a component of a supervisory union
## 1541 1-Regular local school district that is NOT a component of a supervisory union
## 1542 1-Regular local school district that is NOT a component of a supervisory union
## 1543 1-Regular local school district that is NOT a component of a supervisory union
## 1544 1-Regular local school district that is NOT a component of a supervisory union
## 1545                                                 7-Independent Charter District
## 1546 1-Regular local school district that is NOT a component of a supervisory union
## 1547 1-Regular local school district that is NOT a component of a supervisory union
## 1548 1-Regular local school district that is NOT a component of a supervisory union
## 1549 1-Regular local school district that is NOT a component of a supervisory union
## 1550 1-Regular local school district that is NOT a component of a supervisory union
## 1551 1-Regular local school district that is NOT a component of a supervisory union
## 1552         5-State agency providing elementary and/or secondary level instruction
## 1553 1-Regular local school district that is NOT a component of a supervisory union
## 1554                                     4-Regional Education Service Agency (RESA)
## 1555 1-Regular local school district that is NOT a component of a supervisory union
## 1556 1-Regular local school district that is NOT a component of a supervisory union
## 1557 1-Regular local school district that is NOT a component of a supervisory union
## 1558 1-Regular local school district that is NOT a component of a supervisory union
## 1559 1-Regular local school district that is NOT a component of a supervisory union
## 1560                                     4-Regional Education Service Agency (RESA)
## 1561 1-Regular local school district that is NOT a component of a supervisory union
## 1562 1-Regular local school district that is NOT a component of a supervisory union
## 1563 1-Regular local school district that is NOT a component of a supervisory union
## 1564             2-Local school district that is a component of a supervisory union
## 1565 1-Regular local school district that is NOT a component of a supervisory union
## 1566 1-Regular local school district that is NOT a component of a supervisory union
## 1567         5-State agency providing elementary and/or secondary level instruction
## 1568                                     4-Regional Education Service Agency (RESA)
## 1569 1-Regular local school district that is NOT a component of a supervisory union
## 1570 1-Regular local school district that is NOT a component of a supervisory union
## 1571 1-Regular local school district that is NOT a component of a supervisory union
## 1572 1-Regular local school district that is NOT a component of a supervisory union
## 1573 1-Regular local school district that is NOT a component of a supervisory union
## 1574 1-Regular local school district that is NOT a component of a supervisory union
## 1575 1-Regular local school district that is NOT a component of a supervisory union
## 1576 1-Regular local school district that is NOT a component of a supervisory union
## 1577 1-Regular local school district that is NOT a component of a supervisory union
## 1578 1-Regular local school district that is NOT a component of a supervisory union
## 1579 1-Regular local school district that is NOT a component of a supervisory union
## 1580                                                 7-Independent Charter District
## 1581                                                 7-Independent Charter District
## 1582 1-Regular local school district that is NOT a component of a supervisory union
## 1583 1-Regular local school district that is NOT a component of a supervisory union
## 1584 1-Regular local school district that is NOT a component of a supervisory union
## 1585 1-Regular local school district that is NOT a component of a supervisory union
## 1586         5-State agency providing elementary and/or secondary level instruction
## 1587 1-Regular local school district that is NOT a component of a supervisory union
## 1588 1-Regular local school district that is NOT a component of a supervisory union
## 1589 1-Regular local school district that is NOT a component of a supervisory union
## 1590 1-Regular local school district that is NOT a component of a supervisory union
## 1591 1-Regular local school district that is NOT a component of a supervisory union
## 1592 1-Regular local school district that is NOT a component of a supervisory union
## 1593 1-Regular local school district that is NOT a component of a supervisory union
## 1594 1-Regular local school district that is NOT a component of a supervisory union
## 1595 1-Regular local school district that is NOT a component of a supervisory union
## 1596 1-Regular local school district that is NOT a component of a supervisory union
## 1597         5-State agency providing elementary and/or secondary level instruction
## 1598 1-Regular local school district that is NOT a component of a supervisory union
## 1599 1-Regular local school district that is NOT a component of a supervisory union
## 1600 1-Regular local school district that is NOT a component of a supervisory union
## 1601 1-Regular local school district that is NOT a component of a supervisory union
## 1602 1-Regular local school district that is NOT a component of a supervisory union
## 1603 1-Regular local school district that is NOT a component of a supervisory union
## 1604 1-Regular local school district that is NOT a component of a supervisory union
## 1605 1-Regular local school district that is NOT a component of a supervisory union
## 1606 1-Regular local school district that is NOT a component of a supervisory union
## 1607 1-Regular local school district that is NOT a component of a supervisory union
## 1608 1-Regular local school district that is NOT a component of a supervisory union
## 1609 1-Regular local school district that is NOT a component of a supervisory union
## 1610 1-Regular local school district that is NOT a component of a supervisory union
## 1611 1-Regular local school district that is NOT a component of a supervisory union
## 1612                                                 7-Independent Charter District
## 1613 1-Regular local school district that is NOT a component of a supervisory union
## 1614 1-Regular local school district that is NOT a component of a supervisory union
## 1615 1-Regular local school district that is NOT a component of a supervisory union
## 1616 1-Regular local school district that is NOT a component of a supervisory union
## 1617 1-Regular local school district that is NOT a component of a supervisory union
## 1618                                     4-Regional Education Service Agency (RESA)
## 1619 1-Regular local school district that is NOT a component of a supervisory union
## 1620 1-Regular local school district that is NOT a component of a supervisory union
## 1621 1-Regular local school district that is NOT a component of a supervisory union
## 1622 1-Regular local school district that is NOT a component of a supervisory union
## 1623 1-Regular local school district that is NOT a component of a supervisory union
## 1624 1-Regular local school district that is NOT a component of a supervisory union
## 1625 1-Regular local school district that is NOT a component of a supervisory union
## 1626                                     4-Regional Education Service Agency (RESA)
## 1627 1-Regular local school district that is NOT a component of a supervisory union
## 1628 1-Regular local school district that is NOT a component of a supervisory union
## 1629 1-Regular local school district that is NOT a component of a supervisory union
## 1630 1-Regular local school district that is NOT a component of a supervisory union
## 1631 1-Regular local school district that is NOT a component of a supervisory union
## 1632 1-Regular local school district that is NOT a component of a supervisory union
## 1633 1-Regular local school district that is NOT a component of a supervisory union
## 1634 1-Regular local school district that is NOT a component of a supervisory union
## 1635                                     4-Regional Education Service Agency (RESA)
## 1636 1-Regular local school district that is NOT a component of a supervisory union
## 1637 1-Regular local school district that is NOT a component of a supervisory union
## 1638 1-Regular local school district that is NOT a component of a supervisory union
## 1639 1-Regular local school district that is NOT a component of a supervisory union
## 1640         5-State agency providing elementary and/or secondary level instruction
## 1641 1-Regular local school district that is NOT a component of a supervisory union
## 1642         5-State agency providing elementary and/or secondary level instruction
## 1643         5-State agency providing elementary and/or secondary level instruction
## 1644 1-Regular local school district that is NOT a component of a supervisory union
## 1645 1-Regular local school district that is NOT a component of a supervisory union
## 1646 1-Regular local school district that is NOT a component of a supervisory union
## 1647 1-Regular local school district that is NOT a component of a supervisory union
## 1648 1-Regular local school district that is NOT a component of a supervisory union
## 1649 1-Regular local school district that is NOT a component of a supervisory union
## 1650 1-Regular local school district that is NOT a component of a supervisory union
## 1651 1-Regular local school district that is NOT a component of a supervisory union
## 1652 1-Regular local school district that is NOT a component of a supervisory union
## 1653 1-Regular local school district that is NOT a component of a supervisory union
## 1654 1-Regular local school district that is NOT a component of a supervisory union
## 1655         5-State agency providing elementary and/or secondary level instruction
## 1656 1-Regular local school district that is NOT a component of a supervisory union
## 1657 1-Regular local school district that is NOT a component of a supervisory union
## 1658 1-Regular local school district that is NOT a component of a supervisory union
## 1659 1-Regular local school district that is NOT a component of a supervisory union
## 1660 1-Regular local school district that is NOT a component of a supervisory union
## 1661 1-Regular local school district that is NOT a component of a supervisory union
## 1662 1-Regular local school district that is NOT a component of a supervisory union
## 1663                                     4-Regional Education Service Agency (RESA)
## 1664 1-Regular local school district that is NOT a component of a supervisory union
## 1665 1-Regular local school district that is NOT a component of a supervisory union
## 1666 1-Regular local school district that is NOT a component of a supervisory union
## 1667 1-Regular local school district that is NOT a component of a supervisory union
## 1668 1-Regular local school district that is NOT a component of a supervisory union
## 1669 1-Regular local school district that is NOT a component of a supervisory union
## 1670 1-Regular local school district that is NOT a component of a supervisory union
## 1671                                                 7-Independent Charter District
## 1672                                                 7-Independent Charter District
## 1673                                                 7-Independent Charter District
## 1674 1-Regular local school district that is NOT a component of a supervisory union
## 1675 1-Regular local school district that is NOT a component of a supervisory union
## 1676 1-Regular local school district that is NOT a component of a supervisory union
## 1677 1-Regular local school district that is NOT a component of a supervisory union
## 1678 1-Regular local school district that is NOT a component of a supervisory union
## 1679 1-Regular local school district that is NOT a component of a supervisory union
## 1680 1-Regular local school district that is NOT a component of a supervisory union
## 1681                                                 7-Independent Charter District
## 1682                                                 7-Independent Charter District
## 1683 1-Regular local school district that is NOT a component of a supervisory union
## 1684 1-Regular local school district that is NOT a component of a supervisory union
## 1685 1-Regular local school district that is NOT a component of a supervisory union
## 1686 1-Regular local school district that is NOT a component of a supervisory union
## 1687 1-Regular local school district that is NOT a component of a supervisory union
## 1688 1-Regular local school district that is NOT a component of a supervisory union
## 1689 1-Regular local school district that is NOT a component of a supervisory union
## 1690 1-Regular local school district that is NOT a component of a supervisory union
## 1691 1-Regular local school district that is NOT a component of a supervisory union
## 1692 1-Regular local school district that is NOT a component of a supervisory union
## 1693 1-Regular local school district that is NOT a component of a supervisory union
## 1694 1-Regular local school district that is NOT a component of a supervisory union
## 1695 1-Regular local school district that is NOT a component of a supervisory union
## 1696         5-State agency providing elementary and/or secondary level instruction
## 1697 1-Regular local school district that is NOT a component of a supervisory union
## 1698 1-Regular local school district that is NOT a component of a supervisory union
## 1699 1-Regular local school district that is NOT a component of a supervisory union
## 1700 1-Regular local school district that is NOT a component of a supervisory union
## 1701 1-Regular local school district that is NOT a component of a supervisory union
## 1702 1-Regular local school district that is NOT a component of a supervisory union
## 1703 1-Regular local school district that is NOT a component of a supervisory union
## 1704 1-Regular local school district that is NOT a component of a supervisory union
## 1705 1-Regular local school district that is NOT a component of a supervisory union
## 1706 1-Regular local school district that is NOT a component of a supervisory union
## 1707 1-Regular local school district that is NOT a component of a supervisory union
## 1708 1-Regular local school district that is NOT a component of a supervisory union
## 1709 1-Regular local school district that is NOT a component of a supervisory union
## 1710 1-Regular local school district that is NOT a component of a supervisory union
## 1711 1-Regular local school district that is NOT a component of a supervisory union
## 1712 1-Regular local school district that is NOT a component of a supervisory union
## 1713 1-Regular local school district that is NOT a component of a supervisory union
## 1714 1-Regular local school district that is NOT a component of a supervisory union
## 1715 1-Regular local school district that is NOT a component of a supervisory union
## 1716 1-Regular local school district that is NOT a component of a supervisory union
## 1717 1-Regular local school district that is NOT a component of a supervisory union
## 1718 1-Regular local school district that is NOT a component of a supervisory union
## 1719 1-Regular local school district that is NOT a component of a supervisory union
## 1720 1-Regular local school district that is NOT a component of a supervisory union
## 1721 1-Regular local school district that is NOT a component of a supervisory union
## 1722 1-Regular local school district that is NOT a component of a supervisory union
## 1723 1-Regular local school district that is NOT a component of a supervisory union
## 1724 1-Regular local school district that is NOT a component of a supervisory union
## 1725 1-Regular local school district that is NOT a component of a supervisory union
## 1726 1-Regular local school district that is NOT a component of a supervisory union
## 1727 1-Regular local school district that is NOT a component of a supervisory union
## 1728 1-Regular local school district that is NOT a component of a supervisory union
## 1729 1-Regular local school district that is NOT a component of a supervisory union
## 1730                                                 7-Independent Charter District
## 1731 1-Regular local school district that is NOT a component of a supervisory union
## 1732 1-Regular local school district that is NOT a component of a supervisory union
## 1733 1-Regular local school district that is NOT a component of a supervisory union
## 1734 1-Regular local school district that is NOT a component of a supervisory union
## 1735 1-Regular local school district that is NOT a component of a supervisory union
## 1736 1-Regular local school district that is NOT a component of a supervisory union
## 1737 1-Regular local school district that is NOT a component of a supervisory union
## 1738 1-Regular local school district that is NOT a component of a supervisory union
## 1739 1-Regular local school district that is NOT a component of a supervisory union
## 1740 1-Regular local school district that is NOT a component of a supervisory union
## 1741 1-Regular local school district that is NOT a component of a supervisory union
## 1742 1-Regular local school district that is NOT a component of a supervisory union
## 1743 1-Regular local school district that is NOT a component of a supervisory union
## 1744 1-Regular local school district that is NOT a component of a supervisory union
## 1745 1-Regular local school district that is NOT a component of a supervisory union
## 1746 1-Regular local school district that is NOT a component of a supervisory union
## 1747 1-Regular local school district that is NOT a component of a supervisory union
## 1748 1-Regular local school district that is NOT a component of a supervisory union
## 1749         5-State agency providing elementary and/or secondary level instruction
## 1750         5-State agency providing elementary and/or secondary level instruction
## 1751 1-Regular local school district that is NOT a component of a supervisory union
## 1752 1-Regular local school district that is NOT a component of a supervisory union
## 1753                                                 7-Independent Charter District
## 1754 1-Regular local school district that is NOT a component of a supervisory union
## 1755 1-Regular local school district that is NOT a component of a supervisory union
## 1756 1-Regular local school district that is NOT a component of a supervisory union
## 1757         5-State agency providing elementary and/or secondary level instruction
## 1758 1-Regular local school district that is NOT a component of a supervisory union
## 1759 1-Regular local school district that is NOT a component of a supervisory union
## 1760 1-Regular local school district that is NOT a component of a supervisory union
## 1761 1-Regular local school district that is NOT a component of a supervisory union
## 1762 1-Regular local school district that is NOT a component of a supervisory union
## 1763 1-Regular local school district that is NOT a component of a supervisory union
## 1764 1-Regular local school district that is NOT a component of a supervisory union
## 1765 1-Regular local school district that is NOT a component of a supervisory union
## 1766         5-State agency providing elementary and/or secondary level instruction
## 1767 1-Regular local school district that is NOT a component of a supervisory union
## 1768 1-Regular local school district that is NOT a component of a supervisory union
## 1769 1-Regular local school district that is NOT a component of a supervisory union
## 1770 1-Regular local school district that is NOT a component of a supervisory union
## 1771 1-Regular local school district that is NOT a component of a supervisory union
## 1772                                                 7-Independent Charter District
## 1773 1-Regular local school district that is NOT a component of a supervisory union
## 1774                                     4-Regional Education Service Agency (RESA)
## 1775 1-Regular local school district that is NOT a component of a supervisory union
## 1776 1-Regular local school district that is NOT a component of a supervisory union
## 1777         5-State agency providing elementary and/or secondary level instruction
## 1778                                     4-Regional Education Service Agency (RESA)
## 1779 1-Regular local school district that is NOT a component of a supervisory union
## 1780 1-Regular local school district that is NOT a component of a supervisory union
## 1781 1-Regular local school district that is NOT a component of a supervisory union
## 1782 1-Regular local school district that is NOT a component of a supervisory union
## 1783 1-Regular local school district that is NOT a component of a supervisory union
## 1784 1-Regular local school district that is NOT a component of a supervisory union
## 1785 1-Regular local school district that is NOT a component of a supervisory union
## 1786 1-Regular local school district that is NOT a component of a supervisory union
## 1787 1-Regular local school district that is NOT a component of a supervisory union
## 1788 1-Regular local school district that is NOT a component of a supervisory union
## 1789 1-Regular local school district that is NOT a component of a supervisory union
## 1790 1-Regular local school district that is NOT a component of a supervisory union
## 1791 1-Regular local school district that is NOT a component of a supervisory union
## 1792 1-Regular local school district that is NOT a component of a supervisory union
## 1793 1-Regular local school district that is NOT a component of a supervisory union
## 1794                                     4-Regional Education Service Agency (RESA)
## 1795 1-Regular local school district that is NOT a component of a supervisory union
## 1796 1-Regular local school district that is NOT a component of a supervisory union
## 1797 1-Regular local school district that is NOT a component of a supervisory union
## 1798 1-Regular local school district that is NOT a component of a supervisory union
## 1799         5-State agency providing elementary and/or secondary level instruction
## 1800 1-Regular local school district that is NOT a component of a supervisory union
## 1801 1-Regular local school district that is NOT a component of a supervisory union
## 1802 1-Regular local school district that is NOT a component of a supervisory union
## 1803 1-Regular local school district that is NOT a component of a supervisory union
## 1804 1-Regular local school district that is NOT a component of a supervisory union
## 1805 1-Regular local school district that is NOT a component of a supervisory union
## 1806 1-Regular local school district that is NOT a component of a supervisory union
## 1807 1-Regular local school district that is NOT a component of a supervisory union
## 1808 1-Regular local school district that is NOT a component of a supervisory union
## 1809 1-Regular local school district that is NOT a component of a supervisory union
## 1810 1-Regular local school district that is NOT a component of a supervisory union
## 1811 1-Regular local school district that is NOT a component of a supervisory union
## 1812 1-Regular local school district that is NOT a component of a supervisory union
## 1813 1-Regular local school district that is NOT a component of a supervisory union
## 1814                                                 7-Independent Charter District
## 1815                                                 7-Independent Charter District
## 1816 1-Regular local school district that is NOT a component of a supervisory union
## 1817 1-Regular local school district that is NOT a component of a supervisory union
## 1818 1-Regular local school district that is NOT a component of a supervisory union
## 1819 1-Regular local school district that is NOT a component of a supervisory union
## 1820 1-Regular local school district that is NOT a component of a supervisory union
## 1821 1-Regular local school district that is NOT a component of a supervisory union
## 1822         5-State agency providing elementary and/or secondary level instruction
## 1823 1-Regular local school district that is NOT a component of a supervisory union
## 1824 1-Regular local school district that is NOT a component of a supervisory union
## 1825 1-Regular local school district that is NOT a component of a supervisory union
## 1826                                                 7-Independent Charter District
## 1827 1-Regular local school district that is NOT a component of a supervisory union
## 1828 1-Regular local school district that is NOT a component of a supervisory union
## 1829 1-Regular local school district that is NOT a component of a supervisory union
## 1830 1-Regular local school district that is NOT a component of a supervisory union
## 1831 1-Regular local school district that is NOT a component of a supervisory union
## 1832 1-Regular local school district that is NOT a component of a supervisory union
## 1833 1-Regular local school district that is NOT a component of a supervisory union
## 1834 1-Regular local school district that is NOT a component of a supervisory union
## 1835 1-Regular local school district that is NOT a component of a supervisory union
## 1836 1-Regular local school district that is NOT a component of a supervisory union
## 1837 1-Regular local school district that is NOT a component of a supervisory union
## 1838                                     4-Regional Education Service Agency (RESA)
## 1839 1-Regular local school district that is NOT a component of a supervisory union
## 1840 1-Regular local school district that is NOT a component of a supervisory union
## 1841 1-Regular local school district that is NOT a component of a supervisory union
## 1842 1-Regular local school district that is NOT a component of a supervisory union
## 1843                                     4-Regional Education Service Agency (RESA)
## 1844 1-Regular local school district that is NOT a component of a supervisory union
## 1845 1-Regular local school district that is NOT a component of a supervisory union
## 1846 1-Regular local school district that is NOT a component of a supervisory union
## 1847                                     4-Regional Education Service Agency (RESA)
## 1848 1-Regular local school district that is NOT a component of a supervisory union
## 1849 1-Regular local school district that is NOT a component of a supervisory union
## 1850 1-Regular local school district that is NOT a component of a supervisory union
## 1851 1-Regular local school district that is NOT a component of a supervisory union
## 1852 1-Regular local school district that is NOT a component of a supervisory union
## 1853 1-Regular local school district that is NOT a component of a supervisory union
## 1854 1-Regular local school district that is NOT a component of a supervisory union
## 1855 1-Regular local school district that is NOT a component of a supervisory union
## 1856 1-Regular local school district that is NOT a component of a supervisory union
## 1857 1-Regular local school district that is NOT a component of a supervisory union
## 1858 1-Regular local school district that is NOT a component of a supervisory union
## 1859 1-Regular local school district that is NOT a component of a supervisory union
## 1860         5-State agency providing elementary and/or secondary level instruction
## 1861 1-Regular local school district that is NOT a component of a supervisory union
## 1862 1-Regular local school district that is NOT a component of a supervisory union
## 1863 1-Regular local school district that is NOT a component of a supervisory union
## 1864 1-Regular local school district that is NOT a component of a supervisory union
## 1865                                     4-Regional Education Service Agency (RESA)
## 1866 1-Regular local school district that is NOT a component of a supervisory union
## 1867 1-Regular local school district that is NOT a component of a supervisory union
## 1868 1-Regular local school district that is NOT a component of a supervisory union
## 1869 1-Regular local school district that is NOT a component of a supervisory union
## 1870 1-Regular local school district that is NOT a component of a supervisory union
## 1871 1-Regular local school district that is NOT a component of a supervisory union
## 1872 1-Regular local school district that is NOT a component of a supervisory union
## 1873 1-Regular local school district that is NOT a component of a supervisory union
## 1874         5-State agency providing elementary and/or secondary level instruction
## 1875 1-Regular local school district that is NOT a component of a supervisory union
## 1876 1-Regular local school district that is NOT a component of a supervisory union
## 1877 1-Regular local school district that is NOT a component of a supervisory union
## 1878 1-Regular local school district that is NOT a component of a supervisory union
## 1879 1-Regular local school district that is NOT a component of a supervisory union
## 1880 1-Regular local school district that is NOT a component of a supervisory union
## 1881 1-Regular local school district that is NOT a component of a supervisory union
## 1882 1-Regular local school district that is NOT a component of a supervisory union
## 1883 1-Regular local school district that is NOT a component of a supervisory union
## 1884         5-State agency providing elementary and/or secondary level instruction
## 1885 1-Regular local school district that is NOT a component of a supervisory union
## 1886 1-Regular local school district that is NOT a component of a supervisory union
## 1887 1-Regular local school district that is NOT a component of a supervisory union
## 1888 1-Regular local school district that is NOT a component of a supervisory union
## 1889                                                 7-Independent Charter District
## 1890 1-Regular local school district that is NOT a component of a supervisory union
## 1891 1-Regular local school district that is NOT a component of a supervisory union
## 1892 1-Regular local school district that is NOT a component of a supervisory union
## 1893 1-Regular local school district that is NOT a component of a supervisory union
## 1894 1-Regular local school district that is NOT a component of a supervisory union
## 1895 1-Regular local school district that is NOT a component of a supervisory union
## 1896 1-Regular local school district that is NOT a component of a supervisory union
## 1897 1-Regular local school district that is NOT a component of a supervisory union
## 1898 1-Regular local school district that is NOT a component of a supervisory union
## 1899                                                 7-Independent Charter District
## 1900                                                 7-Independent Charter District
## 1901 1-Regular local school district that is NOT a component of a supervisory union
## 1902 1-Regular local school district that is NOT a component of a supervisory union
## 1903 1-Regular local school district that is NOT a component of a supervisory union
## 1904 1-Regular local school district that is NOT a component of a supervisory union
## 1905 1-Regular local school district that is NOT a component of a supervisory union
## 1906 1-Regular local school district that is NOT a component of a supervisory union
## 1907 1-Regular local school district that is NOT a component of a supervisory union
## 1908 1-Regular local school district that is NOT a component of a supervisory union
## 1909 1-Regular local school district that is NOT a component of a supervisory union
## 1910 1-Regular local school district that is NOT a component of a supervisory union
## 1911 1-Regular local school district that is NOT a component of a supervisory union
## 1912 1-Regular local school district that is NOT a component of a supervisory union
## 1913 1-Regular local school district that is NOT a component of a supervisory union
## 1914 1-Regular local school district that is NOT a component of a supervisory union
## 1915 1-Regular local school district that is NOT a component of a supervisory union
## 1916 1-Regular local school district that is NOT a component of a supervisory union
## 1917 1-Regular local school district that is NOT a component of a supervisory union
## 1918                                                 7-Independent Charter District
## 1919 1-Regular local school district that is NOT a component of a supervisory union
## 1920 1-Regular local school district that is NOT a component of a supervisory union
## 1921 1-Regular local school district that is NOT a component of a supervisory union
## 1922                                     4-Regional Education Service Agency (RESA)
## 1923 1-Regular local school district that is NOT a component of a supervisory union
## 1924 1-Regular local school district that is NOT a component of a supervisory union
## 1925 1-Regular local school district that is NOT a component of a supervisory union
## 1926 1-Regular local school district that is NOT a component of a supervisory union
## 1927                                                 7-Independent Charter District
## 1928 1-Regular local school district that is NOT a component of a supervisory union
## 1929 1-Regular local school district that is NOT a component of a supervisory union
## 1930                                                 7-Independent Charter District
## 1931 1-Regular local school district that is NOT a component of a supervisory union
## 1932         5-State agency providing elementary and/or secondary level instruction
## 1933 1-Regular local school district that is NOT a component of a supervisory union
## 1934 1-Regular local school district that is NOT a component of a supervisory union
## 1935 1-Regular local school district that is NOT a component of a supervisory union
## 1936 1-Regular local school district that is NOT a component of a supervisory union
## 1937 1-Regular local school district that is NOT a component of a supervisory union
## 1938 1-Regular local school district that is NOT a component of a supervisory union
## 1939 1-Regular local school district that is NOT a component of a supervisory union
## 1940 1-Regular local school district that is NOT a component of a supervisory union
## 1941 1-Regular local school district that is NOT a component of a supervisory union
## 1942                                                 7-Independent Charter District
## 1943                                                 7-Independent Charter District
## 1944                                                 7-Independent Charter District
## 1945                                                 7-Independent Charter District
## 1946 1-Regular local school district that is NOT a component of a supervisory union
## 1947 1-Regular local school district that is NOT a component of a supervisory union
## 1948 1-Regular local school district that is NOT a component of a supervisory union
## 1949         5-State agency providing elementary and/or secondary level instruction
## 1950 1-Regular local school district that is NOT a component of a supervisory union
## 1951 1-Regular local school district that is NOT a component of a supervisory union
## 1952 1-Regular local school district that is NOT a component of a supervisory union
## 1953                                                 7-Independent Charter District
## 1954 1-Regular local school district that is NOT a component of a supervisory union
## 1955 1-Regular local school district that is NOT a component of a supervisory union
## 1956 1-Regular local school district that is NOT a component of a supervisory union
## 1957 1-Regular local school district that is NOT a component of a supervisory union
## 1958 1-Regular local school district that is NOT a component of a supervisory union
## 1959 1-Regular local school district that is NOT a component of a supervisory union
## 1960 1-Regular local school district that is NOT a component of a supervisory union
## 1961 1-Regular local school district that is NOT a component of a supervisory union
## 1962 1-Regular local school district that is NOT a component of a supervisory union
## 1963 1-Regular local school district that is NOT a component of a supervisory union
## 1964 1-Regular local school district that is NOT a component of a supervisory union
## 1965 1-Regular local school district that is NOT a component of a supervisory union
## 1966 1-Regular local school district that is NOT a component of a supervisory union
## 1967 1-Regular local school district that is NOT a component of a supervisory union
## 1968 1-Regular local school district that is NOT a component of a supervisory union
## 1969 1-Regular local school district that is NOT a component of a supervisory union
## 1970 1-Regular local school district that is NOT a component of a supervisory union
## 1971 1-Regular local school district that is NOT a component of a supervisory union
## 1972 1-Regular local school district that is NOT a component of a supervisory union
## 1973 1-Regular local school district that is NOT a component of a supervisory union
## 1974 1-Regular local school district that is NOT a component of a supervisory union
## 1975 1-Regular local school district that is NOT a component of a supervisory union
## 1976 1-Regular local school district that is NOT a component of a supervisory union
## 1977                                     4-Regional Education Service Agency (RESA)
## 1978 1-Regular local school district that is NOT a component of a supervisory union
## 1979         5-State agency providing elementary and/or secondary level instruction
## 1980 1-Regular local school district that is NOT a component of a supervisory union
## 1981         5-State agency providing elementary and/or secondary level instruction
## 1982 1-Regular local school district that is NOT a component of a supervisory union
## 1983 1-Regular local school district that is NOT a component of a supervisory union
## 1984 1-Regular local school district that is NOT a component of a supervisory union
## 1985 1-Regular local school district that is NOT a component of a supervisory union
## 1986 1-Regular local school district that is NOT a component of a supervisory union
## 1987 1-Regular local school district that is NOT a component of a supervisory union
## 1988 1-Regular local school district that is NOT a component of a supervisory union
## 1989 1-Regular local school district that is NOT a component of a supervisory union
## 1990                                     4-Regional Education Service Agency (RESA)
## 1991 1-Regular local school district that is NOT a component of a supervisory union
## 1992         5-State agency providing elementary and/or secondary level instruction
## 1993 1-Regular local school district that is NOT a component of a supervisory union
## 1994 1-Regular local school district that is NOT a component of a supervisory union
## 1995 1-Regular local school district that is NOT a component of a supervisory union
## 1996 1-Regular local school district that is NOT a component of a supervisory union
## 1997 1-Regular local school district that is NOT a component of a supervisory union
## 1998 1-Regular local school district that is NOT a component of a supervisory union
## 1999 1-Regular local school district that is NOT a component of a supervisory union
## 2000 1-Regular local school district that is NOT a component of a supervisory union
## 2001 1-Regular local school district that is NOT a component of a supervisory union
## 2002 1-Regular local school district that is NOT a component of a supervisory union
## 2003 1-Regular local school district that is NOT a component of a supervisory union
## 2004 1-Regular local school district that is NOT a component of a supervisory union
## 2005 1-Regular local school district that is NOT a component of a supervisory union
## 2006                                     4-Regional Education Service Agency (RESA)
## 2007 1-Regular local school district that is NOT a component of a supervisory union
## 2008 1-Regular local school district that is NOT a component of a supervisory union
## 2009 1-Regular local school district that is NOT a component of a supervisory union
## 2010 1-Regular local school district that is NOT a component of a supervisory union
## 2011 1-Regular local school district that is NOT a component of a supervisory union
## 2012 1-Regular local school district that is NOT a component of a supervisory union
## 2013                                     4-Regional Education Service Agency (RESA)
## 2014                                     4-Regional Education Service Agency (RESA)
## 2015         5-State agency providing elementary and/or secondary level instruction
## 2016         5-State agency providing elementary and/or secondary level instruction
## 2017 1-Regular local school district that is NOT a component of a supervisory union
## 2018 1-Regular local school district that is NOT a component of a supervisory union
## 2019 1-Regular local school district that is NOT a component of a supervisory union
## 2020 1-Regular local school district that is NOT a component of a supervisory union
## 2021 1-Regular local school district that is NOT a component of a supervisory union
## 2022 1-Regular local school district that is NOT a component of a supervisory union
## 2023 1-Regular local school district that is NOT a component of a supervisory union
## 2024 1-Regular local school district that is NOT a component of a supervisory union
## 2025 1-Regular local school district that is NOT a component of a supervisory union
## 2026 1-Regular local school district that is NOT a component of a supervisory union
## 2027 1-Regular local school district that is NOT a component of a supervisory union
## 2028 1-Regular local school district that is NOT a component of a supervisory union
## 2029 1-Regular local school district that is NOT a component of a supervisory union
## 2030 1-Regular local school district that is NOT a component of a supervisory union
## 2031         5-State agency providing elementary and/or secondary level instruction
## 2032 1-Regular local school district that is NOT a component of a supervisory union
## 2033 1-Regular local school district that is NOT a component of a supervisory union
## 2034 1-Regular local school district that is NOT a component of a supervisory union
## 2035 1-Regular local school district that is NOT a component of a supervisory union
## 2036 1-Regular local school district that is NOT a component of a supervisory union
## 2037 1-Regular local school district that is NOT a component of a supervisory union
## 2038 1-Regular local school district that is NOT a component of a supervisory union
## 2039         5-State agency providing elementary and/or secondary level instruction
## 2040 1-Regular local school district that is NOT a component of a supervisory union
## 2041         5-State agency providing elementary and/or secondary level instruction
## 2042 1-Regular local school district that is NOT a component of a supervisory union
## 2043 1-Regular local school district that is NOT a component of a supervisory union
## 2044 1-Regular local school district that is NOT a component of a supervisory union
## 2045 1-Regular local school district that is NOT a component of a supervisory union
## 2046         5-State agency providing elementary and/or secondary level instruction
## 2047 1-Regular local school district that is NOT a component of a supervisory union
## 2048 1-Regular local school district that is NOT a component of a supervisory union
## 2049 1-Regular local school district that is NOT a component of a supervisory union
## 2050 1-Regular local school district that is NOT a component of a supervisory union
## 2051 1-Regular local school district that is NOT a component of a supervisory union
## 2052 1-Regular local school district that is NOT a component of a supervisory union
## 2053 1-Regular local school district that is NOT a component of a supervisory union
## 2054 1-Regular local school district that is NOT a component of a supervisory union
## 2055 1-Regular local school district that is NOT a component of a supervisory union
## 2056 1-Regular local school district that is NOT a component of a supervisory union
## 2057 1-Regular local school district that is NOT a component of a supervisory union
## 2058 1-Regular local school district that is NOT a component of a supervisory union
## 2059 1-Regular local school district that is NOT a component of a supervisory union
## 2060 1-Regular local school district that is NOT a component of a supervisory union
## 2061 1-Regular local school district that is NOT a component of a supervisory union
## 2062 1-Regular local school district that is NOT a component of a supervisory union
## 2063 1-Regular local school district that is NOT a component of a supervisory union
## 2064 1-Regular local school district that is NOT a component of a supervisory union
## 2065 1-Regular local school district that is NOT a component of a supervisory union
## 2066         5-State agency providing elementary and/or secondary level instruction
## 2067 1-Regular local school district that is NOT a component of a supervisory union
## 2068 1-Regular local school district that is NOT a component of a supervisory union
## 2069 1-Regular local school district that is NOT a component of a supervisory union
## 2070 1-Regular local school district that is NOT a component of a supervisory union
## 2071 1-Regular local school district that is NOT a component of a supervisory union
## 2072 1-Regular local school district that is NOT a component of a supervisory union
## 2073                                     4-Regional Education Service Agency (RESA)
## 2074 1-Regular local school district that is NOT a component of a supervisory union
## 2075 1-Regular local school district that is NOT a component of a supervisory union
## 2076 1-Regular local school district that is NOT a component of a supervisory union
## 2077 1-Regular local school district that is NOT a component of a supervisory union
## 2078 1-Regular local school district that is NOT a component of a supervisory union
## 2079 1-Regular local school district that is NOT a component of a supervisory union
## 2080 1-Regular local school district that is NOT a component of a supervisory union
## 2081 1-Regular local school district that is NOT a component of a supervisory union
## 2082 1-Regular local school district that is NOT a component of a supervisory union
## 2083 1-Regular local school district that is NOT a component of a supervisory union
## 2084 1-Regular local school district that is NOT a component of a supervisory union
## 2085 1-Regular local school district that is NOT a component of a supervisory union
## 2086             2-Local school district that is a component of a supervisory union
## 2087                                     4-Regional Education Service Agency (RESA)
## 2088 1-Regular local school district that is NOT a component of a supervisory union
## 2089 1-Regular local school district that is NOT a component of a supervisory union
## 2090 1-Regular local school district that is NOT a component of a supervisory union
## 2091 1-Regular local school district that is NOT a component of a supervisory union
## 2092 1-Regular local school district that is NOT a component of a supervisory union
## 2093 1-Regular local school district that is NOT a component of a supervisory union
## 2094 1-Regular local school district that is NOT a component of a supervisory union
## 2095 1-Regular local school district that is NOT a component of a supervisory union
## 2096 1-Regular local school district that is NOT a component of a supervisory union
## 2097 1-Regular local school district that is NOT a component of a supervisory union
## 2098 1-Regular local school district that is NOT a component of a supervisory union
## 2099 1-Regular local school district that is NOT a component of a supervisory union
## 2100 1-Regular local school district that is NOT a component of a supervisory union
## 2101                                                 7-Independent Charter District
## 2102                                                 7-Independent Charter District
## 2103 1-Regular local school district that is NOT a component of a supervisory union
## 2104 1-Regular local school district that is NOT a component of a supervisory union
## 2105 1-Regular local school district that is NOT a component of a supervisory union
## 2106 1-Regular local school district that is NOT a component of a supervisory union
## 2107 1-Regular local school district that is NOT a component of a supervisory union
## 2108 1-Regular local school district that is NOT a component of a supervisory union
## 2109 1-Regular local school district that is NOT a component of a supervisory union
## 2110 1-Regular local school district that is NOT a component of a supervisory union
## 2111 1-Regular local school district that is NOT a component of a supervisory union
## 2112 1-Regular local school district that is NOT a component of a supervisory union
## 2113 1-Regular local school district that is NOT a component of a supervisory union
## 2114 1-Regular local school district that is NOT a component of a supervisory union
## 2115 1-Regular local school district that is NOT a component of a supervisory union
## 2116 1-Regular local school district that is NOT a component of a supervisory union
## 2117 1-Regular local school district that is NOT a component of a supervisory union
## 2118 1-Regular local school district that is NOT a component of a supervisory union
## 2119 1-Regular local school district that is NOT a component of a supervisory union
## 2120 1-Regular local school district that is NOT a component of a supervisory union
## 2121 1-Regular local school district that is NOT a component of a supervisory union
## 2122 1-Regular local school district that is NOT a component of a supervisory union
## 2123 1-Regular local school district that is NOT a component of a supervisory union
## 2124 1-Regular local school district that is NOT a component of a supervisory union
## 2125 1-Regular local school district that is NOT a component of a supervisory union
## 2126 1-Regular local school district that is NOT a component of a supervisory union
## 2127 1-Regular local school district that is NOT a component of a supervisory union
## 2128                                     4-Regional Education Service Agency (RESA)
## 2129                                     4-Regional Education Service Agency (RESA)
## 2130 1-Regular local school district that is NOT a component of a supervisory union
## 2131 1-Regular local school district that is NOT a component of a supervisory union
## 2132 1-Regular local school district that is NOT a component of a supervisory union
## 2133 1-Regular local school district that is NOT a component of a supervisory union
## 2134 1-Regular local school district that is NOT a component of a supervisory union
## 2135 1-Regular local school district that is NOT a component of a supervisory union
## 2136 1-Regular local school district that is NOT a component of a supervisory union
## 2137                                     4-Regional Education Service Agency (RESA)
## 2138                                                 7-Independent Charter District
## 2139 1-Regular local school district that is NOT a component of a supervisory union
## 2140 1-Regular local school district that is NOT a component of a supervisory union
## 2141 1-Regular local school district that is NOT a component of a supervisory union
## 2142 1-Regular local school district that is NOT a component of a supervisory union
## 2143 1-Regular local school district that is NOT a component of a supervisory union
## 2144 1-Regular local school district that is NOT a component of a supervisory union
## 2145 1-Regular local school district that is NOT a component of a supervisory union
## 2146 1-Regular local school district that is NOT a component of a supervisory union
## 2147                                     4-Regional Education Service Agency (RESA)
## 2148         5-State agency providing elementary and/or secondary level instruction
## 2149 1-Regular local school district that is NOT a component of a supervisory union
## 2150 1-Regular local school district that is NOT a component of a supervisory union
## 2151 1-Regular local school district that is NOT a component of a supervisory union
## 2152 1-Regular local school district that is NOT a component of a supervisory union
## 2153 1-Regular local school district that is NOT a component of a supervisory union
## 2154 1-Regular local school district that is NOT a component of a supervisory union
## 2155 1-Regular local school district that is NOT a component of a supervisory union
## 2156                                                 7-Independent Charter District
## 2157 1-Regular local school district that is NOT a component of a supervisory union
## 2158                                                 7-Independent Charter District
## 2159                                                 7-Independent Charter District
## 2160                                                 7-Independent Charter District
## 2161 1-Regular local school district that is NOT a component of a supervisory union
## 2162 1-Regular local school district that is NOT a component of a supervisory union
## 2163 1-Regular local school district that is NOT a component of a supervisory union
## 2164 1-Regular local school district that is NOT a component of a supervisory union
## 2165 1-Regular local school district that is NOT a component of a supervisory union
## 2166 1-Regular local school district that is NOT a component of a supervisory union
## 2167 1-Regular local school district that is NOT a component of a supervisory union
## 2168 1-Regular local school district that is NOT a component of a supervisory union
## 2169 1-Regular local school district that is NOT a component of a supervisory union
## 2170 1-Regular local school district that is NOT a component of a supervisory union
## 2171 1-Regular local school district that is NOT a component of a supervisory union
## 2172 1-Regular local school district that is NOT a component of a supervisory union
## 2173 1-Regular local school district that is NOT a component of a supervisory union
## 2174 1-Regular local school district that is NOT a component of a supervisory union
## 2175 1-Regular local school district that is NOT a component of a supervisory union
## 2176 1-Regular local school district that is NOT a component of a supervisory union
## 2177 1-Regular local school district that is NOT a component of a supervisory union
## 2178 1-Regular local school district that is NOT a component of a supervisory union
## 2179 1-Regular local school district that is NOT a component of a supervisory union
## 2180 1-Regular local school district that is NOT a component of a supervisory union
## 2181 1-Regular local school district that is NOT a component of a supervisory union
## 2182 1-Regular local school district that is NOT a component of a supervisory union
## 2183 1-Regular local school district that is NOT a component of a supervisory union
## 2184 1-Regular local school district that is NOT a component of a supervisory union
## 2185 1-Regular local school district that is NOT a component of a supervisory union
## 2186 1-Regular local school district that is NOT a component of a supervisory union
## 2187             2-Local school district that is a component of a supervisory union
## 2188 1-Regular local school district that is NOT a component of a supervisory union
## 2189 1-Regular local school district that is NOT a component of a supervisory union
## 2190 1-Regular local school district that is NOT a component of a supervisory union
## 2191 1-Regular local school district that is NOT a component of a supervisory union
## 2192 1-Regular local school district that is NOT a component of a supervisory union
## 2193 1-Regular local school district that is NOT a component of a supervisory union
## 2194         5-State agency providing elementary and/or secondary level instruction
## 2195 1-Regular local school district that is NOT a component of a supervisory union
## 2196 1-Regular local school district that is NOT a component of a supervisory union
## 2197 1-Regular local school district that is NOT a component of a supervisory union
## 2198         5-State agency providing elementary and/or secondary level instruction
## 2199 1-Regular local school district that is NOT a component of a supervisory union
## 2200 1-Regular local school district that is NOT a component of a supervisory union
## 2201 1-Regular local school district that is NOT a component of a supervisory union
## 2202 1-Regular local school district that is NOT a component of a supervisory union
## 2203 1-Regular local school district that is NOT a component of a supervisory union
## 2204 1-Regular local school district that is NOT a component of a supervisory union
## 2205 1-Regular local school district that is NOT a component of a supervisory union
## 2206 1-Regular local school district that is NOT a component of a supervisory union
## 2207 1-Regular local school district that is NOT a component of a supervisory union
## 2208 1-Regular local school district that is NOT a component of a supervisory union
## 2209 1-Regular local school district that is NOT a component of a supervisory union
## 2210 1-Regular local school district that is NOT a component of a supervisory union
## 2211 1-Regular local school district that is NOT a component of a supervisory union
## 2212 1-Regular local school district that is NOT a component of a supervisory union
## 2213 1-Regular local school district that is NOT a component of a supervisory union
## 2214 1-Regular local school district that is NOT a component of a supervisory union
## 2215 1-Regular local school district that is NOT a component of a supervisory union
## 2216 1-Regular local school district that is NOT a component of a supervisory union
## 2217 1-Regular local school district that is NOT a component of a supervisory union
## 2218 1-Regular local school district that is NOT a component of a supervisory union
## 2219 1-Regular local school district that is NOT a component of a supervisory union
## 2220 1-Regular local school district that is NOT a component of a supervisory union
## 2221                                                 7-Independent Charter District
## 2222 1-Regular local school district that is NOT a component of a supervisory union
## 2223 1-Regular local school district that is NOT a component of a supervisory union
## 2224 1-Regular local school district that is NOT a component of a supervisory union
## 2225 1-Regular local school district that is NOT a component of a supervisory union
## 2226 1-Regular local school district that is NOT a component of a supervisory union
## 2227 1-Regular local school district that is NOT a component of a supervisory union
## 2228 1-Regular local school district that is NOT a component of a supervisory union
## 2229 1-Regular local school district that is NOT a component of a supervisory union
## 2230 1-Regular local school district that is NOT a component of a supervisory union
## 2231 1-Regular local school district that is NOT a component of a supervisory union
## 2232 1-Regular local school district that is NOT a component of a supervisory union
## 2233 1-Regular local school district that is NOT a component of a supervisory union
## 2234 1-Regular local school district that is NOT a component of a supervisory union
## 2235 1-Regular local school district that is NOT a component of a supervisory union
## 2236 1-Regular local school district that is NOT a component of a supervisory union
## 2237 1-Regular local school district that is NOT a component of a supervisory union
## 2238 1-Regular local school district that is NOT a component of a supervisory union
## 2239 1-Regular local school district that is NOT a component of a supervisory union
## 2240 1-Regular local school district that is NOT a component of a supervisory union
## 2241 1-Regular local school district that is NOT a component of a supervisory union
## 2242 1-Regular local school district that is NOT a component of a supervisory union
## 2243 1-Regular local school district that is NOT a component of a supervisory union
## 2244 1-Regular local school district that is NOT a component of a supervisory union
## 2245 1-Regular local school district that is NOT a component of a supervisory union
## 2246 1-Regular local school district that is NOT a component of a supervisory union
## 2247 1-Regular local school district that is NOT a component of a supervisory union
## 2248 1-Regular local school district that is NOT a component of a supervisory union
## 2249 1-Regular local school district that is NOT a component of a supervisory union
## 2250 1-Regular local school district that is NOT a component of a supervisory union
## 2251 1-Regular local school district that is NOT a component of a supervisory union
## 2252 1-Regular local school district that is NOT a component of a supervisory union
## 2253 1-Regular local school district that is NOT a component of a supervisory union
## 2254 1-Regular local school district that is NOT a component of a supervisory union
## 2255 1-Regular local school district that is NOT a component of a supervisory union
## 2256 1-Regular local school district that is NOT a component of a supervisory union
## 2257 1-Regular local school district that is NOT a component of a supervisory union
## 2258 1-Regular local school district that is NOT a component of a supervisory union
## 2259 1-Regular local school district that is NOT a component of a supervisory union
## 2260 1-Regular local school district that is NOT a component of a supervisory union
## 2261 1-Regular local school district that is NOT a component of a supervisory union
## 2262 1-Regular local school district that is NOT a component of a supervisory union
## 2263 1-Regular local school district that is NOT a component of a supervisory union
## 2264 1-Regular local school district that is NOT a component of a supervisory union
## 2265 1-Regular local school district that is NOT a component of a supervisory union
## 2266 1-Regular local school district that is NOT a component of a supervisory union
## 2267 1-Regular local school district that is NOT a component of a supervisory union
## 2268 1-Regular local school district that is NOT a component of a supervisory union
## 2269 1-Regular local school district that is NOT a component of a supervisory union
## 2270 1-Regular local school district that is NOT a component of a supervisory union
## 2271 1-Regular local school district that is NOT a component of a supervisory union
## 2272 1-Regular local school district that is NOT a component of a supervisory union
## 2273 1-Regular local school district that is NOT a component of a supervisory union
## 2274 1-Regular local school district that is NOT a component of a supervisory union
## 2275 1-Regular local school district that is NOT a component of a supervisory union
## 2276 1-Regular local school district that is NOT a component of a supervisory union
## 2277 1-Regular local school district that is NOT a component of a supervisory union
## 2278 1-Regular local school district that is NOT a component of a supervisory union
## 2279 1-Regular local school district that is NOT a component of a supervisory union
## 2280 1-Regular local school district that is NOT a component of a supervisory union
## 2281                                                     8-Other education agencies
## 2282 1-Regular local school district that is NOT a component of a supervisory union
## 2283 1-Regular local school district that is NOT a component of a supervisory union
## 2284 1-Regular local school district that is NOT a component of a supervisory union
## 2285 1-Regular local school district that is NOT a component of a supervisory union
## 2286 1-Regular local school district that is NOT a component of a supervisory union
## 2287 1-Regular local school district that is NOT a component of a supervisory union
## 2288 1-Regular local school district that is NOT a component of a supervisory union
## 2289 1-Regular local school district that is NOT a component of a supervisory union
## 2290 1-Regular local school district that is NOT a component of a supervisory union
## 2291 1-Regular local school district that is NOT a component of a supervisory union
## 2292 1-Regular local school district that is NOT a component of a supervisory union
## 2293 1-Regular local school district that is NOT a component of a supervisory union
## 2294 1-Regular local school district that is NOT a component of a supervisory union
## 2295 1-Regular local school district that is NOT a component of a supervisory union
## 2296 1-Regular local school district that is NOT a component of a supervisory union
## 2297 1-Regular local school district that is NOT a component of a supervisory union
## 2298 1-Regular local school district that is NOT a component of a supervisory union
## 2299 1-Regular local school district that is NOT a component of a supervisory union
## 2300 1-Regular local school district that is NOT a component of a supervisory union
## 2301                                                 7-Independent Charter District
## 2302                                                 7-Independent Charter District
## 2303                                                 7-Independent Charter District
## 2304 1-Regular local school district that is NOT a component of a supervisory union
## 2305                                                 7-Independent Charter District
## 2306 1-Regular local school district that is NOT a component of a supervisory union
## 2307 1-Regular local school district that is NOT a component of a supervisory union
## 2308 1-Regular local school district that is NOT a component of a supervisory union
## 2309 1-Regular local school district that is NOT a component of a supervisory union
## 2310 1-Regular local school district that is NOT a component of a supervisory union
## 2311         5-State agency providing elementary and/or secondary level instruction
## 2312         5-State agency providing elementary and/or secondary level instruction
## 2313 1-Regular local school district that is NOT a component of a supervisory union
## 2314 1-Regular local school district that is NOT a component of a supervisory union
## 2315 1-Regular local school district that is NOT a component of a supervisory union
## 2316 1-Regular local school district that is NOT a component of a supervisory union
## 2317 1-Regular local school district that is NOT a component of a supervisory union
## 2318 1-Regular local school district that is NOT a component of a supervisory union
## 2319 1-Regular local school district that is NOT a component of a supervisory union
## 2320 1-Regular local school district that is NOT a component of a supervisory union
## 2321 1-Regular local school district that is NOT a component of a supervisory union
## 2322 1-Regular local school district that is NOT a component of a supervisory union
## 2323         5-State agency providing elementary and/or secondary level instruction
## 2324                                                 7-Independent Charter District
## 2325 1-Regular local school district that is NOT a component of a supervisory union
## 2326 1-Regular local school district that is NOT a component of a supervisory union
## 2327 1-Regular local school district that is NOT a component of a supervisory union
## 2328                                     4-Regional Education Service Agency (RESA)
## 2329 1-Regular local school district that is NOT a component of a supervisory union
## 2330                                                 7-Independent Charter District
## 2331                                                 7-Independent Charter District
## 2332 1-Regular local school district that is NOT a component of a supervisory union
## 2333 1-Regular local school district that is NOT a component of a supervisory union
## 2334 1-Regular local school district that is NOT a component of a supervisory union
## 2335 1-Regular local school district that is NOT a component of a supervisory union
## 2336 1-Regular local school district that is NOT a component of a supervisory union
## 2337 1-Regular local school district that is NOT a component of a supervisory union
## 2338         5-State agency providing elementary and/or secondary level instruction
## 2339         5-State agency providing elementary and/or secondary level instruction
## 2340 1-Regular local school district that is NOT a component of a supervisory union
## 2341         5-State agency providing elementary and/or secondary level instruction
## 2342         5-State agency providing elementary and/or secondary level instruction
## 2343         5-State agency providing elementary and/or secondary level instruction
## 2344 1-Regular local school district that is NOT a component of a supervisory union
## 2345 1-Regular local school district that is NOT a component of a supervisory union
## 2346 1-Regular local school district that is NOT a component of a supervisory union
## 2347 1-Regular local school district that is NOT a component of a supervisory union
## 2348 1-Regular local school district that is NOT a component of a supervisory union
## 2349 1-Regular local school district that is NOT a component of a supervisory union
## 2350 1-Regular local school district that is NOT a component of a supervisory union
## 2351 1-Regular local school district that is NOT a component of a supervisory union
## 2352 1-Regular local school district that is NOT a component of a supervisory union
## 2353 1-Regular local school district that is NOT a component of a supervisory union
## 2354 1-Regular local school district that is NOT a component of a supervisory union
## 2355 1-Regular local school district that is NOT a component of a supervisory union
## 2356 1-Regular local school district that is NOT a component of a supervisory union
## 2357 1-Regular local school district that is NOT a component of a supervisory union
## 2358 1-Regular local school district that is NOT a component of a supervisory union
## 2359 1-Regular local school district that is NOT a component of a supervisory union
## 2360 1-Regular local school district that is NOT a component of a supervisory union
## 2361 1-Regular local school district that is NOT a component of a supervisory union
## 2362 1-Regular local school district that is NOT a component of a supervisory union
## 2363 1-Regular local school district that is NOT a component of a supervisory union
## 2364 1-Regular local school district that is NOT a component of a supervisory union
## 2365             2-Local school district that is a component of a supervisory union
## 2366 1-Regular local school district that is NOT a component of a supervisory union
## 2367                                                     8-Other education agencies
## 2368 1-Regular local school district that is NOT a component of a supervisory union
## 2369 1-Regular local school district that is NOT a component of a supervisory union
## 2370 1-Regular local school district that is NOT a component of a supervisory union
## 2371 1-Regular local school district that is NOT a component of a supervisory union
## 2372 1-Regular local school district that is NOT a component of a supervisory union
## 2373 1-Regular local school district that is NOT a component of a supervisory union
## 2374 1-Regular local school district that is NOT a component of a supervisory union
## 2375 1-Regular local school district that is NOT a component of a supervisory union
## 2376         5-State agency providing elementary and/or secondary level instruction
## 2377 1-Regular local school district that is NOT a component of a supervisory union
## 2378 1-Regular local school district that is NOT a component of a supervisory union
## 2379 1-Regular local school district that is NOT a component of a supervisory union
## 2380 1-Regular local school district that is NOT a component of a supervisory union
## 2381 1-Regular local school district that is NOT a component of a supervisory union
## 2382 1-Regular local school district that is NOT a component of a supervisory union
## 2383 1-Regular local school district that is NOT a component of a supervisory union
## 2384 1-Regular local school district that is NOT a component of a supervisory union
## 2385 1-Regular local school district that is NOT a component of a supervisory union
## 2386 1-Regular local school district that is NOT a component of a supervisory union
## 2387                                                 7-Independent Charter District
## 2388 1-Regular local school district that is NOT a component of a supervisory union
## 2389 1-Regular local school district that is NOT a component of a supervisory union
## 2390 1-Regular local school district that is NOT a component of a supervisory union
## 2391 1-Regular local school district that is NOT a component of a supervisory union
## 2392 1-Regular local school district that is NOT a component of a supervisory union
## 2393 1-Regular local school district that is NOT a component of a supervisory union
## 2394 1-Regular local school district that is NOT a component of a supervisory union
## 2395 1-Regular local school district that is NOT a component of a supervisory union
## 2396 1-Regular local school district that is NOT a component of a supervisory union
## 2397 1-Regular local school district that is NOT a component of a supervisory union
## 2398 1-Regular local school district that is NOT a component of a supervisory union
## 2399 1-Regular local school district that is NOT a component of a supervisory union
## 2400 1-Regular local school district that is NOT a component of a supervisory union
## 2401 1-Regular local school district that is NOT a component of a supervisory union
## 2402 1-Regular local school district that is NOT a component of a supervisory union
## 2403 1-Regular local school district that is NOT a component of a supervisory union
## 2404 1-Regular local school district that is NOT a component of a supervisory union
## 2405 1-Regular local school district that is NOT a component of a supervisory union
## 2406 1-Regular local school district that is NOT a component of a supervisory union
## 2407 1-Regular local school district that is NOT a component of a supervisory union
## 2408 1-Regular local school district that is NOT a component of a supervisory union
## 2409         5-State agency providing elementary and/or secondary level instruction
## 2410 1-Regular local school district that is NOT a component of a supervisory union
## 2411 1-Regular local school district that is NOT a component of a supervisory union
## 2412 1-Regular local school district that is NOT a component of a supervisory union
## 2413                                                 7-Independent Charter District
## 2414 1-Regular local school district that is NOT a component of a supervisory union
## 2415 1-Regular local school district that is NOT a component of a supervisory union
## 2416                                     4-Regional Education Service Agency (RESA)
## 2417 1-Regular local school district that is NOT a component of a supervisory union
## 2418 1-Regular local school district that is NOT a component of a supervisory union
## 2419                                                 7-Independent Charter District
## 2420 1-Regular local school district that is NOT a component of a supervisory union
## 2421 1-Regular local school district that is NOT a component of a supervisory union
## 2422 1-Regular local school district that is NOT a component of a supervisory union
## 2423 1-Regular local school district that is NOT a component of a supervisory union
## 2424 1-Regular local school district that is NOT a component of a supervisory union
## 2425 1-Regular local school district that is NOT a component of a supervisory union
## 2426 1-Regular local school district that is NOT a component of a supervisory union
## 2427 1-Regular local school district that is NOT a component of a supervisory union
## 2428 1-Regular local school district that is NOT a component of a supervisory union
## 2429 1-Regular local school district that is NOT a component of a supervisory union
## 2430 1-Regular local school district that is NOT a component of a supervisory union
## 2431         5-State agency providing elementary and/or secondary level instruction
## 2432         5-State agency providing elementary and/or secondary level instruction
## 2433 1-Regular local school district that is NOT a component of a supervisory union
## 2434 1-Regular local school district that is NOT a component of a supervisory union
## 2435 1-Regular local school district that is NOT a component of a supervisory union
## 2436 1-Regular local school district that is NOT a component of a supervisory union
## 2437 1-Regular local school district that is NOT a component of a supervisory union
## 2438 1-Regular local school district that is NOT a component of a supervisory union
## 2439 1-Regular local school district that is NOT a component of a supervisory union
## 2440 1-Regular local school district that is NOT a component of a supervisory union
## 2441 1-Regular local school district that is NOT a component of a supervisory union
## 2442         5-State agency providing elementary and/or secondary level instruction
## 2443 1-Regular local school district that is NOT a component of a supervisory union
## 2444 1-Regular local school district that is NOT a component of a supervisory union
## 2445 1-Regular local school district that is NOT a component of a supervisory union
## 2446 1-Regular local school district that is NOT a component of a supervisory union
## 2447 1-Regular local school district that is NOT a component of a supervisory union
## 2448 1-Regular local school district that is NOT a component of a supervisory union
## 2449 1-Regular local school district that is NOT a component of a supervisory union
## 2450 1-Regular local school district that is NOT a component of a supervisory union
## 2451         5-State agency providing elementary and/or secondary level instruction
## 2452 1-Regular local school district that is NOT a component of a supervisory union
## 2453 1-Regular local school district that is NOT a component of a supervisory union
## 2454 1-Regular local school district that is NOT a component of a supervisory union
## 2455 1-Regular local school district that is NOT a component of a supervisory union
## 2456                                     4-Regional Education Service Agency (RESA)
## 2457 1-Regular local school district that is NOT a component of a supervisory union
## 2458                                                     8-Other education agencies
## 2459                                                     8-Other education agencies
## 2460                                                     8-Other education agencies
## 2461                                                     8-Other education agencies
## 2462                                                     8-Other education agencies
## 2463 1-Regular local school district that is NOT a component of a supervisory union
## 2464 1-Regular local school district that is NOT a component of a supervisory union
## 2465         5-State agency providing elementary and/or secondary level instruction
## 2466 1-Regular local school district that is NOT a component of a supervisory union
## 2467 1-Regular local school district that is NOT a component of a supervisory union
## 2468 1-Regular local school district that is NOT a component of a supervisory union
## 2469 1-Regular local school district that is NOT a component of a supervisory union
## 2470 1-Regular local school district that is NOT a component of a supervisory union
## 2471 1-Regular local school district that is NOT a component of a supervisory union
## 2472 1-Regular local school district that is NOT a component of a supervisory union
## 2473 1-Regular local school district that is NOT a component of a supervisory union
## 2474 1-Regular local school district that is NOT a component of a supervisory union
## 2475         5-State agency providing elementary and/or secondary level instruction
## 2476         5-State agency providing elementary and/or secondary level instruction
## 2477         5-State agency providing elementary and/or secondary level instruction
## 2478 1-Regular local school district that is NOT a component of a supervisory union
## 2479 1-Regular local school district that is NOT a component of a supervisory union
## 2480 1-Regular local school district that is NOT a component of a supervisory union
## 2481                                                 7-Independent Charter District
## 2482 1-Regular local school district that is NOT a component of a supervisory union
## 2483 1-Regular local school district that is NOT a component of a supervisory union
## 2484 1-Regular local school district that is NOT a component of a supervisory union
## 2485 1-Regular local school district that is NOT a component of a supervisory union
## 2486 1-Regular local school district that is NOT a component of a supervisory union
## 2487 1-Regular local school district that is NOT a component of a supervisory union
## 2488 1-Regular local school district that is NOT a component of a supervisory union
## 2489 1-Regular local school district that is NOT a component of a supervisory union
## 2490 1-Regular local school district that is NOT a component of a supervisory union
## 2491 1-Regular local school district that is NOT a component of a supervisory union
## 2492 1-Regular local school district that is NOT a component of a supervisory union
## 2493 1-Regular local school district that is NOT a component of a supervisory union
## 2494 1-Regular local school district that is NOT a component of a supervisory union
## 2495 1-Regular local school district that is NOT a component of a supervisory union
## 2496 1-Regular local school district that is NOT a component of a supervisory union
## 2497 1-Regular local school district that is NOT a component of a supervisory union
## 2498 1-Regular local school district that is NOT a component of a supervisory union
## 2499 1-Regular local school district that is NOT a component of a supervisory union
## 2500 1-Regular local school district that is NOT a component of a supervisory union
## 2501                                                 7-Independent Charter District
## 2502                                                 7-Independent Charter District
## 2503                                                 7-Independent Charter District
## 2504                                                 7-Independent Charter District
## 2505                                                 7-Independent Charter District
## 2506                                                 7-Independent Charter District
## 2507                                                 7-Independent Charter District
## 2508                                                 7-Independent Charter District
## 2509                                                 7-Independent Charter District
## 2510 1-Regular local school district that is NOT a component of a supervisory union
## 2511 1-Regular local school district that is NOT a component of a supervisory union
## 2512 1-Regular local school district that is NOT a component of a supervisory union
## 2513 1-Regular local school district that is NOT a component of a supervisory union
## 2514 1-Regular local school district that is NOT a component of a supervisory union
## 2515 1-Regular local school district that is NOT a component of a supervisory union
## 2516 1-Regular local school district that is NOT a component of a supervisory union
## 2517 1-Regular local school district that is NOT a component of a supervisory union
## 2518 1-Regular local school district that is NOT a component of a supervisory union
## 2519 1-Regular local school district that is NOT a component of a supervisory union
## 2520 1-Regular local school district that is NOT a component of a supervisory union
## 2521 1-Regular local school district that is NOT a component of a supervisory union
## 2522 1-Regular local school district that is NOT a component of a supervisory union
## 2523 1-Regular local school district that is NOT a component of a supervisory union
## 2524 1-Regular local school district that is NOT a component of a supervisory union
## 2525         5-State agency providing elementary and/or secondary level instruction
## 2526 1-Regular local school district that is NOT a component of a supervisory union
## 2527 1-Regular local school district that is NOT a component of a supervisory union
## 2528         5-State agency providing elementary and/or secondary level instruction
## 2529 1-Regular local school district that is NOT a component of a supervisory union
## 2530 1-Regular local school district that is NOT a component of a supervisory union
## 2531 1-Regular local school district that is NOT a component of a supervisory union
## 2532 1-Regular local school district that is NOT a component of a supervisory union
## 2533 1-Regular local school district that is NOT a component of a supervisory union
## 2534 1-Regular local school district that is NOT a component of a supervisory union
## 2535 1-Regular local school district that is NOT a component of a supervisory union
## 2536 1-Regular local school district that is NOT a component of a supervisory union
## 2537 1-Regular local school district that is NOT a component of a supervisory union
## 2538 1-Regular local school district that is NOT a component of a supervisory union
## 2539                                                 7-Independent Charter District
## 2540 1-Regular local school district that is NOT a component of a supervisory union
## 2541 1-Regular local school district that is NOT a component of a supervisory union
## 2542 1-Regular local school district that is NOT a component of a supervisory union
## 2543 1-Regular local school district that is NOT a component of a supervisory union
## 2544 1-Regular local school district that is NOT a component of a supervisory union
## 2545 1-Regular local school district that is NOT a component of a supervisory union
## 2546 1-Regular local school district that is NOT a component of a supervisory union
## 2547 1-Regular local school district that is NOT a component of a supervisory union
## 2548 1-Regular local school district that is NOT a component of a supervisory union
## 2549 1-Regular local school district that is NOT a component of a supervisory union
## 2550 1-Regular local school district that is NOT a component of a supervisory union
## 2551 1-Regular local school district that is NOT a component of a supervisory union
## 2552 1-Regular local school district that is NOT a component of a supervisory union
## 2553 1-Regular local school district that is NOT a component of a supervisory union
## 2554                                                 7-Independent Charter District
## 2555                                                 7-Independent Charter District
## 2556                                                 7-Independent Charter District
## 2557 1-Regular local school district that is NOT a component of a supervisory union
## 2558 1-Regular local school district that is NOT a component of a supervisory union
## 2559 1-Regular local school district that is NOT a component of a supervisory union
## 2560 1-Regular local school district that is NOT a component of a supervisory union
## 2561 1-Regular local school district that is NOT a component of a supervisory union
## 2562 1-Regular local school district that is NOT a component of a supervisory union
## 2563 1-Regular local school district that is NOT a component of a supervisory union
## 2564 1-Regular local school district that is NOT a component of a supervisory union
## 2565 1-Regular local school district that is NOT a component of a supervisory union
## 2566 1-Regular local school district that is NOT a component of a supervisory union
## 2567 1-Regular local school district that is NOT a component of a supervisory union
## 2568 1-Regular local school district that is NOT a component of a supervisory union
## 2569 1-Regular local school district that is NOT a component of a supervisory union
## 2570 1-Regular local school district that is NOT a component of a supervisory union
## 2571 1-Regular local school district that is NOT a component of a supervisory union
## 2572 1-Regular local school district that is NOT a component of a supervisory union
## 2573 1-Regular local school district that is NOT a component of a supervisory union
## 2574 1-Regular local school district that is NOT a component of a supervisory union
## 2575 1-Regular local school district that is NOT a component of a supervisory union
## 2576                                     4-Regional Education Service Agency (RESA)
## 2577 1-Regular local school district that is NOT a component of a supervisory union
## 2578 1-Regular local school district that is NOT a component of a supervisory union
## 2579                                     4-Regional Education Service Agency (RESA)
## 2580 1-Regular local school district that is NOT a component of a supervisory union
## 2581 1-Regular local school district that is NOT a component of a supervisory union
## 2582 1-Regular local school district that is NOT a component of a supervisory union
## 2583 1-Regular local school district that is NOT a component of a supervisory union
## 2584 1-Regular local school district that is NOT a component of a supervisory union
## 2585 1-Regular local school district that is NOT a component of a supervisory union
## 2586 1-Regular local school district that is NOT a component of a supervisory union
## 2587 1-Regular local school district that is NOT a component of a supervisory union
## 2588 1-Regular local school district that is NOT a component of a supervisory union
## 2589         5-State agency providing elementary and/or secondary level instruction
## 2590 1-Regular local school district that is NOT a component of a supervisory union
## 2591 1-Regular local school district that is NOT a component of a supervisory union
## 2592 1-Regular local school district that is NOT a component of a supervisory union
## 2593 1-Regular local school district that is NOT a component of a supervisory union
## 2594 1-Regular local school district that is NOT a component of a supervisory union
## 2595 1-Regular local school district that is NOT a component of a supervisory union
## 2596 1-Regular local school district that is NOT a component of a supervisory union
## 2597 1-Regular local school district that is NOT a component of a supervisory union
## 2598 1-Regular local school district that is NOT a component of a supervisory union
## 2599 1-Regular local school district that is NOT a component of a supervisory union
## 2600 1-Regular local school district that is NOT a component of a supervisory union
## 2601 1-Regular local school district that is NOT a component of a supervisory union
## 2602 1-Regular local school district that is NOT a component of a supervisory union
## 2603         5-State agency providing elementary and/or secondary level instruction
## 2604         5-State agency providing elementary and/or secondary level instruction
## 2605 1-Regular local school district that is NOT a component of a supervisory union
## 2606 1-Regular local school district that is NOT a component of a supervisory union
## 2607 1-Regular local school district that is NOT a component of a supervisory union
## 2608 1-Regular local school district that is NOT a component of a supervisory union
## 2609 1-Regular local school district that is NOT a component of a supervisory union
## 2610 1-Regular local school district that is NOT a component of a supervisory union
## 2611 1-Regular local school district that is NOT a component of a supervisory union
## 2612 1-Regular local school district that is NOT a component of a supervisory union
## 2613 1-Regular local school district that is NOT a component of a supervisory union
## 2614 1-Regular local school district that is NOT a component of a supervisory union
## 2615 1-Regular local school district that is NOT a component of a supervisory union
## 2616 1-Regular local school district that is NOT a component of a supervisory union
## 2617 1-Regular local school district that is NOT a component of a supervisory union
## 2618                                                 7-Independent Charter District
## 2619 1-Regular local school district that is NOT a component of a supervisory union
## 2620 1-Regular local school district that is NOT a component of a supervisory union
## 2621                                     4-Regional Education Service Agency (RESA)
## 2622 1-Regular local school district that is NOT a component of a supervisory union
## 2623 1-Regular local school district that is NOT a component of a supervisory union
## 2624 1-Regular local school district that is NOT a component of a supervisory union
## 2625 1-Regular local school district that is NOT a component of a supervisory union
## 2626 1-Regular local school district that is NOT a component of a supervisory union
## 2627 1-Regular local school district that is NOT a component of a supervisory union
## 2628 1-Regular local school district that is NOT a component of a supervisory union
## 2629 1-Regular local school district that is NOT a component of a supervisory union
## 2630 1-Regular local school district that is NOT a component of a supervisory union
## 2631         5-State agency providing elementary and/or secondary level instruction
## 2632 1-Regular local school district that is NOT a component of a supervisory union
## 2633 1-Regular local school district that is NOT a component of a supervisory union
## 2634 1-Regular local school district that is NOT a component of a supervisory union
## 2635 1-Regular local school district that is NOT a component of a supervisory union
## 2636                                     4-Regional Education Service Agency (RESA)
## 2637 1-Regular local school district that is NOT a component of a supervisory union
## 2638 1-Regular local school district that is NOT a component of a supervisory union
## 2639 1-Regular local school district that is NOT a component of a supervisory union
## 2640 1-Regular local school district that is NOT a component of a supervisory union
## 2641         5-State agency providing elementary and/or secondary level instruction
## 2642 1-Regular local school district that is NOT a component of a supervisory union
## 2643 1-Regular local school district that is NOT a component of a supervisory union
## 2644 1-Regular local school district that is NOT a component of a supervisory union
## 2645 1-Regular local school district that is NOT a component of a supervisory union
## 2646 1-Regular local school district that is NOT a component of a supervisory union
## 2647                                                 7-Independent Charter District
## 2648 1-Regular local school district that is NOT a component of a supervisory union
## 2649 1-Regular local school district that is NOT a component of a supervisory union
## 2650 1-Regular local school district that is NOT a component of a supervisory union
## 2651 1-Regular local school district that is NOT a component of a supervisory union
## 2652 1-Regular local school district that is NOT a component of a supervisory union
## 2653 1-Regular local school district that is NOT a component of a supervisory union
## 2654 1-Regular local school district that is NOT a component of a supervisory union
## 2655 1-Regular local school district that is NOT a component of a supervisory union
## 2656 1-Regular local school district that is NOT a component of a supervisory union
## 2657 1-Regular local school district that is NOT a component of a supervisory union
## 2658 1-Regular local school district that is NOT a component of a supervisory union
## 2659 1-Regular local school district that is NOT a component of a supervisory union
## 2660         5-State agency providing elementary and/or secondary level instruction
## 2661 1-Regular local school district that is NOT a component of a supervisory union
## 2662 1-Regular local school district that is NOT a component of a supervisory union
## 2663 1-Regular local school district that is NOT a component of a supervisory union
## 2664 1-Regular local school district that is NOT a component of a supervisory union
## 2665 1-Regular local school district that is NOT a component of a supervisory union
## 2666                                     4-Regional Education Service Agency (RESA)
## 2667 1-Regular local school district that is NOT a component of a supervisory union
## 2668 1-Regular local school district that is NOT a component of a supervisory union
## 2669 1-Regular local school district that is NOT a component of a supervisory union
## 2670 1-Regular local school district that is NOT a component of a supervisory union
## 2671 1-Regular local school district that is NOT a component of a supervisory union
## 2672 1-Regular local school district that is NOT a component of a supervisory union
## 2673 1-Regular local school district that is NOT a component of a supervisory union
## 2674                                                 7-Independent Charter District
## 2675 1-Regular local school district that is NOT a component of a supervisory union
## 2676 1-Regular local school district that is NOT a component of a supervisory union
## 2677 1-Regular local school district that is NOT a component of a supervisory union
## 2678 1-Regular local school district that is NOT a component of a supervisory union
## 2679 1-Regular local school district that is NOT a component of a supervisory union
## 2680 1-Regular local school district that is NOT a component of a supervisory union
## 2681 1-Regular local school district that is NOT a component of a supervisory union
## 2682 1-Regular local school district that is NOT a component of a supervisory union
## 2683 1-Regular local school district that is NOT a component of a supervisory union
## 2684 1-Regular local school district that is NOT a component of a supervisory union
## 2685 1-Regular local school district that is NOT a component of a supervisory union
## 2686 1-Regular local school district that is NOT a component of a supervisory union
## 2687 1-Regular local school district that is NOT a component of a supervisory union
## 2688 1-Regular local school district that is NOT a component of a supervisory union
## 2689 1-Regular local school district that is NOT a component of a supervisory union
## 2690 1-Regular local school district that is NOT a component of a supervisory union
## 2691 1-Regular local school district that is NOT a component of a supervisory union
## 2692 1-Regular local school district that is NOT a component of a supervisory union
## 2693 1-Regular local school district that is NOT a component of a supervisory union
## 2694 1-Regular local school district that is NOT a component of a supervisory union
## 2695 1-Regular local school district that is NOT a component of a supervisory union
## 2696 1-Regular local school district that is NOT a component of a supervisory union
## 2697 1-Regular local school district that is NOT a component of a supervisory union
## 2698 1-Regular local school district that is NOT a component of a supervisory union
## 2699 1-Regular local school district that is NOT a component of a supervisory union
## 2700                                     4-Regional Education Service Agency (RESA)
## 2701                                     4-Regional Education Service Agency (RESA)
## 2702 1-Regular local school district that is NOT a component of a supervisory union
## 2703 1-Regular local school district that is NOT a component of a supervisory union
## 2704 1-Regular local school district that is NOT a component of a supervisory union
## 2705 1-Regular local school district that is NOT a component of a supervisory union
## 2706 1-Regular local school district that is NOT a component of a supervisory union
## 2707 1-Regular local school district that is NOT a component of a supervisory union
## 2708 1-Regular local school district that is NOT a component of a supervisory union
## 2709         5-State agency providing elementary and/or secondary level instruction
## 2710 1-Regular local school district that is NOT a component of a supervisory union
## 2711 1-Regular local school district that is NOT a component of a supervisory union
## 2712                                                 7-Independent Charter District
## 2713                                     4-Regional Education Service Agency (RESA)
## 2714 1-Regular local school district that is NOT a component of a supervisory union
## 2715                                     4-Regional Education Service Agency (RESA)
## 2716 1-Regular local school district that is NOT a component of a supervisory union
## 2717                                                 7-Independent Charter District
## 2718         5-State agency providing elementary and/or secondary level instruction
## 2719 1-Regular local school district that is NOT a component of a supervisory union
## 2720 1-Regular local school district that is NOT a component of a supervisory union
## 2721 1-Regular local school district that is NOT a component of a supervisory union
## 2722 1-Regular local school district that is NOT a component of a supervisory union
## 2723 1-Regular local school district that is NOT a component of a supervisory union
## 2724 1-Regular local school district that is NOT a component of a supervisory union
## 2725 1-Regular local school district that is NOT a component of a supervisory union
## 2726 1-Regular local school district that is NOT a component of a supervisory union
## 2727 1-Regular local school district that is NOT a component of a supervisory union
## 2728 1-Regular local school district that is NOT a component of a supervisory union
## 2729 1-Regular local school district that is NOT a component of a supervisory union
## 2730 1-Regular local school district that is NOT a component of a supervisory union
## 2731 1-Regular local school district that is NOT a component of a supervisory union
## 2732 1-Regular local school district that is NOT a component of a supervisory union
## 2733 1-Regular local school district that is NOT a component of a supervisory union
## 2734 1-Regular local school district that is NOT a component of a supervisory union
## 2735 1-Regular local school district that is NOT a component of a supervisory union
## 2736 1-Regular local school district that is NOT a component of a supervisory union
## 2737 1-Regular local school district that is NOT a component of a supervisory union
## 2738 1-Regular local school district that is NOT a component of a supervisory union
## 2739                                     4-Regional Education Service Agency (RESA)
## 2740 1-Regular local school district that is NOT a component of a supervisory union
## 2741 1-Regular local school district that is NOT a component of a supervisory union
## 2742 1-Regular local school district that is NOT a component of a supervisory union
## 2743 1-Regular local school district that is NOT a component of a supervisory union
## 2744 1-Regular local school district that is NOT a component of a supervisory union
## 2745 1-Regular local school district that is NOT a component of a supervisory union
## 2746                                                 7-Independent Charter District
## 2747 1-Regular local school district that is NOT a component of a supervisory union
## 2748 1-Regular local school district that is NOT a component of a supervisory union
## 2749 1-Regular local school district that is NOT a component of a supervisory union
## 2750 1-Regular local school district that is NOT a component of a supervisory union
## 2751 1-Regular local school district that is NOT a component of a supervisory union
## 2752 1-Regular local school district that is NOT a component of a supervisory union
## 2753 1-Regular local school district that is NOT a component of a supervisory union
## 2754                                                 7-Independent Charter District
## 2755 1-Regular local school district that is NOT a component of a supervisory union
## 2756 1-Regular local school district that is NOT a component of a supervisory union
## 2757 1-Regular local school district that is NOT a component of a supervisory union
## 2758 1-Regular local school district that is NOT a component of a supervisory union
## 2759 1-Regular local school district that is NOT a component of a supervisory union
## 2760 1-Regular local school district that is NOT a component of a supervisory union
## 2761 1-Regular local school district that is NOT a component of a supervisory union
## 2762 1-Regular local school district that is NOT a component of a supervisory union
## 2763 1-Regular local school district that is NOT a component of a supervisory union
## 2764 1-Regular local school district that is NOT a component of a supervisory union
## 2765 1-Regular local school district that is NOT a component of a supervisory union
## 2766 1-Regular local school district that is NOT a component of a supervisory union
## 2767         5-State agency providing elementary and/or secondary level instruction
## 2768 1-Regular local school district that is NOT a component of a supervisory union
## 2769         5-State agency providing elementary and/or secondary level instruction
## 2770 1-Regular local school district that is NOT a component of a supervisory union
## 2771 1-Regular local school district that is NOT a component of a supervisory union
## 2772 1-Regular local school district that is NOT a component of a supervisory union
## 2773 1-Regular local school district that is NOT a component of a supervisory union
## 2774 1-Regular local school district that is NOT a component of a supervisory union
## 2775 1-Regular local school district that is NOT a component of a supervisory union
## 2776 1-Regular local school district that is NOT a component of a supervisory union
## 2777 1-Regular local school district that is NOT a component of a supervisory union
## 2778 1-Regular local school district that is NOT a component of a supervisory union
## 2779 1-Regular local school district that is NOT a component of a supervisory union
## 2780 1-Regular local school district that is NOT a component of a supervisory union
## 2781 1-Regular local school district that is NOT a component of a supervisory union
## 2782 1-Regular local school district that is NOT a component of a supervisory union
## 2783 1-Regular local school district that is NOT a component of a supervisory union
## 2784 1-Regular local school district that is NOT a component of a supervisory union
## 2785                                     4-Regional Education Service Agency (RESA)
## 2786 1-Regular local school district that is NOT a component of a supervisory union
## 2787 1-Regular local school district that is NOT a component of a supervisory union
## 2788 1-Regular local school district that is NOT a component of a supervisory union
## 2789 1-Regular local school district that is NOT a component of a supervisory union
## 2790                                                 7-Independent Charter District
## 2791 1-Regular local school district that is NOT a component of a supervisory union
## 2792 1-Regular local school district that is NOT a component of a supervisory union
## 2793 1-Regular local school district that is NOT a component of a supervisory union
## 2794             2-Local school district that is a component of a supervisory union
## 2795 1-Regular local school district that is NOT a component of a supervisory union
## 2796 1-Regular local school district that is NOT a component of a supervisory union
## 2797 1-Regular local school district that is NOT a component of a supervisory union
## 2798 1-Regular local school district that is NOT a component of a supervisory union
## 2799 1-Regular local school district that is NOT a component of a supervisory union
## 2800 1-Regular local school district that is NOT a component of a supervisory union
## 2801 1-Regular local school district that is NOT a component of a supervisory union
## 2802 1-Regular local school district that is NOT a component of a supervisory union
## 2803 1-Regular local school district that is NOT a component of a supervisory union
## 2804             2-Local school district that is a component of a supervisory union
## 2805 1-Regular local school district that is NOT a component of a supervisory union
## 2806 1-Regular local school district that is NOT a component of a supervisory union
## 2807 1-Regular local school district that is NOT a component of a supervisory union
## 2808 1-Regular local school district that is NOT a component of a supervisory union
## 2809                                                 7-Independent Charter District
## 2810 1-Regular local school district that is NOT a component of a supervisory union
## 2811 1-Regular local school district that is NOT a component of a supervisory union
## 2812 1-Regular local school district that is NOT a component of a supervisory union
## 2813                                                 7-Independent Charter District
## 2814                                                 7-Independent Charter District
## 2815                                                 7-Independent Charter District
## 2816                                                 7-Independent Charter District
## 2817                                                 7-Independent Charter District
## 2818 1-Regular local school district that is NOT a component of a supervisory union
## 2819 1-Regular local school district that is NOT a component of a supervisory union
## 2820 1-Regular local school district that is NOT a component of a supervisory union
## 2821 1-Regular local school district that is NOT a component of a supervisory union
## 2822 1-Regular local school district that is NOT a component of a supervisory union
## 2823 1-Regular local school district that is NOT a component of a supervisory union
## 2824 1-Regular local school district that is NOT a component of a supervisory union
## 2825 1-Regular local school district that is NOT a component of a supervisory union
## 2826 1-Regular local school district that is NOT a component of a supervisory union
## 2827 1-Regular local school district that is NOT a component of a supervisory union
## 2828 1-Regular local school district that is NOT a component of a supervisory union
## 2829 1-Regular local school district that is NOT a component of a supervisory union
## 2830 1-Regular local school district that is NOT a component of a supervisory union
## 2831 1-Regular local school district that is NOT a component of a supervisory union
## 2832 1-Regular local school district that is NOT a component of a supervisory union
## 2833 1-Regular local school district that is NOT a component of a supervisory union
## 2834 1-Regular local school district that is NOT a component of a supervisory union
## 2835 1-Regular local school district that is NOT a component of a supervisory union
## 2836         5-State agency providing elementary and/or secondary level instruction
## 2837 1-Regular local school district that is NOT a component of a supervisory union
## 2838 1-Regular local school district that is NOT a component of a supervisory union
## 2839                                     4-Regional Education Service Agency (RESA)
## 2840                                     4-Regional Education Service Agency (RESA)
## 2841                                     4-Regional Education Service Agency (RESA)
## 2842 1-Regular local school district that is NOT a component of a supervisory union
## 2843 1-Regular local school district that is NOT a component of a supervisory union
## 2844 1-Regular local school district that is NOT a component of a supervisory union
## 2845 1-Regular local school district that is NOT a component of a supervisory union
## 2846 1-Regular local school district that is NOT a component of a supervisory union
## 2847 1-Regular local school district that is NOT a component of a supervisory union
## 2848 1-Regular local school district that is NOT a component of a supervisory union
## 2849 1-Regular local school district that is NOT a component of a supervisory union
## 2850 1-Regular local school district that is NOT a component of a supervisory union
## 2851 1-Regular local school district that is NOT a component of a supervisory union
## 2852 1-Regular local school district that is NOT a component of a supervisory union
## 2853 1-Regular local school district that is NOT a component of a supervisory union
## 2854 1-Regular local school district that is NOT a component of a supervisory union
## 2855                                     4-Regional Education Service Agency (RESA)
## 2856                                     4-Regional Education Service Agency (RESA)
## 2857 1-Regular local school district that is NOT a component of a supervisory union
## 2858 1-Regular local school district that is NOT a component of a supervisory union
## 2859 1-Regular local school district that is NOT a component of a supervisory union
## 2860 1-Regular local school district that is NOT a component of a supervisory union
## 2861 1-Regular local school district that is NOT a component of a supervisory union
## 2862 1-Regular local school district that is NOT a component of a supervisory union
## 2863 1-Regular local school district that is NOT a component of a supervisory union
## 2864 1-Regular local school district that is NOT a component of a supervisory union
## 2865 1-Regular local school district that is NOT a component of a supervisory union
## 2866 1-Regular local school district that is NOT a component of a supervisory union
## 2867 1-Regular local school district that is NOT a component of a supervisory union
## 2868 1-Regular local school district that is NOT a component of a supervisory union
## 2869 1-Regular local school district that is NOT a component of a supervisory union
## 2870         5-State agency providing elementary and/or secondary level instruction
## 2871 1-Regular local school district that is NOT a component of a supervisory union
## 2872 1-Regular local school district that is NOT a component of a supervisory union
## 2873 1-Regular local school district that is NOT a component of a supervisory union
## 2874 1-Regular local school district that is NOT a component of a supervisory union
## 2875 1-Regular local school district that is NOT a component of a supervisory union
## 2876 1-Regular local school district that is NOT a component of a supervisory union
## 2877 1-Regular local school district that is NOT a component of a supervisory union
## 2878         5-State agency providing elementary and/or secondary level instruction
## 2879 1-Regular local school district that is NOT a component of a supervisory union
## 2880 1-Regular local school district that is NOT a component of a supervisory union
## 2881 1-Regular local school district that is NOT a component of a supervisory union
## 2882 1-Regular local school district that is NOT a component of a supervisory union
## 2883 1-Regular local school district that is NOT a component of a supervisory union
## 2884 1-Regular local school district that is NOT a component of a supervisory union
## 2885 1-Regular local school district that is NOT a component of a supervisory union
## 2886 1-Regular local school district that is NOT a component of a supervisory union
## 2887         5-State agency providing elementary and/or secondary level instruction
## 2888 1-Regular local school district that is NOT a component of a supervisory union
## 2889 1-Regular local school district that is NOT a component of a supervisory union
## 2890 1-Regular local school district that is NOT a component of a supervisory union
## 2891 1-Regular local school district that is NOT a component of a supervisory union
## 2892             2-Local school district that is a component of a supervisory union
## 2893 1-Regular local school district that is NOT a component of a supervisory union
## 2894         5-State agency providing elementary and/or secondary level instruction
## 2895 1-Regular local school district that is NOT a component of a supervisory union
## 2896 1-Regular local school district that is NOT a component of a supervisory union
## 2897 1-Regular local school district that is NOT a component of a supervisory union
## 2898 1-Regular local school district that is NOT a component of a supervisory union
## 2899 1-Regular local school district that is NOT a component of a supervisory union
## 2900 1-Regular local school district that is NOT a component of a supervisory union
## 2901 1-Regular local school district that is NOT a component of a supervisory union
## 2902 1-Regular local school district that is NOT a component of a supervisory union
## 2903 1-Regular local school district that is NOT a component of a supervisory union
## 2904 1-Regular local school district that is NOT a component of a supervisory union
## 2905 1-Regular local school district that is NOT a component of a supervisory union
## 2906 1-Regular local school district that is NOT a component of a supervisory union
## 2907 1-Regular local school district that is NOT a component of a supervisory union
## 2908 1-Regular local school district that is NOT a component of a supervisory union
## 2909 1-Regular local school district that is NOT a component of a supervisory union
## 2910 1-Regular local school district that is NOT a component of a supervisory union
## 2911                                     4-Regional Education Service Agency (RESA)
## 2912         5-State agency providing elementary and/or secondary level instruction
## 2913 1-Regular local school district that is NOT a component of a supervisory union
## 2914 1-Regular local school district that is NOT a component of a supervisory union
## 2915 1-Regular local school district that is NOT a component of a supervisory union
## 2916 1-Regular local school district that is NOT a component of a supervisory union
## 2917 1-Regular local school district that is NOT a component of a supervisory union
## 2918         5-State agency providing elementary and/or secondary level instruction
## 2919 1-Regular local school district that is NOT a component of a supervisory union
## 2920 1-Regular local school district that is NOT a component of a supervisory union
## 2921         5-State agency providing elementary and/or secondary level instruction
## 2922 1-Regular local school district that is NOT a component of a supervisory union
## 2923         5-State agency providing elementary and/or secondary level instruction
## 2924 1-Regular local school district that is NOT a component of a supervisory union
## 2925 1-Regular local school district that is NOT a component of a supervisory union
## 2926         5-State agency providing elementary and/or secondary level instruction
## 2927         5-State agency providing elementary and/or secondary level instruction
## 2928         5-State agency providing elementary and/or secondary level instruction
## 2929 1-Regular local school district that is NOT a component of a supervisory union
## 2930                                     4-Regional Education Service Agency (RESA)
## 2931 1-Regular local school district that is NOT a component of a supervisory union
## 2932 1-Regular local school district that is NOT a component of a supervisory union
## 2933 1-Regular local school district that is NOT a component of a supervisory union
## 2934 1-Regular local school district that is NOT a component of a supervisory union
## 2935 1-Regular local school district that is NOT a component of a supervisory union
## 2936 1-Regular local school district that is NOT a component of a supervisory union
## 2937 1-Regular local school district that is NOT a component of a supervisory union
## 2938 1-Regular local school district that is NOT a component of a supervisory union
## 2939 1-Regular local school district that is NOT a component of a supervisory union
## 2940 1-Regular local school district that is NOT a component of a supervisory union
## 2941 1-Regular local school district that is NOT a component of a supervisory union
## 2942 1-Regular local school district that is NOT a component of a supervisory union
## 2943 1-Regular local school district that is NOT a component of a supervisory union
## 2944 1-Regular local school district that is NOT a component of a supervisory union
## 2945 1-Regular local school district that is NOT a component of a supervisory union
## 2946 1-Regular local school district that is NOT a component of a supervisory union
## 2947 1-Regular local school district that is NOT a component of a supervisory union
## 2948 1-Regular local school district that is NOT a component of a supervisory union
## 2949 1-Regular local school district that is NOT a component of a supervisory union
## 2950 1-Regular local school district that is NOT a component of a supervisory union
## 2951 1-Regular local school district that is NOT a component of a supervisory union
## 2952 1-Regular local school district that is NOT a component of a supervisory union
## 2953 1-Regular local school district that is NOT a component of a supervisory union
## 2954 1-Regular local school district that is NOT a component of a supervisory union
## 2955 1-Regular local school district that is NOT a component of a supervisory union
## 2956 1-Regular local school district that is NOT a component of a supervisory union
## 2957         5-State agency providing elementary and/or secondary level instruction
## 2958 1-Regular local school district that is NOT a component of a supervisory union
## 2959 1-Regular local school district that is NOT a component of a supervisory union
## 2960 1-Regular local school district that is NOT a component of a supervisory union
## 2961 1-Regular local school district that is NOT a component of a supervisory union
## 2962 1-Regular local school district that is NOT a component of a supervisory union
## 2963 1-Regular local school district that is NOT a component of a supervisory union
## 2964 1-Regular local school district that is NOT a component of a supervisory union
## 2965 1-Regular local school district that is NOT a component of a supervisory union
## 2966 1-Regular local school district that is NOT a component of a supervisory union
## 2967 1-Regular local school district that is NOT a component of a supervisory union
## 2968 1-Regular local school district that is NOT a component of a supervisory union
## 2969 1-Regular local school district that is NOT a component of a supervisory union
## 2970 1-Regular local school district that is NOT a component of a supervisory union
## 2971 1-Regular local school district that is NOT a component of a supervisory union
## 2972 1-Regular local school district that is NOT a component of a supervisory union
## 2973         5-State agency providing elementary and/or secondary level instruction
## 2974 1-Regular local school district that is NOT a component of a supervisory union
## 2975 1-Regular local school district that is NOT a component of a supervisory union
## 2976 1-Regular local school district that is NOT a component of a supervisory union
## 2977 1-Regular local school district that is NOT a component of a supervisory union
## 2978 1-Regular local school district that is NOT a component of a supervisory union
## 2979 1-Regular local school district that is NOT a component of a supervisory union
## 2980 1-Regular local school district that is NOT a component of a supervisory union
## 2981 1-Regular local school district that is NOT a component of a supervisory union
## 2982 1-Regular local school district that is NOT a component of a supervisory union
## 2983 1-Regular local school district that is NOT a component of a supervisory union
## 2984 1-Regular local school district that is NOT a component of a supervisory union
## 2985 1-Regular local school district that is NOT a component of a supervisory union
## 2986 1-Regular local school district that is NOT a component of a supervisory union
## 2987         5-State agency providing elementary and/or secondary level instruction
## 2988 1-Regular local school district that is NOT a component of a supervisory union
## 2989 1-Regular local school district that is NOT a component of a supervisory union
## 2990 1-Regular local school district that is NOT a component of a supervisory union
## 2991 1-Regular local school district that is NOT a component of a supervisory union
## 2992 1-Regular local school district that is NOT a component of a supervisory union
## 2993         5-State agency providing elementary and/or secondary level instruction
## 2994 1-Regular local school district that is NOT a component of a supervisory union
## 2995 1-Regular local school district that is NOT a component of a supervisory union
## 2996 1-Regular local school district that is NOT a component of a supervisory union
## 2997 1-Regular local school district that is NOT a component of a supervisory union
## 2998         5-State agency providing elementary and/or secondary level instruction
## 2999 1-Regular local school district that is NOT a component of a supervisory union
## 3000 1-Regular local school district that is NOT a component of a supervisory union
## 3001 1-Regular local school district that is NOT a component of a supervisory union
## 3002 1-Regular local school district that is NOT a component of a supervisory union
## 3003 1-Regular local school district that is NOT a component of a supervisory union
## 3004 1-Regular local school district that is NOT a component of a supervisory union
## 3005 1-Regular local school district that is NOT a component of a supervisory union
## 3006 1-Regular local school district that is NOT a component of a supervisory union
## 3007 1-Regular local school district that is NOT a component of a supervisory union
## 3008 1-Regular local school district that is NOT a component of a supervisory union
## 3009         5-State agency providing elementary and/or secondary level instruction
## 3010 1-Regular local school district that is NOT a component of a supervisory union
## 3011 1-Regular local school district that is NOT a component of a supervisory union
## 3012 1-Regular local school district that is NOT a component of a supervisory union
## 3013 1-Regular local school district that is NOT a component of a supervisory union
## 3014 1-Regular local school district that is NOT a component of a supervisory union
## 3015 1-Regular local school district that is NOT a component of a supervisory union
## 3016 1-Regular local school district that is NOT a component of a supervisory union
## 3017 1-Regular local school district that is NOT a component of a supervisory union
## 3018         5-State agency providing elementary and/or secondary level instruction
## 3019 1-Regular local school district that is NOT a component of a supervisory union
## 3020                                                 7-Independent Charter District
## 3021 1-Regular local school district that is NOT a component of a supervisory union
## 3022 1-Regular local school district that is NOT a component of a supervisory union
## 3023 1-Regular local school district that is NOT a component of a supervisory union
## 3024 1-Regular local school district that is NOT a component of a supervisory union
## 3025 1-Regular local school district that is NOT a component of a supervisory union
## 3026 1-Regular local school district that is NOT a component of a supervisory union
## 3027 1-Regular local school district that is NOT a component of a supervisory union
## 3028 1-Regular local school district that is NOT a component of a supervisory union
## 3029 1-Regular local school district that is NOT a component of a supervisory union
## 3030 1-Regular local school district that is NOT a component of a supervisory union
## 3031 1-Regular local school district that is NOT a component of a supervisory union
## 3032         5-State agency providing elementary and/or secondary level instruction
## 3033         5-State agency providing elementary and/or secondary level instruction
## 3034         5-State agency providing elementary and/or secondary level instruction
## 3035 1-Regular local school district that is NOT a component of a supervisory union
## 3036 1-Regular local school district that is NOT a component of a supervisory union
## 3037 1-Regular local school district that is NOT a component of a supervisory union
## 3038 1-Regular local school district that is NOT a component of a supervisory union
## 3039 1-Regular local school district that is NOT a component of a supervisory union
## 3040 1-Regular local school district that is NOT a component of a supervisory union
## 3041 1-Regular local school district that is NOT a component of a supervisory union
## 3042 1-Regular local school district that is NOT a component of a supervisory union
## 3043 1-Regular local school district that is NOT a component of a supervisory union
## 3044 1-Regular local school district that is NOT a component of a supervisory union
## 3045 1-Regular local school district that is NOT a component of a supervisory union
## 3046 1-Regular local school district that is NOT a component of a supervisory union
## 3047 1-Regular local school district that is NOT a component of a supervisory union
## 3048         5-State agency providing elementary and/or secondary level instruction
## 3049 1-Regular local school district that is NOT a component of a supervisory union
## 3050 1-Regular local school district that is NOT a component of a supervisory union
## 3051 1-Regular local school district that is NOT a component of a supervisory union
## 3052 1-Regular local school district that is NOT a component of a supervisory union
## 3053 1-Regular local school district that is NOT a component of a supervisory union
## 3054 1-Regular local school district that is NOT a component of a supervisory union
## 3055 1-Regular local school district that is NOT a component of a supervisory union
## 3056         5-State agency providing elementary and/or secondary level instruction
## 3057 1-Regular local school district that is NOT a component of a supervisory union
## 3058 1-Regular local school district that is NOT a component of a supervisory union
## 3059 1-Regular local school district that is NOT a component of a supervisory union
## 3060                                                 7-Independent Charter District
## 3061 1-Regular local school district that is NOT a component of a supervisory union
## 3062 1-Regular local school district that is NOT a component of a supervisory union
## 3063 1-Regular local school district that is NOT a component of a supervisory union
## 3064 1-Regular local school district that is NOT a component of a supervisory union
## 3065 1-Regular local school district that is NOT a component of a supervisory union
## 3066 1-Regular local school district that is NOT a component of a supervisory union
## 3067 1-Regular local school district that is NOT a component of a supervisory union
## 3068 1-Regular local school district that is NOT a component of a supervisory union
## 3069 1-Regular local school district that is NOT a component of a supervisory union
## 3070 1-Regular local school district that is NOT a component of a supervisory union
## 3071         5-State agency providing elementary and/or secondary level instruction
## 3072 1-Regular local school district that is NOT a component of a supervisory union
## 3073 1-Regular local school district that is NOT a component of a supervisory union
## 3074 1-Regular local school district that is NOT a component of a supervisory union
## 3075 1-Regular local school district that is NOT a component of a supervisory union
## 3076 1-Regular local school district that is NOT a component of a supervisory union
## 3077 1-Regular local school district that is NOT a component of a supervisory union
## 3078 1-Regular local school district that is NOT a component of a supervisory union
## 3079 1-Regular local school district that is NOT a component of a supervisory union
## 3080 1-Regular local school district that is NOT a component of a supervisory union
## 3081 1-Regular local school district that is NOT a component of a supervisory union
## 3082 1-Regular local school district that is NOT a component of a supervisory union
## 3083 1-Regular local school district that is NOT a component of a supervisory union
## 3084         5-State agency providing elementary and/or secondary level instruction
## 3085 1-Regular local school district that is NOT a component of a supervisory union
## 3086 1-Regular local school district that is NOT a component of a supervisory union
## 3087 1-Regular local school district that is NOT a component of a supervisory union
## 3088 1-Regular local school district that is NOT a component of a supervisory union
## 3089 1-Regular local school district that is NOT a component of a supervisory union
## 3090 1-Regular local school district that is NOT a component of a supervisory union
## 3091 1-Regular local school district that is NOT a component of a supervisory union
## 3092 1-Regular local school district that is NOT a component of a supervisory union
## 3093 1-Regular local school district that is NOT a component of a supervisory union
## 3094                                                 7-Independent Charter District
## 3095                                     4-Regional Education Service Agency (RESA)
## 3096 1-Regular local school district that is NOT a component of a supervisory union
## 3097 1-Regular local school district that is NOT a component of a supervisory union
## 3098         5-State agency providing elementary and/or secondary level instruction
## 3099                                     4-Regional Education Service Agency (RESA)
## 3100 1-Regular local school district that is NOT a component of a supervisory union
## 3101 1-Regular local school district that is NOT a component of a supervisory union
## 3102 1-Regular local school district that is NOT a component of a supervisory union
## 3103 1-Regular local school district that is NOT a component of a supervisory union
## 3104 1-Regular local school district that is NOT a component of a supervisory union
## 3105 1-Regular local school district that is NOT a component of a supervisory union
## 3106 1-Regular local school district that is NOT a component of a supervisory union
## 3107 1-Regular local school district that is NOT a component of a supervisory union
## 3108 1-Regular local school district that is NOT a component of a supervisory union
## 3109 1-Regular local school district that is NOT a component of a supervisory union
## 3110                                     4-Regional Education Service Agency (RESA)
## 3111 1-Regular local school district that is NOT a component of a supervisory union
## 3112         5-State agency providing elementary and/or secondary level instruction
## 3113 1-Regular local school district that is NOT a component of a supervisory union
## 3114 1-Regular local school district that is NOT a component of a supervisory union
## 3115 1-Regular local school district that is NOT a component of a supervisory union
## 3116 1-Regular local school district that is NOT a component of a supervisory union
## 3117 1-Regular local school district that is NOT a component of a supervisory union
## 3118                                                 7-Independent Charter District
## 3119 1-Regular local school district that is NOT a component of a supervisory union
## 3120 1-Regular local school district that is NOT a component of a supervisory union
## 3121 1-Regular local school district that is NOT a component of a supervisory union
## 3122 1-Regular local school district that is NOT a component of a supervisory union
## 3123 1-Regular local school district that is NOT a component of a supervisory union
## 3124 1-Regular local school district that is NOT a component of a supervisory union
## 3125                                     4-Regional Education Service Agency (RESA)
## 3126 1-Regular local school district that is NOT a component of a supervisory union
## 3127         5-State agency providing elementary and/or secondary level instruction
## 3128 1-Regular local school district that is NOT a component of a supervisory union
## 3129                                     4-Regional Education Service Agency (RESA)
## 3130 1-Regular local school district that is NOT a component of a supervisory union
## 3131         5-State agency providing elementary and/or secondary level instruction
## 3132 1-Regular local school district that is NOT a component of a supervisory union
## 3133                                                 7-Independent Charter District
## 3134 1-Regular local school district that is NOT a component of a supervisory union
## 3135 1-Regular local school district that is NOT a component of a supervisory union
## 3136                                                 7-Independent Charter District
## 3137                                                 7-Independent Charter District
## 3138                                                 7-Independent Charter District
## 3139 1-Regular local school district that is NOT a component of a supervisory union
## 3140 1-Regular local school district that is NOT a component of a supervisory union
## 3141 1-Regular local school district that is NOT a component of a supervisory union
## 3142 1-Regular local school district that is NOT a component of a supervisory union
## 3143 1-Regular local school district that is NOT a component of a supervisory union
## 3144 1-Regular local school district that is NOT a component of a supervisory union
## 3145 1-Regular local school district that is NOT a component of a supervisory union
## 3146 1-Regular local school district that is NOT a component of a supervisory union
## 3147 1-Regular local school district that is NOT a component of a supervisory union
## 3148                                     4-Regional Education Service Agency (RESA)
## 3149 1-Regular local school district that is NOT a component of a supervisory union
## 3150 1-Regular local school district that is NOT a component of a supervisory union
## 3151 1-Regular local school district that is NOT a component of a supervisory union
## 3152 1-Regular local school district that is NOT a component of a supervisory union
## 3153         5-State agency providing elementary and/or secondary level instruction
## 3154 1-Regular local school district that is NOT a component of a supervisory union
## 3155 1-Regular local school district that is NOT a component of a supervisory union
## 3156 1-Regular local school district that is NOT a component of a supervisory union
## 3157 1-Regular local school district that is NOT a component of a supervisory union
## 3158 1-Regular local school district that is NOT a component of a supervisory union
## 3159 1-Regular local school district that is NOT a component of a supervisory union
## 3160 1-Regular local school district that is NOT a component of a supervisory union
## 3161 1-Regular local school district that is NOT a component of a supervisory union
## 3162 1-Regular local school district that is NOT a component of a supervisory union
## 3163 1-Regular local school district that is NOT a component of a supervisory union
## 3164 1-Regular local school district that is NOT a component of a supervisory union
## 3165 1-Regular local school district that is NOT a component of a supervisory union
## 3166 1-Regular local school district that is NOT a component of a supervisory union
## 3167 1-Regular local school district that is NOT a component of a supervisory union
## 3168 1-Regular local school district that is NOT a component of a supervisory union
## 3169 1-Regular local school district that is NOT a component of a supervisory union
## 3170         5-State agency providing elementary and/or secondary level instruction
## 3171 1-Regular local school district that is NOT a component of a supervisory union
## 3172 1-Regular local school district that is NOT a component of a supervisory union
## 3173                                     4-Regional Education Service Agency (RESA)
## 3174         5-State agency providing elementary and/or secondary level instruction
## 3175         5-State agency providing elementary and/or secondary level instruction
## 3176         5-State agency providing elementary and/or secondary level instruction
## 3177         5-State agency providing elementary and/or secondary level instruction
## 3178         5-State agency providing elementary and/or secondary level instruction
## 3179         5-State agency providing elementary and/or secondary level instruction
## 3180                                     4-Regional Education Service Agency (RESA)
## 3181                                     4-Regional Education Service Agency (RESA)
## 3182                                     4-Regional Education Service Agency (RESA)
## 3183                                     4-Regional Education Service Agency (RESA)
## 3184 1-Regular local school district that is NOT a component of a supervisory union
## 3185 1-Regular local school district that is NOT a component of a supervisory union
## 3186         5-State agency providing elementary and/or secondary level instruction
## 3187         5-State agency providing elementary and/or secondary level instruction
## 3188 1-Regular local school district that is NOT a component of a supervisory union
## 3189 1-Regular local school district that is NOT a component of a supervisory union
## 3190 1-Regular local school district that is NOT a component of a supervisory union
## 3191 1-Regular local school district that is NOT a component of a supervisory union
## 3192 1-Regular local school district that is NOT a component of a supervisory union
## 3193 1-Regular local school district that is NOT a component of a supervisory union
## 3194 1-Regular local school district that is NOT a component of a supervisory union
## 3195 1-Regular local school district that is NOT a component of a supervisory union
## 3196         5-State agency providing elementary and/or secondary level instruction
## 3197         5-State agency providing elementary and/or secondary level instruction
## 3198 1-Regular local school district that is NOT a component of a supervisory union
## 3199 1-Regular local school district that is NOT a component of a supervisory union
## 3200 1-Regular local school district that is NOT a component of a supervisory union
## 3201 1-Regular local school district that is NOT a component of a supervisory union
## 3202                                     4-Regional Education Service Agency (RESA)
## 3203 1-Regular local school district that is NOT a component of a supervisory union
## 3204 1-Regular local school district that is NOT a component of a supervisory union
## 3205 1-Regular local school district that is NOT a component of a supervisory union
## 3206 1-Regular local school district that is NOT a component of a supervisory union
## 3207 1-Regular local school district that is NOT a component of a supervisory union
## 3208 1-Regular local school district that is NOT a component of a supervisory union
## 3209 1-Regular local school district that is NOT a component of a supervisory union
## 3210 1-Regular local school district that is NOT a component of a supervisory union
## 3211 1-Regular local school district that is NOT a component of a supervisory union
## 3212 1-Regular local school district that is NOT a component of a supervisory union
## 3213 1-Regular local school district that is NOT a component of a supervisory union
## 3214 1-Regular local school district that is NOT a component of a supervisory union
## 3215 1-Regular local school district that is NOT a component of a supervisory union
## 3216 1-Regular local school district that is NOT a component of a supervisory union
## 3217 1-Regular local school district that is NOT a component of a supervisory union
## 3218 1-Regular local school district that is NOT a component of a supervisory union
## 3219 1-Regular local school district that is NOT a component of a supervisory union
## 3220 1-Regular local school district that is NOT a component of a supervisory union
## 3221 1-Regular local school district that is NOT a component of a supervisory union
## 3222 1-Regular local school district that is NOT a component of a supervisory union
## 3223 1-Regular local school district that is NOT a component of a supervisory union
## 3224 1-Regular local school district that is NOT a component of a supervisory union
## 3225 1-Regular local school district that is NOT a component of a supervisory union
## 3226         5-State agency providing elementary and/or secondary level instruction
## 3227         5-State agency providing elementary and/or secondary level instruction
## 3228 1-Regular local school district that is NOT a component of a supervisory union
## 3229         5-State agency providing elementary and/or secondary level instruction
## 3230 1-Regular local school district that is NOT a component of a supervisory union
## 3231                                     4-Regional Education Service Agency (RESA)
## 3232                                     4-Regional Education Service Agency (RESA)
## 3233                                     4-Regional Education Service Agency (RESA)
## 3234 1-Regular local school district that is NOT a component of a supervisory union
## 3235 1-Regular local school district that is NOT a component of a supervisory union
## 3236 1-Regular local school district that is NOT a component of a supervisory union
## 3237 1-Regular local school district that is NOT a component of a supervisory union
## 3238 1-Regular local school district that is NOT a component of a supervisory union
## 3239 1-Regular local school district that is NOT a component of a supervisory union
## 3240 1-Regular local school district that is NOT a component of a supervisory union
## 3241 1-Regular local school district that is NOT a component of a supervisory union
## 3242 1-Regular local school district that is NOT a component of a supervisory union
## 3243 1-Regular local school district that is NOT a component of a supervisory union
## 3244 1-Regular local school district that is NOT a component of a supervisory union
## 3245         5-State agency providing elementary and/or secondary level instruction
## 3246 1-Regular local school district that is NOT a component of a supervisory union
## 3247 1-Regular local school district that is NOT a component of a supervisory union
## 3248 1-Regular local school district that is NOT a component of a supervisory union
## 3249 1-Regular local school district that is NOT a component of a supervisory union
## 3250                                                 7-Independent Charter District
## 3251 1-Regular local school district that is NOT a component of a supervisory union
## 3252 1-Regular local school district that is NOT a component of a supervisory union
## 3253 1-Regular local school district that is NOT a component of a supervisory union
## 3254 1-Regular local school district that is NOT a component of a supervisory union
## 3255 1-Regular local school district that is NOT a component of a supervisory union
## 3256 1-Regular local school district that is NOT a component of a supervisory union
## 3257 1-Regular local school district that is NOT a component of a supervisory union
## 3258 1-Regular local school district that is NOT a component of a supervisory union
## 3259 1-Regular local school district that is NOT a component of a supervisory union
## 3260 1-Regular local school district that is NOT a component of a supervisory union
## 3261 1-Regular local school district that is NOT a component of a supervisory union
## 3262         5-State agency providing elementary and/or secondary level instruction
## 3263 1-Regular local school district that is NOT a component of a supervisory union
## 3264 1-Regular local school district that is NOT a component of a supervisory union
## 3265 1-Regular local school district that is NOT a component of a supervisory union
## 3266 1-Regular local school district that is NOT a component of a supervisory union
## 3267 1-Regular local school district that is NOT a component of a supervisory union
## 3268 1-Regular local school district that is NOT a component of a supervisory union
## 3269 1-Regular local school district that is NOT a component of a supervisory union
## 3270                                     4-Regional Education Service Agency (RESA)
## 3271 1-Regular local school district that is NOT a component of a supervisory union
## 3272 1-Regular local school district that is NOT a component of a supervisory union
## 3273 1-Regular local school district that is NOT a component of a supervisory union
## 3274 1-Regular local school district that is NOT a component of a supervisory union
## 3275 1-Regular local school district that is NOT a component of a supervisory union
## 3276 1-Regular local school district that is NOT a component of a supervisory union
## 3277 1-Regular local school district that is NOT a component of a supervisory union
## 3278 1-Regular local school district that is NOT a component of a supervisory union
## 3279 1-Regular local school district that is NOT a component of a supervisory union
## 3280 1-Regular local school district that is NOT a component of a supervisory union
## 3281 1-Regular local school district that is NOT a component of a supervisory union
## 3282 1-Regular local school district that is NOT a component of a supervisory union
## 3283                                                 7-Independent Charter District
## 3284 1-Regular local school district that is NOT a component of a supervisory union
## 3285 1-Regular local school district that is NOT a component of a supervisory union
## 3286         5-State agency providing elementary and/or secondary level instruction
## 3287 1-Regular local school district that is NOT a component of a supervisory union
## 3288                                     4-Regional Education Service Agency (RESA)
## 3289                                                 7-Independent Charter District
## 3290         5-State agency providing elementary and/or secondary level instruction
## 3291 1-Regular local school district that is NOT a component of a supervisory union
## 3292         5-State agency providing elementary and/or secondary level instruction
## 3293                                     4-Regional Education Service Agency (RESA)
## 3294                                     4-Regional Education Service Agency (RESA)
## 3295 1-Regular local school district that is NOT a component of a supervisory union
## 3296 1-Regular local school district that is NOT a component of a supervisory union
## 3297 1-Regular local school district that is NOT a component of a supervisory union
## 3298 1-Regular local school district that is NOT a component of a supervisory union
## 3299 1-Regular local school district that is NOT a component of a supervisory union
## 3300 1-Regular local school district that is NOT a component of a supervisory union
## 3301 1-Regular local school district that is NOT a component of a supervisory union
## 3302 1-Regular local school district that is NOT a component of a supervisory union
## 3303 1-Regular local school district that is NOT a component of a supervisory union
## 3304 1-Regular local school district that is NOT a component of a supervisory union
## 3305 1-Regular local school district that is NOT a component of a supervisory union
## 3306 1-Regular local school district that is NOT a component of a supervisory union
## 3307 1-Regular local school district that is NOT a component of a supervisory union
## 3308 1-Regular local school district that is NOT a component of a supervisory union
## 3309 1-Regular local school district that is NOT a component of a supervisory union
## 3310                                     4-Regional Education Service Agency (RESA)
## 3311                                     4-Regional Education Service Agency (RESA)
## 3312 1-Regular local school district that is NOT a component of a supervisory union
## 3313                                     4-Regional Education Service Agency (RESA)
## 3314                                     4-Regional Education Service Agency (RESA)
## 3315 1-Regular local school district that is NOT a component of a supervisory union
## 3316 1-Regular local school district that is NOT a component of a supervisory union
## 3317 1-Regular local school district that is NOT a component of a supervisory union
## 3318 1-Regular local school district that is NOT a component of a supervisory union
## 3319 1-Regular local school district that is NOT a component of a supervisory union
## 3320 1-Regular local school district that is NOT a component of a supervisory union
## 3321                                                 7-Independent Charter District
## 3322                                                 7-Independent Charter District
## 3323                                     4-Regional Education Service Agency (RESA)
## 3324 1-Regular local school district that is NOT a component of a supervisory union
## 3325 1-Regular local school district that is NOT a component of a supervisory union
## 3326 1-Regular local school district that is NOT a component of a supervisory union
## 3327 1-Regular local school district that is NOT a component of a supervisory union
## 3328 1-Regular local school district that is NOT a component of a supervisory union
## 3329 1-Regular local school district that is NOT a component of a supervisory union
## 3330 1-Regular local school district that is NOT a component of a supervisory union
## 3331                                     4-Regional Education Service Agency (RESA)
## 3332 1-Regular local school district that is NOT a component of a supervisory union
## 3333 1-Regular local school district that is NOT a component of a supervisory union
## 3334 1-Regular local school district that is NOT a component of a supervisory union
## 3335 1-Regular local school district that is NOT a component of a supervisory union
## 3336 1-Regular local school district that is NOT a component of a supervisory union
## 3337 1-Regular local school district that is NOT a component of a supervisory union
## 3338                                     4-Regional Education Service Agency (RESA)
## 3339 1-Regular local school district that is NOT a component of a supervisory union
## 3340                                     4-Regional Education Service Agency (RESA)
## 3341 1-Regular local school district that is NOT a component of a supervisory union
## 3342 1-Regular local school district that is NOT a component of a supervisory union
## 3343 1-Regular local school district that is NOT a component of a supervisory union
## 3344                                                 7-Independent Charter District
## 3345                                     4-Regional Education Service Agency (RESA)
## 3346 1-Regular local school district that is NOT a component of a supervisory union
## 3347 1-Regular local school district that is NOT a component of a supervisory union
## 3348 1-Regular local school district that is NOT a component of a supervisory union
## 3349                                     4-Regional Education Service Agency (RESA)
## 3350 1-Regular local school district that is NOT a component of a supervisory union
## 3351                                     4-Regional Education Service Agency (RESA)
## 3352 1-Regular local school district that is NOT a component of a supervisory union
## 3353                                                 7-Independent Charter District
## 3354 1-Regular local school district that is NOT a component of a supervisory union
## 3355 1-Regular local school district that is NOT a component of a supervisory union
## 3356 1-Regular local school district that is NOT a component of a supervisory union
## 3357 1-Regular local school district that is NOT a component of a supervisory union
## 3358 1-Regular local school district that is NOT a component of a supervisory union
## 3359 1-Regular local school district that is NOT a component of a supervisory union
## 3360 1-Regular local school district that is NOT a component of a supervisory union
## 3361                                                 7-Independent Charter District
## 3362 1-Regular local school district that is NOT a component of a supervisory union
## 3363 1-Regular local school district that is NOT a component of a supervisory union
## 3364 1-Regular local school district that is NOT a component of a supervisory union
## 3365 1-Regular local school district that is NOT a component of a supervisory union
## 3366 1-Regular local school district that is NOT a component of a supervisory union
## 3367 1-Regular local school district that is NOT a component of a supervisory union
## 3368 1-Regular local school district that is NOT a component of a supervisory union
## 3369         5-State agency providing elementary and/or secondary level instruction
## 3370 1-Regular local school district that is NOT a component of a supervisory union
## 3371 1-Regular local school district that is NOT a component of a supervisory union
## 3372         5-State agency providing elementary and/or secondary level instruction
## 3373 1-Regular local school district that is NOT a component of a supervisory union
## 3374 1-Regular local school district that is NOT a component of a supervisory union
## 3375 1-Regular local school district that is NOT a component of a supervisory union
## 3376 1-Regular local school district that is NOT a component of a supervisory union
## 3377 1-Regular local school district that is NOT a component of a supervisory union
## 3378 1-Regular local school district that is NOT a component of a supervisory union
## 3379 1-Regular local school district that is NOT a component of a supervisory union
## 3380 1-Regular local school district that is NOT a component of a supervisory union
## 3381 1-Regular local school district that is NOT a component of a supervisory union
## 3382         5-State agency providing elementary and/or secondary level instruction
## 3383 1-Regular local school district that is NOT a component of a supervisory union
## 3384 1-Regular local school district that is NOT a component of a supervisory union
## 3385 1-Regular local school district that is NOT a component of a supervisory union
## 3386 1-Regular local school district that is NOT a component of a supervisory union
## 3387 1-Regular local school district that is NOT a component of a supervisory union
## 3388 1-Regular local school district that is NOT a component of a supervisory union
## 3389 1-Regular local school district that is NOT a component of a supervisory union
## 3390         5-State agency providing elementary and/or secondary level instruction
## 3391 1-Regular local school district that is NOT a component of a supervisory union
## 3392 1-Regular local school district that is NOT a component of a supervisory union
## 3393         5-State agency providing elementary and/or secondary level instruction
## 3394                                                 7-Independent Charter District
## 3395 1-Regular local school district that is NOT a component of a supervisory union
## 3396 1-Regular local school district that is NOT a component of a supervisory union
## 3397 1-Regular local school district that is NOT a component of a supervisory union
## 3398                                     4-Regional Education Service Agency (RESA)
## 3399 1-Regular local school district that is NOT a component of a supervisory union
## 3400         5-State agency providing elementary and/or secondary level instruction
## 3401 1-Regular local school district that is NOT a component of a supervisory union
## 3402 1-Regular local school district that is NOT a component of a supervisory union
## 3403 1-Regular local school district that is NOT a component of a supervisory union
## 3404 1-Regular local school district that is NOT a component of a supervisory union
## 3405 1-Regular local school district that is NOT a component of a supervisory union
## 3406 1-Regular local school district that is NOT a component of a supervisory union
## 3407 1-Regular local school district that is NOT a component of a supervisory union
## 3408 1-Regular local school district that is NOT a component of a supervisory union
## 3409 1-Regular local school district that is NOT a component of a supervisory union
## 3410 1-Regular local school district that is NOT a component of a supervisory union
## 3411 1-Regular local school district that is NOT a component of a supervisory union
## 3412 1-Regular local school district that is NOT a component of a supervisory union
## 3413 1-Regular local school district that is NOT a component of a supervisory union
## 3414 1-Regular local school district that is NOT a component of a supervisory union
## 3415 1-Regular local school district that is NOT a component of a supervisory union
## 3416 1-Regular local school district that is NOT a component of a supervisory union
## 3417 1-Regular local school district that is NOT a component of a supervisory union
## 3418                                     4-Regional Education Service Agency (RESA)
## 3419 1-Regular local school district that is NOT a component of a supervisory union
## 3420 1-Regular local school district that is NOT a component of a supervisory union
## 3421 1-Regular local school district that is NOT a component of a supervisory union
## 3422 1-Regular local school district that is NOT a component of a supervisory union
## 3423 1-Regular local school district that is NOT a component of a supervisory union
## 3424         5-State agency providing elementary and/or secondary level instruction
## 3425         5-State agency providing elementary and/or secondary level instruction
## 3426                                           9-Specialized public school district
## 3427 1-Regular local school district that is NOT a component of a supervisory union
## 3428 1-Regular local school district that is NOT a component of a supervisory union
## 3429 1-Regular local school district that is NOT a component of a supervisory union
## 3430 1-Regular local school district that is NOT a component of a supervisory union
## 3431         5-State agency providing elementary and/or secondary level instruction
## 3432 1-Regular local school district that is NOT a component of a supervisory union
## 3433                                     4-Regional Education Service Agency (RESA)
## 3434 1-Regular local school district that is NOT a component of a supervisory union
## 3435 1-Regular local school district that is NOT a component of a supervisory union
## 3436                                     4-Regional Education Service Agency (RESA)
## 3437 1-Regular local school district that is NOT a component of a supervisory union
## 3438 1-Regular local school district that is NOT a component of a supervisory union
## 3439 1-Regular local school district that is NOT a component of a supervisory union
## 3440 1-Regular local school district that is NOT a component of a supervisory union
## 3441 1-Regular local school district that is NOT a component of a supervisory union
## 3442 1-Regular local school district that is NOT a component of a supervisory union
## 3443 1-Regular local school district that is NOT a component of a supervisory union
## 3444 1-Regular local school district that is NOT a component of a supervisory union
## 3445 1-Regular local school district that is NOT a component of a supervisory union
## 3446 1-Regular local school district that is NOT a component of a supervisory union
## 3447 1-Regular local school district that is NOT a component of a supervisory union
## 3448 1-Regular local school district that is NOT a component of a supervisory union
## 3449 1-Regular local school district that is NOT a component of a supervisory union
## 3450 1-Regular local school district that is NOT a component of a supervisory union
## 3451                                                 7-Independent Charter District
## 3452 1-Regular local school district that is NOT a component of a supervisory union
## 3453 1-Regular local school district that is NOT a component of a supervisory union
## 3454 1-Regular local school district that is NOT a component of a supervisory union
## 3455 1-Regular local school district that is NOT a component of a supervisory union
## 3456 1-Regular local school district that is NOT a component of a supervisory union
## 3457 1-Regular local school district that is NOT a component of a supervisory union
## 3458                                                 7-Independent Charter District
## 3459                                                 7-Independent Charter District
## 3460 1-Regular local school district that is NOT a component of a supervisory union
## 3461 1-Regular local school district that is NOT a component of a supervisory union
## 3462 1-Regular local school district that is NOT a component of a supervisory union
## 3463 1-Regular local school district that is NOT a component of a supervisory union
## 3464 1-Regular local school district that is NOT a component of a supervisory union
## 3465 1-Regular local school district that is NOT a component of a supervisory union
## 3466                                     4-Regional Education Service Agency (RESA)
## 3467                                     4-Regional Education Service Agency (RESA)
## 3468 1-Regular local school district that is NOT a component of a supervisory union
## 3469                                     4-Regional Education Service Agency (RESA)
## 3470 1-Regular local school district that is NOT a component of a supervisory union
## 3471         5-State agency providing elementary and/or secondary level instruction
## 3472 1-Regular local school district that is NOT a component of a supervisory union
## 3473 1-Regular local school district that is NOT a component of a supervisory union
## 3474                                     4-Regional Education Service Agency (RESA)
## 3475 1-Regular local school district that is NOT a component of a supervisory union
## 3476         5-State agency providing elementary and/or secondary level instruction
## 3477         5-State agency providing elementary and/or secondary level instruction
## 3478 1-Regular local school district that is NOT a component of a supervisory union
## 3479                                     4-Regional Education Service Agency (RESA)
## 3480                                     4-Regional Education Service Agency (RESA)
## 3481                                     4-Regional Education Service Agency (RESA)
## 3482                                     4-Regional Education Service Agency (RESA)
## 3483 1-Regular local school district that is NOT a component of a supervisory union
## 3484 1-Regular local school district that is NOT a component of a supervisory union
## 3485 1-Regular local school district that is NOT a component of a supervisory union
## 3486 1-Regular local school district that is NOT a component of a supervisory union
## 3487 1-Regular local school district that is NOT a component of a supervisory union
## 3488 1-Regular local school district that is NOT a component of a supervisory union
## 3489 1-Regular local school district that is NOT a component of a supervisory union
## 3490 1-Regular local school district that is NOT a component of a supervisory union
## 3491 1-Regular local school district that is NOT a component of a supervisory union
## 3492         5-State agency providing elementary and/or secondary level instruction
## 3493 1-Regular local school district that is NOT a component of a supervisory union
## 3494         5-State agency providing elementary and/or secondary level instruction
## 3495                                     4-Regional Education Service Agency (RESA)
## 3496 1-Regular local school district that is NOT a component of a supervisory union
## 3497 1-Regular local school district that is NOT a component of a supervisory union
## 3498 1-Regular local school district that is NOT a component of a supervisory union
## 3499 1-Regular local school district that is NOT a component of a supervisory union
## 3500 1-Regular local school district that is NOT a component of a supervisory union
## 3501                                     4-Regional Education Service Agency (RESA)
## 3502 1-Regular local school district that is NOT a component of a supervisory union
## 3503 1-Regular local school district that is NOT a component of a supervisory union
## 3504 1-Regular local school district that is NOT a component of a supervisory union
## 3505 1-Regular local school district that is NOT a component of a supervisory union
## 3506 1-Regular local school district that is NOT a component of a supervisory union
## 3507 1-Regular local school district that is NOT a component of a supervisory union
## 3508 1-Regular local school district that is NOT a component of a supervisory union
## 3509 1-Regular local school district that is NOT a component of a supervisory union
## 3510 1-Regular local school district that is NOT a component of a supervisory union
## 3511 1-Regular local school district that is NOT a component of a supervisory union
## 3512 1-Regular local school district that is NOT a component of a supervisory union
## 3513 1-Regular local school district that is NOT a component of a supervisory union
## 3514 1-Regular local school district that is NOT a component of a supervisory union
## 3515         5-State agency providing elementary and/or secondary level instruction
## 3516 1-Regular local school district that is NOT a component of a supervisory union
## 3517                                                 7-Independent Charter District
## 3518 1-Regular local school district that is NOT a component of a supervisory union
## 3519                                     4-Regional Education Service Agency (RESA)
## 3520 1-Regular local school district that is NOT a component of a supervisory union
## 3521 1-Regular local school district that is NOT a component of a supervisory union
## 3522 1-Regular local school district that is NOT a component of a supervisory union
## 3523 1-Regular local school district that is NOT a component of a supervisory union
## 3524 1-Regular local school district that is NOT a component of a supervisory union
## 3525                                     4-Regional Education Service Agency (RESA)
## 3526 1-Regular local school district that is NOT a component of a supervisory union
## 3527 1-Regular local school district that is NOT a component of a supervisory union
## 3528 1-Regular local school district that is NOT a component of a supervisory union
## 3529 1-Regular local school district that is NOT a component of a supervisory union
## 3530 1-Regular local school district that is NOT a component of a supervisory union
## 3531         5-State agency providing elementary and/or secondary level instruction
## 3532 1-Regular local school district that is NOT a component of a supervisory union
## 3533 1-Regular local school district that is NOT a component of a supervisory union
## 3534                                     4-Regional Education Service Agency (RESA)
## 3535 1-Regular local school district that is NOT a component of a supervisory union
## 3536                                                 7-Independent Charter District
## 3537         5-State agency providing elementary and/or secondary level instruction
## 3538 1-Regular local school district that is NOT a component of a supervisory union
## 3539 1-Regular local school district that is NOT a component of a supervisory union
## 3540 1-Regular local school district that is NOT a component of a supervisory union
## 3541 1-Regular local school district that is NOT a component of a supervisory union
## 3542 1-Regular local school district that is NOT a component of a supervisory union
## 3543 1-Regular local school district that is NOT a component of a supervisory union
## 3544 1-Regular local school district that is NOT a component of a supervisory union
## 3545 1-Regular local school district that is NOT a component of a supervisory union
## 3546         5-State agency providing elementary and/or secondary level instruction
## 3547         5-State agency providing elementary and/or secondary level instruction
## 3548         5-State agency providing elementary and/or secondary level instruction
## 3549 1-Regular local school district that is NOT a component of a supervisory union
## 3550         5-State agency providing elementary and/or secondary level instruction
## 3551 1-Regular local school district that is NOT a component of a supervisory union
## 3552 1-Regular local school district that is NOT a component of a supervisory union
## 3553 1-Regular local school district that is NOT a component of a supervisory union
## 3554 1-Regular local school district that is NOT a component of a supervisory union
## 3555 1-Regular local school district that is NOT a component of a supervisory union
## 3556 1-Regular local school district that is NOT a component of a supervisory union
## 3557 1-Regular local school district that is NOT a component of a supervisory union
## 3558 1-Regular local school district that is NOT a component of a supervisory union
## 3559 1-Regular local school district that is NOT a component of a supervisory union
## 3560         5-State agency providing elementary and/or secondary level instruction
## 3561 1-Regular local school district that is NOT a component of a supervisory union
## 3562 1-Regular local school district that is NOT a component of a supervisory union
## 3563 1-Regular local school district that is NOT a component of a supervisory union
## 3564 1-Regular local school district that is NOT a component of a supervisory union
## 3565 1-Regular local school district that is NOT a component of a supervisory union
## 3566 1-Regular local school district that is NOT a component of a supervisory union
## 3567 1-Regular local school district that is NOT a component of a supervisory union
## 3568 1-Regular local school district that is NOT a component of a supervisory union
## 3569 1-Regular local school district that is NOT a component of a supervisory union
## 3570 1-Regular local school district that is NOT a component of a supervisory union
## 3571 1-Regular local school district that is NOT a component of a supervisory union
## 3572 1-Regular local school district that is NOT a component of a supervisory union
## 3573 1-Regular local school district that is NOT a component of a supervisory union
## 3574 1-Regular local school district that is NOT a component of a supervisory union
## 3575                                     4-Regional Education Service Agency (RESA)
## 3576                                     4-Regional Education Service Agency (RESA)
## 3577 1-Regular local school district that is NOT a component of a supervisory union
## 3578 1-Regular local school district that is NOT a component of a supervisory union
## 3579 1-Regular local school district that is NOT a component of a supervisory union
## 3580 1-Regular local school district that is NOT a component of a supervisory union
## 3581 1-Regular local school district that is NOT a component of a supervisory union
## 3582 1-Regular local school district that is NOT a component of a supervisory union
## 3583 1-Regular local school district that is NOT a component of a supervisory union
## 3584 1-Regular local school district that is NOT a component of a supervisory union
## 3585 1-Regular local school district that is NOT a component of a supervisory union
## 3586                                     4-Regional Education Service Agency (RESA)
## 3587                                                     8-Other education agencies
## 3588 1-Regular local school district that is NOT a component of a supervisory union
## 3589 1-Regular local school district that is NOT a component of a supervisory union
## 3590 1-Regular local school district that is NOT a component of a supervisory union
## 3591 1-Regular local school district that is NOT a component of a supervisory union
## 3592 1-Regular local school district that is NOT a component of a supervisory union
## 3593 1-Regular local school district that is NOT a component of a supervisory union
## 3594 1-Regular local school district that is NOT a component of a supervisory union
## 3595 1-Regular local school district that is NOT a component of a supervisory union
## 3596 1-Regular local school district that is NOT a component of a supervisory union
## 3597 1-Regular local school district that is NOT a component of a supervisory union
## 3598 1-Regular local school district that is NOT a component of a supervisory union
## 3599 1-Regular local school district that is NOT a component of a supervisory union
## 3600 1-Regular local school district that is NOT a component of a supervisory union
## 3601 1-Regular local school district that is NOT a component of a supervisory union
## 3602 1-Regular local school district that is NOT a component of a supervisory union
## 3603 1-Regular local school district that is NOT a component of a supervisory union
## 3604 1-Regular local school district that is NOT a component of a supervisory union
## 3605 1-Regular local school district that is NOT a component of a supervisory union
## 3606                                     4-Regional Education Service Agency (RESA)
## 3607 1-Regular local school district that is NOT a component of a supervisory union
## 3608 1-Regular local school district that is NOT a component of a supervisory union
## 3609 1-Regular local school district that is NOT a component of a supervisory union
## 3610 1-Regular local school district that is NOT a component of a supervisory union
## 3611 1-Regular local school district that is NOT a component of a supervisory union
## 3612 1-Regular local school district that is NOT a component of a supervisory union
## 3613 1-Regular local school district that is NOT a component of a supervisory union
## 3614 1-Regular local school district that is NOT a component of a supervisory union
## 3615 1-Regular local school district that is NOT a component of a supervisory union
## 3616 1-Regular local school district that is NOT a component of a supervisory union
## 3617 1-Regular local school district that is NOT a component of a supervisory union
## 3618 1-Regular local school district that is NOT a component of a supervisory union
## 3619 1-Regular local school district that is NOT a component of a supervisory union
## 3620         5-State agency providing elementary and/or secondary level instruction
## 3621 1-Regular local school district that is NOT a component of a supervisory union
## 3622 1-Regular local school district that is NOT a component of a supervisory union
## 3623 1-Regular local school district that is NOT a component of a supervisory union
## 3624 1-Regular local school district that is NOT a component of a supervisory union
## 3625 1-Regular local school district that is NOT a component of a supervisory union
## 3626 1-Regular local school district that is NOT a component of a supervisory union
## 3627 1-Regular local school district that is NOT a component of a supervisory union
## 3628 1-Regular local school district that is NOT a component of a supervisory union
## 3629 1-Regular local school district that is NOT a component of a supervisory union
## 3630         5-State agency providing elementary and/or secondary level instruction
## 3631 1-Regular local school district that is NOT a component of a supervisory union
## 3632 1-Regular local school district that is NOT a component of a supervisory union
## 3633 1-Regular local school district that is NOT a component of a supervisory union
## 3634 1-Regular local school district that is NOT a component of a supervisory union
## 3635                                     4-Regional Education Service Agency (RESA)
## 3636 1-Regular local school district that is NOT a component of a supervisory union
## 3637 1-Regular local school district that is NOT a component of a supervisory union
## 3638 1-Regular local school district that is NOT a component of a supervisory union
## 3639 1-Regular local school district that is NOT a component of a supervisory union
## 3640 1-Regular local school district that is NOT a component of a supervisory union
## 3641 1-Regular local school district that is NOT a component of a supervisory union
## 3642 1-Regular local school district that is NOT a component of a supervisory union
## 3643 1-Regular local school district that is NOT a component of a supervisory union
## 3644 1-Regular local school district that is NOT a component of a supervisory union
## 3645 1-Regular local school district that is NOT a component of a supervisory union
## 3646 1-Regular local school district that is NOT a component of a supervisory union
## 3647 1-Regular local school district that is NOT a component of a supervisory union
## 3648 1-Regular local school district that is NOT a component of a supervisory union
## 3649 1-Regular local school district that is NOT a component of a supervisory union
## 3650 1-Regular local school district that is NOT a component of a supervisory union
## 3651 1-Regular local school district that is NOT a component of a supervisory union
## 3652 1-Regular local school district that is NOT a component of a supervisory union
## 3653 1-Regular local school district that is NOT a component of a supervisory union
## 3654 1-Regular local school district that is NOT a component of a supervisory union
## 3655 1-Regular local school district that is NOT a component of a supervisory union
## 3656 1-Regular local school district that is NOT a component of a supervisory union
## 3657 1-Regular local school district that is NOT a component of a supervisory union
## 3658                                                 7-Independent Charter District
## 3659                                                 7-Independent Charter District
## 3660                                                 7-Independent Charter District
## 3661                                                 7-Independent Charter District
## 3662         5-State agency providing elementary and/or secondary level instruction
## 3663 1-Regular local school district that is NOT a component of a supervisory union
## 3664 1-Regular local school district that is NOT a component of a supervisory union
## 3665 1-Regular local school district that is NOT a component of a supervisory union
## 3666 1-Regular local school district that is NOT a component of a supervisory union
## 3667 1-Regular local school district that is NOT a component of a supervisory union
## 3668 1-Regular local school district that is NOT a component of a supervisory union
## 3669 1-Regular local school district that is NOT a component of a supervisory union
## 3670 1-Regular local school district that is NOT a component of a supervisory union
## 3671 1-Regular local school district that is NOT a component of a supervisory union
## 3672 1-Regular local school district that is NOT a component of a supervisory union
## 3673 1-Regular local school district that is NOT a component of a supervisory union
## 3674 1-Regular local school district that is NOT a component of a supervisory union
## 3675 1-Regular local school district that is NOT a component of a supervisory union
## 3676 1-Regular local school district that is NOT a component of a supervisory union
## 3677 1-Regular local school district that is NOT a component of a supervisory union
## 3678 1-Regular local school district that is NOT a component of a supervisory union
## 3679                                     4-Regional Education Service Agency (RESA)
## 3680 1-Regular local school district that is NOT a component of a supervisory union
## 3681 1-Regular local school district that is NOT a component of a supervisory union
## 3682 1-Regular local school district that is NOT a component of a supervisory union
## 3683 1-Regular local school district that is NOT a component of a supervisory union
## 3684 1-Regular local school district that is NOT a component of a supervisory union
## 3685 1-Regular local school district that is NOT a component of a supervisory union
## 3686 1-Regular local school district that is NOT a component of a supervisory union
## 3687 1-Regular local school district that is NOT a component of a supervisory union
## 3688 1-Regular local school district that is NOT a component of a supervisory union
## 3689 1-Regular local school district that is NOT a component of a supervisory union
## 3690 1-Regular local school district that is NOT a component of a supervisory union
## 3691 1-Regular local school district that is NOT a component of a supervisory union
## 3692 1-Regular local school district that is NOT a component of a supervisory union
## 3693 1-Regular local school district that is NOT a component of a supervisory union
## 3694 1-Regular local school district that is NOT a component of a supervisory union
## 3695 1-Regular local school district that is NOT a component of a supervisory union
## 3696 1-Regular local school district that is NOT a component of a supervisory union
## 3697 1-Regular local school district that is NOT a component of a supervisory union
## 3698 1-Regular local school district that is NOT a component of a supervisory union
## 3699 1-Regular local school district that is NOT a component of a supervisory union
## 3700 1-Regular local school district that is NOT a component of a supervisory union
## 3701 1-Regular local school district that is NOT a component of a supervisory union
## 3702 1-Regular local school district that is NOT a component of a supervisory union
## 3703 1-Regular local school district that is NOT a component of a supervisory union
## 3704 1-Regular local school district that is NOT a component of a supervisory union
## 3705 1-Regular local school district that is NOT a component of a supervisory union
## 3706 1-Regular local school district that is NOT a component of a supervisory union
## 3707 1-Regular local school district that is NOT a component of a supervisory union
## 3708 1-Regular local school district that is NOT a component of a supervisory union
## 3709 1-Regular local school district that is NOT a component of a supervisory union
## 3710 1-Regular local school district that is NOT a component of a supervisory union
## 3711 1-Regular local school district that is NOT a component of a supervisory union
## 3712 1-Regular local school district that is NOT a component of a supervisory union
## 3713 1-Regular local school district that is NOT a component of a supervisory union
## 3714 1-Regular local school district that is NOT a component of a supervisory union
## 3715 1-Regular local school district that is NOT a component of a supervisory union
## 3716 1-Regular local school district that is NOT a component of a supervisory union
## 3717 1-Regular local school district that is NOT a component of a supervisory union
## 3718 1-Regular local school district that is NOT a component of a supervisory union
## 3719 1-Regular local school district that is NOT a component of a supervisory union
## 3720 1-Regular local school district that is NOT a component of a supervisory union
## 3721 1-Regular local school district that is NOT a component of a supervisory union
## 3722 1-Regular local school district that is NOT a component of a supervisory union
## 3723                                                 7-Independent Charter District
## 3724 1-Regular local school district that is NOT a component of a supervisory union
## 3725 1-Regular local school district that is NOT a component of a supervisory union
## 3726 1-Regular local school district that is NOT a component of a supervisory union
## 3727                                     4-Regional Education Service Agency (RESA)
## 3728 1-Regular local school district that is NOT a component of a supervisory union
## 3729 1-Regular local school district that is NOT a component of a supervisory union
## 3730 1-Regular local school district that is NOT a component of a supervisory union
## 3731 1-Regular local school district that is NOT a component of a supervisory union
## 3732                                     4-Regional Education Service Agency (RESA)
## 3733 1-Regular local school district that is NOT a component of a supervisory union
## 3734 1-Regular local school district that is NOT a component of a supervisory union
## 3735 1-Regular local school district that is NOT a component of a supervisory union
## 3736                                     4-Regional Education Service Agency (RESA)
## 3737 1-Regular local school district that is NOT a component of a supervisory union
## 3738 1-Regular local school district that is NOT a component of a supervisory union
## 3739 1-Regular local school district that is NOT a component of a supervisory union
## 3740 1-Regular local school district that is NOT a component of a supervisory union
## 3741 1-Regular local school district that is NOT a component of a supervisory union
## 3742         5-State agency providing elementary and/or secondary level instruction
## 3743 1-Regular local school district that is NOT a component of a supervisory union
## 3744                                     4-Regional Education Service Agency (RESA)
## 3745 1-Regular local school district that is NOT a component of a supervisory union
## 3746 1-Regular local school district that is NOT a component of a supervisory union
## 3747 1-Regular local school district that is NOT a component of a supervisory union
## 3748                                                 7-Independent Charter District
## 3749 1-Regular local school district that is NOT a component of a supervisory union
## 3750                                                 7-Independent Charter District
## 3751 1-Regular local school district that is NOT a component of a supervisory union
## 3752 1-Regular local school district that is NOT a component of a supervisory union
## 3753 1-Regular local school district that is NOT a component of a supervisory union
## 3754                                     4-Regional Education Service Agency (RESA)
## 3755 1-Regular local school district that is NOT a component of a supervisory union
## 3756         5-State agency providing elementary and/or secondary level instruction
## 3757 1-Regular local school district that is NOT a component of a supervisory union
## 3758 1-Regular local school district that is NOT a component of a supervisory union
## 3759 1-Regular local school district that is NOT a component of a supervisory union
## 3760                                                 7-Independent Charter District
## 3761                                     4-Regional Education Service Agency (RESA)
## 3762 1-Regular local school district that is NOT a component of a supervisory union
## 3763 1-Regular local school district that is NOT a component of a supervisory union
## 3764 1-Regular local school district that is NOT a component of a supervisory union
## 3765 1-Regular local school district that is NOT a component of a supervisory union
## 3766 1-Regular local school district that is NOT a component of a supervisory union
## 3767 1-Regular local school district that is NOT a component of a supervisory union
## 3768                                     4-Regional Education Service Agency (RESA)
## 3769                                                 7-Independent Charter District
## 3770 1-Regular local school district that is NOT a component of a supervisory union
## 3771 1-Regular local school district that is NOT a component of a supervisory union
## 3772 1-Regular local school district that is NOT a component of a supervisory union
## 3773 1-Regular local school district that is NOT a component of a supervisory union
## 3774 1-Regular local school district that is NOT a component of a supervisory union
## 3775 1-Regular local school district that is NOT a component of a supervisory union
## 3776 1-Regular local school district that is NOT a component of a supervisory union
## 3777 1-Regular local school district that is NOT a component of a supervisory union
## 3778 1-Regular local school district that is NOT a component of a supervisory union
## 3779 1-Regular local school district that is NOT a component of a supervisory union
## 3780                                     4-Regional Education Service Agency (RESA)
## 3781                                     4-Regional Education Service Agency (RESA)
## 3782 1-Regular local school district that is NOT a component of a supervisory union
## 3783 1-Regular local school district that is NOT a component of a supervisory union
## 3784                                     4-Regional Education Service Agency (RESA)
## 3785 1-Regular local school district that is NOT a component of a supervisory union
## 3786 1-Regular local school district that is NOT a component of a supervisory union
## 3787                                     4-Regional Education Service Agency (RESA)
## 3788                                     4-Regional Education Service Agency (RESA)
## 3789 1-Regular local school district that is NOT a component of a supervisory union
## 3790 1-Regular local school district that is NOT a component of a supervisory union
## 3791 1-Regular local school district that is NOT a component of a supervisory union
## 3792 1-Regular local school district that is NOT a component of a supervisory union
## 3793 1-Regular local school district that is NOT a component of a supervisory union
## 3794                                                 7-Independent Charter District
## 3795 1-Regular local school district that is NOT a component of a supervisory union
## 3796                                                 7-Independent Charter District
## 3797 1-Regular local school district that is NOT a component of a supervisory union
## 3798 1-Regular local school district that is NOT a component of a supervisory union
## 3799 1-Regular local school district that is NOT a component of a supervisory union
## 3800 1-Regular local school district that is NOT a component of a supervisory union
## 3801 1-Regular local school district that is NOT a component of a supervisory union
## 3802         5-State agency providing elementary and/or secondary level instruction
## 3803 1-Regular local school district that is NOT a component of a supervisory union
## 3804                                     4-Regional Education Service Agency (RESA)
## 3805 1-Regular local school district that is NOT a component of a supervisory union
## 3806 1-Regular local school district that is NOT a component of a supervisory union
## 3807 1-Regular local school district that is NOT a component of a supervisory union
## 3808 1-Regular local school district that is NOT a component of a supervisory union
## 3809 1-Regular local school district that is NOT a component of a supervisory union
## 3810 1-Regular local school district that is NOT a component of a supervisory union
## 3811 1-Regular local school district that is NOT a component of a supervisory union
## 3812 1-Regular local school district that is NOT a component of a supervisory union
## 3813 1-Regular local school district that is NOT a component of a supervisory union
## 3814 1-Regular local school district that is NOT a component of a supervisory union
## 3815 1-Regular local school district that is NOT a component of a supervisory union
## 3816 1-Regular local school district that is NOT a component of a supervisory union
## 3817                                     4-Regional Education Service Agency (RESA)
## 3818 1-Regular local school district that is NOT a component of a supervisory union
## 3819 1-Regular local school district that is NOT a component of a supervisory union
## 3820 1-Regular local school district that is NOT a component of a supervisory union
## 3821 1-Regular local school district that is NOT a component of a supervisory union
## 3822 1-Regular local school district that is NOT a component of a supervisory union
## 3823 1-Regular local school district that is NOT a component of a supervisory union
## 3824 1-Regular local school district that is NOT a component of a supervisory union
## 3825 1-Regular local school district that is NOT a component of a supervisory union
## 3826 1-Regular local school district that is NOT a component of a supervisory union
## 3827 1-Regular local school district that is NOT a component of a supervisory union
## 3828 1-Regular local school district that is NOT a component of a supervisory union
## 3829 1-Regular local school district that is NOT a component of a supervisory union
## 3830 1-Regular local school district that is NOT a component of a supervisory union
## 3831 1-Regular local school district that is NOT a component of a supervisory union
## 3832 1-Regular local school district that is NOT a component of a supervisory union
## 3833 1-Regular local school district that is NOT a component of a supervisory union
## 3834 1-Regular local school district that is NOT a component of a supervisory union
## 3835 1-Regular local school district that is NOT a component of a supervisory union
## 3836 1-Regular local school district that is NOT a component of a supervisory union
## 3837 1-Regular local school district that is NOT a component of a supervisory union
## 3838 1-Regular local school district that is NOT a component of a supervisory union
## 3839 1-Regular local school district that is NOT a component of a supervisory union
## 3840 1-Regular local school district that is NOT a component of a supervisory union
## 3841 1-Regular local school district that is NOT a component of a supervisory union
## 3842 1-Regular local school district that is NOT a component of a supervisory union
## 3843 1-Regular local school district that is NOT a component of a supervisory union
## 3844 1-Regular local school district that is NOT a component of a supervisory union
## 3845 1-Regular local school district that is NOT a component of a supervisory union
## 3846 1-Regular local school district that is NOT a component of a supervisory union
## 3847 1-Regular local school district that is NOT a component of a supervisory union
## 3848 1-Regular local school district that is NOT a component of a supervisory union
## 3849                                                 7-Independent Charter District
## 3850 1-Regular local school district that is NOT a component of a supervisory union
## 3851 1-Regular local school district that is NOT a component of a supervisory union
## 3852 1-Regular local school district that is NOT a component of a supervisory union
## 3853                                     4-Regional Education Service Agency (RESA)
## 3854         5-State agency providing elementary and/or secondary level instruction
## 3855 1-Regular local school district that is NOT a component of a supervisory union
## 3856 1-Regular local school district that is NOT a component of a supervisory union
## 3857 1-Regular local school district that is NOT a component of a supervisory union
## 3858 1-Regular local school district that is NOT a component of a supervisory union
## 3859                                                 7-Independent Charter District
## 3860 1-Regular local school district that is NOT a component of a supervisory union
## 3861         5-State agency providing elementary and/or secondary level instruction
## 3862 1-Regular local school district that is NOT a component of a supervisory union
## 3863         5-State agency providing elementary and/or secondary level instruction
## 3864         5-State agency providing elementary and/or secondary level instruction
## 3865 1-Regular local school district that is NOT a component of a supervisory union
## 3866 1-Regular local school district that is NOT a component of a supervisory union
## 3867         5-State agency providing elementary and/or secondary level instruction
## 3868 1-Regular local school district that is NOT a component of a supervisory union
## 3869 1-Regular local school district that is NOT a component of a supervisory union
## 3870 1-Regular local school district that is NOT a component of a supervisory union
## 3871         5-State agency providing elementary and/or secondary level instruction
## 3872 1-Regular local school district that is NOT a component of a supervisory union
## 3873 1-Regular local school district that is NOT a component of a supervisory union
## 3874 1-Regular local school district that is NOT a component of a supervisory union
## 3875 1-Regular local school district that is NOT a component of a supervisory union
## 3876 1-Regular local school district that is NOT a component of a supervisory union
## 3877 1-Regular local school district that is NOT a component of a supervisory union
## 3878 1-Regular local school district that is NOT a component of a supervisory union
## 3879 1-Regular local school district that is NOT a component of a supervisory union
## 3880 1-Regular local school district that is NOT a component of a supervisory union
## 3881 1-Regular local school district that is NOT a component of a supervisory union
## 3882 1-Regular local school district that is NOT a component of a supervisory union
## 3883 1-Regular local school district that is NOT a component of a supervisory union
## 3884 1-Regular local school district that is NOT a component of a supervisory union
## 3885 1-Regular local school district that is NOT a component of a supervisory union
## 3886 1-Regular local school district that is NOT a component of a supervisory union
## 3887 1-Regular local school district that is NOT a component of a supervisory union
## 3888 1-Regular local school district that is NOT a component of a supervisory union
## 3889 1-Regular local school district that is NOT a component of a supervisory union
## 3890 1-Regular local school district that is NOT a component of a supervisory union
## 3891 1-Regular local school district that is NOT a component of a supervisory union
## 3892 1-Regular local school district that is NOT a component of a supervisory union
## 3893 1-Regular local school district that is NOT a component of a supervisory union
## 3894 1-Regular local school district that is NOT a component of a supervisory union
## 3895                                     4-Regional Education Service Agency (RESA)
## 3896 1-Regular local school district that is NOT a component of a supervisory union
## 3897 1-Regular local school district that is NOT a component of a supervisory union
## 3898 1-Regular local school district that is NOT a component of a supervisory union
## 3899 1-Regular local school district that is NOT a component of a supervisory union
## 3900 1-Regular local school district that is NOT a component of a supervisory union
## 3901 1-Regular local school district that is NOT a component of a supervisory union
## 3902 1-Regular local school district that is NOT a component of a supervisory union
## 3903 1-Regular local school district that is NOT a component of a supervisory union
## 3904 1-Regular local school district that is NOT a component of a supervisory union
## 3905         5-State agency providing elementary and/or secondary level instruction
## 3906 1-Regular local school district that is NOT a component of a supervisory union
## 3907 1-Regular local school district that is NOT a component of a supervisory union
## 3908 1-Regular local school district that is NOT a component of a supervisory union
## 3909 1-Regular local school district that is NOT a component of a supervisory union
## 3910 1-Regular local school district that is NOT a component of a supervisory union
## 3911 1-Regular local school district that is NOT a component of a supervisory union
## 3912 1-Regular local school district that is NOT a component of a supervisory union
## 3913 1-Regular local school district that is NOT a component of a supervisory union
## 3914 1-Regular local school district that is NOT a component of a supervisory union
## 3915 1-Regular local school district that is NOT a component of a supervisory union
## 3916 1-Regular local school district that is NOT a component of a supervisory union
## 3917 1-Regular local school district that is NOT a component of a supervisory union
## 3918 1-Regular local school district that is NOT a component of a supervisory union
## 3919 1-Regular local school district that is NOT a component of a supervisory union
## 3920 1-Regular local school district that is NOT a component of a supervisory union
## 3921 1-Regular local school district that is NOT a component of a supervisory union
## 3922 1-Regular local school district that is NOT a component of a supervisory union
## 3923 1-Regular local school district that is NOT a component of a supervisory union
## 3924 1-Regular local school district that is NOT a component of a supervisory union
## 3925 1-Regular local school district that is NOT a component of a supervisory union
## 3926 1-Regular local school district that is NOT a component of a supervisory union
## 3927 1-Regular local school district that is NOT a component of a supervisory union
## 3928 1-Regular local school district that is NOT a component of a supervisory union
## 3929 1-Regular local school district that is NOT a component of a supervisory union
## 3930 1-Regular local school district that is NOT a component of a supervisory union
## 3931 1-Regular local school district that is NOT a component of a supervisory union
## 3932                                                 7-Independent Charter District
## 3933 1-Regular local school district that is NOT a component of a supervisory union
## 3934 1-Regular local school district that is NOT a component of a supervisory union
## 3935 1-Regular local school district that is NOT a component of a supervisory union
## 3936 1-Regular local school district that is NOT a component of a supervisory union
## 3937 1-Regular local school district that is NOT a component of a supervisory union
## 3938 1-Regular local school district that is NOT a component of a supervisory union
## 3939 1-Regular local school district that is NOT a component of a supervisory union
## 3940 1-Regular local school district that is NOT a component of a supervisory union
## 3941                                                 7-Independent Charter District
## 3942 1-Regular local school district that is NOT a component of a supervisory union
## 3943 1-Regular local school district that is NOT a component of a supervisory union
## 3944 1-Regular local school district that is NOT a component of a supervisory union
## 3945 1-Regular local school district that is NOT a component of a supervisory union
## 3946                                     4-Regional Education Service Agency (RESA)
## 3947                                     4-Regional Education Service Agency (RESA)
## 3948                                     4-Regional Education Service Agency (RESA)
## 3949 1-Regular local school district that is NOT a component of a supervisory union
## 3950 1-Regular local school district that is NOT a component of a supervisory union
## 3951         5-State agency providing elementary and/or secondary level instruction
## 3952 1-Regular local school district that is NOT a component of a supervisory union
## 3953 1-Regular local school district that is NOT a component of a supervisory union
## 3954 1-Regular local school district that is NOT a component of a supervisory union
## 3955 1-Regular local school district that is NOT a component of a supervisory union
## 3956 1-Regular local school district that is NOT a component of a supervisory union
## 3957 1-Regular local school district that is NOT a component of a supervisory union
## 3958 1-Regular local school district that is NOT a component of a supervisory union
## 3959 1-Regular local school district that is NOT a component of a supervisory union
## 3960                                     4-Regional Education Service Agency (RESA)
## 3961                                     4-Regional Education Service Agency (RESA)
## 3962                                                 7-Independent Charter District
## 3963                                                 7-Independent Charter District
## 3964                                                 7-Independent Charter District
## 3965                                                 7-Independent Charter District
## 3966                                                 7-Independent Charter District
## 3967                                                 7-Independent Charter District
## 3968                                                 7-Independent Charter District
## 3969                                                 7-Independent Charter District
## 3970                                                 7-Independent Charter District
## 3971                                                 7-Independent Charter District
## 3972                                                 7-Independent Charter District
## 3973                                                 7-Independent Charter District
## 3974                                                 7-Independent Charter District
## 3975                                                 7-Independent Charter District
## 3976                                                 7-Independent Charter District
## 3977                                                 7-Independent Charter District
## 3978                                                 7-Independent Charter District
## 3979                                                 7-Independent Charter District
## 3980                                                 7-Independent Charter District
## 3981                                                 7-Independent Charter District
## 3982                                                 7-Independent Charter District
## 3983                                                 7-Independent Charter District
## 3984                                                 7-Independent Charter District
## 3985                                                 7-Independent Charter District
## 3986                                                 7-Independent Charter District
## 3987                                                 7-Independent Charter District
## 3988                                                 7-Independent Charter District
## 3989                                                 7-Independent Charter District
## 3990                                                 7-Independent Charter District
## 3991                                                 7-Independent Charter District
## 3992                                                 7-Independent Charter District
## 3993                                                 7-Independent Charter District
## 3994                                                 7-Independent Charter District
## 3995 1-Regular local school district that is NOT a component of a supervisory union
## 3996 1-Regular local school district that is NOT a component of a supervisory union
## 3997                                                 7-Independent Charter District
## 3998         5-State agency providing elementary and/or secondary level instruction
## 3999         5-State agency providing elementary and/or secondary level instruction
## 4000 1-Regular local school district that is NOT a component of a supervisory union
## 4001 1-Regular local school district that is NOT a component of a supervisory union
## 4002 1-Regular local school district that is NOT a component of a supervisory union
## 4003 1-Regular local school district that is NOT a component of a supervisory union
## 4004 1-Regular local school district that is NOT a component of a supervisory union
## 4005 1-Regular local school district that is NOT a component of a supervisory union
## 4006 1-Regular local school district that is NOT a component of a supervisory union
## 4007 1-Regular local school district that is NOT a component of a supervisory union
## 4008         5-State agency providing elementary and/or secondary level instruction
## 4009 1-Regular local school district that is NOT a component of a supervisory union
## 4010 1-Regular local school district that is NOT a component of a supervisory union
## 4011 1-Regular local school district that is NOT a component of a supervisory union
## 4012 1-Regular local school district that is NOT a component of a supervisory union
## 4013 1-Regular local school district that is NOT a component of a supervisory union
## 4014 1-Regular local school district that is NOT a component of a supervisory union
## 4015 1-Regular local school district that is NOT a component of a supervisory union
## 4016                                                 7-Independent Charter District
## 4017 1-Regular local school district that is NOT a component of a supervisory union
## 4018                                     4-Regional Education Service Agency (RESA)
## 4019 1-Regular local school district that is NOT a component of a supervisory union
## 4020                                     4-Regional Education Service Agency (RESA)
## 4021                                     4-Regional Education Service Agency (RESA)
## 4022 1-Regular local school district that is NOT a component of a supervisory union
## 4023                                     4-Regional Education Service Agency (RESA)
## 4024 1-Regular local school district that is NOT a component of a supervisory union
## 4025 1-Regular local school district that is NOT a component of a supervisory union
## 4026                                     4-Regional Education Service Agency (RESA)
## 4027                                     4-Regional Education Service Agency (RESA)
## 4028                                     4-Regional Education Service Agency (RESA)
## 4029 1-Regular local school district that is NOT a component of a supervisory union
## 4030 1-Regular local school district that is NOT a component of a supervisory union
## 4031         5-State agency providing elementary and/or secondary level instruction
## 4032         5-State agency providing elementary and/or secondary level instruction
## 4033         5-State agency providing elementary and/or secondary level instruction
## 4034         5-State agency providing elementary and/or secondary level instruction
## 4035         5-State agency providing elementary and/or secondary level instruction
## 4036         5-State agency providing elementary and/or secondary level instruction
## 4037 1-Regular local school district that is NOT a component of a supervisory union
## 4038 1-Regular local school district that is NOT a component of a supervisory union
## 4039 1-Regular local school district that is NOT a component of a supervisory union
## 4040 1-Regular local school district that is NOT a component of a supervisory union
## 4041 1-Regular local school district that is NOT a component of a supervisory union
## 4042 1-Regular local school district that is NOT a component of a supervisory union
## 4043 1-Regular local school district that is NOT a component of a supervisory union
## 4044 1-Regular local school district that is NOT a component of a supervisory union
## 4045 1-Regular local school district that is NOT a component of a supervisory union
## 4046 1-Regular local school district that is NOT a component of a supervisory union
## 4047             2-Local school district that is a component of a supervisory union
## 4048                                     4-Regional Education Service Agency (RESA)
## 4049 1-Regular local school district that is NOT a component of a supervisory union
## 4050 1-Regular local school district that is NOT a component of a supervisory union
## 4051 1-Regular local school district that is NOT a component of a supervisory union
## 4052 1-Regular local school district that is NOT a component of a supervisory union
## 4053 1-Regular local school district that is NOT a component of a supervisory union
## 4054 1-Regular local school district that is NOT a component of a supervisory union
## 4055 1-Regular local school district that is NOT a component of a supervisory union
## 4056 1-Regular local school district that is NOT a component of a supervisory union
## 4057         5-State agency providing elementary and/or secondary level instruction
## 4058 1-Regular local school district that is NOT a component of a supervisory union
## 4059 1-Regular local school district that is NOT a component of a supervisory union
## 4060 1-Regular local school district that is NOT a component of a supervisory union
## 4061 1-Regular local school district that is NOT a component of a supervisory union
## 4062 1-Regular local school district that is NOT a component of a supervisory union
## 4063 1-Regular local school district that is NOT a component of a supervisory union
## 4064 1-Regular local school district that is NOT a component of a supervisory union
## 4065 1-Regular local school district that is NOT a component of a supervisory union
## 4066 1-Regular local school district that is NOT a component of a supervisory union
## 4067             2-Local school district that is a component of a supervisory union
## 4068 1-Regular local school district that is NOT a component of a supervisory union
## 4069 1-Regular local school district that is NOT a component of a supervisory union
## 4070 1-Regular local school district that is NOT a component of a supervisory union
## 4071 1-Regular local school district that is NOT a component of a supervisory union
## 4072 1-Regular local school district that is NOT a component of a supervisory union
## 4073 1-Regular local school district that is NOT a component of a supervisory union
## 4074 1-Regular local school district that is NOT a component of a supervisory union
## 4075 1-Regular local school district that is NOT a component of a supervisory union
## 4076                                     4-Regional Education Service Agency (RESA)
## 4077 1-Regular local school district that is NOT a component of a supervisory union
## 4078 1-Regular local school district that is NOT a component of a supervisory union
## 4079 1-Regular local school district that is NOT a component of a supervisory union
## 4080 1-Regular local school district that is NOT a component of a supervisory union
## 4081 1-Regular local school district that is NOT a component of a supervisory union
## 4082 1-Regular local school district that is NOT a component of a supervisory union
## 4083 1-Regular local school district that is NOT a component of a supervisory union
## 4084 1-Regular local school district that is NOT a component of a supervisory union
## 4085         5-State agency providing elementary and/or secondary level instruction
## 4086         5-State agency providing elementary and/or secondary level instruction
## 4087                                     4-Regional Education Service Agency (RESA)
## 4088                                     4-Regional Education Service Agency (RESA)
## 4089                                     4-Regional Education Service Agency (RESA)
## 4090                                     4-Regional Education Service Agency (RESA)
## 4091                                     4-Regional Education Service Agency (RESA)
## 4092 1-Regular local school district that is NOT a component of a supervisory union
## 4093 1-Regular local school district that is NOT a component of a supervisory union
## 4094 1-Regular local school district that is NOT a component of a supervisory union
## 4095 1-Regular local school district that is NOT a component of a supervisory union
## 4096 1-Regular local school district that is NOT a component of a supervisory union
## 4097 1-Regular local school district that is NOT a component of a supervisory union
## 4098 1-Regular local school district that is NOT a component of a supervisory union
## 4099 1-Regular local school district that is NOT a component of a supervisory union
## 4100 1-Regular local school district that is NOT a component of a supervisory union
## 4101                                                 7-Independent Charter District
## 4102 1-Regular local school district that is NOT a component of a supervisory union
## 4103 1-Regular local school district that is NOT a component of a supervisory union
## 4104 1-Regular local school district that is NOT a component of a supervisory union
## 4105 1-Regular local school district that is NOT a component of a supervisory union
## 4106 1-Regular local school district that is NOT a component of a supervisory union
## 4107 1-Regular local school district that is NOT a component of a supervisory union
## 4108                                     4-Regional Education Service Agency (RESA)
## 4109                                     4-Regional Education Service Agency (RESA)
## 4110 1-Regular local school district that is NOT a component of a supervisory union
## 4111         5-State agency providing elementary and/or secondary level instruction
## 4112 1-Regular local school district that is NOT a component of a supervisory union
## 4113 1-Regular local school district that is NOT a component of a supervisory union
## 4114 1-Regular local school district that is NOT a component of a supervisory union
## 4115                                           9-Specialized public school district
## 4116 1-Regular local school district that is NOT a component of a supervisory union
## 4117 1-Regular local school district that is NOT a component of a supervisory union
## 4118 1-Regular local school district that is NOT a component of a supervisory union
## 4119 1-Regular local school district that is NOT a component of a supervisory union
## 4120 1-Regular local school district that is NOT a component of a supervisory union
## 4121 1-Regular local school district that is NOT a component of a supervisory union
## 4122 1-Regular local school district that is NOT a component of a supervisory union
## 4123 1-Regular local school district that is NOT a component of a supervisory union
## 4124 1-Regular local school district that is NOT a component of a supervisory union
## 4125 1-Regular local school district that is NOT a component of a supervisory union
## 4126 1-Regular local school district that is NOT a component of a supervisory union
## 4127 1-Regular local school district that is NOT a component of a supervisory union
## 4128 1-Regular local school district that is NOT a component of a supervisory union
## 4129 1-Regular local school district that is NOT a component of a supervisory union
## 4130 1-Regular local school district that is NOT a component of a supervisory union
## 4131 1-Regular local school district that is NOT a component of a supervisory union
## 4132         5-State agency providing elementary and/or secondary level instruction
## 4133 1-Regular local school district that is NOT a component of a supervisory union
## 4134 1-Regular local school district that is NOT a component of a supervisory union
## 4135 1-Regular local school district that is NOT a component of a supervisory union
## 4136 1-Regular local school district that is NOT a component of a supervisory union
## 4137 1-Regular local school district that is NOT a component of a supervisory union
## 4138 1-Regular local school district that is NOT a component of a supervisory union
## 4139                                     4-Regional Education Service Agency (RESA)
## 4140                                     4-Regional Education Service Agency (RESA)
## 4141         5-State agency providing elementary and/or secondary level instruction
## 4142                                     4-Regional Education Service Agency (RESA)
## 4143 1-Regular local school district that is NOT a component of a supervisory union
## 4144 1-Regular local school district that is NOT a component of a supervisory union
## 4145         5-State agency providing elementary and/or secondary level instruction
## 4146 1-Regular local school district that is NOT a component of a supervisory union
## 4147 1-Regular local school district that is NOT a component of a supervisory union
## 4148 1-Regular local school district that is NOT a component of a supervisory union
## 4149 1-Regular local school district that is NOT a component of a supervisory union
## 4150 1-Regular local school district that is NOT a component of a supervisory union
## 4151 1-Regular local school district that is NOT a component of a supervisory union
## 4152 1-Regular local school district that is NOT a component of a supervisory union
## 4153 1-Regular local school district that is NOT a component of a supervisory union
## 4154 1-Regular local school district that is NOT a component of a supervisory union
## 4155 1-Regular local school district that is NOT a component of a supervisory union
## 4156                                     4-Regional Education Service Agency (RESA)
## 4157                                     4-Regional Education Service Agency (RESA)
## 4158                                     4-Regional Education Service Agency (RESA)
## 4159                                     4-Regional Education Service Agency (RESA)
## 4160                                     4-Regional Education Service Agency (RESA)
## 4161                                     4-Regional Education Service Agency (RESA)
## 4162 1-Regular local school district that is NOT a component of a supervisory union
## 4163                                     4-Regional Education Service Agency (RESA)
## 4164                                     4-Regional Education Service Agency (RESA)
## 4165                                     4-Regional Education Service Agency (RESA)
## 4166                                     4-Regional Education Service Agency (RESA)
## 4167 1-Regular local school district that is NOT a component of a supervisory union
## 4168                                     4-Regional Education Service Agency (RESA)
## 4169                                     4-Regional Education Service Agency (RESA)
## 4170                                     4-Regional Education Service Agency (RESA)
## 4171 1-Regular local school district that is NOT a component of a supervisory union
## 4172 1-Regular local school district that is NOT a component of a supervisory union
## 4173 1-Regular local school district that is NOT a component of a supervisory union
## 4174                                     4-Regional Education Service Agency (RESA)
## 4175 1-Regular local school district that is NOT a component of a supervisory union
## 4176 1-Regular local school district that is NOT a component of a supervisory union
## 4177                                     4-Regional Education Service Agency (RESA)
## 4178                                     4-Regional Education Service Agency (RESA)
## 4179                                     4-Regional Education Service Agency (RESA)
## 4180 1-Regular local school district that is NOT a component of a supervisory union
## 4181                                                 7-Independent Charter District
## 4182 1-Regular local school district that is NOT a component of a supervisory union
## 4183 1-Regular local school district that is NOT a component of a supervisory union
## 4184 1-Regular local school district that is NOT a component of a supervisory union
## 4185 1-Regular local school district that is NOT a component of a supervisory union
## 4186 1-Regular local school district that is NOT a component of a supervisory union
## 4187 1-Regular local school district that is NOT a component of a supervisory union
## 4188 1-Regular local school district that is NOT a component of a supervisory union
## 4189 1-Regular local school district that is NOT a component of a supervisory union
## 4190 1-Regular local school district that is NOT a component of a supervisory union
## 4191 1-Regular local school district that is NOT a component of a supervisory union
## 4192 1-Regular local school district that is NOT a component of a supervisory union
## 4193 1-Regular local school district that is NOT a component of a supervisory union
## 4194 1-Regular local school district that is NOT a component of a supervisory union
## 4195 1-Regular local school district that is NOT a component of a supervisory union
## 4196 1-Regular local school district that is NOT a component of a supervisory union
## 4197                                     4-Regional Education Service Agency (RESA)
## 4198 1-Regular local school district that is NOT a component of a supervisory union
## 4199 1-Regular local school district that is NOT a component of a supervisory union
## 4200 1-Regular local school district that is NOT a component of a supervisory union
## 4201 1-Regular local school district that is NOT a component of a supervisory union
## 4202 1-Regular local school district that is NOT a component of a supervisory union
## 4203 1-Regular local school district that is NOT a component of a supervisory union
## 4204 1-Regular local school district that is NOT a component of a supervisory union
## 4205                                                 7-Independent Charter District
## 4206 1-Regular local school district that is NOT a component of a supervisory union
## 4207 1-Regular local school district that is NOT a component of a supervisory union
## 4208 1-Regular local school district that is NOT a component of a supervisory union
## 4209 1-Regular local school district that is NOT a component of a supervisory union
## 4210 1-Regular local school district that is NOT a component of a supervisory union
## 4211 1-Regular local school district that is NOT a component of a supervisory union
## 4212 1-Regular local school district that is NOT a component of a supervisory union
## 4213                                                 7-Independent Charter District
## 4214 1-Regular local school district that is NOT a component of a supervisory union
## 4215                                                 7-Independent Charter District
## 4216                                                 7-Independent Charter District
## 4217                                                 7-Independent Charter District
## 4218                                                 7-Independent Charter District
## 4219                                                 7-Independent Charter District
## 4220                                                 7-Independent Charter District
## 4221                                                 7-Independent Charter District
## 4222                                                 7-Independent Charter District
## 4223                                                 7-Independent Charter District
## 4224 1-Regular local school district that is NOT a component of a supervisory union
## 4225 1-Regular local school district that is NOT a component of a supervisory union
## 4226 1-Regular local school district that is NOT a component of a supervisory union
## 4227 1-Regular local school district that is NOT a component of a supervisory union
## 4228 1-Regular local school district that is NOT a component of a supervisory union
## 4229 1-Regular local school district that is NOT a component of a supervisory union
## 4230 1-Regular local school district that is NOT a component of a supervisory union
## 4231 1-Regular local school district that is NOT a component of a supervisory union
## 4232         5-State agency providing elementary and/or secondary level instruction
## 4233 1-Regular local school district that is NOT a component of a supervisory union
## 4234 1-Regular local school district that is NOT a component of a supervisory union
## 4235 1-Regular local school district that is NOT a component of a supervisory union
## 4236 1-Regular local school district that is NOT a component of a supervisory union
## 4237         5-State agency providing elementary and/or secondary level instruction
## 4238 1-Regular local school district that is NOT a component of a supervisory union
## 4239             2-Local school district that is a component of a supervisory union
## 4240 1-Regular local school district that is NOT a component of a supervisory union
## 4241 1-Regular local school district that is NOT a component of a supervisory union
## 4242 1-Regular local school district that is NOT a component of a supervisory union
## 4243 1-Regular local school district that is NOT a component of a supervisory union
## 4244 1-Regular local school district that is NOT a component of a supervisory union
## 4245 1-Regular local school district that is NOT a component of a supervisory union
## 4246 1-Regular local school district that is NOT a component of a supervisory union
## 4247 1-Regular local school district that is NOT a component of a supervisory union
## 4248 1-Regular local school district that is NOT a component of a supervisory union
## 4249 1-Regular local school district that is NOT a component of a supervisory union
## 4250 1-Regular local school district that is NOT a component of a supervisory union
## 4251 1-Regular local school district that is NOT a component of a supervisory union
## 4252                                     4-Regional Education Service Agency (RESA)
## 4253 1-Regular local school district that is NOT a component of a supervisory union
## 4254 1-Regular local school district that is NOT a component of a supervisory union
## 4255 1-Regular local school district that is NOT a component of a supervisory union
## 4256 1-Regular local school district that is NOT a component of a supervisory union
## 4257 1-Regular local school district that is NOT a component of a supervisory union
## 4258                                     4-Regional Education Service Agency (RESA)
## 4259 1-Regular local school district that is NOT a component of a supervisory union
## 4260 1-Regular local school district that is NOT a component of a supervisory union
## 4261 1-Regular local school district that is NOT a component of a supervisory union
## 4262 1-Regular local school district that is NOT a component of a supervisory union
## 4263 1-Regular local school district that is NOT a component of a supervisory union
## 4264 1-Regular local school district that is NOT a component of a supervisory union
## 4265 1-Regular local school district that is NOT a component of a supervisory union
## 4266         5-State agency providing elementary and/or secondary level instruction
## 4267 1-Regular local school district that is NOT a component of a supervisory union
## 4268 1-Regular local school district that is NOT a component of a supervisory union
## 4269 1-Regular local school district that is NOT a component of a supervisory union
## 4270                                     4-Regional Education Service Agency (RESA)
## 4271         5-State agency providing elementary and/or secondary level instruction
## 4272         5-State agency providing elementary and/or secondary level instruction
## 4273 1-Regular local school district that is NOT a component of a supervisory union
## 4274 1-Regular local school district that is NOT a component of a supervisory union
## 4275 1-Regular local school district that is NOT a component of a supervisory union
## 4276 1-Regular local school district that is NOT a component of a supervisory union
## 4277 1-Regular local school district that is NOT a component of a supervisory union
## 4278 1-Regular local school district that is NOT a component of a supervisory union
## 4279 1-Regular local school district that is NOT a component of a supervisory union
## 4280 1-Regular local school district that is NOT a component of a supervisory union
## 4281         5-State agency providing elementary and/or secondary level instruction
## 4282 1-Regular local school district that is NOT a component of a supervisory union
## 4283 1-Regular local school district that is NOT a component of a supervisory union
## 4284 1-Regular local school district that is NOT a component of a supervisory union
## 4285 1-Regular local school district that is NOT a component of a supervisory union
## 4286             2-Local school district that is a component of a supervisory union
## 4287         5-State agency providing elementary and/or secondary level instruction
## 4288 1-Regular local school district that is NOT a component of a supervisory union
## 4289         5-State agency providing elementary and/or secondary level instruction
## 4290 1-Regular local school district that is NOT a component of a supervisory union
## 4291         5-State agency providing elementary and/or secondary level instruction
## 4292 1-Regular local school district that is NOT a component of a supervisory union
## 4293 1-Regular local school district that is NOT a component of a supervisory union
## 4294 1-Regular local school district that is NOT a component of a supervisory union
## 4295 1-Regular local school district that is NOT a component of a supervisory union
## 4296 1-Regular local school district that is NOT a component of a supervisory union
## 4297 1-Regular local school district that is NOT a component of a supervisory union
## 4298 1-Regular local school district that is NOT a component of a supervisory union
## 4299                                     4-Regional Education Service Agency (RESA)
## 4300 1-Regular local school district that is NOT a component of a supervisory union
## 4301 1-Regular local school district that is NOT a component of a supervisory union
## 4302 1-Regular local school district that is NOT a component of a supervisory union
## 4303 1-Regular local school district that is NOT a component of a supervisory union
## 4304 1-Regular local school district that is NOT a component of a supervisory union
## 4305 1-Regular local school district that is NOT a component of a supervisory union
## 4306                                     4-Regional Education Service Agency (RESA)
## 4307                                     4-Regional Education Service Agency (RESA)
## 4308                                     4-Regional Education Service Agency (RESA)
## 4309                                     4-Regional Education Service Agency (RESA)
## 4310                                     4-Regional Education Service Agency (RESA)
## 4311                                     4-Regional Education Service Agency (RESA)
## 4312                                     4-Regional Education Service Agency (RESA)
## 4313                                     4-Regional Education Service Agency (RESA)
## 4314                                     4-Regional Education Service Agency (RESA)
## 4315 1-Regular local school district that is NOT a component of a supervisory union
## 4316 1-Regular local school district that is NOT a component of a supervisory union
## 4317 1-Regular local school district that is NOT a component of a supervisory union
## 4318         5-State agency providing elementary and/or secondary level instruction
## 4319 1-Regular local school district that is NOT a component of a supervisory union
## 4320 1-Regular local school district that is NOT a component of a supervisory union
## 4321 1-Regular local school district that is NOT a component of a supervisory union
## 4322 1-Regular local school district that is NOT a component of a supervisory union
## 4323 1-Regular local school district that is NOT a component of a supervisory union
## 4324 1-Regular local school district that is NOT a component of a supervisory union
## 4325             2-Local school district that is a component of a supervisory union
## 4326 1-Regular local school district that is NOT a component of a supervisory union
## 4327 1-Regular local school district that is NOT a component of a supervisory union
## 4328 1-Regular local school district that is NOT a component of a supervisory union
## 4329 1-Regular local school district that is NOT a component of a supervisory union
## 4330 1-Regular local school district that is NOT a component of a supervisory union
## 4331 1-Regular local school district that is NOT a component of a supervisory union
## 4332 1-Regular local school district that is NOT a component of a supervisory union
## 4333 1-Regular local school district that is NOT a component of a supervisory union
## 4334         5-State agency providing elementary and/or secondary level instruction
## 4335 1-Regular local school district that is NOT a component of a supervisory union
## 4336 1-Regular local school district that is NOT a component of a supervisory union
## 4337 1-Regular local school district that is NOT a component of a supervisory union
## 4338 1-Regular local school district that is NOT a component of a supervisory union
## 4339 1-Regular local school district that is NOT a component of a supervisory union
## 4340 1-Regular local school district that is NOT a component of a supervisory union
## 4341 1-Regular local school district that is NOT a component of a supervisory union
## 4342                                     4-Regional Education Service Agency (RESA)
## 4343                                     4-Regional Education Service Agency (RESA)
## 4344                                     4-Regional Education Service Agency (RESA)
## 4345                                     4-Regional Education Service Agency (RESA)
## 4346                                     4-Regional Education Service Agency (RESA)
## 4347                                     4-Regional Education Service Agency (RESA)
## 4348 1-Regular local school district that is NOT a component of a supervisory union
## 4349                                     4-Regional Education Service Agency (RESA)
## 4350                                     4-Regional Education Service Agency (RESA)
## 4351                                     4-Regional Education Service Agency (RESA)
## 4352 1-Regular local school district that is NOT a component of a supervisory union
## 4353 1-Regular local school district that is NOT a component of a supervisory union
## 4354 1-Regular local school district that is NOT a component of a supervisory union
## 4355 1-Regular local school district that is NOT a component of a supervisory union
## 4356 1-Regular local school district that is NOT a component of a supervisory union
## 4357 1-Regular local school district that is NOT a component of a supervisory union
## 4358                                     4-Regional Education Service Agency (RESA)
## 4359 1-Regular local school district that is NOT a component of a supervisory union
## 4360                                                 7-Independent Charter District
## 4361 1-Regular local school district that is NOT a component of a supervisory union
## 4362 1-Regular local school district that is NOT a component of a supervisory union
## 4363 1-Regular local school district that is NOT a component of a supervisory union
## 4364 1-Regular local school district that is NOT a component of a supervisory union
## 4365 1-Regular local school district that is NOT a component of a supervisory union
## 4366 1-Regular local school district that is NOT a component of a supervisory union
## 4367 1-Regular local school district that is NOT a component of a supervisory union
## 4368 1-Regular local school district that is NOT a component of a supervisory union
## 4369 1-Regular local school district that is NOT a component of a supervisory union
## 4370                                     4-Regional Education Service Agency (RESA)
## 4371                                     4-Regional Education Service Agency (RESA)
## 4372                                     4-Regional Education Service Agency (RESA)
## 4373 1-Regular local school district that is NOT a component of a supervisory union
## 4374 1-Regular local school district that is NOT a component of a supervisory union
## 4375 1-Regular local school district that is NOT a component of a supervisory union
## 4376         5-State agency providing elementary and/or secondary level instruction
## 4377                                     4-Regional Education Service Agency (RESA)
## 4378                                                 7-Independent Charter District
## 4379         5-State agency providing elementary and/or secondary level instruction
## 4380                                     4-Regional Education Service Agency (RESA)
## 4381         5-State agency providing elementary and/or secondary level instruction
## 4382 1-Regular local school district that is NOT a component of a supervisory union
## 4383 1-Regular local school district that is NOT a component of a supervisory union
## 4384 1-Regular local school district that is NOT a component of a supervisory union
## 4385 1-Regular local school district that is NOT a component of a supervisory union
## 4386 1-Regular local school district that is NOT a component of a supervisory union
## 4387 1-Regular local school district that is NOT a component of a supervisory union
## 4388 1-Regular local school district that is NOT a component of a supervisory union
## 4389 1-Regular local school district that is NOT a component of a supervisory union
## 4390 1-Regular local school district that is NOT a component of a supervisory union
## 4391 1-Regular local school district that is NOT a component of a supervisory union
## 4392                                     4-Regional Education Service Agency (RESA)
## 4393                                     4-Regional Education Service Agency (RESA)
## 4394         5-State agency providing elementary and/or secondary level instruction
## 4395 1-Regular local school district that is NOT a component of a supervisory union
## 4396 1-Regular local school district that is NOT a component of a supervisory union
## 4397 1-Regular local school district that is NOT a component of a supervisory union
## 4398 1-Regular local school district that is NOT a component of a supervisory union
## 4399 1-Regular local school district that is NOT a component of a supervisory union
## 4400                                                 7-Independent Charter District
## 4401 1-Regular local school district that is NOT a component of a supervisory union
## 4402 1-Regular local school district that is NOT a component of a supervisory union
## 4403             2-Local school district that is a component of a supervisory union
## 4404 1-Regular local school district that is NOT a component of a supervisory union
## 4405 1-Regular local school district that is NOT a component of a supervisory union
## 4406 1-Regular local school district that is NOT a component of a supervisory union
## 4407 1-Regular local school district that is NOT a component of a supervisory union
## 4408 1-Regular local school district that is NOT a component of a supervisory union
## 4409 1-Regular local school district that is NOT a component of a supervisory union
## 4410 1-Regular local school district that is NOT a component of a supervisory union
## 4411 1-Regular local school district that is NOT a component of a supervisory union
## 4412 1-Regular local school district that is NOT a component of a supervisory union
## 4413 1-Regular local school district that is NOT a component of a supervisory union
## 4414 1-Regular local school district that is NOT a component of a supervisory union
## 4415 1-Regular local school district that is NOT a component of a supervisory union
## 4416 1-Regular local school district that is NOT a component of a supervisory union
## 4417 1-Regular local school district that is NOT a component of a supervisory union
## 4418 1-Regular local school district that is NOT a component of a supervisory union
## 4419 1-Regular local school district that is NOT a component of a supervisory union
## 4420 1-Regular local school district that is NOT a component of a supervisory union
## 4421 1-Regular local school district that is NOT a component of a supervisory union
## 4422         5-State agency providing elementary and/or secondary level instruction
## 4423         5-State agency providing elementary and/or secondary level instruction
## 4424 1-Regular local school district that is NOT a component of a supervisory union
## 4425 1-Regular local school district that is NOT a component of a supervisory union
## 4426                                     4-Regional Education Service Agency (RESA)
## 4427                                     4-Regional Education Service Agency (RESA)
## 4428 1-Regular local school district that is NOT a component of a supervisory union
## 4429 1-Regular local school district that is NOT a component of a supervisory union
## 4430 1-Regular local school district that is NOT a component of a supervisory union
## 4431 1-Regular local school district that is NOT a component of a supervisory union
## 4432 1-Regular local school district that is NOT a component of a supervisory union
## 4433 1-Regular local school district that is NOT a component of a supervisory union
## 4434             2-Local school district that is a component of a supervisory union
## 4435 1-Regular local school district that is NOT a component of a supervisory union
## 4436 1-Regular local school district that is NOT a component of a supervisory union
## 4437 1-Regular local school district that is NOT a component of a supervisory union
## 4438 1-Regular local school district that is NOT a component of a supervisory union
## 4439 1-Regular local school district that is NOT a component of a supervisory union
## 4440 1-Regular local school district that is NOT a component of a supervisory union
## 4441 1-Regular local school district that is NOT a component of a supervisory union
## 4442 1-Regular local school district that is NOT a component of a supervisory union
## 4443 1-Regular local school district that is NOT a component of a supervisory union
## 4444 1-Regular local school district that is NOT a component of a supervisory union
## 4445 1-Regular local school district that is NOT a component of a supervisory union
## 4446 1-Regular local school district that is NOT a component of a supervisory union
## 4447 1-Regular local school district that is NOT a component of a supervisory union
## 4448 1-Regular local school district that is NOT a component of a supervisory union
## 4449         5-State agency providing elementary and/or secondary level instruction
## 4450 1-Regular local school district that is NOT a component of a supervisory union
## 4451             2-Local school district that is a component of a supervisory union
## 4452 1-Regular local school district that is NOT a component of a supervisory union
## 4453                                                 7-Independent Charter District
## 4454 1-Regular local school district that is NOT a component of a supervisory union
## 4455         5-State agency providing elementary and/or secondary level instruction
## 4456 1-Regular local school district that is NOT a component of a supervisory union
## 4457 1-Regular local school district that is NOT a component of a supervisory union
## 4458 1-Regular local school district that is NOT a component of a supervisory union
## 4459 1-Regular local school district that is NOT a component of a supervisory union
## 4460 1-Regular local school district that is NOT a component of a supervisory union
## 4461 1-Regular local school district that is NOT a component of a supervisory union
## 4462         5-State agency providing elementary and/or secondary level instruction
## 4463 1-Regular local school district that is NOT a component of a supervisory union
## 4464 1-Regular local school district that is NOT a component of a supervisory union
## 4465 1-Regular local school district that is NOT a component of a supervisory union
## 4466 1-Regular local school district that is NOT a component of a supervisory union
## 4467 1-Regular local school district that is NOT a component of a supervisory union
## 4468 1-Regular local school district that is NOT a component of a supervisory union
## 4469 1-Regular local school district that is NOT a component of a supervisory union
## 4470 1-Regular local school district that is NOT a component of a supervisory union
## 4471 1-Regular local school district that is NOT a component of a supervisory union
## 4472 1-Regular local school district that is NOT a component of a supervisory union
## 4473 1-Regular local school district that is NOT a component of a supervisory union
## 4474 1-Regular local school district that is NOT a component of a supervisory union
## 4475 1-Regular local school district that is NOT a component of a supervisory union
## 4476 1-Regular local school district that is NOT a component of a supervisory union
## 4477 1-Regular local school district that is NOT a component of a supervisory union
## 4478 1-Regular local school district that is NOT a component of a supervisory union
## 4479 1-Regular local school district that is NOT a component of a supervisory union
## 4480 1-Regular local school district that is NOT a component of a supervisory union
## 4481 1-Regular local school district that is NOT a component of a supervisory union
## 4482 1-Regular local school district that is NOT a component of a supervisory union
## 4483                                     4-Regional Education Service Agency (RESA)
## 4484 1-Regular local school district that is NOT a component of a supervisory union
## 4485 1-Regular local school district that is NOT a component of a supervisory union
## 4486 1-Regular local school district that is NOT a component of a supervisory union
## 4487 1-Regular local school district that is NOT a component of a supervisory union
## 4488 1-Regular local school district that is NOT a component of a supervisory union
## 4489 1-Regular local school district that is NOT a component of a supervisory union
## 4490 1-Regular local school district that is NOT a component of a supervisory union
## 4491 1-Regular local school district that is NOT a component of a supervisory union
## 4492 1-Regular local school district that is NOT a component of a supervisory union
## 4493 1-Regular local school district that is NOT a component of a supervisory union
## 4494 1-Regular local school district that is NOT a component of a supervisory union
## 4495 1-Regular local school district that is NOT a component of a supervisory union
## 4496 1-Regular local school district that is NOT a component of a supervisory union
## 4497 1-Regular local school district that is NOT a component of a supervisory union
## 4498 1-Regular local school district that is NOT a component of a supervisory union
## 4499 1-Regular local school district that is NOT a component of a supervisory union
## 4500 1-Regular local school district that is NOT a component of a supervisory union
## 4501 1-Regular local school district that is NOT a component of a supervisory union
## 4502 1-Regular local school district that is NOT a component of a supervisory union
## 4503 1-Regular local school district that is NOT a component of a supervisory union
## 4504 1-Regular local school district that is NOT a component of a supervisory union
## 4505 1-Regular local school district that is NOT a component of a supervisory union
## 4506 1-Regular local school district that is NOT a component of a supervisory union
## 4507 1-Regular local school district that is NOT a component of a supervisory union
## 4508 1-Regular local school district that is NOT a component of a supervisory union
## 4509 1-Regular local school district that is NOT a component of a supervisory union
## 4510 1-Regular local school district that is NOT a component of a supervisory union
## 4511 1-Regular local school district that is NOT a component of a supervisory union
## 4512 1-Regular local school district that is NOT a component of a supervisory union
## 4513 1-Regular local school district that is NOT a component of a supervisory union
## 4514 1-Regular local school district that is NOT a component of a supervisory union
## 4515         5-State agency providing elementary and/or secondary level instruction
## 4516 1-Regular local school district that is NOT a component of a supervisory union
## 4517 1-Regular local school district that is NOT a component of a supervisory union
## 4518 1-Regular local school district that is NOT a component of a supervisory union
## 4519 1-Regular local school district that is NOT a component of a supervisory union
## 4520                                                 7-Independent Charter District
## 4521                                                 7-Independent Charter District
## 4522 1-Regular local school district that is NOT a component of a supervisory union
## 4523 1-Regular local school district that is NOT a component of a supervisory union
## 4524 1-Regular local school district that is NOT a component of a supervisory union
## 4525 1-Regular local school district that is NOT a component of a supervisory union
## 4526 1-Regular local school district that is NOT a component of a supervisory union
## 4527 1-Regular local school district that is NOT a component of a supervisory union
## 4528 1-Regular local school district that is NOT a component of a supervisory union
## 4529 1-Regular local school district that is NOT a component of a supervisory union
## 4530 1-Regular local school district that is NOT a component of a supervisory union
## 4531 1-Regular local school district that is NOT a component of a supervisory union
## 4532 1-Regular local school district that is NOT a component of a supervisory union
## 4533 1-Regular local school district that is NOT a component of a supervisory union
## 4534 1-Regular local school district that is NOT a component of a supervisory union
## 4535                                     4-Regional Education Service Agency (RESA)
## 4536 1-Regular local school district that is NOT a component of a supervisory union
## 4537 1-Regular local school district that is NOT a component of a supervisory union
## 4538         5-State agency providing elementary and/or secondary level instruction
## 4539                                     4-Regional Education Service Agency (RESA)
## 4540 1-Regular local school district that is NOT a component of a supervisory union
## 4541 1-Regular local school district that is NOT a component of a supervisory union
## 4542 1-Regular local school district that is NOT a component of a supervisory union
## 4543 1-Regular local school district that is NOT a component of a supervisory union
## 4544                                     4-Regional Education Service Agency (RESA)
## 4545                                                 7-Independent Charter District
## 4546 1-Regular local school district that is NOT a component of a supervisory union
## 4547 1-Regular local school district that is NOT a component of a supervisory union
## 4548                                                 7-Independent Charter District
## 4549 1-Regular local school district that is NOT a component of a supervisory union
## 4550 1-Regular local school district that is NOT a component of a supervisory union
## 4551 1-Regular local school district that is NOT a component of a supervisory union
## 4552 1-Regular local school district that is NOT a component of a supervisory union
## 4553 1-Regular local school district that is NOT a component of a supervisory union
## 4554 1-Regular local school district that is NOT a component of a supervisory union
## 4555 1-Regular local school district that is NOT a component of a supervisory union
## 4556 1-Regular local school district that is NOT a component of a supervisory union
## 4557 1-Regular local school district that is NOT a component of a supervisory union
## 4558 1-Regular local school district that is NOT a component of a supervisory union
## 4559 1-Regular local school district that is NOT a component of a supervisory union
## 4560 1-Regular local school district that is NOT a component of a supervisory union
## 4561 1-Regular local school district that is NOT a component of a supervisory union
## 4562 1-Regular local school district that is NOT a component of a supervisory union
## 4563 1-Regular local school district that is NOT a component of a supervisory union
## 4564 1-Regular local school district that is NOT a component of a supervisory union
## 4565 1-Regular local school district that is NOT a component of a supervisory union
## 4566 1-Regular local school district that is NOT a component of a supervisory union
## 4567 1-Regular local school district that is NOT a component of a supervisory union
## 4568 1-Regular local school district that is NOT a component of a supervisory union
## 4569 1-Regular local school district that is NOT a component of a supervisory union
## 4570 1-Regular local school district that is NOT a component of a supervisory union
## 4571 1-Regular local school district that is NOT a component of a supervisory union
## 4572 1-Regular local school district that is NOT a component of a supervisory union
## 4573 1-Regular local school district that is NOT a component of a supervisory union
## 4574 1-Regular local school district that is NOT a component of a supervisory union
## 4575 1-Regular local school district that is NOT a component of a supervisory union
## 4576 1-Regular local school district that is NOT a component of a supervisory union
## 4577 1-Regular local school district that is NOT a component of a supervisory union
## 4578 1-Regular local school district that is NOT a component of a supervisory union
## 4579 1-Regular local school district that is NOT a component of a supervisory union
## 4580 1-Regular local school district that is NOT a component of a supervisory union
## 4581 1-Regular local school district that is NOT a component of a supervisory union
## 4582 1-Regular local school district that is NOT a component of a supervisory union
## 4583 1-Regular local school district that is NOT a component of a supervisory union
## 4584 1-Regular local school district that is NOT a component of a supervisory union
## 4585 1-Regular local school district that is NOT a component of a supervisory union
## 4586 1-Regular local school district that is NOT a component of a supervisory union
## 4587                                     4-Regional Education Service Agency (RESA)
## 4588 1-Regular local school district that is NOT a component of a supervisory union
## 4589 1-Regular local school district that is NOT a component of a supervisory union
## 4590 1-Regular local school district that is NOT a component of a supervisory union
## 4591 1-Regular local school district that is NOT a component of a supervisory union
## 4592 1-Regular local school district that is NOT a component of a supervisory union
## 4593 1-Regular local school district that is NOT a component of a supervisory union
## 4594 1-Regular local school district that is NOT a component of a supervisory union
## 4595 1-Regular local school district that is NOT a component of a supervisory union
## 4596 1-Regular local school district that is NOT a component of a supervisory union
## 4597 1-Regular local school district that is NOT a component of a supervisory union
## 4598 1-Regular local school district that is NOT a component of a supervisory union
## 4599 1-Regular local school district that is NOT a component of a supervisory union
## 4600 1-Regular local school district that is NOT a component of a supervisory union
## 4601 1-Regular local school district that is NOT a component of a supervisory union
## 4602 1-Regular local school district that is NOT a component of a supervisory union
## 4603 1-Regular local school district that is NOT a component of a supervisory union
## 4604 1-Regular local school district that is NOT a component of a supervisory union
## 4605 1-Regular local school district that is NOT a component of a supervisory union
## 4606 1-Regular local school district that is NOT a component of a supervisory union
## 4607 1-Regular local school district that is NOT a component of a supervisory union
## 4608 1-Regular local school district that is NOT a component of a supervisory union
## 4609 1-Regular local school district that is NOT a component of a supervisory union
## 4610 1-Regular local school district that is NOT a component of a supervisory union
## 4611 1-Regular local school district that is NOT a component of a supervisory union
## 4612             2-Local school district that is a component of a supervisory union
## 4613 1-Regular local school district that is NOT a component of a supervisory union
## 4614 1-Regular local school district that is NOT a component of a supervisory union
## 4615 1-Regular local school district that is NOT a component of a supervisory union
## 4616 1-Regular local school district that is NOT a component of a supervisory union
## 4617         5-State agency providing elementary and/or secondary level instruction
## 4618             2-Local school district that is a component of a supervisory union
## 4619 1-Regular local school district that is NOT a component of a supervisory union
## 4620 1-Regular local school district that is NOT a component of a supervisory union
## 4621                                     4-Regional Education Service Agency (RESA)
## 4622 1-Regular local school district that is NOT a component of a supervisory union
## 4623 1-Regular local school district that is NOT a component of a supervisory union
## 4624         5-State agency providing elementary and/or secondary level instruction
## 4625 1-Regular local school district that is NOT a component of a supervisory union
## 4626 1-Regular local school district that is NOT a component of a supervisory union
## 4627                                                 7-Independent Charter District
## 4628 1-Regular local school district that is NOT a component of a supervisory union
## 4629 1-Regular local school district that is NOT a component of a supervisory union
## 4630 1-Regular local school district that is NOT a component of a supervisory union
## 4631 1-Regular local school district that is NOT a component of a supervisory union
## 4632 1-Regular local school district that is NOT a component of a supervisory union
## 4633 1-Regular local school district that is NOT a component of a supervisory union
## 4634 1-Regular local school district that is NOT a component of a supervisory union
## 4635         5-State agency providing elementary and/or secondary level instruction
## 4636 1-Regular local school district that is NOT a component of a supervisory union
## 4637 1-Regular local school district that is NOT a component of a supervisory union
## 4638 1-Regular local school district that is NOT a component of a supervisory union
## 4639         5-State agency providing elementary and/or secondary level instruction
## 4640                                     4-Regional Education Service Agency (RESA)
## 4641         5-State agency providing elementary and/or secondary level instruction
## 4642 1-Regular local school district that is NOT a component of a supervisory union
## 4643 1-Regular local school district that is NOT a component of a supervisory union
## 4644 1-Regular local school district that is NOT a component of a supervisory union
## 4645         5-State agency providing elementary and/or secondary level instruction
## 4646                                     4-Regional Education Service Agency (RESA)
## 4647 1-Regular local school district that is NOT a component of a supervisory union
## 4648 1-Regular local school district that is NOT a component of a supervisory union
## 4649 1-Regular local school district that is NOT a component of a supervisory union
## 4650 1-Regular local school district that is NOT a component of a supervisory union
## 4651 1-Regular local school district that is NOT a component of a supervisory union
## 4652 1-Regular local school district that is NOT a component of a supervisory union
## 4653 1-Regular local school district that is NOT a component of a supervisory union
## 4654 1-Regular local school district that is NOT a component of a supervisory union
## 4655 1-Regular local school district that is NOT a component of a supervisory union
## 4656 1-Regular local school district that is NOT a component of a supervisory union
## 4657                                                 7-Independent Charter District
## 4658                                                 7-Independent Charter District
## 4659                                                 7-Independent Charter District
## 4660                                                 7-Independent Charter District
## 4661 1-Regular local school district that is NOT a component of a supervisory union
## 4662 1-Regular local school district that is NOT a component of a supervisory union
## 4663 1-Regular local school district that is NOT a component of a supervisory union
## 4664 1-Regular local school district that is NOT a component of a supervisory union
## 4665 1-Regular local school district that is NOT a component of a supervisory union
## 4666 1-Regular local school district that is NOT a component of a supervisory union
## 4667 1-Regular local school district that is NOT a component of a supervisory union
## 4668 1-Regular local school district that is NOT a component of a supervisory union
## 4669 1-Regular local school district that is NOT a component of a supervisory union
## 4670 1-Regular local school district that is NOT a component of a supervisory union
## 4671 1-Regular local school district that is NOT a component of a supervisory union
## 4672 1-Regular local school district that is NOT a component of a supervisory union
## 4673 1-Regular local school district that is NOT a component of a supervisory union
## 4674 1-Regular local school district that is NOT a component of a supervisory union
## 4675         5-State agency providing elementary and/or secondary level instruction
## 4676 1-Regular local school district that is NOT a component of a supervisory union
## 4677 1-Regular local school district that is NOT a component of a supervisory union
## 4678 1-Regular local school district that is NOT a component of a supervisory union
## 4679 1-Regular local school district that is NOT a component of a supervisory union
## 4680 1-Regular local school district that is NOT a component of a supervisory union
## 4681 1-Regular local school district that is NOT a component of a supervisory union
## 4682 1-Regular local school district that is NOT a component of a supervisory union
## 4683 1-Regular local school district that is NOT a component of a supervisory union
## 4684         5-State agency providing elementary and/or secondary level instruction
## 4685 1-Regular local school district that is NOT a component of a supervisory union
## 4686 1-Regular local school district that is NOT a component of a supervisory union
## 4687 1-Regular local school district that is NOT a component of a supervisory union
## 4688                                                 7-Independent Charter District
## 4689 1-Regular local school district that is NOT a component of a supervisory union
## 4690                                     4-Regional Education Service Agency (RESA)
## 4691 1-Regular local school district that is NOT a component of a supervisory union
## 4692         5-State agency providing elementary and/or secondary level instruction
## 4693 1-Regular local school district that is NOT a component of a supervisory union
## 4694 1-Regular local school district that is NOT a component of a supervisory union
## 4695 1-Regular local school district that is NOT a component of a supervisory union
## 4696 1-Regular local school district that is NOT a component of a supervisory union
## 4697 1-Regular local school district that is NOT a component of a supervisory union
## 4698         5-State agency providing elementary and/or secondary level instruction
## 4699 1-Regular local school district that is NOT a component of a supervisory union
## 4700                                     4-Regional Education Service Agency (RESA)
## 4701 1-Regular local school district that is NOT a component of a supervisory union
## 4702 1-Regular local school district that is NOT a component of a supervisory union
## 4703 1-Regular local school district that is NOT a component of a supervisory union
## 4704 1-Regular local school district that is NOT a component of a supervisory union
## 4705 1-Regular local school district that is NOT a component of a supervisory union
## 4706 1-Regular local school district that is NOT a component of a supervisory union
## 4707 1-Regular local school district that is NOT a component of a supervisory union
## 4708 1-Regular local school district that is NOT a component of a supervisory union
## 4709 1-Regular local school district that is NOT a component of a supervisory union
## 4710 1-Regular local school district that is NOT a component of a supervisory union
## 4711 1-Regular local school district that is NOT a component of a supervisory union
## 4712 1-Regular local school district that is NOT a component of a supervisory union
## 4713 1-Regular local school district that is NOT a component of a supervisory union
## 4714 1-Regular local school district that is NOT a component of a supervisory union
## 4715 1-Regular local school district that is NOT a component of a supervisory union
## 4716 1-Regular local school district that is NOT a component of a supervisory union
## 4717         5-State agency providing elementary and/or secondary level instruction
## 4718 1-Regular local school district that is NOT a component of a supervisory union
## 4719 1-Regular local school district that is NOT a component of a supervisory union
## 4720 1-Regular local school district that is NOT a component of a supervisory union
## 4721 1-Regular local school district that is NOT a component of a supervisory union
## 4722 1-Regular local school district that is NOT a component of a supervisory union
## 4723                                     4-Regional Education Service Agency (RESA)
## 4724 1-Regular local school district that is NOT a component of a supervisory union
## 4725                                     4-Regional Education Service Agency (RESA)
## 4726                                     4-Regional Education Service Agency (RESA)
## 4727 1-Regular local school district that is NOT a component of a supervisory union
## 4728 1-Regular local school district that is NOT a component of a supervisory union
## 4729 1-Regular local school district that is NOT a component of a supervisory union
## 4730 1-Regular local school district that is NOT a component of a supervisory union
## 4731 1-Regular local school district that is NOT a component of a supervisory union
## 4732 1-Regular local school district that is NOT a component of a supervisory union
## 4733                                     4-Regional Education Service Agency (RESA)
## 4734 1-Regular local school district that is NOT a component of a supervisory union
## 4735 1-Regular local school district that is NOT a component of a supervisory union
## 4736 1-Regular local school district that is NOT a component of a supervisory union
## 4737 1-Regular local school district that is NOT a component of a supervisory union
## 4738 1-Regular local school district that is NOT a component of a supervisory union
## 4739 1-Regular local school district that is NOT a component of a supervisory union
## 4740 1-Regular local school district that is NOT a component of a supervisory union
## 4741 1-Regular local school district that is NOT a component of a supervisory union
## 4742 1-Regular local school district that is NOT a component of a supervisory union
## 4743 1-Regular local school district that is NOT a component of a supervisory union
## 4744 1-Regular local school district that is NOT a component of a supervisory union
## 4745 1-Regular local school district that is NOT a component of a supervisory union
## 4746                                     4-Regional Education Service Agency (RESA)
## 4747 1-Regular local school district that is NOT a component of a supervisory union
## 4748 1-Regular local school district that is NOT a component of a supervisory union
## 4749 1-Regular local school district that is NOT a component of a supervisory union
## 4750 1-Regular local school district that is NOT a component of a supervisory union
## 4751 1-Regular local school district that is NOT a component of a supervisory union
## 4752 1-Regular local school district that is NOT a component of a supervisory union
## 4753 1-Regular local school district that is NOT a component of a supervisory union
## 4754 1-Regular local school district that is NOT a component of a supervisory union
## 4755 1-Regular local school district that is NOT a component of a supervisory union
## 4756 1-Regular local school district that is NOT a component of a supervisory union
## 4757 1-Regular local school district that is NOT a component of a supervisory union
## 4758 1-Regular local school district that is NOT a component of a supervisory union
## 4759 1-Regular local school district that is NOT a component of a supervisory union
## 4760 1-Regular local school district that is NOT a component of a supervisory union
## 4761 1-Regular local school district that is NOT a component of a supervisory union
## 4762 1-Regular local school district that is NOT a component of a supervisory union
## 4763 1-Regular local school district that is NOT a component of a supervisory union
## 4764 1-Regular local school district that is NOT a component of a supervisory union
## 4765 1-Regular local school district that is NOT a component of a supervisory union
## 4766 1-Regular local school district that is NOT a component of a supervisory union
## 4767 1-Regular local school district that is NOT a component of a supervisory union
## 4768 1-Regular local school district that is NOT a component of a supervisory union
## 4769 1-Regular local school district that is NOT a component of a supervisory union
## 4770 1-Regular local school district that is NOT a component of a supervisory union
## 4771 1-Regular local school district that is NOT a component of a supervisory union
## 4772 1-Regular local school district that is NOT a component of a supervisory union
## 4773 1-Regular local school district that is NOT a component of a supervisory union
## 4774 1-Regular local school district that is NOT a component of a supervisory union
## 4775 1-Regular local school district that is NOT a component of a supervisory union
## 4776 1-Regular local school district that is NOT a component of a supervisory union
## 4777                                     4-Regional Education Service Agency (RESA)
## 4778 1-Regular local school district that is NOT a component of a supervisory union
## 4779 1-Regular local school district that is NOT a component of a supervisory union
## 4780                                     4-Regional Education Service Agency (RESA)
## 4781 1-Regular local school district that is NOT a component of a supervisory union
## 4782 1-Regular local school district that is NOT a component of a supervisory union
## 4783 1-Regular local school district that is NOT a component of a supervisory union
## 4784 1-Regular local school district that is NOT a component of a supervisory union
## 4785                                     4-Regional Education Service Agency (RESA)
## 4786 1-Regular local school district that is NOT a component of a supervisory union
## 4787                                     4-Regional Education Service Agency (RESA)
## 4788                                                     8-Other education agencies
## 4789                                                     8-Other education agencies
## 4790                                                     8-Other education agencies
## 4791                                                     8-Other education agencies
## 4792 1-Regular local school district that is NOT a component of a supervisory union
## 4793 1-Regular local school district that is NOT a component of a supervisory union
## 4794                                                 7-Independent Charter District
## 4795 1-Regular local school district that is NOT a component of a supervisory union
## 4796 1-Regular local school district that is NOT a component of a supervisory union
## 4797 1-Regular local school district that is NOT a component of a supervisory union
## 4798 1-Regular local school district that is NOT a component of a supervisory union
## 4799 1-Regular local school district that is NOT a component of a supervisory union
## 4800 1-Regular local school district that is NOT a component of a supervisory union
## 4801 1-Regular local school district that is NOT a component of a supervisory union
## 4802 1-Regular local school district that is NOT a component of a supervisory union
## 4803 1-Regular local school district that is NOT a component of a supervisory union
## 4804 1-Regular local school district that is NOT a component of a supervisory union
## 4805 1-Regular local school district that is NOT a component of a supervisory union
## 4806 1-Regular local school district that is NOT a component of a supervisory union
## 4807 1-Regular local school district that is NOT a component of a supervisory union
## 4808 1-Regular local school district that is NOT a component of a supervisory union
## 4809         5-State agency providing elementary and/or secondary level instruction
## 4810 1-Regular local school district that is NOT a component of a supervisory union
## 4811 1-Regular local school district that is NOT a component of a supervisory union
## 4812 1-Regular local school district that is NOT a component of a supervisory union
## 4813 1-Regular local school district that is NOT a component of a supervisory union
## 4814 1-Regular local school district that is NOT a component of a supervisory union
## 4815 1-Regular local school district that is NOT a component of a supervisory union
## 4816 1-Regular local school district that is NOT a component of a supervisory union
## 4817 1-Regular local school district that is NOT a component of a supervisory union
## 4818 1-Regular local school district that is NOT a component of a supervisory union
## 4819 1-Regular local school district that is NOT a component of a supervisory union
## 4820 1-Regular local school district that is NOT a component of a supervisory union
## 4821 1-Regular local school district that is NOT a component of a supervisory union
## 4822 1-Regular local school district that is NOT a component of a supervisory union
## 4823 1-Regular local school district that is NOT a component of a supervisory union
## 4824 1-Regular local school district that is NOT a component of a supervisory union
## 4825 1-Regular local school district that is NOT a component of a supervisory union
## 4826 1-Regular local school district that is NOT a component of a supervisory union
## 4827 1-Regular local school district that is NOT a component of a supervisory union
## 4828 1-Regular local school district that is NOT a component of a supervisory union
## 4829 1-Regular local school district that is NOT a component of a supervisory union
## 4830                                     4-Regional Education Service Agency (RESA)
## 4831                                     4-Regional Education Service Agency (RESA)
## 4832                                     4-Regional Education Service Agency (RESA)
## 4833                                     4-Regional Education Service Agency (RESA)
## 4834                                     4-Regional Education Service Agency (RESA)
## 4835                                     4-Regional Education Service Agency (RESA)
## 4836 1-Regular local school district that is NOT a component of a supervisory union
## 4837 1-Regular local school district that is NOT a component of a supervisory union
## 4838 1-Regular local school district that is NOT a component of a supervisory union
## 4839 1-Regular local school district that is NOT a component of a supervisory union
## 4840         5-State agency providing elementary and/or secondary level instruction
## 4841 1-Regular local school district that is NOT a component of a supervisory union
## 4842 1-Regular local school district that is NOT a component of a supervisory union
## 4843         5-State agency providing elementary and/or secondary level instruction
## 4844 1-Regular local school district that is NOT a component of a supervisory union
## 4845 1-Regular local school district that is NOT a component of a supervisory union
## 4846 1-Regular local school district that is NOT a component of a supervisory union
## 4847 1-Regular local school district that is NOT a component of a supervisory union
## 4848 1-Regular local school district that is NOT a component of a supervisory union
## 4849 1-Regular local school district that is NOT a component of a supervisory union
## 4850 1-Regular local school district that is NOT a component of a supervisory union
## 4851 1-Regular local school district that is NOT a component of a supervisory union
## 4852 1-Regular local school district that is NOT a component of a supervisory union
## 4853 1-Regular local school district that is NOT a component of a supervisory union
## 4854 1-Regular local school district that is NOT a component of a supervisory union
## 4855 1-Regular local school district that is NOT a component of a supervisory union
## 4856 1-Regular local school district that is NOT a component of a supervisory union
## 4857                                     4-Regional Education Service Agency (RESA)
## 4858 1-Regular local school district that is NOT a component of a supervisory union
## 4859 1-Regular local school district that is NOT a component of a supervisory union
## 4860 1-Regular local school district that is NOT a component of a supervisory union
## 4861 1-Regular local school district that is NOT a component of a supervisory union
## 4862 1-Regular local school district that is NOT a component of a supervisory union
## 4863 1-Regular local school district that is NOT a component of a supervisory union
## 4864 1-Regular local school district that is NOT a component of a supervisory union
## 4865 1-Regular local school district that is NOT a component of a supervisory union
## 4866 1-Regular local school district that is NOT a component of a supervisory union
## 4867 1-Regular local school district that is NOT a component of a supervisory union
## 4868 1-Regular local school district that is NOT a component of a supervisory union
## 4869 1-Regular local school district that is NOT a component of a supervisory union
## 4870 1-Regular local school district that is NOT a component of a supervisory union
## 4871 1-Regular local school district that is NOT a component of a supervisory union
## 4872 1-Regular local school district that is NOT a component of a supervisory union
## 4873 1-Regular local school district that is NOT a component of a supervisory union
## 4874 1-Regular local school district that is NOT a component of a supervisory union
## 4875 1-Regular local school district that is NOT a component of a supervisory union
## 4876 1-Regular local school district that is NOT a component of a supervisory union
## 4877 1-Regular local school district that is NOT a component of a supervisory union
## 4878         5-State agency providing elementary and/or secondary level instruction
## 4879 1-Regular local school district that is NOT a component of a supervisory union
## 4880 1-Regular local school district that is NOT a component of a supervisory union
## 4881 1-Regular local school district that is NOT a component of a supervisory union
## 4882 1-Regular local school district that is NOT a component of a supervisory union
## 4883 1-Regular local school district that is NOT a component of a supervisory union
## 4884 1-Regular local school district that is NOT a component of a supervisory union
## 4885                                     4-Regional Education Service Agency (RESA)
## 4886                                     4-Regional Education Service Agency (RESA)
## 4887 1-Regular local school district that is NOT a component of a supervisory union
## 4888 1-Regular local school district that is NOT a component of a supervisory union
## 4889 1-Regular local school district that is NOT a component of a supervisory union
## 4890 1-Regular local school district that is NOT a component of a supervisory union
## 4891                                     4-Regional Education Service Agency (RESA)
## 4892 1-Regular local school district that is NOT a component of a supervisory union
## 4893 1-Regular local school district that is NOT a component of a supervisory union
## 4894 1-Regular local school district that is NOT a component of a supervisory union
## 4895 1-Regular local school district that is NOT a component of a supervisory union
## 4896 1-Regular local school district that is NOT a component of a supervisory union
## 4897 1-Regular local school district that is NOT a component of a supervisory union
## 4898 1-Regular local school district that is NOT a component of a supervisory union
## 4899 1-Regular local school district that is NOT a component of a supervisory union
## 4900 1-Regular local school district that is NOT a component of a supervisory union
## 4901 1-Regular local school district that is NOT a component of a supervisory union
## 4902                                                 7-Independent Charter District
## 4903 1-Regular local school district that is NOT a component of a supervisory union
## 4904 1-Regular local school district that is NOT a component of a supervisory union
## 4905 1-Regular local school district that is NOT a component of a supervisory union
## 4906 1-Regular local school district that is NOT a component of a supervisory union
## 4907 1-Regular local school district that is NOT a component of a supervisory union
## 4908 1-Regular local school district that is NOT a component of a supervisory union
## 4909                                                 7-Independent Charter District
## 4910                                                 7-Independent Charter District
## 4911 1-Regular local school district that is NOT a component of a supervisory union
## 4912 1-Regular local school district that is NOT a component of a supervisory union
## 4913 1-Regular local school district that is NOT a component of a supervisory union
## 4914 1-Regular local school district that is NOT a component of a supervisory union
## 4915 1-Regular local school district that is NOT a component of a supervisory union
## 4916 1-Regular local school district that is NOT a component of a supervisory union
## 4917 1-Regular local school district that is NOT a component of a supervisory union
## 4918 1-Regular local school district that is NOT a component of a supervisory union
## 4919 1-Regular local school district that is NOT a component of a supervisory union
## 4920 1-Regular local school district that is NOT a component of a supervisory union
## 4921 1-Regular local school district that is NOT a component of a supervisory union
## 4922 1-Regular local school district that is NOT a component of a supervisory union
## 4923 1-Regular local school district that is NOT a component of a supervisory union
## 4924 1-Regular local school district that is NOT a component of a supervisory union
## 4925 1-Regular local school district that is NOT a component of a supervisory union
## 4926 1-Regular local school district that is NOT a component of a supervisory union
## 4927 1-Regular local school district that is NOT a component of a supervisory union
## 4928 1-Regular local school district that is NOT a component of a supervisory union
## 4929 1-Regular local school district that is NOT a component of a supervisory union
## 4930 1-Regular local school district that is NOT a component of a supervisory union
## 4931                                     4-Regional Education Service Agency (RESA)
## 4932 1-Regular local school district that is NOT a component of a supervisory union
## 4933 1-Regular local school district that is NOT a component of a supervisory union
## 4934 1-Regular local school district that is NOT a component of a supervisory union
## 4935                                                 7-Independent Charter District
## 4936                                                 7-Independent Charter District
## 4937                                                 7-Independent Charter District
## 4938 1-Regular local school district that is NOT a component of a supervisory union
## 4939         5-State agency providing elementary and/or secondary level instruction
## 4940 1-Regular local school district that is NOT a component of a supervisory union
## 4941                                     4-Regional Education Service Agency (RESA)
## 4942 1-Regular local school district that is NOT a component of a supervisory union
## 4943 1-Regular local school district that is NOT a component of a supervisory union
## 4944 1-Regular local school district that is NOT a component of a supervisory union
## 4945 1-Regular local school district that is NOT a component of a supervisory union
## 4946 1-Regular local school district that is NOT a component of a supervisory union
## 4947 1-Regular local school district that is NOT a component of a supervisory union
## 4948 1-Regular local school district that is NOT a component of a supervisory union
## 4949 1-Regular local school district that is NOT a component of a supervisory union
## 4950 1-Regular local school district that is NOT a component of a supervisory union
## 4951 1-Regular local school district that is NOT a component of a supervisory union
## 4952 1-Regular local school district that is NOT a component of a supervisory union
## 4953 1-Regular local school district that is NOT a component of a supervisory union
## 4954 1-Regular local school district that is NOT a component of a supervisory union
## 4955 1-Regular local school district that is NOT a component of a supervisory union
## 4956 1-Regular local school district that is NOT a component of a supervisory union
## 4957 1-Regular local school district that is NOT a component of a supervisory union
## 4958 1-Regular local school district that is NOT a component of a supervisory union
## 4959 1-Regular local school district that is NOT a component of a supervisory union
## 4960                                                 7-Independent Charter District
## 4961 1-Regular local school district that is NOT a component of a supervisory union
## 4962                                     4-Regional Education Service Agency (RESA)
## 4963 1-Regular local school district that is NOT a component of a supervisory union
## 4964 1-Regular local school district that is NOT a component of a supervisory union
## 4965 1-Regular local school district that is NOT a component of a supervisory union
## 4966 1-Regular local school district that is NOT a component of a supervisory union
## 4967 1-Regular local school district that is NOT a component of a supervisory union
## 4968 1-Regular local school district that is NOT a component of a supervisory union
## 4969 1-Regular local school district that is NOT a component of a supervisory union
## 4970 1-Regular local school district that is NOT a component of a supervisory union
## 4971 1-Regular local school district that is NOT a component of a supervisory union
## 4972 1-Regular local school district that is NOT a component of a supervisory union
## 4973 1-Regular local school district that is NOT a component of a supervisory union
## 4974                                     4-Regional Education Service Agency (RESA)
## 4975 1-Regular local school district that is NOT a component of a supervisory union
## 4976 1-Regular local school district that is NOT a component of a supervisory union
## 4977 1-Regular local school district that is NOT a component of a supervisory union
## 4978 1-Regular local school district that is NOT a component of a supervisory union
## 4979                                                 7-Independent Charter District
## 4980 1-Regular local school district that is NOT a component of a supervisory union
## 4981         5-State agency providing elementary and/or secondary level instruction
## 4982 1-Regular local school district that is NOT a component of a supervisory union
## 4983         5-State agency providing elementary and/or secondary level instruction
## 4984 1-Regular local school district that is NOT a component of a supervisory union
## 4985 1-Regular local school district that is NOT a component of a supervisory union
## 4986 1-Regular local school district that is NOT a component of a supervisory union
## 4987 1-Regular local school district that is NOT a component of a supervisory union
## 4988         5-State agency providing elementary and/or secondary level instruction
## 4989         5-State agency providing elementary and/or secondary level instruction
## 4990                                     4-Regional Education Service Agency (RESA)
## 4991 1-Regular local school district that is NOT a component of a supervisory union
## 4992 1-Regular local school district that is NOT a component of a supervisory union
## 4993 1-Regular local school district that is NOT a component of a supervisory union
## 4994 1-Regular local school district that is NOT a component of a supervisory union
## 4995 1-Regular local school district that is NOT a component of a supervisory union
## 4996 1-Regular local school district that is NOT a component of a supervisory union
## 4997                                                 7-Independent Charter District
## 4998 1-Regular local school district that is NOT a component of a supervisory union
## 4999 1-Regular local school district that is NOT a component of a supervisory union
## 5000 1-Regular local school district that is NOT a component of a supervisory union
## 5001 1-Regular local school district that is NOT a component of a supervisory union
## 5002 1-Regular local school district that is NOT a component of a supervisory union
## 5003 1-Regular local school district that is NOT a component of a supervisory union
## 5004 1-Regular local school district that is NOT a component of a supervisory union
## 5005 1-Regular local school district that is NOT a component of a supervisory union
## 5006 1-Regular local school district that is NOT a component of a supervisory union
## 5007                                     4-Regional Education Service Agency (RESA)
## 5008                                     4-Regional Education Service Agency (RESA)
## 5009 1-Regular local school district that is NOT a component of a supervisory union
## 5010 1-Regular local school district that is NOT a component of a supervisory union
## 5011 1-Regular local school district that is NOT a component of a supervisory union
## 5012 1-Regular local school district that is NOT a component of a supervisory union
## 5013 1-Regular local school district that is NOT a component of a supervisory union
## 5014 1-Regular local school district that is NOT a component of a supervisory union
## 5015 1-Regular local school district that is NOT a component of a supervisory union
## 5016                                     4-Regional Education Service Agency (RESA)
## 5017 1-Regular local school district that is NOT a component of a supervisory union
## 5018 1-Regular local school district that is NOT a component of a supervisory union
## 5019 1-Regular local school district that is NOT a component of a supervisory union
## 5020 1-Regular local school district that is NOT a component of a supervisory union
## 5021 1-Regular local school district that is NOT a component of a supervisory union
## 5022 1-Regular local school district that is NOT a component of a supervisory union
## 5023 1-Regular local school district that is NOT a component of a supervisory union
## 5024 1-Regular local school district that is NOT a component of a supervisory union
## 5025 1-Regular local school district that is NOT a component of a supervisory union
## 5026 1-Regular local school district that is NOT a component of a supervisory union
## 5027 1-Regular local school district that is NOT a component of a supervisory union
## 5028 1-Regular local school district that is NOT a component of a supervisory union
## 5029 1-Regular local school district that is NOT a component of a supervisory union
## 5030 1-Regular local school district that is NOT a component of a supervisory union
## 5031 1-Regular local school district that is NOT a component of a supervisory union
## 5032 1-Regular local school district that is NOT a component of a supervisory union
## 5033         5-State agency providing elementary and/or secondary level instruction
## 5034         5-State agency providing elementary and/or secondary level instruction
## 5035 1-Regular local school district that is NOT a component of a supervisory union
## 5036 1-Regular local school district that is NOT a component of a supervisory union
## 5037 1-Regular local school district that is NOT a component of a supervisory union
## 5038 1-Regular local school district that is NOT a component of a supervisory union
## 5039                                                 7-Independent Charter District
## 5040                                                 7-Independent Charter District
## 5041 1-Regular local school district that is NOT a component of a supervisory union
## 5042 1-Regular local school district that is NOT a component of a supervisory union
## 5043                                     4-Regional Education Service Agency (RESA)
## 5044 1-Regular local school district that is NOT a component of a supervisory union
## 5045 1-Regular local school district that is NOT a component of a supervisory union
## 5046 1-Regular local school district that is NOT a component of a supervisory union
## 5047 1-Regular local school district that is NOT a component of a supervisory union
## 5048 1-Regular local school district that is NOT a component of a supervisory union
## 5049 1-Regular local school district that is NOT a component of a supervisory union
## 5050 1-Regular local school district that is NOT a component of a supervisory union
## 5051 1-Regular local school district that is NOT a component of a supervisory union
## 5052 1-Regular local school district that is NOT a component of a supervisory union
## 5053 1-Regular local school district that is NOT a component of a supervisory union
## 5054 1-Regular local school district that is NOT a component of a supervisory union
## 5055 1-Regular local school district that is NOT a component of a supervisory union
## 5056 1-Regular local school district that is NOT a component of a supervisory union
## 5057 1-Regular local school district that is NOT a component of a supervisory union
## 5058 1-Regular local school district that is NOT a component of a supervisory union
## 5059         5-State agency providing elementary and/or secondary level instruction
## 5060 1-Regular local school district that is NOT a component of a supervisory union
## 5061 1-Regular local school district that is NOT a component of a supervisory union
## 5062 1-Regular local school district that is NOT a component of a supervisory union
## 5063 1-Regular local school district that is NOT a component of a supervisory union
## 5064 1-Regular local school district that is NOT a component of a supervisory union
## 5065 1-Regular local school district that is NOT a component of a supervisory union
## 5066 1-Regular local school district that is NOT a component of a supervisory union
## 5067 1-Regular local school district that is NOT a component of a supervisory union
## 5068 1-Regular local school district that is NOT a component of a supervisory union
## 5069 1-Regular local school district that is NOT a component of a supervisory union
## 5070 1-Regular local school district that is NOT a component of a supervisory union
## 5071 1-Regular local school district that is NOT a component of a supervisory union
## 5072 1-Regular local school district that is NOT a component of a supervisory union
## 5073 1-Regular local school district that is NOT a component of a supervisory union
## 5074 1-Regular local school district that is NOT a component of a supervisory union
## 5075 1-Regular local school district that is NOT a component of a supervisory union
## 5076 1-Regular local school district that is NOT a component of a supervisory union
## 5077 1-Regular local school district that is NOT a component of a supervisory union
## 5078 1-Regular local school district that is NOT a component of a supervisory union
## 5079 1-Regular local school district that is NOT a component of a supervisory union
## 5080 1-Regular local school district that is NOT a component of a supervisory union
## 5081         5-State agency providing elementary and/or secondary level instruction
## 5082 1-Regular local school district that is NOT a component of a supervisory union
## 5083 1-Regular local school district that is NOT a component of a supervisory union
## 5084 1-Regular local school district that is NOT a component of a supervisory union
## 5085                                     4-Regional Education Service Agency (RESA)
## 5086                                                 7-Independent Charter District
## 5087 1-Regular local school district that is NOT a component of a supervisory union
## 5088         5-State agency providing elementary and/or secondary level instruction
## 5089 1-Regular local school district that is NOT a component of a supervisory union
## 5090 1-Regular local school district that is NOT a component of a supervisory union
## 5091 1-Regular local school district that is NOT a component of a supervisory union
## 5092 1-Regular local school district that is NOT a component of a supervisory union
## 5093 1-Regular local school district that is NOT a component of a supervisory union
## 5094 1-Regular local school district that is NOT a component of a supervisory union
## 5095 1-Regular local school district that is NOT a component of a supervisory union
## 5096         5-State agency providing elementary and/or secondary level instruction
## 5097 1-Regular local school district that is NOT a component of a supervisory union
## 5098 1-Regular local school district that is NOT a component of a supervisory union
## 5099 1-Regular local school district that is NOT a component of a supervisory union
## 5100 1-Regular local school district that is NOT a component of a supervisory union
## 5101 1-Regular local school district that is NOT a component of a supervisory union
## 5102                                                 7-Independent Charter District
## 5103 1-Regular local school district that is NOT a component of a supervisory union
## 5104         5-State agency providing elementary and/or secondary level instruction
## 5105         5-State agency providing elementary and/or secondary level instruction
## 5106                                                 7-Independent Charter District
## 5107 1-Regular local school district that is NOT a component of a supervisory union
## 5108 1-Regular local school district that is NOT a component of a supervisory union
## 5109 1-Regular local school district that is NOT a component of a supervisory union
## 5110 1-Regular local school district that is NOT a component of a supervisory union
## 5111                                                 7-Independent Charter District
## 5112 1-Regular local school district that is NOT a component of a supervisory union
## 5113                                                 7-Independent Charter District
## 5114                                     4-Regional Education Service Agency (RESA)
## 5115 1-Regular local school district that is NOT a component of a supervisory union
## 5116 1-Regular local school district that is NOT a component of a supervisory union
## 5117 1-Regular local school district that is NOT a component of a supervisory union
## 5118 1-Regular local school district that is NOT a component of a supervisory union
## 5119 1-Regular local school district that is NOT a component of a supervisory union
## 5120 1-Regular local school district that is NOT a component of a supervisory union
## 5121 1-Regular local school district that is NOT a component of a supervisory union
## 5122 1-Regular local school district that is NOT a component of a supervisory union
## 5123 1-Regular local school district that is NOT a component of a supervisory union
## 5124 1-Regular local school district that is NOT a component of a supervisory union
## 5125 1-Regular local school district that is NOT a component of a supervisory union
## 5126 1-Regular local school district that is NOT a component of a supervisory union
## 5127 1-Regular local school district that is NOT a component of a supervisory union
## 5128 1-Regular local school district that is NOT a component of a supervisory union
## 5129 1-Regular local school district that is NOT a component of a supervisory union
## 5130 1-Regular local school district that is NOT a component of a supervisory union
## 5131 1-Regular local school district that is NOT a component of a supervisory union
## 5132 1-Regular local school district that is NOT a component of a supervisory union
## 5133 1-Regular local school district that is NOT a component of a supervisory union
## 5134 1-Regular local school district that is NOT a component of a supervisory union
## 5135 1-Regular local school district that is NOT a component of a supervisory union
## 5136 1-Regular local school district that is NOT a component of a supervisory union
## 5137 1-Regular local school district that is NOT a component of a supervisory union
## 5138 1-Regular local school district that is NOT a component of a supervisory union
## 5139 1-Regular local school district that is NOT a component of a supervisory union
## 5140 1-Regular local school district that is NOT a component of a supervisory union
## 5141             2-Local school district that is a component of a supervisory union
## 5142             2-Local school district that is a component of a supervisory union
## 5143 1-Regular local school district that is NOT a component of a supervisory union
## 5144 1-Regular local school district that is NOT a component of a supervisory union
## 5145 1-Regular local school district that is NOT a component of a supervisory union
## 5146                                     4-Regional Education Service Agency (RESA)
## 5147 1-Regular local school district that is NOT a component of a supervisory union
## 5148 1-Regular local school district that is NOT a component of a supervisory union
## 5149 1-Regular local school district that is NOT a component of a supervisory union
## 5150 1-Regular local school district that is NOT a component of a supervisory union
## 5151 1-Regular local school district that is NOT a component of a supervisory union
## 5152 1-Regular local school district that is NOT a component of a supervisory union
## 5153 1-Regular local school district that is NOT a component of a supervisory union
## 5154 1-Regular local school district that is NOT a component of a supervisory union
## 5155 1-Regular local school district that is NOT a component of a supervisory union
## 5156 1-Regular local school district that is NOT a component of a supervisory union
## 5157 1-Regular local school district that is NOT a component of a supervisory union
## 5158 1-Regular local school district that is NOT a component of a supervisory union
## 5159 1-Regular local school district that is NOT a component of a supervisory union
## 5160 1-Regular local school district that is NOT a component of a supervisory union
## 5161 1-Regular local school district that is NOT a component of a supervisory union
## 5162 1-Regular local school district that is NOT a component of a supervisory union
## 5163 1-Regular local school district that is NOT a component of a supervisory union
## 5164 1-Regular local school district that is NOT a component of a supervisory union
## 5165 1-Regular local school district that is NOT a component of a supervisory union
## 5166 1-Regular local school district that is NOT a component of a supervisory union
## 5167 1-Regular local school district that is NOT a component of a supervisory union
## 5168 1-Regular local school district that is NOT a component of a supervisory union
## 5169 1-Regular local school district that is NOT a component of a supervisory union
## 5170 1-Regular local school district that is NOT a component of a supervisory union
## 5171 1-Regular local school district that is NOT a component of a supervisory union
## 5172 1-Regular local school district that is NOT a component of a supervisory union
## 5173 1-Regular local school district that is NOT a component of a supervisory union
## 5174 1-Regular local school district that is NOT a component of a supervisory union
## 5175         5-State agency providing elementary and/or secondary level instruction
## 5176 1-Regular local school district that is NOT a component of a supervisory union
## 5177 1-Regular local school district that is NOT a component of a supervisory union
## 5178 1-Regular local school district that is NOT a component of a supervisory union
## 5179 1-Regular local school district that is NOT a component of a supervisory union
## 5180 1-Regular local school district that is NOT a component of a supervisory union
## 5181 1-Regular local school district that is NOT a component of a supervisory union
## 5182 1-Regular local school district that is NOT a component of a supervisory union
## 5183 1-Regular local school district that is NOT a component of a supervisory union
## 5184 1-Regular local school district that is NOT a component of a supervisory union
## 5185 1-Regular local school district that is NOT a component of a supervisory union
## 5186 1-Regular local school district that is NOT a component of a supervisory union
## 5187                                     4-Regional Education Service Agency (RESA)
## 5188 1-Regular local school district that is NOT a component of a supervisory union
## 5189 1-Regular local school district that is NOT a component of a supervisory union
## 5190 1-Regular local school district that is NOT a component of a supervisory union
## 5191         5-State agency providing elementary and/or secondary level instruction
## 5192 1-Regular local school district that is NOT a component of a supervisory union
## 5193 1-Regular local school district that is NOT a component of a supervisory union
## 5194 1-Regular local school district that is NOT a component of a supervisory union
## 5195 1-Regular local school district that is NOT a component of a supervisory union
## 5196         5-State agency providing elementary and/or secondary level instruction
## 5197                                                 7-Independent Charter District
## 5198 1-Regular local school district that is NOT a component of a supervisory union
## 5199 1-Regular local school district that is NOT a component of a supervisory union
## 5200 1-Regular local school district that is NOT a component of a supervisory union
## 5201 1-Regular local school district that is NOT a component of a supervisory union
## 5202 1-Regular local school district that is NOT a component of a supervisory union
## 5203 1-Regular local school district that is NOT a component of a supervisory union
## 5204 1-Regular local school district that is NOT a component of a supervisory union
## 5205 1-Regular local school district that is NOT a component of a supervisory union
## 5206 1-Regular local school district that is NOT a component of a supervisory union
## 5207 1-Regular local school district that is NOT a component of a supervisory union
## 5208 1-Regular local school district that is NOT a component of a supervisory union
## 5209 1-Regular local school district that is NOT a component of a supervisory union
## 5210                                                 7-Independent Charter District
## 5211 1-Regular local school district that is NOT a component of a supervisory union
## 5212 1-Regular local school district that is NOT a component of a supervisory union
## 5213 1-Regular local school district that is NOT a component of a supervisory union
## 5214 1-Regular local school district that is NOT a component of a supervisory union
## 5215 1-Regular local school district that is NOT a component of a supervisory union
## 5216 1-Regular local school district that is NOT a component of a supervisory union
## 5217 1-Regular local school district that is NOT a component of a supervisory union
## 5218 1-Regular local school district that is NOT a component of a supervisory union
## 5219 1-Regular local school district that is NOT a component of a supervisory union
## 5220 1-Regular local school district that is NOT a component of a supervisory union
## 5221         5-State agency providing elementary and/or secondary level instruction
## 5222 1-Regular local school district that is NOT a component of a supervisory union
## 5223 1-Regular local school district that is NOT a component of a supervisory union
## 5224 1-Regular local school district that is NOT a component of a supervisory union
## 5225 1-Regular local school district that is NOT a component of a supervisory union
## 5226                                     4-Regional Education Service Agency (RESA)
## 5227 1-Regular local school district that is NOT a component of a supervisory union
## 5228 1-Regular local school district that is NOT a component of a supervisory union
## 5229 1-Regular local school district that is NOT a component of a supervisory union
## 5230         5-State agency providing elementary and/or secondary level instruction
## 5231                                                 7-Independent Charter District
## 5232 1-Regular local school district that is NOT a component of a supervisory union
## 5233 1-Regular local school district that is NOT a component of a supervisory union
## 5234 1-Regular local school district that is NOT a component of a supervisory union
## 5235 1-Regular local school district that is NOT a component of a supervisory union
## 5236 1-Regular local school district that is NOT a component of a supervisory union
## 5237 1-Regular local school district that is NOT a component of a supervisory union
## 5238 1-Regular local school district that is NOT a component of a supervisory union
## 5239 1-Regular local school district that is NOT a component of a supervisory union
## 5240 1-Regular local school district that is NOT a component of a supervisory union
## 5241 1-Regular local school district that is NOT a component of a supervisory union
## 5242 1-Regular local school district that is NOT a component of a supervisory union
## 5243 1-Regular local school district that is NOT a component of a supervisory union
## 5244 1-Regular local school district that is NOT a component of a supervisory union
## 5245 1-Regular local school district that is NOT a component of a supervisory union
## 5246 1-Regular local school district that is NOT a component of a supervisory union
## 5247 1-Regular local school district that is NOT a component of a supervisory union
## 5248 1-Regular local school district that is NOT a component of a supervisory union
## 5249 1-Regular local school district that is NOT a component of a supervisory union
## 5250 1-Regular local school district that is NOT a component of a supervisory union
## 5251 1-Regular local school district that is NOT a component of a supervisory union
## 5252 1-Regular local school district that is NOT a component of a supervisory union
## 5253 1-Regular local school district that is NOT a component of a supervisory union
## 5254 1-Regular local school district that is NOT a component of a supervisory union
## 5255 1-Regular local school district that is NOT a component of a supervisory union
## 5256 1-Regular local school district that is NOT a component of a supervisory union
## 5257 1-Regular local school district that is NOT a component of a supervisory union
## 5258 1-Regular local school district that is NOT a component of a supervisory union
## 5259 1-Regular local school district that is NOT a component of a supervisory union
## 5260 1-Regular local school district that is NOT a component of a supervisory union
## 5261 1-Regular local school district that is NOT a component of a supervisory union
## 5262 1-Regular local school district that is NOT a component of a supervisory union
## 5263         5-State agency providing elementary and/or secondary level instruction
##                     School.Type Members Male Female FTE.Equivalent
## 1    4-Alternative/other school      37   20     17           <NA>
## 2    4-Alternative/other school     366  198    168           <NA>
## 3    4-Alternative/other school       0    0      0              0
## 4    4-Alternative/other school      65   27     38           3.82
## 5    4-Alternative/other school       5    3      2           0.07
## 6    4-Alternative/other school       0    0      0              0
## 7    4-Alternative/other school       1    0      1           0.26
## 8    4-Alternative/other school       0    0      0              0
## 9    4-Alternative/other school       0    0      0              0
## 10   4-Alternative/other school       0    0      0              0
## 11   4-Alternative/other school       0    0      0              0
## 12   4-Alternative/other school       0    0      0              0
## 13   4-Alternative/other school       0    0      0              0
## 14   4-Alternative/other school      20   10     10            0.6
## 15   4-Alternative/other school       0    0      0              0
## 16   4-Alternative/other school       0    0      0              0
## 17   4-Alternative/other school       0    0      0              0
## 18   4-Alternative/other school       0    0      0              0
## 19   4-Alternative/other school      16   13      3           1.25
## 20   4-Alternative/other school     142   90     52             13
## 21   4-Alternative/other school       0    0      0              0
## 22   4-Alternative/other school       0    0      0              0
## 23   4-Alternative/other school       0    0      0              0
## 24   4-Alternative/other school     116   64     52            4.2
## 25   4-Alternative/other school       0    0      0              0
## 26   4-Alternative/other school     153   83     70           6.28
## 27   4-Alternative/other school      17   12      5            5.8
## 28   4-Alternative/other school       0    0      0              0
## 29   4-Alternative/other school      67   39     28           5.57
## 30   4-Alternative/other school      62    0     62           9.04
## 31   4-Alternative/other school      93   61     32             19
## 32   4-Alternative/other school      32   25      7           <NA>
## 33   4-Alternative/other school      75   48     27           1.32
## 34   4-Alternative/other school      65   37     28           7.05
## 35   4-Alternative/other school       2    2      0              1
## 36   4-Alternative/other school       2    2      0           <NA>
## 37   4-Alternative/other school     n/a  n/a    n/a            n/a
## 38   4-Alternative/other school      10    7      3           2.59
## 39   4-Alternative/other school     116   57     59            4.2
## 40   4-Alternative/other school     151   95     56           12.2
## 41   4-Alternative/other school     196  120     76           17.3
## 42   4-Alternative/other school     109   59     50           6.49
## 43   4-Alternative/other school     n/a  n/a    n/a            n/a
## 44   4-Alternative/other school     n/a  n/a    n/a            n/a
## 45   4-Alternative/other school      24   20      4              3
## 46   4-Alternative/other school     265  122    143          16.73
## 47   4-Alternative/other school     147   80     67              8
## 48   4-Alternative/other school     249  160     89             11
## 49   4-Alternative/other school     359  176    183           21.3
## 50   4-Alternative/other school     158   84     74            5.2
## 51   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 52   4-Alternative/other school      43   24     19            2.1
## 53   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 54   4-Alternative/other school     138   67     71           8.48
## 55   4-Alternative/other school      11    9      2            1.4
## 56   4-Alternative/other school     n/a  n/a    n/a            n/a
## 57   4-Alternative/other school     715  341    374          41.95
## 58   4-Alternative/other school     187   88     99          26.18
## 59   4-Alternative/other school     124   71     53          10.06
## 60   4-Alternative/other school     432  226    206          24.67
## 61   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 62   4-Alternative/other school     170   72     98           5.25
## 63   4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 64   4-Alternative/other school     117   70     47             26
## 65   4-Alternative/other school     511  253    258             15
## 66   4-Alternative/other school      24    9     15            3.2
## 67   4-Alternative/other school     111   62     49             10
## 68   4-Alternative/other school     155  113     42              9
## 69   4-Alternative/other school       0    0      0              5
## 70   4-Alternative/other school     n/a  n/a    n/a            n/a
## 71   4-Alternative/other school     193   99     94              0
## 72   4-Alternative/other school     355  182    173              4
## 73   4-Alternative/other school     184   73    111             16
## 74   4-Alternative/other school      78   47     31              6
## 75   4-Alternative/other school     281  121    160             26
## 76   4-Alternative/other school     n/a  n/a    n/a              0
## 77   4-Alternative/other school      10    4      6           <NA>
## 78   4-Alternative/other school    1753 1064    689           96.5
## 79   4-Alternative/other school     356  297     59           43.5
## 80   4-Alternative/other school     159  158      1           7.92
## 81   4-Alternative/other school     181  109     72           4.73
## 82   4-Alternative/other school     181  109     72             12
## 83   4-Alternative/other school     135   89     46           14.8
## 84   4-Alternative/other school      48   39      9              9
## 85   4-Alternative/other school     343  184    159             20
## 86   4-Alternative/other school      25   19      6           1.32
## 87   4-Alternative/other school     n/a  n/a    n/a           <NA>
## 88   4-Alternative/other school      16    7      9              2
## 89   4-Alternative/other school      55   32     23            3.8
## 90   4-Alternative/other school      10   10      0              1
## 91   4-Alternative/other school      12    8      4              2
## 92   4-Alternative/other school       0    0      0              0
## 93   4-Alternative/other school      28   26      2              5
## 94   4-Alternative/other school      48   25     23              6
## 95   4-Alternative/other school      26   21      5           3.94
## 96   4-Alternative/other school     513  250    263             24
## 97   4-Alternative/other school     118   54     64              4
## 98   4-Alternative/other school       3    2      1            0.5
## 99   4-Alternative/other school      55   41     14           3.25
## 100  4-Alternative/other school     109   72     37          11.05
## 101  4-Alternative/other school      15   13      2              2
## 102  4-Alternative/other school      72   48     24          16.65
## 103  4-Alternative/other school     154  143     11           <NA>
## 104  4-Alternative/other school      49   23     26              4
## 105  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 106  4-Alternative/other school       8    4      4           6.81
## 107  4-Alternative/other school       0    0      0              0
## 108  4-Alternative/other school     n/a  n/a    n/a            n/a
## 109  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 110  4-Alternative/other school       0  n/a    n/a              0
## 111  4-Alternative/other school     n/a  n/a    n/a            n/a
## 112  4-Alternative/other school      11    3      8           <NA>
## 113  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 114  4-Alternative/other school       0  n/a    n/a              0
## 115  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 116  4-Alternative/other school      18   14      4              5
## 117  4-Alternative/other school       0  n/a    n/a              0
## 118  4-Alternative/other school     133   89     44           8.78
## 119  4-Alternative/other school     170  105     65           8.47
## 120  4-Alternative/other school     n/a  n/a    n/a            n/a
## 121  4-Alternative/other school      62   62      0           9.54
## 122  4-Alternative/other school     n/a  n/a    n/a              0
## 123  4-Alternative/other school       0    0      0              0
## 124  4-Alternative/other school      81   81      0              7
## 125  4-Alternative/other school      39   25     14              5
## 126  4-Alternative/other school      22   13      9              1
## 127  4-Alternative/other school       0    0      0           1.25
## 128  4-Alternative/other school      55   29     26           5.54
## 129  4-Alternative/other school      77   40     37           6.76
## 130  4-Alternative/other school     139   74     65            4.8
## 131  4-Alternative/other school      79   34     45           2.93
## 132  4-Alternative/other school       8    4      4           1.31
## 133  4-Alternative/other school      80   55     25              5
## 134  4-Alternative/other school      22    0     22           <NA>
## 135  4-Alternative/other school       0    0      0           <NA>
## 136  4-Alternative/other school      26   23      3           <NA>
## 137  4-Alternative/other school     174   82     92             13
## 138  4-Alternative/other school      73   68      5             10
## 139  4-Alternative/other school     187   88     99           6.11
## 140  4-Alternative/other school      57   32     25            1.1
## 141  4-Alternative/other school      33   24      9              9
## 142  4-Alternative/other school     168   97     71              8
## 143  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 144  4-Alternative/other school      60   42     18            3.5
## 145  4-Alternative/other school     116   58     58              6
## 146  4-Alternative/other school     129   83     46           14.8
## 147  4-Alternative/other school       0    0      0              0
## 148  4-Alternative/other school       0    0      0              0
## 149  4-Alternative/other school       0    0      0              0
## 150  4-Alternative/other school       0    0      0              0
## 151  4-Alternative/other school       0    0      0              0
## 152  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 153  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 154  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 155  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 156  4-Alternative/other school       0    0      0              0
## 157  4-Alternative/other school       0    0      0              0
## 158  4-Alternative/other school       0    0      0              0
## 159  4-Alternative/other school       0    0      0              0
## 160  4-Alternative/other school       0    0      0              0
## 161  4-Alternative/other school      30   13     17              1
## 162  4-Alternative/other school      24   12     12           <NA>
## 163  4-Alternative/other school     106   54     52           2.52
## 164  4-Alternative/other school       2    0      2           <NA>
## 165  4-Alternative/other school       0    0      0              0
## 166  4-Alternative/other school       0    0      0              0
## 167  4-Alternative/other school       0    0      0              0
## 168  4-Alternative/other school       0    0      0              0
## 169  4-Alternative/other school       0    0      0              0
## 170  4-Alternative/other school       0    0      0              0
## 171  4-Alternative/other school       0    0      0           0.14
## 172  4-Alternative/other school       0    0      0           0.18
## 173  4-Alternative/other school       0    0      0              0
## 174  4-Alternative/other school       0    0      0              0
## 175  4-Alternative/other school     132   69     63           <NA>
## 176  4-Alternative/other school       0    0      0              0
## 177  4-Alternative/other school       0    0      0              0
## 178  4-Alternative/other school       0    0      0              0
## 179  4-Alternative/other school     n/a  n/a    n/a              1
## 180  4-Alternative/other school       0    0      0          52.87
## 181  4-Alternative/other school       1    1      0           <NA>
## 182  4-Alternative/other school     278  137    141             10
## 183  4-Alternative/other school     n/a  n/a    n/a              0
## 184  4-Alternative/other school     326  223    103             18
## 185  4-Alternative/other school       1    1      0           <NA>
## 186  4-Alternative/other school      30   17     13            2.4
## 187  4-Alternative/other school     137   59     78            9.5
## 188  4-Alternative/other school       0    0      0              0
## 189  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 190  4-Alternative/other school      19   14      5              1
## 191  4-Alternative/other school     393  195    198             23
## 192  4-Alternative/other school     255  222     33           19.7
## 193  4-Alternative/other school     777  368    409          48.79
## 194  4-Alternative/other school       9    6      3           <NA>
## 195  4-Alternative/other school      88   57     31          37.46
## 196  4-Alternative/other school      24   21      3           8.54
## 197  4-Alternative/other school       0    0      0          13.17
## 198  4-Alternative/other school     209  122     87              4
## 199  4-Alternative/other school     n/a  n/a    n/a            n/a
## 200  4-Alternative/other school       9    3      6           <NA>
## 201  4-Alternative/other school     128   84     44            8.4
## 202  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 203  4-Alternative/other school     191  114     77          20.75
## 204  4-Alternative/other school      84   36     48            8.7
## 205  4-Alternative/other school       5    4      1           0.33
## 206  4-Alternative/other school      82   38     44             11
## 207  4-Alternative/other school       1    0      1           <NA>
## 208  4-Alternative/other school     326  212    114             11
## 209  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 210  4-Alternative/other school       0    0      0              0
## 211  4-Alternative/other school     101   49     52          10.28
## 212  4-Alternative/other school       0    0      0           <NA>
## 213  4-Alternative/other school       0    0      0           <NA>
## 214  4-Alternative/other school      16    9      7            0.8
## 215  4-Alternative/other school      30   18     12           8.09
## 216  4-Alternative/other school     145   70     75            7.5
## 217  4-Alternative/other school       1    1      0            1.1
## 218  4-Alternative/other school      82   59     23            7.5
## 219  4-Alternative/other school     139   82     57          11.52
## 220  4-Alternative/other school      45   28     17           8.37
## 221  4-Alternative/other school     117   78     39          20.66
## 222  4-Alternative/other school       4    3      1           2.59
## 223  4-Alternative/other school      49   34     15           9.57
## 224  4-Alternative/other school     136   91     45          16.96
## 225  4-Alternative/other school       0    0      0          10.85
## 226  4-Alternative/other school       6    5      1              1
## 227  4-Alternative/other school      48   28     20          11.03
## 228  4-Alternative/other school       0    0      0              0
## 229  4-Alternative/other school      26   18      8           1.25
## 230  4-Alternative/other school       4    3      1           5.83
## 231  4-Alternative/other school       3    3      0              1
## 232  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 233  4-Alternative/other school       0    0      0              0
## 234  4-Alternative/other school      31   16     15           4.52
## 235  4-Alternative/other school      46   35     11              7
## 236  4-Alternative/other school      58   36     22           7.38
## 237  4-Alternative/other school      88   45     43           11.2
## 238  4-Alternative/other school     346  157    189           <NA>
## 239  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 240  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 241  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 242  4-Alternative/other school     105   55     50              0
## 243  4-Alternative/other school       1    1      0              5
## 244  4-Alternative/other school       0    0      0           2.53
## 245  4-Alternative/other school      40   22     18           7.29
## 246  4-Alternative/other school     157   86     71              4
## 247  4-Alternative/other school     105   46     59              3
## 248  4-Alternative/other school       9    7      2           <NA>
## 249  4-Alternative/other school       5    5      0           0.11
## 250  4-Alternative/other school     128   68     60            4.9
## 251  4-Alternative/other school     128   94     34          23.64
## 252  4-Alternative/other school     164  104     60             40
## 253  4-Alternative/other school       0    0      0           <NA>
## 254  4-Alternative/other school      11    9      2              1
## 255  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 256  4-Alternative/other school     101   74     27          24.33
## 257  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 258  4-Alternative/other school      40   27     13          13.78
## 259  4-Alternative/other school      35   16     19              3
## 260  4-Alternative/other school     n/a  n/a    n/a           3.98
## 261  4-Alternative/other school       0    0      0          35.73
## 262  4-Alternative/other school       0    0      0          34.91
## 263  4-Alternative/other school       0    0      0              7
## 264  4-Alternative/other school     n/a  n/a    n/a              2
## 265  4-Alternative/other school     111   67     44           5.03
## 266  4-Alternative/other school      39   27     12          12.98
## 267  4-Alternative/other school      46   32     14              5
## 268  4-Alternative/other school     n/a  n/a    n/a            n/a
## 269  4-Alternative/other school     307  158    149             61
## 270  4-Alternative/other school      13    8      5              2
## 271  4-Alternative/other school     115   78     37           <NA>
## 272  4-Alternative/other school      14   12      2              2
## 273  4-Alternative/other school     n/a  n/a    n/a            n/a
## 274  4-Alternative/other school       1    1      0           <NA>
## 275  4-Alternative/other school      84   39     45            6.2
## 276  4-Alternative/other school      11   10      1           2.31
## 277  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 278  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 279  4-Alternative/other school      21    9     12            1.6
## 280  4-Alternative/other school      18   14      4              6
## 281  4-Alternative/other school     n/a  n/a    n/a              1
## 282  4-Alternative/other school      18    9      9              1
## 283  4-Alternative/other school     167   98     69           8.88
## 284  4-Alternative/other school     159   87     72            7.4
## 285  4-Alternative/other school     121   69     52             10
## 286  4-Alternative/other school      21   17      4              6
## 287  4-Alternative/other school     481  229    252             27
## 288  4-Alternative/other school      87   62     25              5
## 289  4-Alternative/other school      28   20      8            3.7
## 290  4-Alternative/other school      41   23     18           2.42
## 291  4-Alternative/other school       0    0      0              0
## 292  4-Alternative/other school     269  160    109          14.28
## 293  4-Alternative/other school      24   24      0           <NA>
## 294  4-Alternative/other school      32   24      8           <NA>
## 295  4-Alternative/other school      14   14      0           4.22
## 296  4-Alternative/other school      31   30      1             10
## 297  4-Alternative/other school      35   26      9           <NA>
## 298  4-Alternative/other school      33   25      8           <NA>
## 299  4-Alternative/other school      20   20      0              3
## 300  4-Alternative/other school      45   33     12           <NA>
## 301  4-Alternative/other school      28   28      0              8
## 302  4-Alternative/other school      67   55     12           <NA>
## 303  4-Alternative/other school      61   57      4           <NA>
## 304  4-Alternative/other school      42   38      4           <NA>
## 305  4-Alternative/other school      43   36      7              5
## 306  4-Alternative/other school      24   21      3              2
## 307  4-Alternative/other school      27   23      4           <NA>
## 308  4-Alternative/other school     221  122     99           16.2
## 309  4-Alternative/other school       6    2      4              1
## 310  4-Alternative/other school       5    1      4           <NA>
## 311  4-Alternative/other school      35   14     21              1
## 312  4-Alternative/other school      14    7      7              1
## 313  4-Alternative/other school      43   27     16           5.68
## 314  4-Alternative/other school     264  154    110              7
## 315  4-Alternative/other school      75   54     21            3.5
## 316  4-Alternative/other school       1    1    n/a           <NA>
## 317  4-Alternative/other school       9    0      9           <NA>
## 318  4-Alternative/other school      81   58     23             14
## 319  4-Alternative/other school     249  157     92           <NA>
## 320  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 321  4-Alternative/other school       8    0      8              2
## 322  4-Alternative/other school     148   81     67           16.8
## 323  4-Alternative/other school       0    0      0              0
## 324  4-Alternative/other school      22   10     12           0.44
## 325  4-Alternative/other school       0    0      0           3.28
## 326  4-Alternative/other school      90   63     27          10.03
## 327  4-Alternative/other school     224  123    101          22.11
## 328  4-Alternative/other school      78   54     24           8.26
## 329  4-Alternative/other school       0    0      0           <NA>
## 330  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 331  4-Alternative/other school       5    2      3           0.59
## 332  4-Alternative/other school       4    4      0           0.84
## 333  4-Alternative/other school      18   11      7            1.6
## 334  4-Alternative/other school     n/a  n/a    n/a            n/a
## 335  4-Alternative/other school       0    0      0           <NA>
## 336  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 337  4-Alternative/other school      17   15      2           <NA>
## 338  4-Alternative/other school       8    5      3           <NA>
## 339  4-Alternative/other school      12   10      2           <NA>
## 340  4-Alternative/other school       1    1      0           <NA>
## 341  4-Alternative/other school       0    0      0           <NA>
## 342  4-Alternative/other school      27   25      2              7
## 343  4-Alternative/other school      27   14     13            3.4
## 344  4-Alternative/other school     156   84     72              8
## 345  4-Alternative/other school     148   91     57           17.1
## 346  4-Alternative/other school       4    4      0            0.5
## 347  4-Alternative/other school     n/a  n/a    n/a             27
## 348  4-Alternative/other school     134  102     32           27.2
## 349  4-Alternative/other school     n/a  n/a    n/a            n/a
## 350  4-Alternative/other school     103   57     46          23.62
## 351  4-Alternative/other school      10    6      4           0.75
## 352  4-Alternative/other school      11    6      5            0.5
## 353  4-Alternative/other school       7    4      3           2.12
## 354  4-Alternative/other school       2    1      1           1.84
## 355  4-Alternative/other school       0    0      0              0
## 356  4-Alternative/other school      41   20     21              2
## 357  4-Alternative/other school     210  131     79           7.99
## 358  4-Alternative/other school      12    7      5           1.42
## 359  4-Alternative/other school       6    2      4           0.45
## 360  4-Alternative/other school      61   31     30           2.75
## 361  4-Alternative/other school     404  148    256          17.52
## 362  4-Alternative/other school      11    8      3              0
## 363  4-Alternative/other school      23   13     10           1.15
## 364  4-Alternative/other school       0    0      0              0
## 365  4-Alternative/other school      57   36     21            5.8
## 366  4-Alternative/other school      22   18      4           3.44
## 367  4-Alternative/other school     557  263    294             21
## 368  4-Alternative/other school       0    0      0          29.92
## 369  4-Alternative/other school     n/a  n/a    n/a            4.2
## 370  4-Alternative/other school      74   43     31          11.38
## 371  4-Alternative/other school     756  309    447          32.08
## 372  4-Alternative/other school      54   38     16           7.41
## 373  4-Alternative/other school     199  100     99             10
## 374  4-Alternative/other school      53   34     19           1.86
## 375  4-Alternative/other school      83   50     33          14.34
## 376  4-Alternative/other school     185  105     80          10.73
## 377  4-Alternative/other school       0    0      0              0
## 378  4-Alternative/other school      68   38     30          11.89
## 379  4-Alternative/other school     123   58     65           <NA>
## 380  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 381  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 382  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 383  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 384  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 385  4-Alternative/other school      24   24      0           <NA>
## 386  4-Alternative/other school      12   12      0           <NA>
## 387  4-Alternative/other school       1    1      0           <NA>
## 388  4-Alternative/other school       2    2      0           <NA>
## 389  4-Alternative/other school     130   71     59           15.8
## 390  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 391  4-Alternative/other school     112   62     50             11
## 392  4-Alternative/other school      78   41     37              6
## 393  4-Alternative/other school      32   20     12              4
## 394  4-Alternative/other school      90   74     16             12
## 395  4-Alternative/other school     113   48     65              1
## 396  4-Alternative/other school       7    3      4              1
## 397  4-Alternative/other school       9    9    n/a              1
## 398  4-Alternative/other school      34   22     12              3
## 399  4-Alternative/other school     104   38     66            4.5
## 400  4-Alternative/other school       3    3      0           <NA>
## 401  4-Alternative/other school     n/a  n/a    n/a            n/a
## 402  4-Alternative/other school     n/a  n/a    n/a            n/a
## 403  4-Alternative/other school       1    1      0           <NA>
## 404  4-Alternative/other school     n/a  n/a    n/a            n/a
## 405  4-Alternative/other school       8    8      0              1
## 406  4-Alternative/other school     n/a  n/a    n/a            n/a
## 407  4-Alternative/other school      75   37     38           0.68
## 408  4-Alternative/other school      12   12    n/a           <NA>
## 409  4-Alternative/other school      56   31     25              7
## 410  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 411  4-Alternative/other school      35   18     17           <NA>
## 412  4-Alternative/other school      61   35     26           3.44
## 413  4-Alternative/other school       8    6      2              1
## 414  4-Alternative/other school      39   28     11            6.4
## 415  4-Alternative/other school       4    4      0           <NA>
## 416  4-Alternative/other school      61   61      0             10
## 417  4-Alternative/other school     189  128     61             11
## 418  4-Alternative/other school      33   20     13           6.11
## 419  4-Alternative/other school      15   13      2           3.89
## 420  4-Alternative/other school     109   57     52           2.45
## 421  4-Alternative/other school       0    0      0              0
## 422  4-Alternative/other school     485  262    223          25.72
## 423  4-Alternative/other school      26   14     12              2
## 424  4-Alternative/other school      16   12      4              7
## 425  4-Alternative/other school    <NA>  n/a    n/a              5
## 426  4-Alternative/other school     100   49     51            4.1
## 427  4-Alternative/other school      83   50     33              3
## 428  4-Alternative/other school     138   60     78            7.2
## 429  4-Alternative/other school     119   69     50            5.6
## 430  4-Alternative/other school     n/a  n/a    n/a            n/a
## 431  4-Alternative/other school       4    4      0           <NA>
## 432  4-Alternative/other school       0    0      0              0
## 433  4-Alternative/other school      80   38     42            2.9
## 434  4-Alternative/other school      22   22      0           1.82
## 435  4-Alternative/other school      41   41      0           5.42
## 436  4-Alternative/other school      65   65      0          10.59
## 437  4-Alternative/other school      18   18    n/a           <NA>
## 438  4-Alternative/other school      50   30     20              7
## 439  4-Alternative/other school     342  170    172           <NA>
## 440  4-Alternative/other school     171  108     63           13.3
## 441  4-Alternative/other school      93   58     35            6.5
## 442  4-Alternative/other school      47   29     18          10.29
## 443  4-Alternative/other school       3    3      0           <NA>
## 444  4-Alternative/other school     747  372    375             26
## 445  4-Alternative/other school     n/a  n/a    n/a              0
## 446  4-Alternative/other school     111   65     46           5.73
## 447  4-Alternative/other school     109   46     63              0
## 448  4-Alternative/other school      62   33     29            2.2
## 449  4-Alternative/other school     229  129    100           <NA>
## 450  4-Alternative/other school     n/a  n/a    n/a            n/a
## 451  4-Alternative/other school       0    0      0              0
## 452  4-Alternative/other school     354  178    176          48.98
## 453  4-Alternative/other school       8    6      2              2
## 454  4-Alternative/other school     125   86     39          20.88
## 455  4-Alternative/other school      81   53     28             24
## 456  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 457  4-Alternative/other school      89   44     45           4.85
## 458  4-Alternative/other school      22   13      9              1
## 459  4-Alternative/other school     n/a  n/a    n/a            n/a
## 460  4-Alternative/other school     357  167    190          14.59
## 461  4-Alternative/other school       5    5      0            1.1
## 462  4-Alternative/other school       1    1      0              1
## 463  4-Alternative/other school    <NA>  n/a    n/a             12
## 464  4-Alternative/other school      10    6      4              4
## 465  4-Alternative/other school      58   34     24              6
## 466  4-Alternative/other school      29   29      0              1
## 467  4-Alternative/other school       0    0      0              0
## 468  4-Alternative/other school      16   12      4           3.78
## 469  4-Alternative/other school       2    2      0           <NA>
## 470  4-Alternative/other school     n/a  n/a    n/a            n/a
## 471  4-Alternative/other school       0    0      0              0
## 472  4-Alternative/other school     166   94     72           9.05
## 473  4-Alternative/other school     236   74    162            4.5
## 474  4-Alternative/other school      37   13     24              0
## 475  4-Alternative/other school      93   60     33           5.25
## 476  4-Alternative/other school    1221  639    582           58.4
## 477  4-Alternative/other school      32   25      7              2
## 478  4-Alternative/other school      48   34     14           3.64
## 479  4-Alternative/other school     144   70     74            5.5
## 480  4-Alternative/other school      17    6     11             26
## 481  4-Alternative/other school     179  120     59             10
## 482  4-Alternative/other school     222  120    102             23
## 483  4-Alternative/other school       0    0      0              0
## 484  4-Alternative/other school      14   13      1           <NA>
## 485  4-Alternative/other school     167  103     64           13.5
## 486  4-Alternative/other school      80   18     62              1
## 487  4-Alternative/other school     114   82     32              5
## 488  4-Alternative/other school       0    0      0              0
## 489  4-Alternative/other school     284  205     79           <NA>
## 490  4-Alternative/other school      26   22      4              1
## 491  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 492  4-Alternative/other school      13    8      5              1
## 493  4-Alternative/other school      98   49     49           6.18
## 494  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 495  4-Alternative/other school     102   57     45              9
## 496  4-Alternative/other school      83   44     39            4.1
## 497  4-Alternative/other school     n/a  n/a    n/a            n/a
## 498  4-Alternative/other school     n/a  n/a    n/a            n/a
## 499  4-Alternative/other school     n/a  n/a    n/a            n/a
## 500  4-Alternative/other school     n/a  n/a    n/a            n/a
## 501  4-Alternative/other school      35   16     19            2.5
## 502  4-Alternative/other school       0    0      0              4
## 503  4-Alternative/other school     n/a  n/a    n/a            n/a
## 504  4-Alternative/other school       1    1      0           <NA>
## 505  4-Alternative/other school     n/a  n/a    n/a            n/a
## 506  4-Alternative/other school     n/a  n/a    n/a            n/a
## 507  4-Alternative/other school     n/a  n/a    n/a            n/a
## 508  4-Alternative/other school     n/a  n/a    n/a            n/a
## 509  4-Alternative/other school      14   14      0              0
## 510  4-Alternative/other school      42   21     21              3
## 511  4-Alternative/other school      61   44     17           16.3
## 512  4-Alternative/other school     381  217    164           27.5
## 513  4-Alternative/other school      40   31      9           4.98
## 514  4-Alternative/other school      15   12      3            3.5
## 515  4-Alternative/other school      72   33     39            5.2
## 516  4-Alternative/other school      89   59     30              0
## 517  4-Alternative/other school      11    4      7              1
## 518  4-Alternative/other school     185  103     82          10.96
## 519  4-Alternative/other school      53   22     31            3.5
## 520  4-Alternative/other school       0    0      0           2.95
## 521  4-Alternative/other school      44   16     28           2.66
## 522  4-Alternative/other school     137   69     68            4.7
## 523  4-Alternative/other school      96   46     50            6.7
## 524  4-Alternative/other school      21   13      8           0.99
## 525  4-Alternative/other school       9    5      4           0.99
## 526  4-Alternative/other school     277  143    134          13.38
## 527  4-Alternative/other school      21    9     12            0.2
## 528  4-Alternative/other school      65   38     27            1.5
## 529  4-Alternative/other school      13    9      4           <NA>
## 530  4-Alternative/other school      44   23     21           <NA>
## 531  4-Alternative/other school      51   28     23           7.54
## 532  4-Alternative/other school       9    3      6              1
## 533  4-Alternative/other school       0    0      0              0
## 534  4-Alternative/other school      98   51     47              2
## 535  4-Alternative/other school      73   33     40           3.63
## 536  4-Alternative/other school       0    0      0           <NA>
## 537  4-Alternative/other school      71   25     46              9
## 538  4-Alternative/other school      19   19      0              2
## 539  4-Alternative/other school       1    0      1           <NA>
## 540  4-Alternative/other school       9    8      1           2.13
## 541  4-Alternative/other school     n/a  n/a    n/a            n/a
## 542  4-Alternative/other school       7    6      1           <NA>
## 543  4-Alternative/other school       1    1      0           <NA>
## 544  4-Alternative/other school       4    4      0           <NA>
## 545  4-Alternative/other school       3    2      1           <NA>
## 546  4-Alternative/other school     n/a  n/a    n/a            n/a
## 547  4-Alternative/other school     n/a  n/a    n/a            n/a
## 548  4-Alternative/other school     n/a  n/a    n/a            n/a
## 549  4-Alternative/other school       1    1      0           <NA>
## 550  4-Alternative/other school      57   37     20              7
## 551  4-Alternative/other school     171  103     68             10
## 552  4-Alternative/other school       2    2      0           <NA>
## 553  4-Alternative/other school     180   93     87          17.22
## 554  4-Alternative/other school      95   42     53              1
## 555  4-Alternative/other school       0    0      0              0
## 556  4-Alternative/other school     129   66     63          11.79
## 557  4-Alternative/other school       0    0      0           <NA>
## 558  4-Alternative/other school      37   26     11             16
## 559  4-Alternative/other school      18   17      1           <NA>
## 560  4-Alternative/other school     n/a  n/a    n/a            n/a
## 561  4-Alternative/other school      25   11     14              1
## 562  4-Alternative/other school     n/a  n/a    n/a            n/a
## 563  4-Alternative/other school     114  109      5             32
## 564  4-Alternative/other school     134   73     61           <NA>
## 565  4-Alternative/other school     216  100    116           11.2
## 566  4-Alternative/other school      23   12     11            0.6
## 567  4-Alternative/other school       1    1      0              1
## 568  4-Alternative/other school       4    3      1              1
## 569  4-Alternative/other school      64   46     18           8.25
## 570  4-Alternative/other school     221  136     85          17.58
## 571  4-Alternative/other school       1    1      0           0.25
## 572  4-Alternative/other school       4    3      1           0.02
## 573  4-Alternative/other school      25   17      8              1
## 574  4-Alternative/other school       0    0      0           <NA>
## 575  4-Alternative/other school     121   77     44           8.08
## 576  4-Alternative/other school     n/a  n/a    n/a             32
## 577  4-Alternative/other school      66   30     36            2.2
## 578  4-Alternative/other school      19   15      4              0
## 579  4-Alternative/other school      65   38     27          11.23
## 580  4-Alternative/other school     147   85     62          11.91
## 581  4-Alternative/other school      85   53     32              4
## 582  4-Alternative/other school      32   24      8              1
## 583  4-Alternative/other school    2065 1098    967           <NA>
## 584  4-Alternative/other school       8    7      1              2
## 585  4-Alternative/other school      20   16      4           1.75
## 586  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 587  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 588  4-Alternative/other school       0    0      0              1
## 589  4-Alternative/other school      17   14      3              1
## 590  4-Alternative/other school      13   10      3              1
## 591  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 592  4-Alternative/other school       9    6      3           <NA>
## 593  4-Alternative/other school       0    0      0           0.91
## 594  4-Alternative/other school      79   52     27              3
## 595  4-Alternative/other school      27   17     10           1.52
## 596  4-Alternative/other school      55   11     44            4.8
## 597  4-Alternative/other school     203  118     85             15
## 598  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 599  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 600  4-Alternative/other school     154   79     75          21.39
## 601  4-Alternative/other school     469  158    311          47.81
## 602  4-Alternative/other school     182  100     82           6.99
## 603  4-Alternative/other school     213  148     65             22
## 604  4-Alternative/other school      88   49     39            8.6
## 605  4-Alternative/other school      50   41      9          13.99
## 606  4-Alternative/other school     131   82     49             17
## 607  4-Alternative/other school      27   16     11              6
## 608  4-Alternative/other school     415  262    153           20.1
## 609  4-Alternative/other school       0    0      0              1
## 610  4-Alternative/other school      47   33     14              3
## 611  4-Alternative/other school     208  136     72           14.5
## 612  4-Alternative/other school      23   16      7              3
## 613  4-Alternative/other school     183  113     70          32.89
## 614  4-Alternative/other school      77   77    n/a          11.39
## 615  4-Alternative/other school      18   18      0           4.96
## 616  4-Alternative/other school      13    7      6           <NA>
## 617  4-Alternative/other school     n/a  n/a    n/a          13.03
## 618  4-Alternative/other school      46   42      4           <NA>
## 619  4-Alternative/other school      43   26     17              5
## 620  4-Alternative/other school     286  167    119          20.75
## 621  4-Alternative/other school      52   38     14          11.05
## 622  4-Alternative/other school     453  237    216          29.77
## 623  4-Alternative/other school      12    6      6              1
## 624  4-Alternative/other school      98   77     21              6
## 625  4-Alternative/other school      70   30     40              2
## 626  4-Alternative/other school      26   17      9            1.6
## 627  4-Alternative/other school       4    4      0           2.73
## 628  4-Alternative/other school     n/a  n/a    n/a            n/a
## 629  4-Alternative/other school       4    1      3           <NA>
## 630  4-Alternative/other school     n/a  n/a    n/a            n/a
## 631  4-Alternative/other school     n/a  n/a    n/a            n/a
## 632  4-Alternative/other school       5    4      1           <NA>
## 633  4-Alternative/other school     n/a  n/a    n/a            n/a
## 634  4-Alternative/other school      33   30      3              9
## 635  4-Alternative/other school      26   21      5           2.57
## 636  4-Alternative/other school      15   12      3           <NA>
## 637  4-Alternative/other school     223   98    125          11.59
## 638  4-Alternative/other school     236  108    128             16
## 639  4-Alternative/other school     165   76     89          12.48
## 640  4-Alternative/other school     103   43     60            5.5
## 641  4-Alternative/other school     206  115     91           7.78
## 642  4-Alternative/other school      49   34     15           5.35
## 643  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 644  4-Alternative/other school      19   19      0              2
## 645  4-Alternative/other school      16   14      2              1
## 646  4-Alternative/other school       0    0      0              1
## 647  4-Alternative/other school       7    5      2           <NA>
## 648  4-Alternative/other school     100   67     33          30.14
## 649  4-Alternative/other school      30   18     12           0.99
## 650  4-Alternative/other school     187  108     79          14.33
## 651  4-Alternative/other school      16    0     16          35.02
## 652  4-Alternative/other school     637  341    296             25
## 653  4-Alternative/other school       5    5      0              1
## 654  4-Alternative/other school      29   25      4              2
## 655  4-Alternative/other school      31   31      0              2
## 656  4-Alternative/other school      31   26      5           <NA>
## 657  4-Alternative/other school      29   20      9            0.6
## 658  4-Alternative/other school      42   31     11           5.91
## 659  4-Alternative/other school     110   52     58            7.1
## 660  4-Alternative/other school      12    3      9              1
## 661  4-Alternative/other school      62   36     26            4.5
## 662  4-Alternative/other school      18   10      8              1
## 663  4-Alternative/other school      50   28     22            3.2
## 664  4-Alternative/other school       8    6      2              1
## 665  4-Alternative/other school       5    5      0              1
## 666  4-Alternative/other school       6    6      0              1
## 667  4-Alternative/other school      13   10      3            2.4
## 668  4-Alternative/other school     117   60     57            4.4
## 669  4-Alternative/other school      28   24      4              8
## 670  4-Alternative/other school     207  118     89           8.79
## 671  4-Alternative/other school      52   27     25            2.1
## 672  4-Alternative/other school       2    0      2           <NA>
## 673  4-Alternative/other school     196  128     68          14.43
## 674  4-Alternative/other school     200   90    110             13
## 675  4-Alternative/other school     118   77     41           15.5
## 676  4-Alternative/other school     140   67     73             12
## 677  4-Alternative/other school      23    9     14           4.95
## 678  4-Alternative/other school      40   18     22           <NA>
## 679  4-Alternative/other school      58   30     28           0.57
## 680  4-Alternative/other school       0    0      0              0
## 681  4-Alternative/other school       0    0      0              0
## 682  4-Alternative/other school      55   55      0          35.02
## 683  4-Alternative/other school      86   79      7           <NA>
## 684  4-Alternative/other school      37   37      0           <NA>
## 685  4-Alternative/other school      11   10      1           0.67
## 686  4-Alternative/other school      20   16      4           2.75
## 687  4-Alternative/other school       0    0      0          21.14
## 688  4-Alternative/other school     101   49     52           8.01
## 689  4-Alternative/other school     244  145     99           18.4
## 690  4-Alternative/other school     151   87     64          14.39
## 691  4-Alternative/other school      10    5      5              2
## 692  4-Alternative/other school     n/a  n/a    n/a           14.6
## 693  4-Alternative/other school     300  139    161          14.96
## 694  4-Alternative/other school     365  192    173          32.66
## 695  4-Alternative/other school      23   12     11              0
## 696  4-Alternative/other school      23    0     23              2
## 697  4-Alternative/other school      44   29     15              6
## 698  4-Alternative/other school      84   67     17          17.57
## 699  4-Alternative/other school       0    0      0           <NA>
## 700  4-Alternative/other school     192  124     68          13.27
## 701  4-Alternative/other school     196  130     66          15.25
## 702  4-Alternative/other school       5    0      5            0.5
## 703  4-Alternative/other school      68   47     21           6.25
## 704  4-Alternative/other school       0    0      0              0
## 705  4-Alternative/other school      20   16      4           4.94
## 706  4-Alternative/other school       0    0      0              0
## 707  4-Alternative/other school      93   35     58            2.2
## 708  4-Alternative/other school      21   19      2              4
## 709  4-Alternative/other school     209   94    115          14.52
## 710  4-Alternative/other school      90   57     33             14
## 711  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 712  4-Alternative/other school      21   17      4           <NA>
## 713  4-Alternative/other school     102   64     38           <NA>
## 714  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 715  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 716  4-Alternative/other school      35   18     17           2.16
## 717  4-Alternative/other school      84   75      9             11
## 718  4-Alternative/other school      10    7      3              1
## 719  4-Alternative/other school       0    0      0           <NA>
## 720  4-Alternative/other school       0    0      0              0
## 721  4-Alternative/other school     135   74     61          14.79
## 722  4-Alternative/other school     980  492    488           <NA>
## 723  4-Alternative/other school      21    7     14           <NA>
## 724  4-Alternative/other school       6    3      3           0.14
## 725  4-Alternative/other school       5    5      0            0.5
## 726  4-Alternative/other school      10    7      3            0.5
## 727  4-Alternative/other school      16   15      1              3
## 728  4-Alternative/other school      22   13      9            0.6
## 729  4-Alternative/other school      34   26      8           1.99
## 730  4-Alternative/other school      36   14     22           2.02
## 731  4-Alternative/other school      71   47     24              6
## 732  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 733  4-Alternative/other school     116   76     40             11
## 734  4-Alternative/other school    <NA>  n/a    n/a              2
## 735  4-Alternative/other school     487  328    159             13
## 736  4-Alternative/other school       0    0      0              0
## 737  4-Alternative/other school      60   43     17             12
## 738  4-Alternative/other school      52   34     18              6
## 739  4-Alternative/other school     136   75     61             10
## 740  4-Alternative/other school     145   95     50           <NA>
## 741  4-Alternative/other school     n/a  n/a    n/a            n/a
## 742  4-Alternative/other school     150   83     67            3.2
## 743  4-Alternative/other school    <NA>  n/a    n/a            1.6
## 744  4-Alternative/other school     177   99     78            8.5
## 745  4-Alternative/other school     106   64     42            9.2
## 746  4-Alternative/other school      26   19      7            3.5
## 747  4-Alternative/other school      40   22     18            1.2
## 748  4-Alternative/other school       0    0      0              1
## 749  4-Alternative/other school     370  208    162           23.1
## 750  4-Alternative/other school    <NA>  n/a    n/a           2.36
## 751  4-Alternative/other school      21   14      7            0.5
## 752  4-Alternative/other school     134   54     80           6.65
## 753  4-Alternative/other school     179  119     60             11
## 754  4-Alternative/other school     936  270    666             50
## 755  4-Alternative/other school      17    9      8            1.9
## 756  4-Alternative/other school      12    7      5            3.1
## 757  4-Alternative/other school       5    4      1              4
## 758  4-Alternative/other school     164   73     91          10.72
## 759  4-Alternative/other school     147   60     87           7.34
## 760  4-Alternative/other school     161  104     57            9.5
## 761  4-Alternative/other school     522  233    289           20.3
## 762  4-Alternative/other school     494  330    164          16.38
## 763  4-Alternative/other school      51   33     18            2.5
## 764  4-Alternative/other school      37   35      2           <NA>
## 765  4-Alternative/other school       0    0      0           <NA>
## 766  4-Alternative/other school      10   10    n/a           <NA>
## 767  4-Alternative/other school       8    5      3           <NA>
## 768  4-Alternative/other school      10    1      9           <NA>
## 769  4-Alternative/other school     157  120     37             12
## 770  4-Alternative/other school      82   34     48            3.4
## 771  4-Alternative/other school       6    5      1           <NA>
## 772  4-Alternative/other school     n/a  n/a    n/a            n/a
## 773  4-Alternative/other school      18    7     11           <NA>
## 774  4-Alternative/other school      21   17      4           <NA>
## 775  4-Alternative/other school     n/a  n/a    n/a            n/a
## 776  4-Alternative/other school      12   10      2           <NA>
## 777  4-Alternative/other school       1    1      0           <NA>
## 778  4-Alternative/other school     n/a  n/a    n/a            n/a
## 779  4-Alternative/other school       5    4      1           <NA>
## 780  4-Alternative/other school      33   27      6           <NA>
## 781  4-Alternative/other school       9    9      0              2
## 782  4-Alternative/other school      17   12      5              1
## 783  4-Alternative/other school       3    3      0           1.15
## 784  4-Alternative/other school      14    8      6              1
## 785  4-Alternative/other school      21   10     11              2
## 786  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 787  4-Alternative/other school       0    0      0              0
## 788  4-Alternative/other school       0    0      0              0
## 789  4-Alternative/other school     n/a  n/a    n/a           3.85
## 790  4-Alternative/other school     n/a  n/a    n/a            n/a
## 791  4-Alternative/other school      84   50     34              8
## 792  4-Alternative/other school      10    3      7              2
## 793  4-Alternative/other school     198  128     70          11.65
## 794  4-Alternative/other school     224  122    102           <NA>
## 795  4-Alternative/other school     260  170     90          24.79
## 796  4-Alternative/other school       1    1      0          40.01
## 797  4-Alternative/other school      68   31     37              2
## 798  4-Alternative/other school      49   20     29           1.01
## 799  4-Alternative/other school      10    4      6           <NA>
## 800  4-Alternative/other school      26   19      7           <NA>
## 801  4-Alternative/other school     103   45     58           3.67
## 802  4-Alternative/other school     n/a  n/a    n/a          18.77
## 803  4-Alternative/other school     263  136    127          17.75
## 804  4-Alternative/other school     n/a  n/a    n/a            n/a
## 805  4-Alternative/other school     131   78     53           7.25
## 806  4-Alternative/other school      32   16     16              1
## 807  4-Alternative/other school      67   31     36           4.25
## 808  4-Alternative/other school       2    1      1              1
## 809  4-Alternative/other school      17   13      4              1
## 810  4-Alternative/other school      16   10      6            0.8
## 811  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 812  4-Alternative/other school      92   41     51              6
## 813  4-Alternative/other school     n/a  n/a    n/a            n/a
## 814  4-Alternative/other school      22   16      6              8
## 815  4-Alternative/other school       0    0      0           1.67
## 816  4-Alternative/other school     n/a  n/a    n/a          33.05
## 817  4-Alternative/other school      64   39     25            2.8
## 818  4-Alternative/other school      40   31      9            0.5
## 819  4-Alternative/other school       0    0      0          31.65
## 820  4-Alternative/other school       0    0      0              0
## 821  4-Alternative/other school     n/a  n/a    n/a              0
## 822  4-Alternative/other school     137   67     70           11.5
## 823  4-Alternative/other school      38   15     23           2.35
## 824  4-Alternative/other school     110   55     55          15.17
## 825  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 826  4-Alternative/other school      83   48     35           3.18
## 827  4-Alternative/other school      46   17     29              2
## 828  4-Alternative/other school      83   54     29           5.01
## 829  4-Alternative/other school      19   12      7            3.2
## 830  4-Alternative/other school      79   39     40              1
## 831  4-Alternative/other school     n/a  n/a    n/a              3
## 832  4-Alternative/other school      23   12     11           2.12
## 833  4-Alternative/other school      73   40     33              3
## 834  4-Alternative/other school      17   16      1              2
## 835  4-Alternative/other school      16    8      8              2
## 836  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 837  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 838  4-Alternative/other school       0  n/a    n/a              7
## 839  4-Alternative/other school       0  n/a    n/a           <NA>
## 840  4-Alternative/other school       0    0      0              0
## 841  4-Alternative/other school      45   24     21           1.83
## 842  4-Alternative/other school      41   18     23           1.55
## 843  4-Alternative/other school     215  215      0             18
## 844  4-Alternative/other school     188  119     69             15
## 845  4-Alternative/other school       7    2      5              1
## 846  4-Alternative/other school     n/a  n/a    n/a             15
## 847  4-Alternative/other school      46   29     17          14.26
## 848  4-Alternative/other school     251  126    125          28.26
## 849  4-Alternative/other school     553  371    182             13
## 850  4-Alternative/other school       8    0      8           3.48
## 851  4-Alternative/other school       0    0      0           <NA>
## 852  4-Alternative/other school     224  115    109          11.88
## 853  4-Alternative/other school      47   33     14              2
## 854  4-Alternative/other school     159   94     65            3.8
## 855  4-Alternative/other school     217   95    122          14.01
## 856  4-Alternative/other school      63   34     29              5
## 857  4-Alternative/other school      81   36     45          12.34
## 858  4-Alternative/other school     136   84     52            9.8
## 859  4-Alternative/other school      65   33     32           0.66
## 860  4-Alternative/other school      29   21      8              2
## 861  4-Alternative/other school      72   42     30             20
## 862  4-Alternative/other school     750  421    329           <NA>
## 863  4-Alternative/other school     n/a  n/a    n/a            n/a
## 864  4-Alternative/other school      18   12      6           13.5
## 865  4-Alternative/other school      66   49     17           14.5
## 866  4-Alternative/other school     n/a  n/a    n/a            n/a
## 867  4-Alternative/other school       0    0      0              0
## 868  4-Alternative/other school      63   40     23           <NA>
## 869  4-Alternative/other school      24   18      6              2
## 870  4-Alternative/other school       4    3      1              2
## 871  4-Alternative/other school      35   24     11              6
## 872  4-Alternative/other school      31   13     18              2
## 873  4-Alternative/other school      11   11      0              1
## 874  4-Alternative/other school      45   25     20           <NA>
## 875  4-Alternative/other school     105   50     55           8.88
## 876  4-Alternative/other school      51   37     14           6.67
## 877  4-Alternative/other school     129   74     55           5.93
## 878  4-Alternative/other school      27   15     12            3.8
## 879  4-Alternative/other school     131   67     64          11.97
## 880  4-Alternative/other school       4    2      2           0.47
## 881  4-Alternative/other school     141   73     68          12.47
## 882  4-Alternative/other school       0    0      0           <NA>
## 883  4-Alternative/other school     n/a  n/a    n/a           1.42
## 884  4-Alternative/other school     n/a  n/a    n/a           9.94
## 885  4-Alternative/other school      30   23      7            2.4
## 886  4-Alternative/other school      36   20     16           7.34
## 887  4-Alternative/other school     n/a  n/a    n/a              2
## 888  4-Alternative/other school       0    0      0           26.2
## 889  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 890  4-Alternative/other school      54   40     14              7
## 891  4-Alternative/other school      69   47     22          16.34
## 892  4-Alternative/other school     160  107     53            4.2
## 893  4-Alternative/other school      35   22     13            4.2
## 894  4-Alternative/other school       0    0      0              0
## 895  4-Alternative/other school       0    0      0           <NA>
## 896  4-Alternative/other school      33   14     19              2
## 897  4-Alternative/other school     156   92     64             13
## 898  4-Alternative/other school       0    0      0           1.69
## 899  4-Alternative/other school      48   31     17              5
## 900  4-Alternative/other school      85   58     27          11.17
## 901  4-Alternative/other school      15   10      5              5
## 902  4-Alternative/other school       6    1      5              1
## 903  4-Alternative/other school     122   72     50           14.5
## 904  4-Alternative/other school     503  311    192           26.5
## 905  4-Alternative/other school      92   55     37            8.6
## 906  4-Alternative/other school     133   86     47          10.68
## 907  4-Alternative/other school     134   66     68           8.81
## 908  4-Alternative/other school      98   59     39           8.05
## 909  4-Alternative/other school     102   49     53            7.5
## 910  4-Alternative/other school     174   76     98              8
## 911  4-Alternative/other school     203  165     38          17.04
## 912  4-Alternative/other school     235  141     94          15.63
## 913  4-Alternative/other school       0    0      0              0
## 914  4-Alternative/other school      23   15      8           0.67
## 915  4-Alternative/other school     123   58     65           6.05
## 916  4-Alternative/other school       0    0      0              0
## 917  4-Alternative/other school       0    0      0              0
## 918  4-Alternative/other school       0    0      0              0
## 919  4-Alternative/other school       2    1      1           <NA>
## 920  4-Alternative/other school       0    0      0              0
## 921  4-Alternative/other school      17    4     13           <NA>
## 922  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 923  4-Alternative/other school      25    0     25              3
## 924  4-Alternative/other school       1  n/a      1              1
## 925  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 926  4-Alternative/other school       0    0      0           <NA>
## 927  4-Alternative/other school     218  107    111           8.75
## 928  4-Alternative/other school      98   63     35           3.87
## 929  4-Alternative/other school      10    9      1            2.8
## 930  4-Alternative/other school      49   33     16              3
## 931  4-Alternative/other school      93   31     62            5.2
## 932  4-Alternative/other school     144   72     72           6.25
## 933  4-Alternative/other school     115   72     43           7.37
## 934  4-Alternative/other school      30   14     16           <NA>
## 935  4-Alternative/other school      50   42      8             23
## 936  4-Alternative/other school     n/a  n/a    n/a            n/a
## 937  4-Alternative/other school      84   59     25              4
## 938  4-Alternative/other school     417  250    167           23.5
## 939  4-Alternative/other school      84   38     46            7.9
## 940  4-Alternative/other school     347  215    132          17.49
## 941  4-Alternative/other school     n/a  n/a    n/a              1
## 942  4-Alternative/other school      30   19     11              4
## 943  4-Alternative/other school      15   12      3            2.7
## 944  4-Alternative/other school     104   31     73           3.81
## 945  4-Alternative/other school     n/a  n/a    n/a            n/a
## 946  4-Alternative/other school     n/a  n/a    n/a            n/a
## 947  4-Alternative/other school     n/a  n/a    n/a            n/a
## 948  4-Alternative/other school     n/a  n/a    n/a            n/a
## 949  4-Alternative/other school     n/a  n/a    n/a            n/a
## 950  4-Alternative/other school     n/a  n/a    n/a            n/a
## 951  4-Alternative/other school     n/a  n/a    n/a            n/a
## 952  4-Alternative/other school     n/a  n/a    n/a            n/a
## 953  4-Alternative/other school       2    1      1           <NA>
## 954  4-Alternative/other school     n/a  n/a    n/a            n/a
## 955  4-Alternative/other school       3    3      0           <NA>
## 956  4-Alternative/other school      22   17      5              4
## 957  4-Alternative/other school       1    1      0           <NA>
## 958  4-Alternative/other school     n/a  n/a    n/a            n/a
## 959  4-Alternative/other school       3    3      0           <NA>
## 960  4-Alternative/other school     331  186    145          13.18
## 961  4-Alternative/other school      81   81      0            4.3
## 962  4-Alternative/other school     266  139    127             16
## 963  4-Alternative/other school     721  392    329             33
## 964  4-Alternative/other school       5    5      0              1
## 965  4-Alternative/other school     491  301    190             16
## 966  4-Alternative/other school     326  184    142             13
## 967  4-Alternative/other school     174  102     72             13
## 968  4-Alternative/other school     723  339    384             34
## 969  4-Alternative/other school      54   37     17           2.83
## 970  4-Alternative/other school     166  109     57           9.04
## 971  4-Alternative/other school      73   57     16            6.1
## 972  4-Alternative/other school      58   33     25           9.06
## 973  4-Alternative/other school      40   19     21           1.95
## 974  4-Alternative/other school      26   26      0           <NA>
## 975  4-Alternative/other school      66   41     25            5.7
## 976  4-Alternative/other school      84   44     40           4.53
## 977  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 978  4-Alternative/other school     178   84     94           8.37
## 979  4-Alternative/other school     482  249    233          25.05
## 980  4-Alternative/other school      76   34     42              4
## 981  4-Alternative/other school      30   25      5             34
## 982  4-Alternative/other school      46   31     15              3
## 983  4-Alternative/other school      93   44     49              6
## 984  4-Alternative/other school      32   15     17            0.5
## 985  4-Alternative/other school      32   24      8              2
## 986  4-Alternative/other school       8    2      6              0
## 987  4-Alternative/other school      45   21     24           <NA>
## 988  4-Alternative/other school       5    4      1           <NA>
## 989  4-Alternative/other school     n/a  n/a    n/a            n/a
## 990  4-Alternative/other school      23   17      6              1
## 991  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 992  4-Alternative/other school      38   26     12            2.5
## 993  4-Alternative/other school      59   45     14           8.51
## 994  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 995  4-Alternative/other school      59   38     21              3
## 996  4-Alternative/other school      11    6      5           0.25
## 997  4-Alternative/other school      58   26     32           1.76
## 998  4-Alternative/other school      73   51     22           <NA>
## 999  4-Alternative/other school      82   60     22           16.6
## 1000 4-Alternative/other school     n/a  n/a    n/a              1
## 1001 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1002 4-Alternative/other school       3    3      0              1
## 1003 4-Alternative/other school      46   24     22          12.95
## 1004 4-Alternative/other school      34   15     19              2
## 1005 4-Alternative/other school       0    0      0              1
## 1006 4-Alternative/other school      27    8     19           <NA>
## 1007 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1008 4-Alternative/other school      15   14      1           2.75
## 1009 4-Alternative/other school      66   35     31           9.24
## 1010 4-Alternative/other school       0    0      0              0
## 1011 4-Alternative/other school     161  118     43           16.3
## 1012 4-Alternative/other school      57   42     15              3
## 1013 4-Alternative/other school       1    1      0           <NA>
## 1014 4-Alternative/other school     165   77     88            6.5
## 1015 4-Alternative/other school      91   52     39           1.96
## 1016 4-Alternative/other school       0    0      0              1
## 1017 4-Alternative/other school     201   88    113          14.73
## 1018 4-Alternative/other school      32   23      9              3
## 1019 4-Alternative/other school      23   17      6           <NA>
## 1020 4-Alternative/other school      68   60      8          23.71
## 1021 4-Alternative/other school      49   35     14           6.25
## 1022 4-Alternative/other school      19   17      2              3
## 1023 4-Alternative/other school       2    1      1              1
## 1024 4-Alternative/other school       8    4      4            1.8
## 1025 4-Alternative/other school       0    0      0              0
## 1026 4-Alternative/other school      64   40     24            4.6
## 1027 4-Alternative/other school      87   41     46              4
## 1028 4-Alternative/other school       0  n/a    n/a           <NA>
## 1029 4-Alternative/other school     176   86     90            8.8
## 1030 4-Alternative/other school       4    1      3           1.73
## 1031 4-Alternative/other school     120   84     36              7
## 1032 4-Alternative/other school       3    1      2           <NA>
## 1033 4-Alternative/other school     149  110     39              9
## 1034 4-Alternative/other school     307  199    108          26.63
## 1035 4-Alternative/other school      87   41     46           <NA>
## 1036 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1037 4-Alternative/other school    1711  686   1025           65.5
## 1038 4-Alternative/other school     176   80     96              6
## 1039 4-Alternative/other school     135    1    134          13.56
## 1040 4-Alternative/other school      41   18     23           2.79
## 1041 4-Alternative/other school       4    1      3             27
## 1042 4-Alternative/other school      59   58      1           <NA>
## 1043 4-Alternative/other school      87   59     28              2
## 1044 4-Alternative/other school    1825  933    892          89.78
## 1045 4-Alternative/other school    1197  603    594          58.15
## 1046 4-Alternative/other school       7    7      0           <NA>
## 1047 4-Alternative/other school       7    3      4           <NA>
## 1048 4-Alternative/other school      85   60     25             15
## 1049 4-Alternative/other school     240  162     78             28
## 1050 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1051 4-Alternative/other school       8    8      0              1
## 1052 4-Alternative/other school      19    8     11           1.02
## 1053 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1054 4-Alternative/other school     n/a  n/a    n/a           2.13
## 1055 4-Alternative/other school      17   11      6          50.51
## 1056 4-Alternative/other school     341  154    187              7
## 1057 4-Alternative/other school     122   63     59              2
## 1058 4-Alternative/other school       2    1      1            1.9
## 1059 4-Alternative/other school      30   15     15           1.42
## 1060 4-Alternative/other school    <NA>  n/a    n/a             11
## 1061 4-Alternative/other school      84   44     40           9.73
## 1062 4-Alternative/other school      11    8      3           <NA>
## 1063 4-Alternative/other school      15    7      8            0.5
## 1064 4-Alternative/other school     347  161    186            5.8
## 1065 4-Alternative/other school       9    7      2              2
## 1066 4-Alternative/other school      61   41     20           8.97
## 1067 4-Alternative/other school       0    0      0              0
## 1068 4-Alternative/other school     n/a  n/a    n/a              1
## 1069 4-Alternative/other school      72   32     40              3
## 1070 4-Alternative/other school       0    0      0           <NA>
## 1071 4-Alternative/other school     184   96     88           9.65
## 1072 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1073 4-Alternative/other school       1    0      1           <NA>
## 1074 4-Alternative/other school       8    8      0           5.72
## 1075 4-Alternative/other school      10    9      1           <NA>
## 1076 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1077 4-Alternative/other school      15    9      6           3.17
## 1078 4-Alternative/other school     180   84     96             19
## 1079 4-Alternative/other school     160   69     91           8.78
## 1080 4-Alternative/other school       0    0      0           1.21
## 1081 4-Alternative/other school     129   54     75          27.23
## 1082 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1083 4-Alternative/other school      62   31     31              7
## 1084 4-Alternative/other school     180  100     80             20
## 1085 4-Alternative/other school     399  157    242           15.4
## 1086 4-Alternative/other school       0    0      0              1
## 1087 4-Alternative/other school      14   12      2              3
## 1088 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1089 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1090 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1091 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1092 4-Alternative/other school       1    1      0           <NA>
## 1093 4-Alternative/other school       3    2      1           <NA>
## 1094 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1095 4-Alternative/other school       4    4      0           <NA>
## 1096 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1097 4-Alternative/other school      10    2      8           0.16
## 1098 4-Alternative/other school     364  206    158          11.53
## 1099 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1100 4-Alternative/other school     293  165    128          20.54
## 1101 4-Alternative/other school      11   10      1              2
## 1102 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1103 4-Alternative/other school     119   65     54              4
## 1104 4-Alternative/other school       0    0      0              0
## 1105 4-Alternative/other school      34   34      0           2.35
## 1106 4-Alternative/other school      76   41     35            4.5
## 1107 4-Alternative/other school       9    0      9          35.02
## 1108 4-Alternative/other school       4    2      2              0
## 1109 4-Alternative/other school     449  225    224          11.78
## 1110 4-Alternative/other school     241  113    128            6.1
## 1111 4-Alternative/other school      58   24     34              2
## 1112 4-Alternative/other school      48   26     22           0.66
## 1113 4-Alternative/other school       4    4      0              1
## 1114 4-Alternative/other school     293  189    104           21.3
## 1115 4-Alternative/other school       6    3      3           <NA>
## 1116 4-Alternative/other school      39   30      9           3.99
## 1117 4-Alternative/other school      49   49      0              4
## 1118 4-Alternative/other school      16   11      5            0.7
## 1119 4-Alternative/other school      69   37     32            2.7
## 1120 4-Alternative/other school      35   19     16           3.12
## 1121 4-Alternative/other school      39   29     10              8
## 1122 4-Alternative/other school     636  302    334             28
## 1123 4-Alternative/other school      24   13     11              3
## 1124 4-Alternative/other school     257  157    100              8
## 1125 4-Alternative/other school      57   31     26              6
## 1126 4-Alternative/other school       7    6      1           2.45
## 1127 4-Alternative/other school       8    6      2              1
## 1128 4-Alternative/other school       3    2      1              1
## 1129 4-Alternative/other school      42   26     16              4
## 1130 4-Alternative/other school       9    5      4            0.8
## 1131 4-Alternative/other school      22   14      8              3
## 1132 4-Alternative/other school      11    7      4           <NA>
## 1133 4-Alternative/other school       7    7      0              1
## 1134 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1135 4-Alternative/other school      38   21     17            4.5
## 1136 4-Alternative/other school      18   11      7              2
## 1137 4-Alternative/other school     141   79     62           19.2
## 1138 4-Alternative/other school     531  246    285          30.45
## 1139 4-Alternative/other school     n/a  n/a    n/a              1
## 1140 4-Alternative/other school     340  159    181          15.75
## 1141 4-Alternative/other school     162   82     80          17.22
## 1142 4-Alternative/other school       0    0      0              0
## 1143 4-Alternative/other school      71   36     35           3.63
## 1144 4-Alternative/other school     525  398    127             32
## 1145 4-Alternative/other school      86   49     37             38
## 1146 4-Alternative/other school      77   58     19              8
## 1147 4-Alternative/other school       3    3      0            3.8
## 1148 4-Alternative/other school      43   26     17           4.12
## 1149 4-Alternative/other school     144   84     60              9
## 1150 4-Alternative/other school      24   20      4          12.48
## 1151 4-Alternative/other school       8    4      4              2
## 1152 4-Alternative/other school       1    1      0            0.5
## 1153 4-Alternative/other school     134   82     52              5
## 1154 4-Alternative/other school      75   30     45           4.97
## 1155 4-Alternative/other school     161   85     76            4.5
## 1156 4-Alternative/other school     166   80     86          12.81
## 1157 4-Alternative/other school     483  239    244           13.6
## 1158 4-Alternative/other school     112   72     40             10
## 1159 4-Alternative/other school      57   36     21              3
## 1160 4-Alternative/other school      10    6      4              6
## 1161 4-Alternative/other school       0    0      0              0
## 1162 4-Alternative/other school      36   25     11              8
## 1163 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1164 4-Alternative/other school      94   47     47            7.3
## 1165 4-Alternative/other school      40   27     13           3.25
## 1166 4-Alternative/other school     115   68     47          16.02
## 1167 4-Alternative/other school       9    5      4              0
## 1168 4-Alternative/other school     302  175    127              4
## 1169 4-Alternative/other school      66   48     18             17
## 1170 4-Alternative/other school      25    9     16              1
## 1171 4-Alternative/other school      38   30      8              0
## 1172 4-Alternative/other school       0    0      0              0
## 1173 4-Alternative/other school      51   51      0           8.55
## 1174 4-Alternative/other school       4    2      2           <NA>
## 1175 4-Alternative/other school     318  157    161          18.06
## 1176 4-Alternative/other school       0    0      0              0
## 1177 4-Alternative/other school       0    0      0              0
## 1178 4-Alternative/other school       1    1      0           0.49
## 1179 4-Alternative/other school       7    6      1            1.9
## 1180 4-Alternative/other school      72    1     71             11
## 1181 4-Alternative/other school     370  200    170          23.51
## 1182 4-Alternative/other school      18    0     18              1
## 1183 4-Alternative/other school      26   14     12              3
## 1184 4-Alternative/other school      61   22     39              3
## 1185 4-Alternative/other school       3    1      2           <NA>
## 1186 4-Alternative/other school     154  103     51            8.6
## 1187 4-Alternative/other school     135   70     65          11.63
## 1188 4-Alternative/other school      15   12      3           <NA>
## 1189 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1190 4-Alternative/other school      23    6     17              4
## 1191 4-Alternative/other school       4    0      4           <NA>
## 1192 4-Alternative/other school     137   62     75              5
## 1193 4-Alternative/other school     180  113     67           16.1
## 1194 4-Alternative/other school     178   96     82              5
## 1195 4-Alternative/other school      68   21     47           7.16
## 1196 4-Alternative/other school       0    0      0              0
## 1197 4-Alternative/other school       0    0      0              2
## 1198 4-Alternative/other school     216  103    113             11
## 1199 4-Alternative/other school     116   73     43          10.66
## 1200 4-Alternative/other school      89   59     30           4.67
## 1201 4-Alternative/other school      20   20    n/a           <NA>
## 1202 4-Alternative/other school      12   12      0              0
## 1203 4-Alternative/other school       5    2      3              1
## 1204 4-Alternative/other school     158   92     66           8.08
## 1205 4-Alternative/other school      15    8      7            2.4
## 1206 4-Alternative/other school       0    0      0           <NA>
## 1207 4-Alternative/other school       5    3      2              1
## 1208 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1209 4-Alternative/other school      66   56     10             11
## 1210 4-Alternative/other school    1449  723    726           56.9
## 1211 4-Alternative/other school     161   85     76            7.5
## 1212 4-Alternative/other school     180   95     85              5
## 1213 4-Alternative/other school     133   68     65            8.5
## 1214 4-Alternative/other school     344  187    157              9
## 1215 4-Alternative/other school      27   18      9            1.7
## 1216 4-Alternative/other school       8    4      4              6
## 1217 4-Alternative/other school     n/a  n/a    n/a            2.5
## 1218 4-Alternative/other school      72   54     18             10
## 1219 4-Alternative/other school      57   37     20           <NA>
## 1220 4-Alternative/other school     n/a  n/a    n/a              0
## 1221 4-Alternative/other school     157   88     69            3.5
## 1222 4-Alternative/other school      35   25     10              3
## 1223 4-Alternative/other school      19   13      6            5.1
## 1224 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1225 4-Alternative/other school      19   15      4              0
## 1226 4-Alternative/other school     191  114     77              2
## 1227 4-Alternative/other school     179   95     84              0
## 1228 4-Alternative/other school     255  136    119              1
## 1229 4-Alternative/other school       0    0      0              0
## 1230 4-Alternative/other school      43   25     18           3.05
## 1231 4-Alternative/other school      88   53     35           8.59
## 1232 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1233 4-Alternative/other school     343  172    171           16.5
## 1234 4-Alternative/other school      39   39      0             11
## 1235 4-Alternative/other school     125   65     60             23
## 1236 4-Alternative/other school      11   11      0           <NA>
## 1237 4-Alternative/other school     134   58     76           <NA>
## 1238 4-Alternative/other school      72   44     28             18
## 1239 4-Alternative/other school      20   14      6              1
## 1240 4-Alternative/other school       1    0      1           <NA>
## 1241 4-Alternative/other school      90   54     36           <NA>
## 1242 4-Alternative/other school      36   26     10             10
## 1243 4-Alternative/other school      11    9      2            2.6
## 1244 4-Alternative/other school      73   53     20             17
## 1245 4-Alternative/other school     109   37     72              6
## 1246 4-Alternative/other school     225  128     97           14.4
## 1247 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1248 4-Alternative/other school      26   15     11              1
## 1249 4-Alternative/other school     181  100     81           25.5
## 1250 4-Alternative/other school      54   46      8              5
## 1251 4-Alternative/other school       2    1      1            0.8
## 1252 4-Alternative/other school      66   30     36           9.87
## 1253 4-Alternative/other school      83   46     37           9.03
## 1254 4-Alternative/other school      33    0     33            2.6
## 1255 4-Alternative/other school      55   27     28              2
## 1256 4-Alternative/other school     164   79     85          11.48
## 1257 4-Alternative/other school      21   21      0           <NA>
## 1258 4-Alternative/other school       9    5      4              4
## 1259 4-Alternative/other school     152   95     57          14.07
## 1260 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1261 4-Alternative/other school      15    0     15           2.03
## 1262 4-Alternative/other school       8    8      0          14.84
## 1263 4-Alternative/other school      28   28      0           <NA>
## 1264 4-Alternative/other school      11   11      0           1.14
## 1265 4-Alternative/other school     109   59     50              6
## 1266 4-Alternative/other school     433  271    162          19.79
## 1267 4-Alternative/other school     130   59     71             11
## 1268 4-Alternative/other school       8    3      5           1.16
## 1269 4-Alternative/other school       0    0      0              0
## 1270 4-Alternative/other school       0    0      0           36.8
## 1271 4-Alternative/other school    <NA>  n/a    n/a              1
## 1272 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1273 4-Alternative/other school      13    5      8            0.5
## 1274 4-Alternative/other school      41   30     11            4.5
## 1275 4-Alternative/other school     585  297    288          46.86
## 1276 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1277 4-Alternative/other school      28   12     16           2.76
## 1278 4-Alternative/other school      10    8      2           <NA>
## 1279 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1280 4-Alternative/other school       0    0      0              0
## 1281 4-Alternative/other school       9    7      2              1
## 1282 4-Alternative/other school      40   20     20           1.02
## 1283 4-Alternative/other school      24   14     10              0
## 1284 4-Alternative/other school      42   19     23              0
## 1285 4-Alternative/other school     143  143      0              9
## 1286 4-Alternative/other school      31    0     31              3
## 1287 4-Alternative/other school     115   88     27             20
## 1288 4-Alternative/other school       7    4      3           <NA>
## 1289 4-Alternative/other school       0    0      0             11
## 1290 4-Alternative/other school     220  133     87          12.86
## 1291 4-Alternative/other school      47   46      1           <NA>
## 1292 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1293 4-Alternative/other school       4    4      0           <NA>
## 1294 4-Alternative/other school      22   13      9           4.86
## 1295 4-Alternative/other school       1    1      0            0.8
## 1296 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1297 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1298 4-Alternative/other school       5    3      2          17.15
## 1299 4-Alternative/other school      10    8      2           4.83
## 1300 4-Alternative/other school       7    4      3            4.6
## 1301 4-Alternative/other school     158  102     56           17.1
## 1302 4-Alternative/other school     194  116     78          15.54
## 1303 4-Alternative/other school       6    5      1           <NA>
## 1304 4-Alternative/other school     199  138     61             27
## 1305 4-Alternative/other school       0    0      0          11.39
## 1306 4-Alternative/other school     136   88     48           <NA>
## 1307 4-Alternative/other school     369  189    180          15.73
## 1308 4-Alternative/other school     444  257    187           20.9
## 1309 4-Alternative/other school     570  275    295          24.73
## 1310 4-Alternative/other school     503  280    223           22.3
## 1311 4-Alternative/other school     689  367    322          29.56
## 1312 4-Alternative/other school       4    3      1           <NA>
## 1313 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1314 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1315 4-Alternative/other school       3    2      1           <NA>
## 1316 4-Alternative/other school       1    1      0           <NA>
## 1317 4-Alternative/other school     290  235     55             26
## 1318 4-Alternative/other school     140   70     70          12.33
## 1319 4-Alternative/other school      35   32      3              3
## 1320 4-Alternative/other school     157   92     65           13.3
## 1321 4-Alternative/other school      47   36     11           13.7
## 1322 4-Alternative/other school      29    0     29             11
## 1323 4-Alternative/other school      29   16     13            4.5
## 1324 4-Alternative/other school      44   24     20            2.8
## 1325 4-Alternative/other school      78   50     28           2.54
## 1326 4-Alternative/other school      18   18      0              1
## 1327 4-Alternative/other school     719  410    309             39
## 1328 4-Alternative/other school     284  135    149             11
## 1329 4-Alternative/other school      92   43     49             13
## 1330 4-Alternative/other school      86   54     32              9
## 1331 4-Alternative/other school     295  134    161             17
## 1332 4-Alternative/other school     107   44     63          10.31
## 1333 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1334 4-Alternative/other school     189  101     88          11.03
## 1335 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1336 4-Alternative/other school      64   31     33              3
## 1337 4-Alternative/other school      23   13     10              2
## 1338 4-Alternative/other school       3    0      3              0
## 1339 4-Alternative/other school     110   61     49            8.9
## 1340 4-Alternative/other school      27   27      0              5
## 1341 4-Alternative/other school      54   45      9           <NA>
## 1342 4-Alternative/other school      46   34     12            5.4
## 1343 4-Alternative/other school      29   16     13            2.8
## 1344 4-Alternative/other school     118   42     76            5.7
## 1345 4-Alternative/other school      66   32     34              2
## 1346 4-Alternative/other school      86   60     26          16.83
## 1347 4-Alternative/other school     497  252    245           8.16
## 1348 4-Alternative/other school      11    6      5            0.8
## 1349 4-Alternative/other school     151  115     36             37
## 1350 4-Alternative/other school      23   23      0           <NA>
## 1351 4-Alternative/other school     109   67     42          11.15
## 1352 4-Alternative/other school      60   39     21              3
## 1353 4-Alternative/other school      34   25      9            2.7
## 1354 4-Alternative/other school      84   46     38           6.93
## 1355 4-Alternative/other school     115   75     40             12
## 1356 4-Alternative/other school     206  114     92          37.37
## 1357 4-Alternative/other school       0    0      0              1
## 1358 4-Alternative/other school      66   57      9             20
## 1359 4-Alternative/other school      20   13      7            2.8
## 1360 4-Alternative/other school     390  232    158           13.5
## 1361 4-Alternative/other school      32   24      8              1
## 1362 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1363 4-Alternative/other school       1    1      0           <NA>
## 1364 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1365 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1366 4-Alternative/other school      10    9      1              8
## 1367 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1368 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1369 4-Alternative/other school       5    4      1           <NA>
## 1370 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1371 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1372 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1373 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1374 4-Alternative/other school       2    2      0           <NA>
## 1375 4-Alternative/other school      33   33      0           2.94
## 1376 4-Alternative/other school     200  125     75          19.87
## 1377 4-Alternative/other school       0    0      0              4
## 1378 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1379 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1380 4-Alternative/other school      17    9      8              2
## 1381 4-Alternative/other school       7    7      0              1
## 1382 4-Alternative/other school     197   77    120           13.3
## 1383 4-Alternative/other school     116   74     42            9.7
## 1384 4-Alternative/other school      77   51     26           3.25
## 1385 4-Alternative/other school     172   76     96           <NA>
## 1386 4-Alternative/other school     361  199    162             29
## 1387 4-Alternative/other school     151   97     54            7.8
## 1388 4-Alternative/other school       1    1      0              1
## 1389 4-Alternative/other school     642  410    232           34.8
## 1390 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1391 4-Alternative/other school     268  142    126              7
## 1392 4-Alternative/other school      42   24     18            7.9
## 1393 4-Alternative/other school      58   35     23              2
## 1394 4-Alternative/other school     n/a  n/a    n/a          30.68
## 1395 4-Alternative/other school      44   44      0              3
## 1396 4-Alternative/other school      92   44     48           7.05
## 1397 4-Alternative/other school     250  103    147          14.25
## 1398 4-Alternative/other school      85   71     14              6
## 1399 4-Alternative/other school      82   70     12              7
## 1400 4-Alternative/other school       0    0      0           <NA>
## 1401 4-Alternative/other school      83   42     41           5.48
## 1402 4-Alternative/other school      68   30     38           1.16
## 1403 4-Alternative/other school       2    1      1              8
## 1404 4-Alternative/other school      19   13      6              1
## 1405 4-Alternative/other school      86   50     36              7
## 1406 4-Alternative/other school      24   24      0           7.84
## 1407 4-Alternative/other school      33   25      8              2
## 1408 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1409 4-Alternative/other school       4    4      0              1
## 1410 4-Alternative/other school     240  142     98           11.6
## 1411 4-Alternative/other school     151   97     54           6.88
## 1412 4-Alternative/other school      16    9      7              2
## 1413 4-Alternative/other school      23   17      6            2.9
## 1414 4-Alternative/other school       0    0      0              1
## 1415 4-Alternative/other school      91   43     48           <NA>
## 1416 4-Alternative/other school     232  140     92             19
## 1417 4-Alternative/other school      32   22     10              1
## 1418 4-Alternative/other school      71   33     38           5.49
## 1419 4-Alternative/other school      23   11     12              1
## 1420 4-Alternative/other school     219   93    126            2.5
## 1421 4-Alternative/other school       8    6      2              4
## 1422 4-Alternative/other school       2    2      0              1
## 1423 4-Alternative/other school      68   37     31           10.1
## 1424 4-Alternative/other school       0    0      0              2
## 1425 4-Alternative/other school       0    0      0              0
## 1426 4-Alternative/other school     202  101    101              9
## 1427 4-Alternative/other school      31   22      9              2
## 1428 4-Alternative/other school     134   91     43           10.2
## 1429 4-Alternative/other school      72   38     34              6
## 1430 4-Alternative/other school     140   62     78            5.4
## 1431 4-Alternative/other school      41   26     15            0.4
## 1432 4-Alternative/other school     319  190    129          19.44
## 1433 4-Alternative/other school      69   31     38           3.22
## 1434 4-Alternative/other school     318  158    160           13.3
## 1435 4-Alternative/other school     136   76     60             13
## 1436 4-Alternative/other school       0    0      0           0.88
## 1437 4-Alternative/other school      14    9      5              1
## 1438 4-Alternative/other school       0    0      0          37.44
## 1439 4-Alternative/other school       0    0      0              0
## 1440 4-Alternative/other school      12   10      2              1
## 1441 4-Alternative/other school      13   13      0              1
## 1442 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1443 4-Alternative/other school       7    6      1              1
## 1444 4-Alternative/other school     181  113     68              6
## 1445 4-Alternative/other school      23   18      5             12
## 1446 4-Alternative/other school      72   43     29           4.95
## 1447 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1448 4-Alternative/other school       0    0      0             15
## 1449 4-Alternative/other school     111   83     28              5
## 1450 4-Alternative/other school      70    0     70             13
## 1451 4-Alternative/other school      51   31     20              5
## 1452 4-Alternative/other school     767  381    386           30.5
## 1453 4-Alternative/other school       5    4      1           <NA>
## 1454 4-Alternative/other school     n/a  n/a    n/a              0
## 1455 4-Alternative/other school       0  n/a    n/a           <NA>
## 1456 4-Alternative/other school     n/a  n/a    n/a           3.06
## 1457 4-Alternative/other school     115   56     59            5.2
## 1458 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1459 4-Alternative/other school       5  n/a      5           <NA>
## 1460 4-Alternative/other school      19    7     12              0
## 1461 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1462 4-Alternative/other school    1035  536    499          47.33
## 1463 4-Alternative/other school     169   98     71            8.5
## 1464 4-Alternative/other school     706  242    464          26.53
## 1465 4-Alternative/other school      18   16      2           2.27
## 1466 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1467 4-Alternative/other school      24   16      8           7.05
## 1468 4-Alternative/other school     171   90     81              9
## 1469 4-Alternative/other school     165  104     61           28.7
## 1470 4-Alternative/other school      27   20      7              4
## 1471 4-Alternative/other school      70   35     35              9
## 1472 4-Alternative/other school       0    0      0             26
## 1473 4-Alternative/other school     282  149    133           14.2
## 1474 4-Alternative/other school      39   30      9              3
## 1475 4-Alternative/other school     140   75     65           <NA>
## 1476 4-Alternative/other school     233  147     86           <NA>
## 1477 4-Alternative/other school     302  148    154           15.5
## 1478 4-Alternative/other school     627  349    278           9.82
## 1479 4-Alternative/other school      19   14      5              1
## 1480 4-Alternative/other school      40   20     20            1.1
## 1481 4-Alternative/other school       0    0      0           <NA>
## 1482 4-Alternative/other school       5    3      2              1
## 1483 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1484 4-Alternative/other school      88   41     47              7
## 1485 4-Alternative/other school      81   63     18              4
## 1486 4-Alternative/other school     123   59     64          11.14
## 1487 4-Alternative/other school     173   67    106             15
## 1488 4-Alternative/other school      27   26      1              4
## 1489 4-Alternative/other school     195  106     89           <NA>
## 1490 4-Alternative/other school     106   89     17              8
## 1491 4-Alternative/other school       0    0      0              2
## 1492 4-Alternative/other school       0    0      0           1.88
## 1493 4-Alternative/other school       0    0      0           0.12
## 1494 4-Alternative/other school     n/a  n/a    n/a              7
## 1495 4-Alternative/other school     138   86     52           12.2
## 1496 4-Alternative/other school     152   95     57          13.48
## 1497 4-Alternative/other school      10    4      6              1
## 1498 4-Alternative/other school      27   11     16              1
## 1499 4-Alternative/other school       0    0      0           <NA>
## 1500 4-Alternative/other school     107   57     50            4.5
## 1501 4-Alternative/other school      80   65     15           12.2
## 1502 4-Alternative/other school      11    6      5           <NA>
## 1503 4-Alternative/other school      31   27      4              3
## 1504 4-Alternative/other school      71   45     26            3.5
## 1505 4-Alternative/other school      74   51     23           3.14
## 1506 4-Alternative/other school      14   12      2            2.1
## 1507 4-Alternative/other school       6    5      1            0.7
## 1508 4-Alternative/other school      36   26     10           <NA>
## 1509 4-Alternative/other school     187   80    107            2.2
## 1510 4-Alternative/other school     203   73    130           10.2
## 1511 4-Alternative/other school     202   57    145          15.56
## 1512 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1513 4-Alternative/other school       0    0      0              0
## 1514 4-Alternative/other school      12    8      4           <NA>
## 1515 4-Alternative/other school     220   81    139          13.93
## 1516 4-Alternative/other school     n/a  n/a    n/a           6.01
## 1517 4-Alternative/other school      34   29      5           <NA>
## 1518 4-Alternative/other school      24   12     12           2.47
## 1519 4-Alternative/other school      25   13     12              0
## 1520 4-Alternative/other school      88   59     29              4
## 1521 4-Alternative/other school      11    7      4              0
## 1522 4-Alternative/other school     114   71     43            6.9
## 1523 4-Alternative/other school       0    0      0           0.11
## 1524 4-Alternative/other school      64   34     30           0.33
## 1525 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1526 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1527 4-Alternative/other school      79   53     26              4
## 1528 4-Alternative/other school     119   69     50           6.84
## 1529 4-Alternative/other school      93   38     55            8.9
## 1530 4-Alternative/other school     300  178    122          11.58
## 1531 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1532 4-Alternative/other school       7    7      0           <NA>
## 1533 4-Alternative/other school      37   37      0             11
## 1534 4-Alternative/other school       0    0      0            0.4
## 1535 4-Alternative/other school       3    2      1           0.05
## 1536 4-Alternative/other school      12    9      3           0.05
## 1537 4-Alternative/other school       8    7      1              2
## 1538 4-Alternative/other school      37   24     13              3
## 1539 4-Alternative/other school      23   23    n/a           2.42
## 1540 4-Alternative/other school     194  118     76              6
## 1541 4-Alternative/other school      28   18     10           5.29
## 1542 4-Alternative/other school      18   10      8           0.75
## 1543 4-Alternative/other school      50   32     18              5
## 1544 4-Alternative/other school       0    0      0              0
## 1545 4-Alternative/other school     154   84     70           <NA>
## 1546 4-Alternative/other school       0    0      0           2.19
## 1547 4-Alternative/other school       0    0      0              0
## 1548 4-Alternative/other school     264  129    135              0
## 1549 4-Alternative/other school      69   32     37            7.8
## 1550 4-Alternative/other school     528  263    265          15.21
## 1551 4-Alternative/other school      20   12      8              2
## 1552 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1553 4-Alternative/other school      15   15      0           4.44
## 1554 4-Alternative/other school       0    0      0           0.08
## 1555 4-Alternative/other school       0    0      0             11
## 1556 4-Alternative/other school       0    0      0              0
## 1557 4-Alternative/other school     101   51     50              5
## 1558 4-Alternative/other school      13    8      5              0
## 1559 4-Alternative/other school     803  426    377           17.5
## 1560 4-Alternative/other school     n/a  n/a    n/a              1
## 1561 4-Alternative/other school       0    0      0           <NA>
## 1562 4-Alternative/other school       0    0      0           <NA>
## 1563 4-Alternative/other school      15    9      6           0.68
## 1564 4-Alternative/other school     408  217    191          32.82
## 1565 4-Alternative/other school     199  117     82          11.33
## 1566 4-Alternative/other school      46   30     16              2
## 1567 4-Alternative/other school       0    0      0              0
## 1568 4-Alternative/other school       0    0      0              0
## 1569 4-Alternative/other school      38   27     11              8
## 1570 4-Alternative/other school     255  103    152              9
## 1571 4-Alternative/other school      56   32     24           2.41
## 1572 4-Alternative/other school     219  138     81           19.5
## 1573 4-Alternative/other school     148   89     59          12.02
## 1574 4-Alternative/other school     112   98     14             10
## 1575 4-Alternative/other school       1    1      0              2
## 1576 4-Alternative/other school       0    0      0           4.82
## 1577 4-Alternative/other school       7    6      1              4
## 1578 4-Alternative/other school       4    4      0           1.47
## 1579 4-Alternative/other school      39   36      3              4
## 1580 4-Alternative/other school     261  133    128             13
## 1581 4-Alternative/other school     192  108     84              9
## 1582 4-Alternative/other school     339  152    187          14.65
## 1583 4-Alternative/other school       5    4      1           0.68
## 1584 4-Alternative/other school     192  108     84          12.59
## 1585 4-Alternative/other school     n/a  n/a    n/a           60.4
## 1586 4-Alternative/other school       2    1      1           <NA>
## 1587 4-Alternative/other school       0    0      0           0.75
## 1588 4-Alternative/other school       1    0      1           <NA>
## 1589 4-Alternative/other school       9    7      2              2
## 1590 4-Alternative/other school       4    4      0           3.12
## 1591 4-Alternative/other school     136   89     47              6
## 1592 4-Alternative/other school     165   93     72          12.21
## 1593 4-Alternative/other school      10    5      5            1.3
## 1594 4-Alternative/other school       3    2      1           <NA>
## 1595 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1596 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1597 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1598 4-Alternative/other school       8    6      2           1.51
## 1599 4-Alternative/other school      71   45     26            4.5
## 1600 4-Alternative/other school      92   52     40              3
## 1601 4-Alternative/other school      90   50     40           8.45
## 1602 4-Alternative/other school     358  196    162          22.14
## 1603 4-Alternative/other school     401  189    212           39.1
## 1604 4-Alternative/other school      60   33     27              4
## 1605 4-Alternative/other school     149   84     65            9.2
## 1606 4-Alternative/other school      54   21     33            9.8
## 1607 4-Alternative/other school      60   33     27           3.77
## 1608 4-Alternative/other school     389  214    175          21.52
## 1609 4-Alternative/other school       0    0      0              0
## 1610 4-Alternative/other school      22   16      6           1.64
## 1611 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1612 4-Alternative/other school     356  175    181          22.32
## 1613 4-Alternative/other school     661  338    323           31.8
## 1614 4-Alternative/other school     127   82     45             14
## 1615 4-Alternative/other school     167   83     84           5.34
## 1616 4-Alternative/other school     103   48     55           9.64
## 1617 4-Alternative/other school      71   36     35            6.7
## 1618 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1619 4-Alternative/other school      89   41     48           6.36
## 1620 4-Alternative/other school     388  210    178             14
## 1621 4-Alternative/other school      50   35     15           5.22
## 1622 4-Alternative/other school      25   18      7              1
## 1623 4-Alternative/other school       0    0      0           <NA>
## 1624 4-Alternative/other school     539  267    272             22
## 1625 4-Alternative/other school     139   75     64            6.2
## 1626 4-Alternative/other school      23   17      6           8.23
## 1627 4-Alternative/other school     241  136    105           18.5
## 1628 4-Alternative/other school       6    5      1          12.01
## 1629 4-Alternative/other school      20   20      0           <NA>
## 1630 4-Alternative/other school      99   64     35              5
## 1631 4-Alternative/other school    <NA>  n/a    n/a           0.19
## 1632 4-Alternative/other school      70   52     18           <NA>
## 1633 4-Alternative/other school      11   11      0           <NA>
## 1634 4-Alternative/other school      60   30     30            1.5
## 1635 4-Alternative/other school     110   65     45           1.75
## 1636 4-Alternative/other school     n/a  n/a    n/a              0
## 1637 4-Alternative/other school      33   20     13           1.28
## 1638 4-Alternative/other school      35   21     14            1.9
## 1639 4-Alternative/other school      27   21      6              8
## 1640 4-Alternative/other school      72   67      5           <NA>
## 1641 4-Alternative/other school      27   20      7              5
## 1642 4-Alternative/other school       5    5    n/a           <NA>
## 1643 4-Alternative/other school      20   11      9           <NA>
## 1644 4-Alternative/other school      26   12     14              7
## 1645 4-Alternative/other school      38   24     14            0.9
## 1646 4-Alternative/other school      10    9      1              1
## 1647 4-Alternative/other school     106   84     22             19
## 1648 4-Alternative/other school      22   15      7            0.8
## 1649 4-Alternative/other school       5    5      0              1
## 1650 4-Alternative/other school     207   97    110          11.79
## 1651 4-Alternative/other school      61   41     20              2
## 1652 4-Alternative/other school      76   37     39           2.93
## 1653 4-Alternative/other school     173   86     87           5.49
## 1654 4-Alternative/other school       3    3      0           2.69
## 1655 4-Alternative/other school     237  194     43             23
## 1656 4-Alternative/other school       1    1      0              1
## 1657 4-Alternative/other school      56   26     30           <NA>
## 1658 4-Alternative/other school     n/a  n/a    n/a              0
## 1659 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1660 4-Alternative/other school      59   37     22              0
## 1661 4-Alternative/other school       3    2      1              1
## 1662 4-Alternative/other school     102   54     48              2
## 1663 4-Alternative/other school      19   19    n/a           <NA>
## 1664 4-Alternative/other school       2    2      0            0.5
## 1665 4-Alternative/other school       3    1      2            0.5
## 1666 4-Alternative/other school      74   47     27              4
## 1667 4-Alternative/other school      11   10      1              1
## 1668 4-Alternative/other school      30   16     14              2
## 1669 4-Alternative/other school       6    5      1            1.5
## 1670 4-Alternative/other school      67   30     37           4.84
## 1671 4-Alternative/other school     171   70    101              6
## 1672 4-Alternative/other school     349  188    161          11.53
## 1673 4-Alternative/other school     289  164    125          11.06
## 1674 4-Alternative/other school      26    4     22              2
## 1675 4-Alternative/other school      56   56      0              3
## 1676 4-Alternative/other school     258  153    105             13
## 1677 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1678 4-Alternative/other school       9    6      3           <NA>
## 1679 4-Alternative/other school       1    1      0           <NA>
## 1680 4-Alternative/other school     544  296    248             28
## 1681 4-Alternative/other school      32   26      6           <NA>
## 1682 4-Alternative/other school      13    0     13              3
## 1683 4-Alternative/other school      41   19     22           2.98
## 1684 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1685 4-Alternative/other school       0    0      0           <NA>
## 1686 4-Alternative/other school      40   33      7            1.8
## 1687 4-Alternative/other school     156   82     74           7.06
## 1688 4-Alternative/other school      71   29     42           3.34
## 1689 4-Alternative/other school     411  182    229          31.22
## 1690 4-Alternative/other school      60   37     23           <NA>
## 1691 4-Alternative/other school      70   51     19          14.93
## 1692 4-Alternative/other school     n/a  n/a    n/a           16.3
## 1693 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1694 4-Alternative/other school     145   91     54          11.17
## 1695 4-Alternative/other school     229  150     79           30.7
## 1696 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1697 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1698 4-Alternative/other school       0    0      0           <NA>
## 1699 4-Alternative/other school     149  102     47             12
## 1700 4-Alternative/other school      10    6      4           <NA>
## 1701 4-Alternative/other school       1    0      1           <NA>
## 1702 4-Alternative/other school       2    1      1           <NA>
## 1703 4-Alternative/other school       6    4      2            2.6
## 1704 4-Alternative/other school       1    0      1           <NA>
## 1705 4-Alternative/other school       1    0      1           <NA>
## 1706 4-Alternative/other school       2    1      1           <NA>
## 1707 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1708 4-Alternative/other school       2    2      0           <NA>
## 1709 4-Alternative/other school       0    0      0           3.02
## 1710 4-Alternative/other school       1    1      0           <NA>
## 1711 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1712 4-Alternative/other school      97   59     38           6.55
## 1713 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1714 4-Alternative/other school       1    0      1           <NA>
## 1715 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1716 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1717 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1718 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1719 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1720 4-Alternative/other school       4    0      4           <NA>
## 1721 4-Alternative/other school       6    2      4            0.6
## 1722 4-Alternative/other school       2    1      1           <NA>
## 1723 4-Alternative/other school       1    0      1           <NA>
## 1724 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1725 4-Alternative/other school       6    5      1           <NA>
## 1726 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1727 4-Alternative/other school       4    2      2           <NA>
## 1728 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1729 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1730 4-Alternative/other school     294  119    175             20
## 1731 4-Alternative/other school      23   21      2              4
## 1732 4-Alternative/other school       7    7      0              1
## 1733 4-Alternative/other school       1    1      0            0.8
## 1734 4-Alternative/other school      39   22     17              2
## 1735 4-Alternative/other school       0    0      0           0.13
## 1736 4-Alternative/other school      49   20     29           6.23
## 1737 4-Alternative/other school      40    0     40            3.9
## 1738 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1739 4-Alternative/other school      22   19      3           <NA>
## 1740 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1741 4-Alternative/other school      46   28     18           1.53
## 1742 4-Alternative/other school       0    0      0           <NA>
## 1743 4-Alternative/other school     137   79     58           7.29
## 1744 4-Alternative/other school     104   52     52            5.5
## 1745 4-Alternative/other school      28   18     10            0.1
## 1746 4-Alternative/other school     116   64     52           7.26
## 1747 4-Alternative/other school       0    0      0              1
## 1748 4-Alternative/other school     117   71     46           6.17
## 1749 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1750 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1751 4-Alternative/other school      22   15      7              4
## 1752 4-Alternative/other school      43   20     23            2.5
## 1753 4-Alternative/other school     236  117    119           <NA>
## 1754 4-Alternative/other school     180  100     80           20.6
## 1755 4-Alternative/other school      38   35      3            3.8
## 1756 4-Alternative/other school      86   59     27            7.1
## 1757 4-Alternative/other school       0    0      0           <NA>
## 1758 4-Alternative/other school       9    5      4           3.72
## 1759 4-Alternative/other school       4    2      2           0.97
## 1760 4-Alternative/other school     364  179    185          31.32
## 1761 4-Alternative/other school      88   47     41           8.63
## 1762 4-Alternative/other school     345  213    132          18.88
## 1763 4-Alternative/other school      45   21     24              0
## 1764 4-Alternative/other school      67   47     20             31
## 1765 4-Alternative/other school      13   12      1           <NA>
## 1766 4-Alternative/other school      44   44      0          35.02
## 1767 4-Alternative/other school       3    2      1              1
## 1768 4-Alternative/other school      54   31     23          11.04
## 1769 4-Alternative/other school      25   14     11              3
## 1770 4-Alternative/other school       2    2      0           <NA>
## 1771 4-Alternative/other school       2    2      0           <NA>
## 1772 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1773 4-Alternative/other school      97   47     50          18.41
## 1774 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1775 4-Alternative/other school      10    1      9              1
## 1776 4-Alternative/other school     107   66     41              5
## 1777 4-Alternative/other school       0    0      0           <NA>
## 1778 4-Alternative/other school       7    3      4           <NA>
## 1779 4-Alternative/other school      22   14      8           <NA>
## 1780 4-Alternative/other school       1    0      1           <NA>
## 1781 4-Alternative/other school     125  n/a    125          11.01
## 1782 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1783 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1784 4-Alternative/other school      30   18     12              8
## 1785 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1786 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1787 4-Alternative/other school       1    0      1           <NA>
## 1788 4-Alternative/other school      11   10      1           <NA>
## 1789 4-Alternative/other school     142   78     64              1
## 1790 4-Alternative/other school      45   38      7              6
## 1791 4-Alternative/other school      43   41      2              6
## 1792 4-Alternative/other school       6    4      2           <NA>
## 1793 4-Alternative/other school      14   10      4           <NA>
## 1794 4-Alternative/other school      12    8      4              1
## 1795 4-Alternative/other school      90   70     20            8.6
## 1796 4-Alternative/other school      13    6      7            0.2
## 1797 4-Alternative/other school       8    7      1              1
## 1798 4-Alternative/other school     330  181    149           18.2
## 1799 4-Alternative/other school      47   47    n/a           <NA>
## 1800 4-Alternative/other school      19   13      6            0.4
## 1801 4-Alternative/other school      67   67      0              7
## 1802 4-Alternative/other school     279  168    111          14.85
## 1803 4-Alternative/other school      54   17     37            1.5
## 1804 4-Alternative/other school     233  149     84          13.57
## 1805 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1806 4-Alternative/other school      25   12     13              1
## 1807 4-Alternative/other school       0    0      0           0.06
## 1808 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1809 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1810 4-Alternative/other school      14   13      1              3
## 1811 4-Alternative/other school       1    1      0           <NA>
## 1812 4-Alternative/other school       9    9      0           3.21
## 1813 4-Alternative/other school     150   86     64           17.5
## 1814 4-Alternative/other school     449  243    206          21.77
## 1815 4-Alternative/other school     402  221    181          17.82
## 1816 4-Alternative/other school      64   48     16            4.5
## 1817 4-Alternative/other school       7    4      3           0.25
## 1818 4-Alternative/other school      10    5      5              1
## 1819 4-Alternative/other school      14    7      7           1.17
## 1820 4-Alternative/other school       7  n/a      7           0.66
## 1821 4-Alternative/other school      57   29     28              0
## 1822 4-Alternative/other school       3    3    n/a           <NA>
## 1823 4-Alternative/other school       0    0      0           9.55
## 1824 4-Alternative/other school    1861  716   1145          72.83
## 1825 4-Alternative/other school     462  241    221          52.04
## 1826 4-Alternative/other school     486  258    228          37.04
## 1827 4-Alternative/other school     178  105     73          15.87
## 1828 4-Alternative/other school      16   15      1              1
## 1829 4-Alternative/other school      42   29     13              5
## 1830 4-Alternative/other school     336  174    162          15.71
## 1831 4-Alternative/other school      42   31     11              4
## 1832 4-Alternative/other school      49   22     27           7.15
## 1833 4-Alternative/other school     128   73     55           6.27
## 1834 4-Alternative/other school       3    3      0           1.07
## 1835 4-Alternative/other school      33   15     18           5.13
## 1836 4-Alternative/other school      14    7      7              1
## 1837 4-Alternative/other school     187   86    101          16.59
## 1838 4-Alternative/other school       2    1      1              1
## 1839 4-Alternative/other school      21    6     15              2
## 1840 4-Alternative/other school     158   89     69           10.9
## 1841 4-Alternative/other school      29   23      6              2
## 1842 4-Alternative/other school      30   13     17              1
## 1843 4-Alternative/other school      45   15     30            5.5
## 1844 4-Alternative/other school     n/a  n/a    n/a           2.52
## 1845 4-Alternative/other school     382  189    193            5.6
## 1846 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1847 4-Alternative/other school     117   63     54            9.8
## 1848 4-Alternative/other school       3    2      1            0.8
## 1849 4-Alternative/other school     150  101     49            6.5
## 1850 4-Alternative/other school      90   50     40           2.72
## 1851 4-Alternative/other school      95   46     49           5.59
## 1852 4-Alternative/other school     358  230    128          22.15
## 1853 4-Alternative/other school     464  313    151             27
## 1854 4-Alternative/other school      55   30     25           4.63
## 1855 4-Alternative/other school      28   18     10           4.25
## 1856 4-Alternative/other school      37   17     20            1.2
## 1857 4-Alternative/other school       0    0      0             11
## 1858 4-Alternative/other school      52   32     20          10.76
## 1859 4-Alternative/other school     175   94     81           7.85
## 1860 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1861 4-Alternative/other school     106   45     61              7
## 1862 4-Alternative/other school      35    8     27            1.6
## 1863 4-Alternative/other school      35   23     12              1
## 1864 4-Alternative/other school      27   10     17            2.3
## 1865 4-Alternative/other school      93   56     37              7
## 1866 4-Alternative/other school      56   19     37            2.6
## 1867 4-Alternative/other school       0    0      0              4
## 1868 4-Alternative/other school      67   56     11             15
## 1869 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1870 4-Alternative/other school       1    1      0           <NA>
## 1871 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1872 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1873 4-Alternative/other school      25   22      3              3
## 1874 4-Alternative/other school      12   11      1           <NA>
## 1875 4-Alternative/other school       7    5      2              0
## 1876 4-Alternative/other school     222  125     97             15
## 1877 4-Alternative/other school      23   17      6           2.71
## 1878 4-Alternative/other school       2    2      0           <NA>
## 1879 4-Alternative/other school       3    2      1           <NA>
## 1880 4-Alternative/other school       2    2      0           <NA>
## 1881 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1882 4-Alternative/other school       3    3      0           <NA>
## 1883 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1884 4-Alternative/other school      83   83    n/a           <NA>
## 1885 4-Alternative/other school      73   36     36           6.85
## 1886 4-Alternative/other school      41   27     14           12.2
## 1887 4-Alternative/other school     246  139    107           23.8
## 1888 4-Alternative/other school      69   45     24          45.16
## 1889 4-Alternative/other school     265  154    111          13.86
## 1890 4-Alternative/other school      46   23     23           8.93
## 1891 4-Alternative/other school      55   55      0           9.01
## 1892 4-Alternative/other school     169   73     96          27.06
## 1893 4-Alternative/other school      26   10     16              0
## 1894 4-Alternative/other school     136   65     71             13
## 1895 4-Alternative/other school       0    0      0              0
## 1896 4-Alternative/other school       0    0      0              0
## 1897 4-Alternative/other school      69   37     32            6.5
## 1898 4-Alternative/other school      44   21     23              1
## 1899 4-Alternative/other school     140   72     68           8.24
## 1900 4-Alternative/other school     181   85     96           9.28
## 1901 4-Alternative/other school      22   12     10              4
## 1902 4-Alternative/other school      12   11      1              1
## 1903 4-Alternative/other school      14   10      4              2
## 1904 4-Alternative/other school      83   65     18              9
## 1905 4-Alternative/other school      13   10      3              2
## 1906 4-Alternative/other school      17   11      6              5
## 1907 4-Alternative/other school       0    0      0           <NA>
## 1908 4-Alternative/other school      58   23     35            2.4
## 1909 4-Alternative/other school      84   66     18          16.94
## 1910 4-Alternative/other school     235  143     92           26.3
## 1911 4-Alternative/other school      23   14      9           1.66
## 1912 4-Alternative/other school      34   17     17            2.2
## 1913 4-Alternative/other school      40   29     11          14.51
## 1914 4-Alternative/other school      21   17      4           8.74
## 1915 4-Alternative/other school      72   38     34             19
## 1916 4-Alternative/other school      63   50     13          11.79
## 1917 4-Alternative/other school      24   13     11           6.09
## 1918 4-Alternative/other school     102   49     53              2
## 1919 4-Alternative/other school      46   15     31              0
## 1920 4-Alternative/other school     n/a  n/a    n/a              0
## 1921 4-Alternative/other school       0    0      0              0
## 1922 4-Alternative/other school     n/a  n/a    n/a              0
## 1923 4-Alternative/other school      90   52     38           <NA>
## 1924 4-Alternative/other school      45   13     32           0.01
## 1925 4-Alternative/other school      32   20     12              0
## 1926 4-Alternative/other school      82   42     40              4
## 1927 4-Alternative/other school     106   62     44              6
## 1928 4-Alternative/other school     226  132     94             19
## 1929 4-Alternative/other school       4    2      2           0.15
## 1930 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1931 4-Alternative/other school      19   16      3           2.33
## 1932 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1933 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1934 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1935 4-Alternative/other school      40   35      5              2
## 1936 4-Alternative/other school      32   27      5              4
## 1937 4-Alternative/other school      98   57     41           8.47
## 1938 4-Alternative/other school    <NA>  n/a    n/a              1
## 1939 4-Alternative/other school     177   87     90              9
## 1940 4-Alternative/other school     121   71     50              9
## 1941 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 1942 4-Alternative/other school    1209  592    617          50.06
## 1943 4-Alternative/other school     782  400    382          49.79
## 1944 4-Alternative/other school     134   61     73           7.29
## 1945 4-Alternative/other school      16    8      8              3
## 1946 4-Alternative/other school       2    2      0              1
## 1947 4-Alternative/other school      15   13      2              1
## 1948 4-Alternative/other school      63   32     31              3
## 1949 4-Alternative/other school      35   35    n/a           <NA>
## 1950 4-Alternative/other school      11    7      4              1
## 1951 4-Alternative/other school     217  134     83           <NA>
## 1952 4-Alternative/other school       0    0      0              3
## 1953 4-Alternative/other school      23    2     21              1
## 1954 4-Alternative/other school      74   16     58          15.83
## 1955 4-Alternative/other school     115   78     37           4.33
## 1956 4-Alternative/other school     696  450    246             38
## 1957 4-Alternative/other school      28   25      3           8.63
## 1958 4-Alternative/other school      22   16      6            2.2
## 1959 4-Alternative/other school       9    0      9              2
## 1960 4-Alternative/other school      85   57     28           5.89
## 1961 4-Alternative/other school     123   70     53             10
## 1962 4-Alternative/other school      15    8      7           1.35
## 1963 4-Alternative/other school     175   86     89             17
## 1964 4-Alternative/other school    3811 1695   2116          75.31
## 1965 4-Alternative/other school     n/a  n/a    n/a              4
## 1966 4-Alternative/other school       0    0      0           6.17
## 1967 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1968 4-Alternative/other school     n/a  n/a    n/a            n/a
## 1969 4-Alternative/other school      81   48     33              1
## 1970 4-Alternative/other school      52   36     16            4.6
## 1971 4-Alternative/other school       3    3      0              1
## 1972 4-Alternative/other school      46   26     20            2.8
## 1973 4-Alternative/other school      84   51     33              7
## 1974 4-Alternative/other school      18   16      2           3.03
## 1975 4-Alternative/other school      10    8      2              2
## 1976 4-Alternative/other school      38   38      0            3.2
## 1977 4-Alternative/other school       0    0      0              0
## 1978 4-Alternative/other school     206  111     95           11.7
## 1979 4-Alternative/other school       0    0      0           <NA>
## 1980 4-Alternative/other school     192  108     84          13.16
## 1981 4-Alternative/other school      31   31      0          35.02
## 1982 4-Alternative/other school      13    8      5              0
## 1983 4-Alternative/other school      31   19     12              2
## 1984 4-Alternative/other school      77   29     48           4.83
## 1985 4-Alternative/other school     164   74     90              3
## 1986 4-Alternative/other school     362  176    186          31.52
## 1987 4-Alternative/other school      16    3     13           1.36
## 1988 4-Alternative/other school      32   20     12            1.4
## 1989 4-Alternative/other school      95   30     65            1.7
## 1990 4-Alternative/other school     n/a  n/a    n/a              0
## 1991 4-Alternative/other school     143  108     35           4.77
## 1992 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 1993 4-Alternative/other school       0    0      0              0
## 1994 4-Alternative/other school      94   54     40             21
## 1995 4-Alternative/other school      96   47     49           4.82
## 1996 4-Alternative/other school      73   34     39              2
## 1997 4-Alternative/other school       0    0      0             12
## 1998 4-Alternative/other school     239  110    129              9
## 1999 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2000 4-Alternative/other school     487  271    216           <NA>
## 2001 4-Alternative/other school      91   39     52            2.2
## 2002 4-Alternative/other school     539  290    249          21.43
## 2003 4-Alternative/other school      74   58     16           1.73
## 2004 4-Alternative/other school     336  197    139             36
## 2005 4-Alternative/other school       0    0      0           <NA>
## 2006 4-Alternative/other school     391  215    176              0
## 2007 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2008 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2009 4-Alternative/other school       5    5      0              1
## 2010 4-Alternative/other school       0    0      0          22.99
## 2011 4-Alternative/other school      60   30     30            5.2
## 2012 4-Alternative/other school      25   12     13           0.17
## 2013 4-Alternative/other school       0    0      0              7
## 2014 4-Alternative/other school      25   14     11           <NA>
## 2015 4-Alternative/other school      44   44      0           0.15
## 2016 4-Alternative/other school       7    7    n/a           <NA>
## 2017 4-Alternative/other school      18   18      0              2
## 2018 4-Alternative/other school     459  306    153             12
## 2019 4-Alternative/other school      66   39     27             19
## 2020 4-Alternative/other school     106   66     40            7.3
## 2021 4-Alternative/other school      39   16     23            2.6
## 2022 4-Alternative/other school       4    3      1              4
## 2023 4-Alternative/other school      19   13      6              3
## 2024 4-Alternative/other school      33   22     11              2
## 2025 4-Alternative/other school       4    2      2           4.78
## 2026 4-Alternative/other school     881  455    426          45.59
## 2027 4-Alternative/other school     358  219    139           15.2
## 2028 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2029 4-Alternative/other school     n/a  n/a    n/a            5.2
## 2030 4-Alternative/other school      90   48     42           5.35
## 2031 4-Alternative/other school       2    2    n/a           <NA>
## 2032 4-Alternative/other school      15    8      7           0.45
## 2033 4-Alternative/other school      63   34     29           4.46
## 2034 4-Alternative/other school      11    8      3              4
## 2035 4-Alternative/other school      17    9      8              3
## 2036 4-Alternative/other school     140   76     64           12.5
## 2037 4-Alternative/other school      72   19     53            3.5
## 2038 4-Alternative/other school     n/a  n/a    n/a              6
## 2039 4-Alternative/other school       2    2      0              1
## 2040 4-Alternative/other school      56   30     26           <NA>
## 2041 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2042 4-Alternative/other school      38   21     17              4
## 2043 4-Alternative/other school       0    0      0             19
## 2044 4-Alternative/other school      32   19     13              2
## 2045 4-Alternative/other school     262  117    145           2.76
## 2046 4-Alternative/other school      10   10      0              0
## 2047 4-Alternative/other school     334  223    111           38.2
## 2048 4-Alternative/other school      37   27     10           7.89
## 2049 4-Alternative/other school     256  152    104             12
## 2050 4-Alternative/other school       5    3      2           <NA>
## 2051 4-Alternative/other school      40   24     16           2.17
## 2052 4-Alternative/other school     131   59     72           4.19
## 2053 4-Alternative/other school      13   11      2           7.84
## 2054 4-Alternative/other school      15   12      3           4.49
## 2055 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2056 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2057 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2058 4-Alternative/other school      29   19     10           <NA>
## 2059 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2060 4-Alternative/other school     239  111    128          28.85
## 2061 4-Alternative/other school       0    0      0           1.37
## 2062 4-Alternative/other school     105   76     29          14.27
## 2063 4-Alternative/other school      29   25      4              6
## 2064 4-Alternative/other school       0    0      0           <NA>
## 2065 4-Alternative/other school     815  442    373          40.84
## 2066 4-Alternative/other school       2    2      0              0
## 2067 4-Alternative/other school      29   24      5           2.83
## 2068 4-Alternative/other school      16   16    n/a              3
## 2069 4-Alternative/other school      32   26      6           0.94
## 2070 4-Alternative/other school       8    3      5              0
## 2071 4-Alternative/other school       5    5      0              1
## 2072 4-Alternative/other school      12   10      2             13
## 2073 4-Alternative/other school      16   14      2              5
## 2074 4-Alternative/other school      11    5      6           1.33
## 2075 4-Alternative/other school     137   74     63           7.83
## 2076 4-Alternative/other school       3    3      0            1.2
## 2077 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2078 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2079 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2080 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2081 4-Alternative/other school       2    1      1           <NA>
## 2082 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2083 4-Alternative/other school      17   15      2              4
## 2084 4-Alternative/other school       1    1      0           2.16
## 2085 4-Alternative/other school       2    2      0           2.51
## 2086 4-Alternative/other school     222  101    121          16.01
## 2087 4-Alternative/other school     n/a  n/a    n/a           0.91
## 2088 4-Alternative/other school       0    0      0              0
## 2089 4-Alternative/other school     109   53     56          11.35
## 2090 4-Alternative/other school     129    0    129              9
## 2091 4-Alternative/other school      43   21     22              1
## 2092 4-Alternative/other school       0    0      0             13
## 2093 4-Alternative/other school      68   30     38            2.5
## 2094 4-Alternative/other school       0    0      0              0
## 2095 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2096 4-Alternative/other school       5    5      0           <NA>
## 2097 4-Alternative/other school       1    1      0           <NA>
## 2098 4-Alternative/other school      28   23      5           <NA>
## 2099 4-Alternative/other school       1    1      0           <NA>
## 2100 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2101 4-Alternative/other school     184  151     33          15.13
## 2102 4-Alternative/other school      97   76     21              5
## 2103 4-Alternative/other school     175  105     70              9
## 2104 4-Alternative/other school      15   10      5            2.6
## 2105 4-Alternative/other school     155   93     62            8.4
## 2106 4-Alternative/other school      25   22      3          15.01
## 2107 4-Alternative/other school      15   11      4           <NA>
## 2108 4-Alternative/other school     n/a  n/a    n/a           9.51
## 2109 4-Alternative/other school      37   17     20           3.43
## 2110 4-Alternative/other school      32   26      6           3.25
## 2111 4-Alternative/other school      57   29     28            2.9
## 2112 4-Alternative/other school      30   21      9           1.95
## 2113 4-Alternative/other school      22   12     10              2
## 2114 4-Alternative/other school       0    0      0           <NA>
## 2115 4-Alternative/other school     142   81     61          23.41
## 2116 4-Alternative/other school       9    5      4           2.37
## 2117 4-Alternative/other school      46   22     24            1.6
## 2118 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2119 4-Alternative/other school      54   39     15              1
## 2120 4-Alternative/other school       0    0      0              5
## 2121 4-Alternative/other school       0    0      0              1
## 2122 4-Alternative/other school       0    0      0              1
## 2123 4-Alternative/other school       1    1      0              1
## 2124 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2125 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2126 4-Alternative/other school     146   75     71              9
## 2127 4-Alternative/other school      44   23     21            2.8
## 2128 4-Alternative/other school      30   11     19           4.16
## 2129 4-Alternative/other school      25    4     21            4.4
## 2130 4-Alternative/other school     135   37     98              7
## 2131 4-Alternative/other school      20  n/a     20           2.97
## 2132 4-Alternative/other school      71   48     23           5.65
## 2133 4-Alternative/other school      21   11     10            2.6
## 2134 4-Alternative/other school      37   35      2           <NA>
## 2135 4-Alternative/other school      15   12      3             17
## 2136 4-Alternative/other school     280  117    163           21.2
## 2137 4-Alternative/other school      81   49     32           6.71
## 2138 4-Alternative/other school      24   13     11           3.98
## 2139 4-Alternative/other school      39   29     10              1
## 2140 4-Alternative/other school       4    2      2           <NA>
## 2141 4-Alternative/other school      51   39     12           5.75
## 2142 4-Alternative/other school     128   68     60           11.2
## 2143 4-Alternative/other school     187  110     77             20
## 2144 4-Alternative/other school      71   47     24          13.26
## 2145 4-Alternative/other school       5    0      5            0.4
## 2146 4-Alternative/other school       0    0      0              0
## 2147 4-Alternative/other school      82   40     42            4.4
## 2148 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2149 4-Alternative/other school    <NA>  n/a    n/a            0.1
## 2150 4-Alternative/other school    1514  955    559             37
## 2151 4-Alternative/other school      96   64     32              4
## 2152 4-Alternative/other school       0    0      0              0
## 2153 4-Alternative/other school      53   33     20           2.01
## 2154 4-Alternative/other school      12   12      0           <NA>
## 2155 4-Alternative/other school      78   29     49           8.58
## 2156 4-Alternative/other school      34   20     14           3.92
## 2157 4-Alternative/other school       0    0      0              0
## 2158 4-Alternative/other school     265  137    128          16.94
## 2159 4-Alternative/other school      37   21     16           3.15
## 2160 4-Alternative/other school     172   85     87          12.91
## 2161 4-Alternative/other school       9    9      0              1
## 2162 4-Alternative/other school     170  107     63             16
## 2163 4-Alternative/other school      21    8     13              1
## 2164 4-Alternative/other school      14    9      5              1
## 2165 4-Alternative/other school       5    5      0           <NA>
## 2166 4-Alternative/other school      13    9      4              2
## 2167 4-Alternative/other school      45   35     10           4.37
## 2168 4-Alternative/other school      34   20     14              5
## 2169 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2170 4-Alternative/other school      13    8      5           <NA>
## 2171 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2172 4-Alternative/other school       1    1      0           <NA>
## 2173 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2174 4-Alternative/other school       6    4      2           <NA>
## 2175 4-Alternative/other school       2    2      0           <NA>
## 2176 4-Alternative/other school      31   31      0           2.53
## 2177 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2178 4-Alternative/other school       1    1      0           <NA>
## 2179 4-Alternative/other school      15    8      7           1.47
## 2180 4-Alternative/other school       6    3      3           0.34
## 2181 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2182 4-Alternative/other school     189   93     96              9
## 2183 4-Alternative/other school       0  n/a    n/a           <NA>
## 2184 4-Alternative/other school      65   24     41           0.71
## 2185 4-Alternative/other school       6    5      1           <NA>
## 2186 4-Alternative/other school       6    6      0           <NA>
## 2187 4-Alternative/other school     540  241    299             31
## 2188 4-Alternative/other school      13   10      3              0
## 2189 4-Alternative/other school     n/a  n/a    n/a              5
## 2190 4-Alternative/other school       0    0      0              0
## 2191 4-Alternative/other school      24   19      5              8
## 2192 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2193 4-Alternative/other school      71   44     27            3.5
## 2194 4-Alternative/other school      28   28      0          35.02
## 2195 4-Alternative/other school      27   25      2              2
## 2196 4-Alternative/other school       2    1      1           <NA>
## 2197 4-Alternative/other school      17    8      9              0
## 2198 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2199 4-Alternative/other school      73   73      0             12
## 2200 4-Alternative/other school      13    6      7              0
## 2201 4-Alternative/other school     409  195    214           8.68
## 2202 4-Alternative/other school      22   18      4           <NA>
## 2203 4-Alternative/other school       3    3      0           <NA>
## 2204 4-Alternative/other school       3    3      0           <NA>
## 2205 4-Alternative/other school       8    5      3           <NA>
## 2206 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2207 4-Alternative/other school      18   15      3           <NA>
## 2208 4-Alternative/other school       2    2      0           <NA>
## 2209 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2210 4-Alternative/other school      32   19     13              6
## 2211 4-Alternative/other school     160   78     82           9.77
## 2212 4-Alternative/other school       0    0      0              0
## 2213 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2214 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2215 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2216 4-Alternative/other school       1    1      0           <NA>
## 2217 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2218 4-Alternative/other school       1    1      0           <NA>
## 2219 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2220 4-Alternative/other school      34   19     15              4
## 2221 4-Alternative/other school     104   55     49          10.72
## 2222 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2223 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2224 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2225 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2226 4-Alternative/other school       0    0      0              0
## 2227 4-Alternative/other school      85   56     29              9
## 2228 4-Alternative/other school     102   55     47             10
## 2229 4-Alternative/other school      48   42      6              6
## 2230 4-Alternative/other school       0    0      0           <NA>
## 2231 4-Alternative/other school       4    4      0              1
## 2232 4-Alternative/other school      95   77     18          12.84
## 2233 4-Alternative/other school      18    0     18              3
## 2234 4-Alternative/other school     174  109     65           11.5
## 2235 4-Alternative/other school      17    5     12            0.5
## 2236 4-Alternative/other school      23   16      7           3.52
## 2237 4-Alternative/other school      40   29     11              2
## 2238 4-Alternative/other school     181  109     72          12.05
## 2239 4-Alternative/other school      60   41     19           <NA>
## 2240 4-Alternative/other school      11    5      6           1.02
## 2241 4-Alternative/other school      24   24      0           3.66
## 2242 4-Alternative/other school      47   30     17            2.6
## 2243 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2244 4-Alternative/other school     n/a  n/a    n/a           4.22
## 2245 4-Alternative/other school      75   56     19          28.17
## 2246 4-Alternative/other school      15    5     10              1
## 2247 4-Alternative/other school     n/a  n/a    n/a              0
## 2248 4-Alternative/other school      24   16      8           <NA>
## 2249 4-Alternative/other school     148   77     71           7.38
## 2250 4-Alternative/other school     135   73     62              0
## 2251 4-Alternative/other school       4    4      0              0
## 2252 4-Alternative/other school      29   17     12              2
## 2253 4-Alternative/other school      57   16     41              7
## 2254 4-Alternative/other school      14    4     10            0.3
## 2255 4-Alternative/other school       5    1      4           <NA>
## 2256 4-Alternative/other school       2    0      2           <NA>
## 2257 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2258 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2259 4-Alternative/other school       0    0      0            0.5
## 2260 4-Alternative/other school       0    0      0              3
## 2261 4-Alternative/other school     167   87     80           5.43
## 2262 4-Alternative/other school      93   42     51           2.55
## 2263 4-Alternative/other school      16    8      8           4.51
## 2264 4-Alternative/other school     889  423    466          42.72
## 2265 4-Alternative/other school      29   16     13           4.02
## 2266 4-Alternative/other school      36   16     20            3.4
## 2267 4-Alternative/other school     116   76     40             43
## 2268 4-Alternative/other school      78   40     38           2.04
## 2269 4-Alternative/other school       0    0      0           <NA>
## 2270 4-Alternative/other school       9    5      4            1.8
## 2271 4-Alternative/other school     330  174    156          15.24
## 2272 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2273 4-Alternative/other school      31   19     12              7
## 2274 4-Alternative/other school      17   13      4           <NA>
## 2275 4-Alternative/other school     357  169    188          24.46
## 2276 4-Alternative/other school      62   47     15             14
## 2277 4-Alternative/other school      27   16     11              4
## 2278 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2279 4-Alternative/other school      17    0     17              2
## 2280 4-Alternative/other school     146  107     39             19
## 2281 4-Alternative/other school       0    0      0           <NA>
## 2282 4-Alternative/other school       6    6      0            3.5
## 2283 4-Alternative/other school      40   22     18            3.5
## 2284 4-Alternative/other school     223   84    139          13.43
## 2285 4-Alternative/other school      16   11      5              1
## 2286 4-Alternative/other school     201  158     43           9.99
## 2287 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2288 4-Alternative/other school     215  119     96             25
## 2289 4-Alternative/other school      33   24      9          14.08
## 2290 4-Alternative/other school      29   15     14            3.5
## 2291 4-Alternative/other school      30   22      8              2
## 2292 4-Alternative/other school     348  182    166          22.82
## 2293 4-Alternative/other school     151   53     98          10.03
## 2294 4-Alternative/other school     434  225    209           <NA>
## 2295 4-Alternative/other school      67   34     33              5
## 2296 4-Alternative/other school      61   43     18          11.97
## 2297 4-Alternative/other school      10    1      9           <NA>
## 2298 4-Alternative/other school      72   40     32           7.27
## 2299 4-Alternative/other school      89   52     37           5.19
## 2300 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2301 4-Alternative/other school     412  221    191          18.98
## 2302 4-Alternative/other school     443  229    214          20.79
## 2303 4-Alternative/other school     378  187    191          16.83
## 2304 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2305 4-Alternative/other school     204  105     99          16.32
## 2306 4-Alternative/other school     n/a  n/a    n/a              5
## 2307 4-Alternative/other school       5    4      1           11.5
## 2308 4-Alternative/other school       0    0      0              0
## 2309 4-Alternative/other school       0    0      0              0
## 2310 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2311 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2312 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2313 4-Alternative/other school      79   37     42           0.02
## 2314 4-Alternative/other school       0    0      0            0.5
## 2315 4-Alternative/other school      78   52     26           9.54
## 2316 4-Alternative/other school      55   38     17          37.41
## 2317 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2318 4-Alternative/other school       0  n/a    n/a           <NA>
## 2319 4-Alternative/other school       3    2      1              1
## 2320 4-Alternative/other school       6    5      1              1
## 2321 4-Alternative/other school      58   42     16          12.66
## 2322 4-Alternative/other school      21   15      6              0
## 2323 4-Alternative/other school       4    0      4              0
## 2324 4-Alternative/other school      67   27     40           6.41
## 2325 4-Alternative/other school      21    9     12              0
## 2326 4-Alternative/other school      37   22     15           <NA>
## 2327 4-Alternative/other school       4    2      2           <NA>
## 2328 4-Alternative/other school      24   17      7            5.5
## 2329 4-Alternative/other school       0    0      0              0
## 2330 4-Alternative/other school     131   75     56           4.22
## 2331 4-Alternative/other school     163   71     92           8.54
## 2332 4-Alternative/other school     118   84     34            6.3
## 2333 4-Alternative/other school       0    0      0           <NA>
## 2334 4-Alternative/other school     160   80     80          13.85
## 2335 4-Alternative/other school     395  199    196            5.2
## 2336 4-Alternative/other school       8    4      4              0
## 2337 4-Alternative/other school      34   14     20           9.19
## 2338 4-Alternative/other school      25   16      9           0.64
## 2339 4-Alternative/other school      26   26    n/a            8.1
## 2340 4-Alternative/other school       0    0      0              1
## 2341 4-Alternative/other school     627  313    314           <NA>
## 2342 4-Alternative/other school      28   16     12             10
## 2343 4-Alternative/other school      63   63    n/a           15.2
## 2344 4-Alternative/other school       0    0      0              6
## 2345 4-Alternative/other school     103   52     51           5.91
## 2346 4-Alternative/other school      28    8     20              4
## 2347 4-Alternative/other school      22   22      0              4
## 2348 4-Alternative/other school       0    0      0              0
## 2349 4-Alternative/other school      46   28     18            3.5
## 2350 4-Alternative/other school       6    5      1              1
## 2351 4-Alternative/other school     158   62     96           8.66
## 2352 4-Alternative/other school       0    0      0           20.7
## 2353 4-Alternative/other school     108   65     43            9.1
## 2354 4-Alternative/other school     102   67     35            6.5
## 2355 4-Alternative/other school     109   60     49           7.02
## 2356 4-Alternative/other school      17   10      7           2.11
## 2357 4-Alternative/other school     252  116    136          14.13
## 2358 4-Alternative/other school     176   86     90           15.2
## 2359 4-Alternative/other school     195  112     83           <NA>
## 2360 4-Alternative/other school     117   44     73           6.31
## 2361 4-Alternative/other school     177   67    110          11.09
## 2362 4-Alternative/other school      76   43     33           3.13
## 2363 4-Alternative/other school      47   14     33            5.4
## 2364 4-Alternative/other school      44   25     19           3.06
## 2365 4-Alternative/other school     302  148    154             17
## 2366 4-Alternative/other school     175   98     77           16.8
## 2367 4-Alternative/other school       0    0      0           <NA>
## 2368 4-Alternative/other school     170  103     67          13.72
## 2369 4-Alternative/other school      80   40     40           1.36
## 2370 4-Alternative/other school     n/a  n/a    n/a              0
## 2371 4-Alternative/other school     147   74     73             11
## 2372 4-Alternative/other school       0    0      0           <NA>
## 2373 4-Alternative/other school      17   11      6           0.26
## 2374 4-Alternative/other school     n/a  n/a    n/a              0
## 2375 4-Alternative/other school      23   13     10              1
## 2376 4-Alternative/other school      45   45      0          35.02
## 2377 4-Alternative/other school      72   46     26              0
## 2378 4-Alternative/other school       9    8      1              0
## 2379 4-Alternative/other school      19   10      9            0.1
## 2380 4-Alternative/other school      86   56     30            4.8
## 2381 4-Alternative/other school      83   53     30           5.97
## 2382 4-Alternative/other school      55   24     31           1.86
## 2383 4-Alternative/other school     126   50     76             16
## 2384 4-Alternative/other school     170  104     66             10
## 2385 4-Alternative/other school     250  118    132           27.4
## 2386 4-Alternative/other school       0    0      0              1
## 2387 4-Alternative/other school     788  419    369          35.35
## 2388 4-Alternative/other school    1917  770   1147             59
## 2389 4-Alternative/other school      49   20     29            7.4
## 2390 4-Alternative/other school       9    8      1              3
## 2391 4-Alternative/other school     303  157    146           <NA>
## 2392 4-Alternative/other school      50   37     13             15
## 2393 4-Alternative/other school      23   21      2              6
## 2394 4-Alternative/other school     475  251    224             44
## 2395 4-Alternative/other school      66   27     39           6.95
## 2396 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2397 4-Alternative/other school      72   32     40              0
## 2398 4-Alternative/other school     347  183    164           37.7
## 2399 4-Alternative/other school     438  203    235          20.31
## 2400 4-Alternative/other school     191  110     81          19.25
## 2401 4-Alternative/other school      73   32     41           5.45
## 2402 4-Alternative/other school     547  274    273           <NA>
## 2403 4-Alternative/other school     578  281    297          30.96
## 2404 4-Alternative/other school     250  105    145           13.2
## 2405 4-Alternative/other school      17    6     11              0
## 2406 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2407 4-Alternative/other school      33   21     12              2
## 2408 4-Alternative/other school     259  136    123              7
## 2409 4-Alternative/other school       5    5      0              0
## 2410 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2411 4-Alternative/other school      29   16     13           2.86
## 2412 4-Alternative/other school       2    0      2           <NA>
## 2413 4-Alternative/other school    3508 1402   2106             12
## 2414 4-Alternative/other school     149   71     78            7.6
## 2415 4-Alternative/other school       0    0      0              0
## 2416 4-Alternative/other school      21   12      9           0.32
## 2417 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2418 4-Alternative/other school      18   11      7           3.02
## 2419 4-Alternative/other school       3    0      3              1
## 2420 4-Alternative/other school     111   69     42           9.46
## 2421 4-Alternative/other school     304  189    115              7
## 2422 4-Alternative/other school      25   15     10           1.16
## 2423 4-Alternative/other school      44   23     21              8
## 2424 4-Alternative/other school     n/a  n/a    n/a           5.63
## 2425 4-Alternative/other school       0    0      0             20
## 2426 4-Alternative/other school       2    2      0           <NA>
## 2427 4-Alternative/other school      69   38     31           8.66
## 2428 4-Alternative/other school       0    0      0              0
## 2429 4-Alternative/other school       2    0      2           <NA>
## 2430 4-Alternative/other school     114   70     44              7
## 2431 4-Alternative/other school      59   59    n/a           8.95
## 2432 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2433 4-Alternative/other school      14   11      3           5.79
## 2434 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2435 4-Alternative/other school       3    3      0           <NA>
## 2436 4-Alternative/other school       0    0      0              0
## 2437 4-Alternative/other school      38   21     17              6
## 2438 4-Alternative/other school      41   38      3              3
## 2439 4-Alternative/other school      21   15      6             13
## 2440 4-Alternative/other school     262  130    132          14.83
## 2441 4-Alternative/other school       5    4      1              1
## 2442 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2443 4-Alternative/other school      52   35     17            3.5
## 2444 4-Alternative/other school     106   79     27           4.33
## 2445 4-Alternative/other school     244  120    124             16
## 2446 4-Alternative/other school       8    7      1            4.2
## 2447 4-Alternative/other school       1    1      0            1.2
## 2448 4-Alternative/other school     115   78     37             14
## 2449 4-Alternative/other school      11    8      3           <NA>
## 2450 4-Alternative/other school      90   56     34          13.93
## 2451 4-Alternative/other school       1    1    n/a           <NA>
## 2452 4-Alternative/other school    <NA>  n/a    n/a              2
## 2453 4-Alternative/other school       0    0      0              0
## 2454 4-Alternative/other school      74   43     31              3
## 2455 4-Alternative/other school       2    1      1           <NA>
## 2456 4-Alternative/other school       9    4      5           <NA>
## 2457 4-Alternative/other school      43   29     14             12
## 2458 4-Alternative/other school       0    0      0           <NA>
## 2459 4-Alternative/other school       0    0      0           <NA>
## 2460 4-Alternative/other school       0    0      0           <NA>
## 2461 4-Alternative/other school      10   10      0           <NA>
## 2462 4-Alternative/other school       1    1      0           <NA>
## 2463 4-Alternative/other school      46   26     20           2.96
## 2464 4-Alternative/other school     162  100     62           14.6
## 2465 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2466 4-Alternative/other school      94   62     32             15
## 2467 4-Alternative/other school     144   40    104          16.36
## 2468 4-Alternative/other school       3    1      2              2
## 2469 4-Alternative/other school      82   50     32              7
## 2470 4-Alternative/other school      12    9      3              1
## 2471 4-Alternative/other school     113   67     46              6
## 2472 4-Alternative/other school     235  126    109          11.33
## 2473 4-Alternative/other school      95   71     24             19
## 2474 4-Alternative/other school      49   49      0           2.25
## 2475 4-Alternative/other school       0    0      0           <NA>
## 2476 4-Alternative/other school       0    0      0           <NA>
## 2477 4-Alternative/other school       0    0      0           <NA>
## 2478 4-Alternative/other school       0    0      0           3.33
## 2479 4-Alternative/other school       0    0      0           6.81
## 2480 4-Alternative/other school       0    0      0              7
## 2481 4-Alternative/other school     196   76    120          16.03
## 2482 4-Alternative/other school     127   58     69              6
## 2483 4-Alternative/other school     225  110    115           12.6
## 2484 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2485 4-Alternative/other school       2    2      0           <NA>
## 2486 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2487 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2488 4-Alternative/other school       3    3      0           <NA>
## 2489 4-Alternative/other school       8    7      1           <NA>
## 2490 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2491 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2492 4-Alternative/other school    <NA>  n/a    n/a              2
## 2493 4-Alternative/other school     464  224    240          10.73
## 2494 4-Alternative/other school       9    3      6           1.08
## 2495 4-Alternative/other school      48   30     18              5
## 2496 4-Alternative/other school     514  268    246          28.63
## 2497 4-Alternative/other school     n/a  n/a    n/a           4.76
## 2498 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2499 4-Alternative/other school     138   59     79           8.19
## 2500 4-Alternative/other school      11   10      1              2
## 2501 4-Alternative/other school     138   52     86          10.99
## 2502 4-Alternative/other school      37   30      7           5.99
## 2503 4-Alternative/other school       0    0      0              0
## 2504 4-Alternative/other school      58   34     24           <NA>
## 2505 4-Alternative/other school      60   43     17              6
## 2506 4-Alternative/other school      31   16     15           3.07
## 2507 4-Alternative/other school     101   48     53          11.16
## 2508 4-Alternative/other school      33   28      5              5
## 2509 4-Alternative/other school      34   16     18           3.73
## 2510 4-Alternative/other school      13   10      3              1
## 2511 4-Alternative/other school       1    1      0           <NA>
## 2512 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2513 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2514 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2515 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2516 4-Alternative/other school      40   32      8           8.23
## 2517 4-Alternative/other school       2    2      0           <NA>
## 2518 4-Alternative/other school       3    3      0           <NA>
## 2519 4-Alternative/other school       3    2      1           <NA>
## 2520 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2521 4-Alternative/other school       8    7      1           <NA>
## 2522 4-Alternative/other school      43   24     19             12
## 2523 4-Alternative/other school      18    0     18           <NA>
## 2524 4-Alternative/other school      54   43     11             14
## 2525 4-Alternative/other school     108  108      0          27.93
## 2526 4-Alternative/other school      19   13      6              1
## 2527 4-Alternative/other school     109   74     35              8
## 2528 4-Alternative/other school       0    0      0           <NA>
## 2529 4-Alternative/other school     102   95      7            7.5
## 2530 4-Alternative/other school     622  250    372           22.1
## 2531 4-Alternative/other school     174  108     66          11.07
## 2532 4-Alternative/other school      71   30     41            3.5
## 2533 4-Alternative/other school      81   54     27            4.1
## 2534 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2535 4-Alternative/other school     210  111     99             17
## 2536 4-Alternative/other school       6    6      0           <NA>
## 2537 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2538 4-Alternative/other school      99   56     43              5
## 2539 4-Alternative/other school     481  238    243          22.39
## 2540 4-Alternative/other school      17    5     12           0.72
## 2541 4-Alternative/other school      29   17     12              1
## 2542 4-Alternative/other school      11   10      1            1.7
## 2543 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2544 4-Alternative/other school       5    4      1           <NA>
## 2545 4-Alternative/other school      15   13      2            3.4
## 2546 4-Alternative/other school     n/a  n/a    n/a           8.06
## 2547 4-Alternative/other school      68   34     34           3.25
## 2548 4-Alternative/other school     260  138    122          23.33
## 2549 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2550 4-Alternative/other school       6    4      2           <NA>
## 2551 4-Alternative/other school      87   57     30             16
## 2552 4-Alternative/other school      19   13      6              1
## 2553 4-Alternative/other school       9    7      2              3
## 2554 4-Alternative/other school     451  226    225          26.35
## 2555 4-Alternative/other school     909  439    470          48.53
## 2556 4-Alternative/other school    1150  579    571          62.01
## 2557 4-Alternative/other school     n/a  n/a    n/a              0
## 2558 4-Alternative/other school      76   43     33          14.89
## 2559 4-Alternative/other school      91   41     50              5
## 2560 4-Alternative/other school     498  258    240           40.9
## 2561 4-Alternative/other school     137   97     40             12
## 2562 4-Alternative/other school     161   92     69          12.61
## 2563 4-Alternative/other school      78    1     77             10
## 2564 4-Alternative/other school      35    0     35              5
## 2565 4-Alternative/other school      79   54     25           4.02
## 2566 4-Alternative/other school       3    3      0              1
## 2567 4-Alternative/other school      36   28      8           5.21
## 2568 4-Alternative/other school       3    3      0              1
## 2569 4-Alternative/other school     108   78     30             14
## 2570 4-Alternative/other school      13   12      1           2.82
## 2571 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2572 4-Alternative/other school      77   59     18             19
## 2573 4-Alternative/other school       1    1      0              1
## 2574 4-Alternative/other school     111   95     16             13
## 2575 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2576 4-Alternative/other school    <NA>  n/a    n/a              2
## 2577 4-Alternative/other school      54   45      9              2
## 2578 4-Alternative/other school      12   11      1            3.8
## 2579 4-Alternative/other school      30   11     19              4
## 2580 4-Alternative/other school      28   21      7              3
## 2581 4-Alternative/other school      13   13      0              2
## 2582 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2583 4-Alternative/other school      28   24      4           3.77
## 2584 4-Alternative/other school       4    3      1              1
## 2585 4-Alternative/other school      36   26     10              8
## 2586 4-Alternative/other school      34   31      3             14
## 2587 4-Alternative/other school       6    4      2              1
## 2588 4-Alternative/other school      10    9      1            1.2
## 2589 4-Alternative/other school       9  n/a      9           <NA>
## 2590 4-Alternative/other school      46   42      4              4
## 2591 4-Alternative/other school      11   11      0           <NA>
## 2592 4-Alternative/other school       1    1      0           <NA>
## 2593 4-Alternative/other school       2    2      0           <NA>
## 2594 4-Alternative/other school      24   22      2              5
## 2595 4-Alternative/other school       1    1      0           <NA>
## 2596 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2597 4-Alternative/other school      14   11      3           <NA>
## 2598 4-Alternative/other school     107   99      8             13
## 2599 4-Alternative/other school       0    0      0              2
## 2600 4-Alternative/other school       0    0      0           <NA>
## 2601 4-Alternative/other school      12    8      4           2.42
## 2602 4-Alternative/other school       2    2      0              1
## 2603 4-Alternative/other school      64   64    n/a           <NA>
## 2604 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2605 4-Alternative/other school      14   13      1              5
## 2606 4-Alternative/other school      17   13      4              5
## 2607 4-Alternative/other school       0    0      0           <NA>
## 2608 4-Alternative/other school      38   33      5           <NA>
## 2609 4-Alternative/other school      12    7      5           2.86
## 2610 4-Alternative/other school       0    0      0           1.53
## 2611 4-Alternative/other school      21    9     12           0.99
## 2612 4-Alternative/other school       0    0      0              0
## 2613 4-Alternative/other school      70   45     25              0
## 2614 4-Alternative/other school      87   52     35              8
## 2615 4-Alternative/other school      35   19     16           3.16
## 2616 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2617 4-Alternative/other school     108   57     51              4
## 2618 4-Alternative/other school     157   56    101          16.57
## 2619 4-Alternative/other school      71   51     20            1.6
## 2620 4-Alternative/other school       1    1      0           <NA>
## 2621 4-Alternative/other school      21   15      6          19.24
## 2622 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2623 4-Alternative/other school       4    2      2            1.6
## 2624 4-Alternative/other school     n/a  n/a    n/a           20.5
## 2625 4-Alternative/other school     197  116     81          11.25
## 2626 4-Alternative/other school       8    6      2              1
## 2627 4-Alternative/other school      34   21     13           0.58
## 2628 4-Alternative/other school       0    0      0           16.6
## 2629 4-Alternative/other school      71   42     29           6.99
## 2630 4-Alternative/other school       0    0      0              2
## 2631 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2632 4-Alternative/other school      73   44     29              3
## 2633 4-Alternative/other school     288  145    143           16.8
## 2634 4-Alternative/other school     248  106    142           14.4
## 2635 4-Alternative/other school       0    0      0              0
## 2636 4-Alternative/other school       0    0      0              0
## 2637 4-Alternative/other school      34   19     14           7.84
## 2638 4-Alternative/other school     670  419    251             33
## 2639 4-Alternative/other school     281  228     53             19
## 2640 4-Alternative/other school       0    0      0              4
## 2641 4-Alternative/other school      24   24    n/a              2
## 2642 4-Alternative/other school      51   42      9          15.51
## 2643 4-Alternative/other school     151   68     83           11.4
## 2644 4-Alternative/other school       9    0      9              2
## 2645 4-Alternative/other school       3    3      0              1
## 2646 4-Alternative/other school     100   54     46          12.91
## 2647 4-Alternative/other school     174  101     73          20.63
## 2648 4-Alternative/other school      30   18     12              3
## 2649 4-Alternative/other school       3    1      2           <NA>
## 2650 4-Alternative/other school      55   28     27            5.8
## 2651 4-Alternative/other school     329  172    157          34.88
## 2652 4-Alternative/other school    1573  561   1012             65
## 2653 4-Alternative/other school     102   63     39              9
## 2654 4-Alternative/other school      28   22      6              1
## 2655 4-Alternative/other school      94   55     39            5.8
## 2656 4-Alternative/other school      49   19     30              1
## 2657 4-Alternative/other school      89   58     31          24.36
## 2658 4-Alternative/other school     122   66     56            9.2
## 2659 4-Alternative/other school      10   10      0           4.59
## 2660 4-Alternative/other school       0    0      0              0
## 2661 4-Alternative/other school      40   24     16              2
## 2662 4-Alternative/other school      65   33     32           2.47
## 2663 4-Alternative/other school      84   59     25          29.03
## 2664 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2665 4-Alternative/other school      87   62     25           <NA>
## 2666 4-Alternative/other school       0    0      0              0
## 2667 4-Alternative/other school      29   25      4           4.73
## 2668 4-Alternative/other school      51   40     11              5
## 2669 4-Alternative/other school      23   14      9              2
## 2670 4-Alternative/other school      52   33     19           4.16
## 2671 4-Alternative/other school       0    0      0              0
## 2672 4-Alternative/other school      16   10      6           0.34
## 2673 4-Alternative/other school     391  162    229          16.03
## 2674 4-Alternative/other school     230  105    125              6
## 2675 4-Alternative/other school     n/a  n/a    n/a           0.25
## 2676 4-Alternative/other school      89   43     46           5.63
## 2677 4-Alternative/other school     466  221    245          26.14
## 2678 4-Alternative/other school       1    1      0           <NA>
## 2679 4-Alternative/other school       2    2      0           <NA>
## 2680 4-Alternative/other school     550  216    334           <NA>
## 2681 4-Alternative/other school      24   10     14              0
## 2682 4-Alternative/other school      80   38     42           7.01
## 2683 4-Alternative/other school      65   45     20           2.11
## 2684 4-Alternative/other school      69   28     41              3
## 2685 4-Alternative/other school     131   85     46           10.2
## 2686 4-Alternative/other school      33   19     14              5
## 2687 4-Alternative/other school     176  114     62             11
## 2688 4-Alternative/other school     431  257    174           26.1
## 2689 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2690 4-Alternative/other school     369  205    164           18.2
## 2691 4-Alternative/other school      13    9      4              1
## 2692 4-Alternative/other school      59   30     29              7
## 2693 4-Alternative/other school       0    0      0              0
## 2694 4-Alternative/other school      81   57     24           5.87
## 2695 4-Alternative/other school      46    0     46              3
## 2696 4-Alternative/other school      69   51     18              8
## 2697 4-Alternative/other school      71   56     15              8
## 2698 4-Alternative/other school     588  299    289           25.5
## 2699 4-Alternative/other school       3    1      2            0.3
## 2700 4-Alternative/other school       0    0      0              0
## 2701 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2702 4-Alternative/other school      10   10      0           <NA>
## 2703 4-Alternative/other school      30   30      0            2.2
## 2704 4-Alternative/other school      47   36     11             13
## 2705 4-Alternative/other school      36   21     15            1.5
## 2706 4-Alternative/other school      14    6      8           <NA>
## 2707 4-Alternative/other school      85   47     38           8.75
## 2708 4-Alternative/other school       0    0      0              0
## 2709 4-Alternative/other school       0    0      0              0
## 2710 4-Alternative/other school      31   16     15              2
## 2711 4-Alternative/other school       5    2      3              1
## 2712 4-Alternative/other school      54   54      0           3.95
## 2713 4-Alternative/other school      45   15     30           5.09
## 2714 4-Alternative/other school     202  121     81           4.85
## 2715 4-Alternative/other school      15   15      0              2
## 2716 4-Alternative/other school       0    0      0              0
## 2717 4-Alternative/other school     123  108     15           9.75
## 2718 4-Alternative/other school      76   76      0           <NA>
## 2719 4-Alternative/other school      12    9      3           <NA>
## 2720 4-Alternative/other school       4    3      1           <NA>
## 2721 4-Alternative/other school      31   20     11             19
## 2722 4-Alternative/other school      79   43     36           9.03
## 2723 4-Alternative/other school       4    2      2              0
## 2724 4-Alternative/other school     124   42     82          21.86
## 2725 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2726 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2727 4-Alternative/other school      45   20     25           4.21
## 2728 4-Alternative/other school      60   35     25            2.5
## 2729 4-Alternative/other school       0  n/a    n/a           <NA>
## 2730 4-Alternative/other school     287  172    115           <NA>
## 2731 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2732 4-Alternative/other school      89   67     22             20
## 2733 4-Alternative/other school      48   31     17              0
## 2734 4-Alternative/other school       0    0      0              2
## 2735 4-Alternative/other school       0    0      0          27.16
## 2736 4-Alternative/other school     169  108     61             13
## 2737 4-Alternative/other school     243  125    118           9.16
## 2738 4-Alternative/other school     197   93    104              9
## 2739 4-Alternative/other school       2    2    n/a           <NA>
## 2740 4-Alternative/other school       9    9      0              1
## 2741 4-Alternative/other school     n/a  n/a    n/a              0
## 2742 4-Alternative/other school     132   84     48              7
## 2743 4-Alternative/other school      40   28     12              3
## 2744 4-Alternative/other school       0    0      0              1
## 2745 4-Alternative/other school     n/a  n/a    n/a           3.62
## 2746 4-Alternative/other school      40   25     15           4.44
## 2747 4-Alternative/other school       0    0      0              0
## 2748 4-Alternative/other school      27   17     10           1.78
## 2749 4-Alternative/other school       0    0      0           <NA>
## 2750 4-Alternative/other school     119   65     54           8.48
## 2751 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2752 4-Alternative/other school     115   77     38           16.4
## 2753 4-Alternative/other school      74   35     39           4.98
## 2754 4-Alternative/other school      81   58     23              4
## 2755 4-Alternative/other school      16   16      0           7.21
## 2756 4-Alternative/other school     513  296    217             44
## 2757 4-Alternative/other school     211  115     96          18.76
## 2758 4-Alternative/other school       0    0      0              0
## 2759 4-Alternative/other school      47   34     13           1.36
## 2760 4-Alternative/other school      14   12      2           0.05
## 2761 4-Alternative/other school     167  119     48              7
## 2762 4-Alternative/other school     171  104     67           51.3
## 2763 4-Alternative/other school      73   39     34           4.37
## 2764 4-Alternative/other school     215   96    119           8.05
## 2765 4-Alternative/other school      66    0     66             10
## 2766 4-Alternative/other school     n/a  n/a    n/a              5
## 2767 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2768 4-Alternative/other school      14   14      0              2
## 2769 4-Alternative/other school      58   58      0              6
## 2770 4-Alternative/other school     615  394    221             29
## 2771 4-Alternative/other school      15    7      8              1
## 2772 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2773 4-Alternative/other school      20   14      6              1
## 2774 4-Alternative/other school      56   32     24            5.1
## 2775 4-Alternative/other school     222  118    104           9.49
## 2776 4-Alternative/other school     280  143    137           16.1
## 2777 4-Alternative/other school      92   54     38             10
## 2778 4-Alternative/other school      69   36     33              8
## 2779 4-Alternative/other school     304  153    151          25.09
## 2780 4-Alternative/other school       2    1      1           <NA>
## 2781 4-Alternative/other school     246  119    127             41
## 2782 4-Alternative/other school      61   42     19             10
## 2783 4-Alternative/other school      29   22      7              2
## 2784 4-Alternative/other school       7    7      0              1
## 2785 4-Alternative/other school      38   27     11           5.13
## 2786 4-Alternative/other school      24   24      0              4
## 2787 4-Alternative/other school      56   47      9          11.13
## 2788 4-Alternative/other school     227  121    106              9
## 2789 4-Alternative/other school       1    1      0              3
## 2790 4-Alternative/other school      39    6     33              8
## 2791 4-Alternative/other school      21   16      5           <NA>
## 2792 4-Alternative/other school       0    0      0            7.2
## 2793 4-Alternative/other school      22    9     13            1.5
## 2794 4-Alternative/other school       0    0      0           <NA>
## 2795 4-Alternative/other school      55   32     23            1.2
## 2796 4-Alternative/other school       0    0      0           <NA>
## 2797 4-Alternative/other school     228  124    104           19.2
## 2798 4-Alternative/other school     391  238    153          20.79
## 2799 4-Alternative/other school     262  132    130           41.5
## 2800 4-Alternative/other school     113   75     38            6.5
## 2801 4-Alternative/other school      59   34     25            3.6
## 2802 4-Alternative/other school     308  152    156           15.4
## 2803 4-Alternative/other school     122   79     43           6.71
## 2804 4-Alternative/other school     391  234    157             27
## 2805 4-Alternative/other school      10    7      3              1
## 2806 4-Alternative/other school      38   38      0           <NA>
## 2807 4-Alternative/other school     164   87     77          15.99
## 2808 4-Alternative/other school       0    0      0              0
## 2809 4-Alternative/other school     110   53     57           2.33
## 2810 4-Alternative/other school      21   21      0              2
## 2811 4-Alternative/other school       0    0      0              0
## 2812 4-Alternative/other school      48   31     17            6.6
## 2813 4-Alternative/other school      65   29     36           3.65
## 2814 4-Alternative/other school      83   66     17           5.23
## 2815 4-Alternative/other school      15   10      5           1.29
## 2816 4-Alternative/other school      29   26      3           2.87
## 2817 4-Alternative/other school      65   49     16            6.1
## 2818 4-Alternative/other school      22   18      4              2
## 2819 4-Alternative/other school      90   54     36           <NA>
## 2820 4-Alternative/other school      58   44     14          14.22
## 2821 4-Alternative/other school       4    3      1           <NA>
## 2822 4-Alternative/other school       5    3      2              1
## 2823 4-Alternative/other school      18   11      7            1.4
## 2824 4-Alternative/other school       0  n/a    n/a           <NA>
## 2825 4-Alternative/other school     100   48     52            6.2
## 2826 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2827 4-Alternative/other school       5    2      3           1.41
## 2828 4-Alternative/other school       0  n/a    n/a           <NA>
## 2829 4-Alternative/other school      62   47     15           11.8
## 2830 4-Alternative/other school     155   94     61              9
## 2831 4-Alternative/other school      31   21     10           4.19
## 2832 4-Alternative/other school     112   58     54             11
## 2833 4-Alternative/other school     173   97     76          13.43
## 2834 4-Alternative/other school      72   27     45           4.77
## 2835 4-Alternative/other school     142   79     63            5.4
## 2836 4-Alternative/other school     102  102      0             14
## 2837 4-Alternative/other school      98   62     36              5
## 2838 4-Alternative/other school     104    0    104          13.12
## 2839 4-Alternative/other school      10    8      2              1
## 2840 4-Alternative/other school      23   18      5            4.5
## 2841 4-Alternative/other school      46   28     18              2
## 2842 4-Alternative/other school      25    0     25              4
## 2843 4-Alternative/other school      30   11     19           4.79
## 2844 4-Alternative/other school       6    6      0              1
## 2845 4-Alternative/other school      12    5      7            1.4
## 2846 4-Alternative/other school      56   33     23            3.1
## 2847 4-Alternative/other school       7    0      7           1.01
## 2848 4-Alternative/other school     198   97    101          11.84
## 2849 4-Alternative/other school      33   15     18           1.72
## 2850 4-Alternative/other school     155   81     74              9
## 2851 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2852 4-Alternative/other school      45   27     18              2
## 2853 4-Alternative/other school      26   19      7              7
## 2854 4-Alternative/other school      14    9      5              1
## 2855 4-Alternative/other school      31   27      4            5.7
## 2856 4-Alternative/other school       6    5      1           <NA>
## 2857 4-Alternative/other school      47   22     25           4.07
## 2858 4-Alternative/other school       1    1      0           <NA>
## 2859 4-Alternative/other school       8    5      3            0.5
## 2860 4-Alternative/other school      13    6      7            0.5
## 2861 4-Alternative/other school     n/a  n/a    n/a              0
## 2862 4-Alternative/other school     931  487    444             38
## 2863 4-Alternative/other school     168   93     75           <NA>
## 2864 4-Alternative/other school       9    6      3              1
## 2865 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2866 4-Alternative/other school       0    0      0              0
## 2867 4-Alternative/other school      84    0     84           7.88
## 2868 4-Alternative/other school     561  278    283          33.21
## 2869 4-Alternative/other school      58   31     27            4.5
## 2870 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2871 4-Alternative/other school      55   30     25           1.49
## 2872 4-Alternative/other school      18    6     12              0
## 2873 4-Alternative/other school     118   65     53           8.58
## 2874 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2875 4-Alternative/other school     367  240    127          17.34
## 2876 4-Alternative/other school       0    0      0              0
## 2877 4-Alternative/other school      60   29     31              4
## 2878 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2879 4-Alternative/other school     957  475    482          36.34
## 2880 4-Alternative/other school    1655  825    830          64.51
## 2881 4-Alternative/other school       1    1      0           <NA>
## 2882 4-Alternative/other school     164  138     26          16.34
## 2883 4-Alternative/other school     313  164    149             17
## 2884 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2885 4-Alternative/other school       5    4      1           <NA>
## 2886 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2887 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2888 4-Alternative/other school      38   34      4            3.8
## 2889 4-Alternative/other school      58   56      2              5
## 2890 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2891 4-Alternative/other school      53   38     15              5
## 2892 4-Alternative/other school     500  275    225          32.02
## 2893 4-Alternative/other school     n/a  n/a    n/a           2.89
## 2894 4-Alternative/other school      77   77      0             17
## 2895 4-Alternative/other school     n/a  n/a    n/a            8.6
## 2896 4-Alternative/other school     305  159    146             13
## 2897 4-Alternative/other school       0    0      0              0
## 2898 4-Alternative/other school      14    6      8            0.6
## 2899 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2900 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2901 4-Alternative/other school       6    3      3           6.98
## 2902 4-Alternative/other school       1    0      1           <NA>
## 2903 4-Alternative/other school       1    1      0           <NA>
## 2904 4-Alternative/other school      57   42     15             10
## 2905 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2906 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2907 4-Alternative/other school      35   15     20              4
## 2908 4-Alternative/other school       0    0      0           <NA>
## 2909 4-Alternative/other school     251  129    122             12
## 2910 4-Alternative/other school       5    4      1            0.6
## 2911 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2912 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2913 4-Alternative/other school     227  106    121           9.18
## 2914 4-Alternative/other school      73   45     28          31.78
## 2915 4-Alternative/other school       6    1      5              1
## 2916 4-Alternative/other school       0  n/a    n/a           <NA>
## 2917 4-Alternative/other school       5    4      1           0.95
## 2918 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2919 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2920 4-Alternative/other school       0    0      0              0
## 2921 4-Alternative/other school      17   17      0          35.02
## 2922 4-Alternative/other school      16    8      8           1.09
## 2923 4-Alternative/other school       7    7      0            5.5
## 2924 4-Alternative/other school      12    7      5           0.41
## 2925 4-Alternative/other school     155   83     72              6
## 2926 4-Alternative/other school       6    6      0              0
## 2927 4-Alternative/other school       8    8      0           <NA>
## 2928 4-Alternative/other school      29    0     29              5
## 2929 4-Alternative/other school     292  142    150             11
## 2930 4-Alternative/other school       8    7      1           <NA>
## 2931 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 2932 4-Alternative/other school     n/a  n/a    n/a           9.19
## 2933 4-Alternative/other school      19   12      7            0.4
## 2934 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2935 4-Alternative/other school      18   14      4              7
## 2936 4-Alternative/other school      24   15      9              2
## 2937 4-Alternative/other school     127   76     51              6
## 2938 4-Alternative/other school       1    1      0           <NA>
## 2939 4-Alternative/other school     637  305    332           34.7
## 2940 4-Alternative/other school      72   43     29            3.4
## 2941 4-Alternative/other school     174   94     80           14.8
## 2942 4-Alternative/other school      49   21     28            0.8
## 2943 4-Alternative/other school     109   48     61              5
## 2944 4-Alternative/other school     579  289    290          23.49
## 2945 4-Alternative/other school      51   38     13          21.33
## 2946 4-Alternative/other school     n/a  n/a    n/a              9
## 2947 4-Alternative/other school     488  314    174             18
## 2948 4-Alternative/other school      81   57     24            5.4
## 2949 4-Alternative/other school     178  112     66          13.01
## 2950 4-Alternative/other school       3    2      1           1.85
## 2951 4-Alternative/other school      23   15      8           0.75
## 2952 4-Alternative/other school      98   53     45           5.25
## 2953 4-Alternative/other school      99   66     33             12
## 2954 4-Alternative/other school      17    7     10              1
## 2955 4-Alternative/other school       0    0      0              0
## 2956 4-Alternative/other school       0    0      0              0
## 2957 4-Alternative/other school      95   95      0            3.5
## 2958 4-Alternative/other school      59   24     35              6
## 2959 4-Alternative/other school      36   24     12            4.5
## 2960 4-Alternative/other school       3    2      1              1
## 2961 4-Alternative/other school       2    1      1              1
## 2962 4-Alternative/other school      99   55     44            2.5
## 2963 4-Alternative/other school     127   74     53           9.56
## 2964 4-Alternative/other school      12    6      6           1.17
## 2965 4-Alternative/other school     489  267    222          26.79
## 2966 4-Alternative/other school       5    1      4           0.67
## 2967 4-Alternative/other school      14   10      4            1.8
## 2968 4-Alternative/other school      19   16      3            1.2
## 2969 4-Alternative/other school     344  216    128          20.86
## 2970 4-Alternative/other school      88   61     27            5.5
## 2971 4-Alternative/other school      13    0     13              2
## 2972 4-Alternative/other school     230  136     94             16
## 2973 4-Alternative/other school       8    6      2           <NA>
## 2974 4-Alternative/other school       9    5      4            0.8
## 2975 4-Alternative/other school      67   40     27            6.5
## 2976 4-Alternative/other school      67   40     27            2.6
## 2977 4-Alternative/other school      44   28     16              3
## 2978 4-Alternative/other school       4    3      1           <NA>
## 2979 4-Alternative/other school       3    2      1              2
## 2980 4-Alternative/other school     n/a  n/a    n/a             10
## 2981 4-Alternative/other school      52   47      5           <NA>
## 2982 4-Alternative/other school     161   99     62             13
## 2983 4-Alternative/other school      48   48      0           <NA>
## 2984 4-Alternative/other school     386  191    195           17.2
## 2985 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2986 4-Alternative/other school     n/a  n/a    n/a            n/a
## 2987 4-Alternative/other school       6    6      0              0
## 2988 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 2989 4-Alternative/other school     160   79     81             11
## 2990 4-Alternative/other school     124   73     51              7
## 2991 4-Alternative/other school      18    1     17           4.35
## 2992 4-Alternative/other school       2    2      0           <NA>
## 2993 4-Alternative/other school      12   12      0           <NA>
## 2994 4-Alternative/other school      19    0     19              2
## 2995 4-Alternative/other school       5    3      2           <NA>
## 2996 4-Alternative/other school     233  137     96           24.3
## 2997 4-Alternative/other school      42   35      7           5.55
## 2998 4-Alternative/other school      76   69      7          32.95
## 2999 4-Alternative/other school     n/a  n/a    n/a            5.9
## 3000 4-Alternative/other school     106   48     58           9.83
## 3001 4-Alternative/other school      69    0     69              9
## 3002 4-Alternative/other school      41   32      9              0
## 3003 4-Alternative/other school      52   43      9           27.6
## 3004 4-Alternative/other school       0    0      0              0
## 3005 4-Alternative/other school       2    0      2              0
## 3006 4-Alternative/other school      87   50     37            4.5
## 3007 4-Alternative/other school     132   54     78            6.3
## 3008 4-Alternative/other school      82   42     40              0
## 3009 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3010 4-Alternative/other school       2    2      0              1
## 3011 4-Alternative/other school      14    8      6              3
## 3012 4-Alternative/other school      11    6      5              1
## 3013 4-Alternative/other school      11    5      6           1.52
## 3014 4-Alternative/other school     161   85     76          10.89
## 3015 4-Alternative/other school     156   79     77          14.98
## 3016 4-Alternative/other school      60   42     18             18
## 3017 4-Alternative/other school     399  250    149              7
## 3018 4-Alternative/other school      30   27      3            7.5
## 3019 4-Alternative/other school      24    0     24           6.08
## 3020 4-Alternative/other school     170   81     89           15.6
## 3021 4-Alternative/other school     415  216    199             17
## 3022 4-Alternative/other school      15   15      0              2
## 3023 4-Alternative/other school     n/a  n/a    n/a              1
## 3024 4-Alternative/other school      97   60     37           6.42
## 3025 4-Alternative/other school     562  273    289          27.43
## 3026 4-Alternative/other school     165   96     69           20.2
## 3027 4-Alternative/other school      71   36     35              5
## 3028 4-Alternative/other school      69   46     23              3
## 3029 4-Alternative/other school      29   26      3              1
## 3030 4-Alternative/other school      52   35     17              5
## 3031 4-Alternative/other school      51   32     19              3
## 3032 4-Alternative/other school       1    1      0           <NA>
## 3033 4-Alternative/other school       3    3      0           <NA>
## 3034 4-Alternative/other school      77   77      0           <NA>
## 3035 4-Alternative/other school      13    7      6            0.7
## 3036 4-Alternative/other school       1    1      0           0.48
## 3037 4-Alternative/other school     n/a  n/a    n/a              1
## 3038 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3039 4-Alternative/other school      54   31     23              6
## 3040 4-Alternative/other school     158  103     55              5
## 3041 4-Alternative/other school     357  221    136          24.78
## 3042 4-Alternative/other school      76   58     18          13.11
## 3043 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3044 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3045 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3046 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3047 4-Alternative/other school      39   39      0           3.06
## 3048 4-Alternative/other school       0    0      0           <NA>
## 3049 4-Alternative/other school       8    8      0           <NA>
## 3050 4-Alternative/other school      21   16      5              2
## 3051 4-Alternative/other school      84   33     51            6.4
## 3052 4-Alternative/other school     447  209    238           11.8
## 3053 4-Alternative/other school      11    7      4              0
## 3054 4-Alternative/other school      85   44     41            9.2
## 3055 4-Alternative/other school       0    0      0           <NA>
## 3056 4-Alternative/other school      12    9      3              2
## 3057 4-Alternative/other school      13    8      5            8.5
## 3058 4-Alternative/other school     150   83     67             19
## 3059 4-Alternative/other school      26   13     13              3
## 3060 4-Alternative/other school     125  125      0             15
## 3061 4-Alternative/other school      32   32      0              5
## 3062 4-Alternative/other school       2    1      1           <NA>
## 3063 4-Alternative/other school     161  106     55              4
## 3064 4-Alternative/other school     290  147    143          33.13
## 3065 4-Alternative/other school       0    0      0           0.33
## 3066 4-Alternative/other school       3    0      3            0.6
## 3067 4-Alternative/other school      57   38     19            2.4
## 3068 4-Alternative/other school      11    7      4            0.4
## 3069 4-Alternative/other school       6    6      0            0.8
## 3070 4-Alternative/other school      13   12      1            1.2
## 3071 4-Alternative/other school      25   25      0              5
## 3072 4-Alternative/other school      70   35     35            4.8
## 3073 4-Alternative/other school       0    0      0              0
## 3074 4-Alternative/other school      56   33     23            4.2
## 3075 4-Alternative/other school       0    0      0              0
## 3076 4-Alternative/other school      10    9      1              1
## 3077 4-Alternative/other school      40   36      4           4.47
## 3078 4-Alternative/other school      69   42     27          10.02
## 3079 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3080 4-Alternative/other school     400  181    219          19.29
## 3081 4-Alternative/other school      92   50     42           6.46
## 3082 4-Alternative/other school      25   16      9              2
## 3083 4-Alternative/other school      12    9      3              2
## 3084 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3085 4-Alternative/other school     167   96     71          13.16
## 3086 4-Alternative/other school      11    6      5              0
## 3087 4-Alternative/other school     262  140    122           8.55
## 3088 4-Alternative/other school      21   15      6            1.1
## 3089 4-Alternative/other school      95   70     25            9.9
## 3090 4-Alternative/other school      54   48      6              4
## 3091 4-Alternative/other school       9    4      5           0.12
## 3092 4-Alternative/other school     187   83    104          46.24
## 3093 4-Alternative/other school      84   43     41           5.61
## 3094 4-Alternative/other school     133   77     56          11.71
## 3095 4-Alternative/other school     120   68     52           7.48
## 3096 4-Alternative/other school     342  184    158          23.23
## 3097 4-Alternative/other school      30   25      5             11
## 3098 4-Alternative/other school      33   29      4           <NA>
## 3099 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3100 4-Alternative/other school      13   13      0            4.6
## 3101 4-Alternative/other school       3    3      0           <NA>
## 3102 4-Alternative/other school      23   14      9           1.83
## 3103 4-Alternative/other school      84   46     38              5
## 3104 4-Alternative/other school     391  190    201          22.66
## 3105 4-Alternative/other school       7    4      3           <NA>
## 3106 4-Alternative/other school       6    2      4           <NA>
## 3107 4-Alternative/other school     109   82     27             22
## 3108 4-Alternative/other school      27   27      0           <NA>
## 3109 4-Alternative/other school     194   96     98             16
## 3110 4-Alternative/other school      36   28      8              9
## 3111 4-Alternative/other school     189   76    113              1
## 3112 4-Alternative/other school       2    2      0              0
## 3113 4-Alternative/other school     124   95     29           5.25
## 3114 4-Alternative/other school     250  114    136          26.21
## 3115 4-Alternative/other school      18    9      9              1
## 3116 4-Alternative/other school     248  124    124             10
## 3117 4-Alternative/other school     296  157    139           8.89
## 3118 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3119 4-Alternative/other school     169   74     95           2.99
## 3120 4-Alternative/other school     123   57     66           5.93
## 3121 4-Alternative/other school     161   75     86           5.49
## 3122 4-Alternative/other school     348  155    193          14.47
## 3123 4-Alternative/other school     274  114    160             10
## 3124 4-Alternative/other school      17    6     11           1.98
## 3125 4-Alternative/other school       0    0      0              0
## 3126 4-Alternative/other school      50   32     18             19
## 3127 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3128 4-Alternative/other school       0    0      0              0
## 3129 4-Alternative/other school      20   12      8           <NA>
## 3130 4-Alternative/other school      35   27      8              1
## 3131 4-Alternative/other school      50   45      5           <NA>
## 3132 4-Alternative/other school      88   48     40           9.32
## 3133 4-Alternative/other school     413  174    239             30
## 3134 4-Alternative/other school      12   10      2             17
## 3135 4-Alternative/other school      15    8      7           1.84
## 3136 4-Alternative/other school     124   67     57           6.32
## 3137 4-Alternative/other school     114   49     65           6.39
## 3138 4-Alternative/other school     146   63     83           4.09
## 3139 4-Alternative/other school      63   28     35              6
## 3140 4-Alternative/other school       0    0      0            8.6
## 3141 4-Alternative/other school      42   24     18           3.44
## 3142 4-Alternative/other school      43   28     15            0.5
## 3143 4-Alternative/other school       2    1      1              1
## 3144 4-Alternative/other school     225  117    107           <NA>
## 3145 4-Alternative/other school      67   67    n/a           9.84
## 3146 4-Alternative/other school      60   30     30            5.5
## 3147 4-Alternative/other school       0    0      0           <NA>
## 3148 4-Alternative/other school      36   25     11              4
## 3149 4-Alternative/other school     212  157     55           19.1
## 3150 4-Alternative/other school      95   62     33            5.3
## 3151 4-Alternative/other school      51   51      0              1
## 3152 4-Alternative/other school      35   30      5              3
## 3153 4-Alternative/other school       3    3    n/a           <NA>
## 3154 4-Alternative/other school       0    0      0              0
## 3155 4-Alternative/other school       0  n/a    n/a              1
## 3156 4-Alternative/other school      12   11      1           4.25
## 3157 4-Alternative/other school      44   18     26           1.14
## 3158 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3159 4-Alternative/other school    <NA>  n/a    n/a              1
## 3160 4-Alternative/other school       4    1      3           0.73
## 3161 4-Alternative/other school      51   36     15            8.4
## 3162 4-Alternative/other school       0    0      0            0.4
## 3163 4-Alternative/other school     164   96     68             35
## 3164 4-Alternative/other school      15   12      3           <NA>
## 3165 4-Alternative/other school      65   47     18            3.5
## 3166 4-Alternative/other school     102   45     57           <NA>
## 3167 4-Alternative/other school      15    5     10           <NA>
## 3168 4-Alternative/other school      43   20     23              2
## 3169 4-Alternative/other school    1677  782    895          73.01
## 3170 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3171 4-Alternative/other school      44   31     13          14.91
## 3172 4-Alternative/other school      28   22      6           5.02
## 3173 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3174 4-Alternative/other school       0    0      0              0
## 3175 4-Alternative/other school       3    3      0           <NA>
## 3176 4-Alternative/other school       0    0      0              0
## 3177 4-Alternative/other school       0    0      0              0
## 3178 4-Alternative/other school      15   15    n/a           <NA>
## 3179 4-Alternative/other school       4    4      0           <NA>
## 3180 4-Alternative/other school       0    0      0              0
## 3181 4-Alternative/other school     139   76     63            1.2
## 3182 4-Alternative/other school      36   19     17           8.41
## 3183 4-Alternative/other school       0    0      0              0
## 3184 4-Alternative/other school       2    0      2           0.34
## 3185 4-Alternative/other school       0    0      0              0
## 3186 4-Alternative/other school       2    1      1           <NA>
## 3187 4-Alternative/other school      45   18     27           <NA>
## 3188 4-Alternative/other school       4    4      0              1
## 3189 4-Alternative/other school      11    6      5            0.5
## 3190 4-Alternative/other school     300  192    108           17.1
## 3191 4-Alternative/other school      13   10      3           0.88
## 3192 4-Alternative/other school       0    0      0              0
## 3193 4-Alternative/other school      23   14      9           2.19
## 3194 4-Alternative/other school     273  140    133             15
## 3195 4-Alternative/other school      49   31     18            2.5
## 3196 4-Alternative/other school       1    0      1           <NA>
## 3197 4-Alternative/other school       7    4      3           <NA>
## 3198 4-Alternative/other school     n/a  n/a    n/a           11.5
## 3199 4-Alternative/other school      56   49      7          42.05
## 3200 4-Alternative/other school      25   14     11              3
## 3201 4-Alternative/other school       0    0      0           <NA>
## 3202 4-Alternative/other school      20   10     10              3
## 3203 4-Alternative/other school      89   54     35           9.04
## 3204 4-Alternative/other school     217   99    118           12.1
## 3205 4-Alternative/other school      44   14     30            1.5
## 3206 4-Alternative/other school     123   50     73           3.02
## 3207 4-Alternative/other school      57   37     20           4.68
## 3208 4-Alternative/other school     150   97     53              6
## 3209 4-Alternative/other school      62   44     18            3.5
## 3210 4-Alternative/other school     142   83     59           10.5
## 3211 4-Alternative/other school       7    7      0              1
## 3212 4-Alternative/other school      10    9      1           1.33
## 3213 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3214 4-Alternative/other school       6    1      5           <NA>
## 3215 4-Alternative/other school      42   33      9           5.96
## 3216 4-Alternative/other school      25   15     10           3.04
## 3217 4-Alternative/other school     140   76     64            3.3
## 3218 4-Alternative/other school      36   14     22            2.1
## 3219 4-Alternative/other school       0    0      0            0.9
## 3220 4-Alternative/other school       7    0      7              1
## 3221 4-Alternative/other school      19   14      5            1.2
## 3222 4-Alternative/other school     172   72    100              8
## 3223 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3224 4-Alternative/other school      24   16      8            0.6
## 3225 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3226 4-Alternative/other school       8    7      1           <NA>
## 3227 4-Alternative/other school       4    1      3           <NA>
## 3228 4-Alternative/other school      48   16     32           <NA>
## 3229 4-Alternative/other school      18    9      9           <NA>
## 3230 4-Alternative/other school     n/a  n/a    n/a           0.33
## 3231 4-Alternative/other school       2    1      1           <NA>
## 3232 4-Alternative/other school      28   20      8           <NA>
## 3233 4-Alternative/other school     n/a  n/a    n/a              3
## 3234 4-Alternative/other school      39   21     18            2.3
## 3235 4-Alternative/other school      92   47     45              4
## 3236 4-Alternative/other school     n/a  n/a    n/a              0
## 3237 4-Alternative/other school      10    6      4           0.83
## 3238 4-Alternative/other school      11    6      5           6.94
## 3239 4-Alternative/other school      75   35     40           6.88
## 3240 4-Alternative/other school      22   10     12            2.5
## 3241 4-Alternative/other school      18   15      3           3.83
## 3242 4-Alternative/other school     193  116     77             12
## 3243 4-Alternative/other school      99   75     24          30.55
## 3244 4-Alternative/other school      64   34     30              0
## 3245 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3246 4-Alternative/other school     147   71     76           <NA>
## 3247 4-Alternative/other school      47   24     23              3
## 3248 4-Alternative/other school       0  n/a    n/a              5
## 3249 4-Alternative/other school      50   36     14           4.95
## 3250 4-Alternative/other school     249  154     95           <NA>
## 3251 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3252 4-Alternative/other school     246   97    149          10.05
## 3253 4-Alternative/other school     122   82     40             10
## 3254 4-Alternative/other school     286  168    118          22.27
## 3255 4-Alternative/other school      18   12      6              1
## 3256 4-Alternative/other school     242  145     97           10.8
## 3257 4-Alternative/other school      17   12      5            0.5
## 3258 4-Alternative/other school      80   39     41            2.4
## 3259 4-Alternative/other school     164  111     53             12
## 3260 4-Alternative/other school     360  167    193           25.2
## 3261 4-Alternative/other school      83   50     33           6.92
## 3262 4-Alternative/other school      48   48    n/a           <NA>
## 3263 4-Alternative/other school      34   24     10              4
## 3264 4-Alternative/other school       0    0      0              0
## 3265 4-Alternative/other school      18    3     15           7.11
## 3266 4-Alternative/other school      34   19     15           3.93
## 3267 4-Alternative/other school      38   22     16              9
## 3268 4-Alternative/other school     186  117     69          16.27
## 3269 4-Alternative/other school     142   73     69           6.75
## 3270 4-Alternative/other school      28   15     13              6
## 3271 4-Alternative/other school     240   95    145             13
## 3272 4-Alternative/other school       1    0      1            0.4
## 3273 4-Alternative/other school      54   36     18            2.5
## 3274 4-Alternative/other school     203  104     99           8.27
## 3275 4-Alternative/other school     135  113     22              9
## 3276 4-Alternative/other school      64   34     30              5
## 3277 4-Alternative/other school      39   23     16           1.02
## 3278 4-Alternative/other school     426  277    149           20.2
## 3279 4-Alternative/other school      78   41     37           4.28
## 3280 4-Alternative/other school      32   14     18              0
## 3281 4-Alternative/other school      77   77      0          11.94
## 3282 4-Alternative/other school     n/a  n/a    n/a              4
## 3283 4-Alternative/other school      21   11     10           1.91
## 3284 4-Alternative/other school      29   17     12           1.49
## 3285 4-Alternative/other school     252  117    135           14.5
## 3286 4-Alternative/other school      47   47      0              5
## 3287 4-Alternative/other school     170   63    107           5.78
## 3288 4-Alternative/other school      18   16      2              3
## 3289 4-Alternative/other school     244  111    133              7
## 3290 4-Alternative/other school      98   98    n/a             26
## 3291 4-Alternative/other school       2    2      0           <NA>
## 3292 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3293 4-Alternative/other school       4    4    n/a              2
## 3294 4-Alternative/other school      50   30     20              3
## 3295 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3296 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3297 4-Alternative/other school       0    0      0              0
## 3298 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3299 4-Alternative/other school     103   65     38            6.5
## 3300 4-Alternative/other school       9    6      3              1
## 3301 4-Alternative/other school       0    0      0           <NA>
## 3302 4-Alternative/other school     165   77     88            8.7
## 3303 4-Alternative/other school      31   10     21              2
## 3304 4-Alternative/other school      12    8      4              1
## 3305 4-Alternative/other school       1    1      0          101.2
## 3306 4-Alternative/other school       0    0      0           <NA>
## 3307 4-Alternative/other school      19    9     10              1
## 3308 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3309 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3310 4-Alternative/other school       3    2      1           <NA>
## 3311 4-Alternative/other school       2    2      0           <NA>
## 3312 4-Alternative/other school    <NA>  n/a    n/a            0.2
## 3313 4-Alternative/other school     n/a  n/a    n/a            5.5
## 3314 4-Alternative/other school       0    0      0              0
## 3315 4-Alternative/other school       6    3      3              1
## 3316 4-Alternative/other school      24   13     11              1
## 3317 4-Alternative/other school     139   83     56              5
## 3318 4-Alternative/other school      19    5     14            1.5
## 3319 4-Alternative/other school       0    0      0              0
## 3320 4-Alternative/other school     n/a  n/a    n/a           4.59
## 3321 4-Alternative/other school     475  258    217          14.34
## 3322 4-Alternative/other school     330  165    165          10.32
## 3323 4-Alternative/other school      33   22     11              3
## 3324 4-Alternative/other school      10    7      3              0
## 3325 4-Alternative/other school       7    4      3            2.1
## 3326 4-Alternative/other school      39   37      2             22
## 3327 4-Alternative/other school      53   31     22           2.94
## 3328 4-Alternative/other school     227  155     72             22
## 3329 4-Alternative/other school     958  520    438             30
## 3330 4-Alternative/other school      30   26      4              7
## 3331 4-Alternative/other school      52   31     21           <NA>
## 3332 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3333 4-Alternative/other school       4    4      0           <NA>
## 3334 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3335 4-Alternative/other school       0    0      0              0
## 3336 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3337 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3338 4-Alternative/other school       8    8      0           2.53
## 3339 4-Alternative/other school       0    0      0              0
## 3340 4-Alternative/other school       0    0      0              0
## 3341 4-Alternative/other school       1    0      1           <NA>
## 3342 4-Alternative/other school    <NA>  n/a    n/a              6
## 3343 4-Alternative/other school      57   28     29          19.28
## 3344 4-Alternative/other school     141   63     78          11.96
## 3345 4-Alternative/other school      13    6      7           <NA>
## 3346 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3347 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3348 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3349 4-Alternative/other school      80   56     24           <NA>
## 3350 4-Alternative/other school      93   46     47           <NA>
## 3351 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3352 4-Alternative/other school     117   20     97           18.3
## 3353 4-Alternative/other school      35   25     10              2
## 3354 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3355 4-Alternative/other school      75   39     36           6.15
## 3356 4-Alternative/other school      47   17     30           5.93
## 3357 4-Alternative/other school    <NA>  n/a    n/a              2
## 3358 4-Alternative/other school      38   17     21           8.57
## 3359 4-Alternative/other school      73   44     29           <NA>
## 3360 4-Alternative/other school     122   75     47          13.02
## 3361 4-Alternative/other school      66   50     16              9
## 3362 4-Alternative/other school      13   13      0              1
## 3363 4-Alternative/other school       0    0      0           0.18
## 3364 4-Alternative/other school      21   14      7            1.2
## 3365 4-Alternative/other school     269  154    115          14.33
## 3366 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3367 4-Alternative/other school      66   40     26          11.86
## 3368 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3369 4-Alternative/other school      87   87    n/a           <NA>
## 3370 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3371 4-Alternative/other school      96   81     15             17
## 3372 4-Alternative/other school       4    4      0           <NA>
## 3373 4-Alternative/other school      11    7      4           1.17
## 3374 4-Alternative/other school      74   47     27            1.3
## 3375 4-Alternative/other school     392  205    187          33.39
## 3376 4-Alternative/other school      46   25     21              1
## 3377 4-Alternative/other school      10    6      4            0.5
## 3378 4-Alternative/other school      74   49     25           1.51
## 3379 4-Alternative/other school       0    0      0           0.22
## 3380 4-Alternative/other school       0    0      0              0
## 3381 4-Alternative/other school       0    0      0              0
## 3382 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3383 4-Alternative/other school      55   31     24           4.83
## 3384 4-Alternative/other school      99   53     46          11.07
## 3385 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3386 4-Alternative/other school     393  198    195           17.7
## 3387 4-Alternative/other school     125   85     40           9.95
## 3388 4-Alternative/other school     111   76     35           8.67
## 3389 4-Alternative/other school     155   82     73            7.4
## 3390 4-Alternative/other school      88   28     60          40.01
## 3391 4-Alternative/other school      17    7     10           <NA>
## 3392 4-Alternative/other school      19    8     11              9
## 3393 4-Alternative/other school       0    0      0              0
## 3394 4-Alternative/other school     115   52     63           9.11
## 3395 4-Alternative/other school     514  300    214          44.13
## 3396 4-Alternative/other school     180   89     91             29
## 3397 4-Alternative/other school      89   53     36              2
## 3398 4-Alternative/other school     127   71     56              0
## 3399 4-Alternative/other school       1    1      0            0.4
## 3400 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3401 4-Alternative/other school      17   16      1              3
## 3402 4-Alternative/other school     n/a  n/a    n/a           43.4
## 3403 4-Alternative/other school      15   13      2           5.33
## 3404 4-Alternative/other school       3    3      0            1.4
## 3405 4-Alternative/other school       0    0      0              7
## 3406 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3407 4-Alternative/other school       3    0      3           <NA>
## 3408 4-Alternative/other school     169  148     21             17
## 3409 4-Alternative/other school       0    0      0           0.53
## 3410 4-Alternative/other school     218  128     90           17.3
## 3411 4-Alternative/other school      71   38     33           4.85
## 3412 4-Alternative/other school      28   13     15           0.75
## 3413 4-Alternative/other school      24   19      5           <NA>
## 3414 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3415 4-Alternative/other school       5    5      0           2.95
## 3416 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3417 4-Alternative/other school       1    0      1           0.05
## 3418 4-Alternative/other school       0    0      0              0
## 3419 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3420 4-Alternative/other school       2    2      0            0.6
## 3421 4-Alternative/other school      18   11      7           <NA>
## 3422 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3423 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3424 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3425 4-Alternative/other school      37   20     17           5.89
## 3426 4-Alternative/other school       0    0      0            0.5
## 3427 4-Alternative/other school     141   82     59              6
## 3428 4-Alternative/other school      31   25      6           2.24
## 3429 4-Alternative/other school     234  127    107              1
## 3430 4-Alternative/other school       0    0      0           <NA>
## 3431 4-Alternative/other school      40   40      0             11
## 3432 4-Alternative/other school      51   30     21           2.49
## 3433 4-Alternative/other school      25   21      4              4
## 3434 4-Alternative/other school     n/a  n/a    n/a           3.43
## 3435 4-Alternative/other school      25   15     10           <NA>
## 3436 4-Alternative/other school      86   36     50             11
## 3437 4-Alternative/other school       4    0      4            0.3
## 3438 4-Alternative/other school     267  170     97              6
## 3439 4-Alternative/other school     319  190    129          26.03
## 3440 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3441 4-Alternative/other school      98   62     36            7.5
## 3442 4-Alternative/other school     116   60     56              5
## 3443 4-Alternative/other school       8    3      5           0.44
## 3444 4-Alternative/other school     155   67     88              7
## 3445 4-Alternative/other school     319  201    118              9
## 3446 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3447 4-Alternative/other school     285  205     80             16
## 3448 4-Alternative/other school     375  263    112           <NA>
## 3449 4-Alternative/other school      43   20     23           7.35
## 3450 4-Alternative/other school      91   39     52           3.59
## 3451 4-Alternative/other school     296  160    136             23
## 3452 4-Alternative/other school      40   28     12            2.8
## 3453 4-Alternative/other school      49   23     26            4.1
## 3454 4-Alternative/other school     175   73    102           <NA>
## 3455 4-Alternative/other school      17   15      2              2
## 3456 4-Alternative/other school     110   43     67            3.6
## 3457 4-Alternative/other school      84   62     22              8
## 3458 4-Alternative/other school     169   94     75          13.52
## 3459 4-Alternative/other school     177   82     95          11.33
## 3460 4-Alternative/other school      29   13     16              7
## 3461 4-Alternative/other school     197  128     69              5
## 3462 4-Alternative/other school      58   43     15            3.9
## 3463 4-Alternative/other school      23   18      5              2
## 3464 4-Alternative/other school      27   19      8              6
## 3465 4-Alternative/other school      48   36     12              7
## 3466 4-Alternative/other school       1    1    n/a           <NA>
## 3467 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3468 4-Alternative/other school     n/a  n/a    n/a            6.6
## 3469 4-Alternative/other school     n/a  n/a    n/a              3
## 3470 4-Alternative/other school      31   26      5            1.5
## 3471 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3472 4-Alternative/other school      35   35      0              3
## 3473 4-Alternative/other school       8    4      4           2.02
## 3474 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3475 4-Alternative/other school     141   86     55              5
## 3476 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3477 4-Alternative/other school      10    7      3            0.6
## 3478 4-Alternative/other school      61   30     31           6.25
## 3479 4-Alternative/other school      54   27     27           3.72
## 3480 4-Alternative/other school       0    0      0              0
## 3481 4-Alternative/other school       0    0      0              0
## 3482 4-Alternative/other school       2    2      0           <NA>
## 3483 4-Alternative/other school      62   36     26              5
## 3484 4-Alternative/other school      65   38     27              0
## 3485 4-Alternative/other school     134   58     76            6.2
## 3486 4-Alternative/other school      19   13      6              0
## 3487 4-Alternative/other school      27   21      6           3.35
## 3488 4-Alternative/other school      90   51     39            4.2
## 3489 4-Alternative/other school      83   54     29            7.4
## 3490 4-Alternative/other school      91   54     37           3.75
## 3491 4-Alternative/other school      21   15      6           2.97
## 3492 4-Alternative/other school       0    0      0           2.25
## 3493 4-Alternative/other school     128   70     58              2
## 3494 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3495 4-Alternative/other school     n/a  n/a    n/a              3
## 3496 4-Alternative/other school     157   85     72              7
## 3497 4-Alternative/other school      48   17     31              3
## 3498 4-Alternative/other school     312  132    180          16.81
## 3499 4-Alternative/other school     117   49     68              4
## 3500 4-Alternative/other school      15    7      8              2
## 3501 4-Alternative/other school       0    0      0              0
## 3502 4-Alternative/other school      45   24     21              2
## 3503 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3504 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3505 4-Alternative/other school       3    3      0           <NA>
## 3506 4-Alternative/other school       8    6      2           <NA>
## 3507 4-Alternative/other school       2    2      0           <NA>
## 3508 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3509 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3510 4-Alternative/other school     137   84     53           6.75
## 3511 4-Alternative/other school     214  141     73          17.56
## 3512 4-Alternative/other school      48   30     18           7.33
## 3513 4-Alternative/other school       1    1      0              0
## 3514 4-Alternative/other school       4    2      2              1
## 3515 4-Alternative/other school    1017  995     22          40.01
## 3516 4-Alternative/other school       0    0      0          19.82
## 3517 4-Alternative/other school    2247 1079   1168         125.44
## 3518 4-Alternative/other school      64   39     25           4.95
## 3519 4-Alternative/other school       5    0      5            1.4
## 3520 4-Alternative/other school      52   16     36              2
## 3521 4-Alternative/other school       0    0      0           <NA>
## 3522 4-Alternative/other school    1086  649    437           6.99
## 3523 4-Alternative/other school     194   75    119              7
## 3524 4-Alternative/other school      85   33     52           6.49
## 3525 4-Alternative/other school      44   33     11           <NA>
## 3526 4-Alternative/other school      46   41      5           7.34
## 3527 4-Alternative/other school      31   17     14              3
## 3528 4-Alternative/other school      90   56     34            6.2
## 3529 4-Alternative/other school     111   63     48              2
## 3530 4-Alternative/other school      15   15      0              1
## 3531 4-Alternative/other school       3    3    n/a           <NA>
## 3532 4-Alternative/other school     187   79    108             13
## 3533 4-Alternative/other school     367  213    154             24
## 3534 4-Alternative/other school     198  130     68           5.39
## 3535 4-Alternative/other school      34   18     16           2.81
## 3536 4-Alternative/other school      85   49     36          10.35
## 3537 4-Alternative/other school       0    0      0              0
## 3538 4-Alternative/other school      98   38     60              3
## 3539 4-Alternative/other school      38   26     12           3.67
## 3540 4-Alternative/other school      85   35     50              4
## 3541 4-Alternative/other school     368  160    208          10.52
## 3542 4-Alternative/other school      28   18     10              2
## 3543 4-Alternative/other school     795  339    456          35.41
## 3544 4-Alternative/other school      70   29     41           2.51
## 3545 4-Alternative/other school      31   12     19              1
## 3546 4-Alternative/other school      12   11      1           <NA>
## 3547 4-Alternative/other school       7    7    n/a           <NA>
## 3548 4-Alternative/other school      21   11     10           <NA>
## 3549 4-Alternative/other school     140   90     50            8.3
## 3550 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3551 4-Alternative/other school     619  312    307          32.76
## 3552 4-Alternative/other school       4    4      0           1.38
## 3553 4-Alternative/other school     113   70     43            5.5
## 3554 4-Alternative/other school     197   81    116           15.5
## 3555 4-Alternative/other school      91   42     49            4.3
## 3556 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3557 4-Alternative/other school       4    4      0           0.73
## 3558 4-Alternative/other school      15   13      2              2
## 3559 4-Alternative/other school      18   13      5              2
## 3560 4-Alternative/other school       0    0      0              0
## 3561 4-Alternative/other school     251  173     78             13
## 3562 4-Alternative/other school      10    8      2           <NA>
## 3563 4-Alternative/other school     125   76     49             29
## 3564 4-Alternative/other school      71   71      0           <NA>
## 3565 4-Alternative/other school      21    9     12              1
## 3566 4-Alternative/other school      77   25     52              1
## 3567 4-Alternative/other school     158   99     59             11
## 3568 4-Alternative/other school      26   26      0              2
## 3569 4-Alternative/other school     152  152      0             10
## 3570 4-Alternative/other school     130   64     66          28.65
## 3571 4-Alternative/other school      69   53     16           17.5
## 3572 4-Alternative/other school      64   36     28          11.75
## 3573 4-Alternative/other school     245  151     94             24
## 3574 4-Alternative/other school      50   25     25           6.85
## 3575 4-Alternative/other school     n/a  n/a    n/a           3.01
## 3576 4-Alternative/other school      19   10      9           3.26
## 3577 4-Alternative/other school     149   83     66            6.5
## 3578 4-Alternative/other school     286  137    149           13.8
## 3579 4-Alternative/other school      16    5     11           1.75
## 3580 4-Alternative/other school      41   41      0           2.21
## 3581 4-Alternative/other school      56   52      4             29
## 3582 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3583 4-Alternative/other school      54   26     28              0
## 3584 4-Alternative/other school      39   21     18              0
## 3585 4-Alternative/other school      93   59     34              0
## 3586 4-Alternative/other school       0    0      0              0
## 3587 4-Alternative/other school     442  251    191              0
## 3588 4-Alternative/other school       9    5      4              0
## 3589 4-Alternative/other school       7    5      2              0
## 3590 4-Alternative/other school      13    8      5            0.4
## 3591 4-Alternative/other school      66   34     32              0
## 3592 4-Alternative/other school      77   27     50              0
## 3593 4-Alternative/other school     232  121    111            4.2
## 3594 4-Alternative/other school       3    2      1              0
## 3595 4-Alternative/other school      69   28     41            1.5
## 3596 4-Alternative/other school      80   61     19          25.06
## 3597 4-Alternative/other school      23    7     16              1
## 3598 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3599 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3600 4-Alternative/other school      94   17     77            2.2
## 3601 4-Alternative/other school      46   37      9            3.2
## 3602 4-Alternative/other school      26   13     13           0.88
## 3603 4-Alternative/other school     n/a  n/a    n/a              2
## 3604 4-Alternative/other school     n/a  n/a    n/a              2
## 3605 4-Alternative/other school     n/a  n/a    n/a              0
## 3606 4-Alternative/other school      28   12     16            2.3
## 3607 4-Alternative/other school      18    4     14              1
## 3608 4-Alternative/other school      64   32     32              7
## 3609 4-Alternative/other school       0    0      0              0
## 3610 4-Alternative/other school     117   59     58          14.99
## 3611 4-Alternative/other school     157   71     86          11.79
## 3612 4-Alternative/other school     562  283    279            9.5
## 3613 4-Alternative/other school     133   61     72           9.65
## 3614 4-Alternative/other school     131   97     34          12.05
## 3615 4-Alternative/other school      52   52      0              6
## 3616 4-Alternative/other school     213  137     76          17.68
## 3617 4-Alternative/other school     391  203    188          23.75
## 3618 4-Alternative/other school     153   69     84              6
## 3619 4-Alternative/other school      72   39     33              5
## 3620 4-Alternative/other school       0    0      0           <NA>
## 3621 4-Alternative/other school     211  107    104              9
## 3622 4-Alternative/other school       3    2      1              1
## 3623 4-Alternative/other school      38   29      9            2.4
## 3624 4-Alternative/other school       8    6      2              2
## 3625 4-Alternative/other school     321  207    114           17.6
## 3626 4-Alternative/other school     832  330    502           36.5
## 3627 4-Alternative/other school     545  286    259          27.51
## 3628 4-Alternative/other school      61   61      0              5
## 3629 4-Alternative/other school       8    2      6           0.46
## 3630 4-Alternative/other school      12   12    n/a           <NA>
## 3631 4-Alternative/other school      12    5      7            0.5
## 3632 4-Alternative/other school       9    4      5            0.1
## 3633 4-Alternative/other school      11    6      5           <NA>
## 3634 4-Alternative/other school       0    0      0          16.82
## 3635 4-Alternative/other school      55   36     19           <NA>
## 3636 4-Alternative/other school      28   21      7            1.4
## 3637 4-Alternative/other school      38    0     38              4
## 3638 4-Alternative/other school      24    5     19           2.75
## 3639 4-Alternative/other school      22   22      0           2.11
## 3640 4-Alternative/other school       0    0      0           1.69
## 3641 4-Alternative/other school      36   27      9            5.8
## 3642 4-Alternative/other school      64   20     44              5
## 3643 4-Alternative/other school       0    0      0              0
## 3644 4-Alternative/other school      13   13      0              2
## 3645 4-Alternative/other school      37   23     14              1
## 3646 4-Alternative/other school      67   33     34           6.76
## 3647 4-Alternative/other school       0    0      0              0
## 3648 4-Alternative/other school       0    0      0              0
## 3649 4-Alternative/other school      23   13     10              3
## 3650 4-Alternative/other school       0    0      0           12.5
## 3651 4-Alternative/other school      99   62     37              6
## 3652 4-Alternative/other school      99   50     49            4.7
## 3653 4-Alternative/other school       0    0      0              1
## 3654 4-Alternative/other school      51   30     21           3.25
## 3655 4-Alternative/other school      47   30     17              5
## 3656 4-Alternative/other school     n/a  n/a    n/a           0.07
## 3657 4-Alternative/other school     248  114    134          24.42
## 3658 4-Alternative/other school       0    0      0           <NA>
## 3659 4-Alternative/other school      49   49    n/a           9.41
## 3660 4-Alternative/other school       0    0      0           <NA>
## 3661 4-Alternative/other school      65   65    n/a          10.93
## 3662 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3663 4-Alternative/other school       5    4      1           0.25
## 3664 4-Alternative/other school       8    7      1           3.19
## 3665 4-Alternative/other school       9    7      2           <NA>
## 3666 4-Alternative/other school       5    4      1           <NA>
## 3667 4-Alternative/other school       7    7      0           <NA>
## 3668 4-Alternative/other school      11    4      7           <NA>
## 3669 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3670 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3671 4-Alternative/other school       7    3      4           5.32
## 3672 4-Alternative/other school      15   10      5           <NA>
## 3673 4-Alternative/other school       1    0      1           <NA>
## 3674 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3675 4-Alternative/other school      41   18     23           5.32
## 3676 4-Alternative/other school      43    0     43           <NA>
## 3677 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3678 4-Alternative/other school      80   45     35              6
## 3679 4-Alternative/other school       3    2      1              1
## 3680 4-Alternative/other school      82   36     46          19.46
## 3681 4-Alternative/other school      58    0     58              8
## 3682 4-Alternative/other school      55    0     55             10
## 3683 4-Alternative/other school      58    0     58           <NA>
## 3684 4-Alternative/other school      55    0     55           <NA>
## 3685 4-Alternative/other school      38    0     38              4
## 3686 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3687 4-Alternative/other school      66    0     66              4
## 3688 4-Alternative/other school      55    1     54              6
## 3689 4-Alternative/other school      55    0     55              2
## 3690 4-Alternative/other school      34    0     34              1
## 3691 4-Alternative/other school      39    0     39           <NA>
## 3692 4-Alternative/other school      47    0     47              5
## 3693 4-Alternative/other school      61    0     61              7
## 3694 4-Alternative/other school      93    0     93           <NA>
## 3695 4-Alternative/other school      35    0     35              2
## 3696 4-Alternative/other school      61    0     61           <NA>
## 3697 4-Alternative/other school      47    0     47              6
## 3698 4-Alternative/other school      56    0     56              9
## 3699 4-Alternative/other school      53   30     23              4
## 3700 4-Alternative/other school     142  103     39            9.8
## 3701 4-Alternative/other school      57   34     23            2.4
## 3702 4-Alternative/other school       0    0      0              0
## 3703 4-Alternative/other school     153   92     61          12.45
## 3704 4-Alternative/other school      30   17     13           4.37
## 3705 4-Alternative/other school       0    0      0           <NA>
## 3706 4-Alternative/other school      53   21     32           0.17
## 3707 4-Alternative/other school      17    8      9           0.84
## 3708 4-Alternative/other school      20    9     11              6
## 3709 4-Alternative/other school      44   19     25            2.3
## 3710 4-Alternative/other school       3    3      0              1
## 3711 4-Alternative/other school      33   26      7            2.4
## 3712 4-Alternative/other school       7    6      1              1
## 3713 4-Alternative/other school     319  180    139              6
## 3714 4-Alternative/other school      25   24      1              7
## 3715 4-Alternative/other school      70   70      0              8
## 3716 4-Alternative/other school      46   39      7              5
## 3717 4-Alternative/other school      46   45      1           <NA>
## 3718 4-Alternative/other school      59   28     31             20
## 3719 4-Alternative/other school      74   48     26           3.08
## 3720 4-Alternative/other school     273  182     91          23.28
## 3721 4-Alternative/other school      27   16     11           2.59
## 3722 4-Alternative/other school      71   42     29           <NA>
## 3723 4-Alternative/other school      27   21      6              1
## 3724 4-Alternative/other school     114   64     50           3.42
## 3725 4-Alternative/other school     122   55     67           4.44
## 3726 4-Alternative/other school      22   10     12            2.5
## 3727 4-Alternative/other school       6    2      4              2
## 3728 4-Alternative/other school      18   13      5            3.6
## 3729 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3730 4-Alternative/other school      92   48     44           4.03
## 3731 4-Alternative/other school       4    2      2            0.5
## 3732 4-Alternative/other school      18   12      6           4.12
## 3733 4-Alternative/other school     581  292    289          33.12
## 3734 4-Alternative/other school     238  158     80          12.25
## 3735 4-Alternative/other school      33   18     15              1
## 3736 4-Alternative/other school      11   11      0           1.26
## 3737 4-Alternative/other school     212  100    112           6.83
## 3738 4-Alternative/other school      67   54     13             13
## 3739 4-Alternative/other school      16    0     16           2.97
## 3740 4-Alternative/other school      29   29      0           3.94
## 3741 4-Alternative/other school      12    7      5           14.6
## 3742 4-Alternative/other school       2    2      0              0
## 3743 4-Alternative/other school     n/a  n/a    n/a              7
## 3744 4-Alternative/other school      30   22      8           6.25
## 3745 4-Alternative/other school      42   26     16              6
## 3746 4-Alternative/other school     n/a  n/a    n/a          10.71
## 3747 4-Alternative/other school      40   18     22              5
## 3748 4-Alternative/other school     109   60     49           6.87
## 3749 4-Alternative/other school     458  225    233             19
## 3750 4-Alternative/other school     108   49     59              5
## 3751 4-Alternative/other school      31   18     13            1.6
## 3752 4-Alternative/other school     n/a  n/a    n/a              1
## 3753 4-Alternative/other school       6    6      0           <NA>
## 3754 4-Alternative/other school       0    0      0              0
## 3755 4-Alternative/other school       2    1      1              1
## 3756 4-Alternative/other school      13    8      5           <NA>
## 3757 4-Alternative/other school       0    0      0          13.65
## 3758 4-Alternative/other school      36   30      6           <NA>
## 3759 4-Alternative/other school      55   48      7          20.47
## 3760 4-Alternative/other school      20   20      0            2.5
## 3761 4-Alternative/other school     n/a  n/a    n/a              6
## 3762 4-Alternative/other school     487  244    243          32.16
## 3763 4-Alternative/other school      52   21     31            2.8
## 3764 4-Alternative/other school       5    3      2              1
## 3765 4-Alternative/other school      24   18      6            4.5
## 3766 4-Alternative/other school       4    4      0              1
## 3767 4-Alternative/other school     154   81     73              4
## 3768 4-Alternative/other school      87   45     42              5
## 3769 4-Alternative/other school      29   29      0              3
## 3770 4-Alternative/other school     356  195    161           23.5
## 3771 4-Alternative/other school      65   50     15             11
## 3772 4-Alternative/other school      16   14      2              2
## 3773 4-Alternative/other school       1    1      0           <NA>
## 3774 4-Alternative/other school     322  201    121          17.86
## 3775 4-Alternative/other school      19   11      8           4.84
## 3776 4-Alternative/other school     143   80     63              3
## 3777 4-Alternative/other school      56   26     30          15.48
## 3778 4-Alternative/other school     129   79     50          13.42
## 3779 4-Alternative/other school      37   18     19              1
## 3780 4-Alternative/other school       4    3      1              1
## 3781 4-Alternative/other school      18   13      5           <NA>
## 3782 4-Alternative/other school     140   77     63             18
## 3783 4-Alternative/other school      63   41     22            4.1
## 3784 4-Alternative/other school     n/a  n/a    n/a           3.25
## 3785 4-Alternative/other school     104   77     27              9
## 3786 4-Alternative/other school     115   62     53             13
## 3787 4-Alternative/other school       3    1      2           <NA>
## 3788 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3789 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3790 4-Alternative/other school     172   98     74             24
## 3791 4-Alternative/other school     190   92     98           7.95
## 3792 4-Alternative/other school      18    8     10              1
## 3793 4-Alternative/other school      94    0     94              7
## 3794 4-Alternative/other school     653  324    329          41.99
## 3795 4-Alternative/other school     125   69     56              6
## 3796 4-Alternative/other school     146  146      0             22
## 3797 4-Alternative/other school      27   16     11           0.96
## 3798 4-Alternative/other school       6    4      2           1.28
## 3799 4-Alternative/other school      23   14      9              2
## 3800 4-Alternative/other school    <NA>  n/a    n/a            5.7
## 3801 4-Alternative/other school     141   97     44            5.6
## 3802 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3803 4-Alternative/other school      79   46     33          11.44
## 3804 4-Alternative/other school      57   33     24            6.5
## 3805 4-Alternative/other school       4    2      2           <NA>
## 3806 4-Alternative/other school     107   58     49              7
## 3807 4-Alternative/other school     109   44     65            7.7
## 3808 4-Alternative/other school      36   23     13            4.2
## 3809 4-Alternative/other school      59   23     36           7.29
## 3810 4-Alternative/other school     253  168     85          11.05
## 3811 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3812 4-Alternative/other school       5    5      0              2
## 3813 4-Alternative/other school       0  n/a    n/a           <NA>
## 3814 4-Alternative/other school     117   76     41            9.5
## 3815 4-Alternative/other school     144   42    102          21.22
## 3816 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3817 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3818 4-Alternative/other school     158   95     63              9
## 3819 4-Alternative/other school      87   67     20             12
## 3820 4-Alternative/other school     118   63     55          29.68
## 3821 4-Alternative/other school       6    6      0           4.72
## 3822 4-Alternative/other school      32   24      8            6.5
## 3823 4-Alternative/other school       9    9      0              1
## 3824 4-Alternative/other school       6    4      2           0.47
## 3825 4-Alternative/other school      19   15      4            4.5
## 3826 4-Alternative/other school       8    6      2              1
## 3827 4-Alternative/other school      31   17     14           8.34
## 3828 4-Alternative/other school     125   77     48           8.35
## 3829 4-Alternative/other school      26   14     12           4.27
## 3830 4-Alternative/other school      62   37     25           3.76
## 3831 4-Alternative/other school     183   99     84            8.5
## 3832 4-Alternative/other school      19   11      8              0
## 3833 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3834 4-Alternative/other school      75   44     31            3.5
## 3835 4-Alternative/other school      65   59      6              7
## 3836 4-Alternative/other school      48   34     14           3.69
## 3837 4-Alternative/other school      77   50     27              4
## 3838 4-Alternative/other school      76   46     30            4.8
## 3839 4-Alternative/other school      68   54     14            8.4
## 3840 4-Alternative/other school     499  264    235           27.9
## 3841 4-Alternative/other school      62   32     30              3
## 3842 4-Alternative/other school      23   13     10           3.66
## 3843 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3844 4-Alternative/other school      29   29      0              1
## 3845 4-Alternative/other school      12    6      6           <NA>
## 3846 4-Alternative/other school      36   17     19            1.5
## 3847 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3848 4-Alternative/other school       6    4      2           <NA>
## 3849 4-Alternative/other school     185   89     96          23.88
## 3850 4-Alternative/other school      69   46     23             12
## 3851 4-Alternative/other school      63   31     32           3.05
## 3852 4-Alternative/other school       0    0      0           <NA>
## 3853 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3854 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3855 4-Alternative/other school       1    1      0           <NA>
## 3856 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3857 4-Alternative/other school      28   23      5              5
## 3858 4-Alternative/other school      30   21      9            1.5
## 3859 4-Alternative/other school     346  164    182           <NA>
## 3860 4-Alternative/other school      30   14     16            3.6
## 3861 4-Alternative/other school      19   19      0           5.25
## 3862 4-Alternative/other school      88   60     28           15.4
## 3863 4-Alternative/other school       0    0      0           1.09
## 3864 4-Alternative/other school      32   32      0           6.31
## 3865 4-Alternative/other school       0    0      0              0
## 3866 4-Alternative/other school      79   64     15             19
## 3867 4-Alternative/other school       0    0      0              0
## 3868 4-Alternative/other school      49   24     25           4.18
## 3869 4-Alternative/other school       0    0      0              0
## 3870 4-Alternative/other school       0    0      0           4.59
## 3871 4-Alternative/other school      23   21      2           <NA>
## 3872 4-Alternative/other school       9    8      1           <NA>
## 3873 4-Alternative/other school     172  107     65             15
## 3874 4-Alternative/other school      94   81     13           <NA>
## 3875 4-Alternative/other school     191  113     78              8
## 3876 4-Alternative/other school     234  158     76             33
## 3877 4-Alternative/other school      77   50     27              2
## 3878 4-Alternative/other school      31   31    n/a           3.69
## 3879 4-Alternative/other school      19   11      8           2.35
## 3880 4-Alternative/other school      20   15      5            3.6
## 3881 4-Alternative/other school      18   14      4           6.39
## 3882 4-Alternative/other school      18   12      6           6.41
## 3883 4-Alternative/other school      15   15      0           1.72
## 3884 4-Alternative/other school      10    9      1           0.83
## 3885 4-Alternative/other school      36   21     15           4.01
## 3886 4-Alternative/other school     148   67     81              8
## 3887 4-Alternative/other school      10   10      0              3
## 3888 4-Alternative/other school       4    3      1              1
## 3889 4-Alternative/other school     171  110     61           11.8
## 3890 4-Alternative/other school      22    9     13            0.5
## 3891 4-Alternative/other school      67   39     28              2
## 3892 4-Alternative/other school      70   41     29           2.75
## 3893 4-Alternative/other school      32   12     20              3
## 3894 4-Alternative/other school     163  101     62             10
## 3895 4-Alternative/other school       0    0      0           0.17
## 3896 4-Alternative/other school       6    6      0           <NA>
## 3897 4-Alternative/other school      36   23     13              2
## 3898 4-Alternative/other school      13   11      2              2
## 3899 4-Alternative/other school     238  132    106          14.64
## 3900 4-Alternative/other school       0    0      0              1
## 3901 4-Alternative/other school       4    3      1           <NA>
## 3902 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3903 4-Alternative/other school     132   84     48             11
## 3904 4-Alternative/other school      82   65     17            9.6
## 3905 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3906 4-Alternative/other school     152   92     60           9.45
## 3907 4-Alternative/other school      88   65     23           <NA>
## 3908 4-Alternative/other school      16   13      3              1
## 3909 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3910 4-Alternative/other school       3    3      0              1
## 3911 4-Alternative/other school       8    6      2           2.82
## 3912 4-Alternative/other school     n/a  n/a    n/a              0
## 3913 4-Alternative/other school     147   84     63          10.29
## 3914 4-Alternative/other school       0    0      0              0
## 3915 4-Alternative/other school      20   12      8              1
## 3916 4-Alternative/other school       1    0      1              1
## 3917 4-Alternative/other school      17    6     11              3
## 3918 4-Alternative/other school      37   31      6             11
## 3919 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 3920 4-Alternative/other school      38    9     29            1.4
## 3921 4-Alternative/other school     411  226    185          25.35
## 3922 4-Alternative/other school     132   55     77              4
## 3923 4-Alternative/other school     133   77     56           <NA>
## 3924 4-Alternative/other school     110   53     57              4
## 3925 4-Alternative/other school      43   42      1              3
## 3926 4-Alternative/other school      52   40     12              3
## 3927 4-Alternative/other school      24   24      0              3
## 3928 4-Alternative/other school     214   66    148              6
## 3929 4-Alternative/other school      30   26      4           6.75
## 3930 4-Alternative/other school      23   23      0           <NA>
## 3931 4-Alternative/other school     n/a  n/a    n/a              0
## 3932 4-Alternative/other school     119   55     64          11.05
## 3933 4-Alternative/other school       0    0      0             15
## 3934 4-Alternative/other school     125   57     68            3.3
## 3935 4-Alternative/other school      26   16     10              1
## 3936 4-Alternative/other school     125   71     54          11.83
## 3937 4-Alternative/other school      11   10      1              2
## 3938 4-Alternative/other school      52   39     13              3
## 3939 4-Alternative/other school     291  203     88             23
## 3940 4-Alternative/other school       4    3      1           6.83
## 3941 4-Alternative/other school     125   56     69          10.77
## 3942 4-Alternative/other school      37   23     14           <NA>
## 3943 4-Alternative/other school     150   74     76           9.96
## 3944 4-Alternative/other school      15   14      1            3.5
## 3945 4-Alternative/other school     n/a  n/a    n/a            n/a
## 3946 4-Alternative/other school      49   21     28           5.98
## 3947 4-Alternative/other school      23   12     11           3.62
## 3948 4-Alternative/other school      18    4     14           2.01
## 3949 4-Alternative/other school      10    6      4           <NA>
## 3950 4-Alternative/other school       8    4      4           1.37
## 3951 4-Alternative/other school      48   48    n/a            2.9
## 3952 4-Alternative/other school      50    0     50              4
## 3953 4-Alternative/other school       4    0      4           0.67
## 3954 4-Alternative/other school      45   36      9           8.01
## 3955 4-Alternative/other school      88   42     46              6
## 3956 4-Alternative/other school      18   10      8              3
## 3957 4-Alternative/other school      12    7      5           1.48
## 3958 4-Alternative/other school      20    8     12           <NA>
## 3959 4-Alternative/other school       0    0      0              0
## 3960 4-Alternative/other school      22   15      7           4.91
## 3961 4-Alternative/other school      32   16     16              2
## 3962 4-Alternative/other school      82   46     36              6
## 3963 4-Alternative/other school     160   76     84           11.5
## 3964 4-Alternative/other school     202   95    107           8.89
## 3965 4-Alternative/other school      75   39     36              4
## 3966 4-Alternative/other school     195  106     89          11.86
## 3967 4-Alternative/other school     168   73     95           9.64
## 3968 4-Alternative/other school      86   41     45              5
## 3969 4-Alternative/other school      74   29     45              5
## 3970 4-Alternative/other school      73   43     30              5
## 3971 4-Alternative/other school     124   71     53            4.5
## 3972 4-Alternative/other school     127   65     62              7
## 3973 4-Alternative/other school     112   67     45              6
## 3974 4-Alternative/other school     120   49     71              7
## 3975 4-Alternative/other school      64   39     25           3.88
## 3976 4-Alternative/other school     106   50     56              8
## 3977 4-Alternative/other school      65   30     35              4
## 3978 4-Alternative/other school     116   52     64              6
## 3979 4-Alternative/other school     242  102    140          11.57
## 3980 4-Alternative/other school     121   62     59           8.76
## 3981 4-Alternative/other school     103   46     57              6
## 3982 4-Alternative/other school      85   40     45              6
## 3983 4-Alternative/other school     100   49     51              6
## 3984 4-Alternative/other school     136   53     83          11.77
## 3985 4-Alternative/other school     118   52     66              4
## 3986 4-Alternative/other school     130   66     64           6.67
## 3987 4-Alternative/other school     113   47     66           7.19
## 3988 4-Alternative/other school     109   56     53              5
## 3989 4-Alternative/other school      61   26     35              3
## 3990 4-Alternative/other school      55   20     35              4
## 3991 4-Alternative/other school     140   59     81              7
## 3992 4-Alternative/other school      45   25     20              3
## 3993 4-Alternative/other school     107   49     58              5
## 3994 4-Alternative/other school     114   39     75              8
## 3995 4-Alternative/other school       0    0      0           0.01
## 3996 4-Alternative/other school     169   84     85          20.25
## 3997 4-Alternative/other school      27   17     10            0.8
## 3998 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 3999 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4000 4-Alternative/other school     122   75     47          18.98
## 4001 4-Alternative/other school      51   51      0              6
## 4002 4-Alternative/other school      27   27      0              1
## 4003 4-Alternative/other school       0    0      0              5
## 4004 4-Alternative/other school      21   11     10              3
## 4005 4-Alternative/other school      39   25     14           2.58
## 4006 4-Alternative/other school      15   14      1              3
## 4007 4-Alternative/other school      14    8      6           1.45
## 4008 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4009 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4010 4-Alternative/other school       6    5      1           <NA>
## 4011 4-Alternative/other school       9    7      2           <NA>
## 4012 4-Alternative/other school       0    0      0           0.96
## 4013 4-Alternative/other school       0    0      0            1.3
## 4014 4-Alternative/other school      98   49     49            6.2
## 4015 4-Alternative/other school      66   50     16          15.34
## 4016 4-Alternative/other school     207  137     70          11.59
## 4017 4-Alternative/other school    <NA>  n/a    n/a              1
## 4018 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4019 4-Alternative/other school      37   18     19              6
## 4020 4-Alternative/other school      58   31     27           5.25
## 4021 4-Alternative/other school      25   19      6           <NA>
## 4022 4-Alternative/other school      72   44     28           13.6
## 4023 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4024 4-Alternative/other school      11    9      2           <NA>
## 4025 4-Alternative/other school       1    1      0           <NA>
## 4026 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4027 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4028 4-Alternative/other school       7    4      3           <NA>
## 4029 4-Alternative/other school     252  124    128             12
## 4030 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4031 4-Alternative/other school      25    2     23           <NA>
## 4032 4-Alternative/other school      30    4     26           <NA>
## 4033 4-Alternative/other school       6  n/a      6           <NA>
## 4034 4-Alternative/other school      34  n/a     34           <NA>
## 4035 4-Alternative/other school      27  n/a     27           <NA>
## 4036 4-Alternative/other school       3  n/a      3           <NA>
## 4037 4-Alternative/other school      29   23      6            4.2
## 4038 4-Alternative/other school      78   20     58           8.11
## 4039 4-Alternative/other school     118   77     41           8.05
## 4040 4-Alternative/other school      53   33     20            2.2
## 4041 4-Alternative/other school       0    0      0           <NA>
## 4042 4-Alternative/other school     335  156    179           14.5
## 4043 4-Alternative/other school     140   78     62              9
## 4044 4-Alternative/other school       0    0      0              0
## 4045 4-Alternative/other school      60   48     12              8
## 4046 4-Alternative/other school       5    4      1              1
## 4047 4-Alternative/other school     244  118    126             14
## 4048 4-Alternative/other school      55   35     20            3.5
## 4049 4-Alternative/other school       0    0      0           <NA>
## 4050 4-Alternative/other school       7    3      4            8.5
## 4051 4-Alternative/other school     106    0    106          10.43
## 4052 4-Alternative/other school     710  356    354          29.03
## 4053 4-Alternative/other school      58   28     30            3.5
## 4054 4-Alternative/other school      24   22      2              0
## 4055 4-Alternative/other school     123   86     37             12
## 4056 4-Alternative/other school      91   52     39              0
## 4057 4-Alternative/other school       0    0      0              0
## 4058 4-Alternative/other school      48   46      2              1
## 4059 4-Alternative/other school      10    5      5              1
## 4060 4-Alternative/other school      13    8      5              2
## 4061 4-Alternative/other school       4    3      1         106.47
## 4062 4-Alternative/other school     127   52     75           3.84
## 4063 4-Alternative/other school     142   74     68           3.36
## 4064 4-Alternative/other school       1    0      1              0
## 4065 4-Alternative/other school     n/a  n/a    n/a             11
## 4066 4-Alternative/other school     250  156     94              3
## 4067 4-Alternative/other school     302  183    119          19.01
## 4068 4-Alternative/other school       0    0      0              0
## 4069 4-Alternative/other school       9    6      3            2.2
## 4070 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4071 4-Alternative/other school      24   12     12           4.38
## 4072 4-Alternative/other school      80   52     28           5.75
## 4073 4-Alternative/other school      47   28     19            2.6
## 4074 4-Alternative/other school      39   26     13              3
## 4075 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4076 4-Alternative/other school      94   53     41          12.37
## 4077 4-Alternative/other school     114   83     31           18.3
## 4078 4-Alternative/other school     289  145    144          17.16
## 4079 4-Alternative/other school     156  122     34             26
## 4080 4-Alternative/other school     248  186     62          16.62
## 4081 4-Alternative/other school     637  402    235           24.8
## 4082 4-Alternative/other school      24   21      3            3.5
## 4083 4-Alternative/other school      18   16      2            2.5
## 4084 4-Alternative/other school     199   92    107          30.44
## 4085 4-Alternative/other school      17   17      0           <NA>
## 4086 4-Alternative/other school     192  192      0              3
## 4087 4-Alternative/other school       4    3      1           <NA>
## 4088 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4089 4-Alternative/other school      15    8      7              2
## 4090 4-Alternative/other school       9    5      4           <NA>
## 4091 4-Alternative/other school      15   11      4            1.5
## 4092 4-Alternative/other school       0    0      0              0
## 4093 4-Alternative/other school     150   97     53           11.7
## 4094 4-Alternative/other school     218  117    101          22.69
## 4095 4-Alternative/other school     410  254    156          18.15
## 4096 4-Alternative/other school     100   50     50           10.7
## 4097 4-Alternative/other school      69   50     19             12
## 4098 4-Alternative/other school     265  124    141          10.95
## 4099 4-Alternative/other school      49    0     49            4.5
## 4100 4-Alternative/other school      22   18      4             18
## 4101 4-Alternative/other school     102   54     48           6.15
## 4102 4-Alternative/other school      14    7      7            0.6
## 4103 4-Alternative/other school      58   38     20            5.7
## 4104 4-Alternative/other school      51   32     19           3.09
## 4105 4-Alternative/other school     127   85     42          12.57
## 4106 4-Alternative/other school       7    6      1              2
## 4107 4-Alternative/other school     n/a  n/a    n/a          17.42
## 4108 4-Alternative/other school      16   11      5              1
## 4109 4-Alternative/other school      12    9      3              1
## 4110 4-Alternative/other school     380  224    156          34.67
## 4111 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4112 4-Alternative/other school      52   36     16              4
## 4113 4-Alternative/other school      85   68     17           18.5
## 4114 4-Alternative/other school       1    1      0           2.18
## 4115 4-Alternative/other school       3    3      0            1.5
## 4116 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4117 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4118 4-Alternative/other school      66   34     32           8.13
## 4119 4-Alternative/other school       0    0      0             17
## 4120 4-Alternative/other school       3    1      2              0
## 4121 4-Alternative/other school       3    2      1              0
## 4122 4-Alternative/other school       0    0      0              0
## 4123 4-Alternative/other school       0    0      0              0
## 4124 4-Alternative/other school      43   32     11            6.5
## 4125 4-Alternative/other school      46   31     15              4
## 4126 4-Alternative/other school     305  200    105             22
## 4127 4-Alternative/other school     128   79     49           3.09
## 4128 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4129 4-Alternative/other school       0    0      0           0.62
## 4130 4-Alternative/other school       0    0      0           <NA>
## 4131 4-Alternative/other school     168   93     75          11.95
## 4132 4-Alternative/other school       5    5      0          35.02
## 4133 4-Alternative/other school      71   29     42              2
## 4134 4-Alternative/other school       5    4      1              1
## 4135 4-Alternative/other school      15    9      6            1.5
## 4136 4-Alternative/other school       0    0      0              0
## 4137 4-Alternative/other school     119   65     54            8.3
## 4138 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4139 4-Alternative/other school      32   15     17           3.21
## 4140 4-Alternative/other school       0    0      0              0
## 4141 4-Alternative/other school      12   12      0            2.1
## 4142 4-Alternative/other school       0    0      0              0
## 4143 4-Alternative/other school      12   10      2              2
## 4144 4-Alternative/other school     233  146     87          33.57
## 4145 4-Alternative/other school       0    0      0           <NA>
## 4146 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4147 4-Alternative/other school       7    4      3            0.5
## 4148 4-Alternative/other school       1    1      0           <NA>
## 4149 4-Alternative/other school     109   74     35            8.4
## 4150 4-Alternative/other school     222  137     85          11.83
## 4151 4-Alternative/other school       0    0      0           0.33
## 4152 4-Alternative/other school       0    0      0           <NA>
## 4153 4-Alternative/other school       5    4      1              1
## 4154 4-Alternative/other school     102   59     43             13
## 4155 4-Alternative/other school      11    8      3           1.43
## 4156 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4157 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4158 4-Alternative/other school      94   64     30             14
## 4159 4-Alternative/other school      12    6      6           <NA>
## 4160 4-Alternative/other school      94   54     40              2
## 4161 4-Alternative/other school       4    2      2           <NA>
## 4162 4-Alternative/other school       5    3      2              1
## 4163 4-Alternative/other school     220  127     93           7.62
## 4164 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4165 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4166 4-Alternative/other school     135   81     54           <NA>
## 4167 4-Alternative/other school      27   20      7           <NA>
## 4168 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4169 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4170 4-Alternative/other school       8    6      2            2.5
## 4171 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4172 4-Alternative/other school       0    0      0          43.63
## 4173 4-Alternative/other school      22   22      0              1
## 4174 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4175 4-Alternative/other school       0    0      0              1
## 4176 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4177 4-Alternative/other school      59   44     15              5
## 4178 4-Alternative/other school      15   13      2              5
## 4179 4-Alternative/other school      55   40     15              7
## 4180 4-Alternative/other school     220  141     79              7
## 4181 4-Alternative/other school     114   54     60           4.47
## 4182 4-Alternative/other school      19   11      8              1
## 4183 4-Alternative/other school     293  136    157           12.5
## 4184 4-Alternative/other school     431  277    154           <NA>
## 4185 4-Alternative/other school     125   65     60              7
## 4186 4-Alternative/other school     173  100     73          13.68
## 4187 4-Alternative/other school     272  138    134          14.96
## 4188 4-Alternative/other school     229  138     91           10.9
## 4189 4-Alternative/other school       0    0      0           <NA>
## 4190 4-Alternative/other school     111   78     33           5.92
## 4191 4-Alternative/other school     145   95     50             11
## 4192 4-Alternative/other school      80   41     39              3
## 4193 4-Alternative/other school     406  102    304          17.33
## 4194 4-Alternative/other school      41   21     20              7
## 4195 4-Alternative/other school      93   27     66            4.6
## 4196 4-Alternative/other school      25   16      9           0.08
## 4197 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4198 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4199 4-Alternative/other school      39   32      7              8
## 4200 4-Alternative/other school      17   14      3              4
## 4201 4-Alternative/other school      67   35     32              1
## 4202 4-Alternative/other school       0    0      0              0
## 4203 4-Alternative/other school     182   92     90           <NA>
## 4204 4-Alternative/other school     116   74     42              7
## 4205 4-Alternative/other school    2283 1106   1177             16
## 4206 4-Alternative/other school     344  175    169             32
## 4207 4-Alternative/other school     105   53     52              8
## 4208 4-Alternative/other school     199  115     84          19.28
## 4209 4-Alternative/other school      14   14      0           0.76
## 4210 4-Alternative/other school      63   42     21            4.5
## 4211 4-Alternative/other school     124   74     50            8.5
## 4212 4-Alternative/other school      33    6     27           1.64
## 4213 4-Alternative/other school     166   77     89           5.06
## 4214 4-Alternative/other school     312  153    159           <NA>
## 4215 4-Alternative/other school     205  105    100           7.52
## 4216 4-Alternative/other school     378  177    201          13.59
## 4217 4-Alternative/other school     194  101     93           8.59
## 4218 4-Alternative/other school     182   94     88           6.74
## 4219 4-Alternative/other school     188   89     99           8.87
## 4220 4-Alternative/other school     181   89     92           5.66
## 4221 4-Alternative/other school     444  223    221          14.12
## 4222 4-Alternative/other school     197   87    110           5.16
## 4223 4-Alternative/other school     255  139    116            8.7
## 4224 4-Alternative/other school      67   57     10             22
## 4225 4-Alternative/other school     827    0    827          51.72
## 4226 4-Alternative/other school      56   38     18           <NA>
## 4227 4-Alternative/other school      44   24     20           3.08
## 4228 4-Alternative/other school     218  144     74           18.1
## 4229 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4230 4-Alternative/other school     983  428    555           7.54
## 4231 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4232 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4233 4-Alternative/other school      52   35     17           <NA>
## 4234 4-Alternative/other school      43   16     27           <NA>
## 4235 4-Alternative/other school     207  207    n/a          24.34
## 4236 4-Alternative/other school      79   61     18           22.5
## 4237 4-Alternative/other school      28   28      0              3
## 4238 4-Alternative/other school      95   62     33            6.7
## 4239 4-Alternative/other school     257  151    106          19.08
## 4240 4-Alternative/other school      28   18     10            1.6
## 4241 4-Alternative/other school     152   91     61            9.8
## 4242 4-Alternative/other school       4    3      1            1.1
## 4243 4-Alternative/other school     346  171    175           15.4
## 4244 4-Alternative/other school     166   79     87           9.05
## 4245 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4246 4-Alternative/other school      46   31     15            5.7
## 4247 4-Alternative/other school       0  n/a    n/a            3.5
## 4248 4-Alternative/other school     122   76     46           6.16
## 4249 4-Alternative/other school     150  105     45           11.2
## 4250 4-Alternative/other school       0    0      0              1
## 4251 4-Alternative/other school       0    0      0              3
## 4252 4-Alternative/other school      77   43     34           9.43
## 4253 4-Alternative/other school      82   41     41            5.5
## 4254 4-Alternative/other school       4    4      0            0.9
## 4255 4-Alternative/other school      17   11      6           0.83
## 4256 4-Alternative/other school      57   33     24          18.68
## 4257 4-Alternative/other school      56   35     21           3.95
## 4258 4-Alternative/other school      10    6      4           1.17
## 4259 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4260 4-Alternative/other school     230  134     96           12.9
## 4261 4-Alternative/other school       6    3      3           <NA>
## 4262 4-Alternative/other school      45   26     19           5.26
## 4263 4-Alternative/other school      43   24     19            2.3
## 4264 4-Alternative/other school      31   14     17            0.2
## 4265 4-Alternative/other school       5    5      0           1.54
## 4266 4-Alternative/other school      82   82      0             13
## 4267 4-Alternative/other school     310  222     88           23.5
## 4268 4-Alternative/other school     260  147    113             12
## 4269 4-Alternative/other school     120  102     18             10
## 4270 4-Alternative/other school      18   14      4           2.57
## 4271 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4272 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4273 4-Alternative/other school      99   65     34           7.84
## 4274 4-Alternative/other school      17   10      7              8
## 4275 4-Alternative/other school       0    0      0              6
## 4276 4-Alternative/other school       3    2      1            3.3
## 4277 4-Alternative/other school      63   47     16              6
## 4278 4-Alternative/other school      49   32     17              6
## 4279 4-Alternative/other school     154   85     69             21
## 4280 4-Alternative/other school      21   21      0           <NA>
## 4281 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4282 4-Alternative/other school       0    0      0              0
## 4283 4-Alternative/other school      10    5      5              2
## 4284 4-Alternative/other school      79   35     44             29
## 4285 4-Alternative/other school       0    0      0              0
## 4286 4-Alternative/other school     477  291    186          38.44
## 4287 4-Alternative/other school       2  n/a      2              1
## 4288 4-Alternative/other school      68   44     24              4
## 4289 4-Alternative/other school       0    0      0           <NA>
## 4290 4-Alternative/other school      41   24     17            3.3
## 4291 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4292 4-Alternative/other school     425  185    240          36.56
## 4293 4-Alternative/other school     167  100     67             18
## 4294 4-Alternative/other school      37   18     19           3.05
## 4295 4-Alternative/other school       3    1      2           1.96
## 4296 4-Alternative/other school     333  168    165          25.97
## 4297 4-Alternative/other school     219  101    118          12.16
## 4298 4-Alternative/other school      14    8      6            1.2
## 4299 4-Alternative/other school      12    9      3           <NA>
## 4300 4-Alternative/other school      25    7     18            1.5
## 4301 4-Alternative/other school      36   36      0           4.83
## 4302 4-Alternative/other school       3    3      0             50
## 4303 4-Alternative/other school      93   68     25          12.94
## 4304 4-Alternative/other school      59   38     21           5.51
## 4305 4-Alternative/other school      21   17      4           <NA>
## 4306 4-Alternative/other school      37   22     15           5.49
## 4307 4-Alternative/other school       5    3      2              1
## 4308 4-Alternative/other school       9    7      2              3
## 4309 4-Alternative/other school    <NA>  n/a    n/a            1.1
## 4310 4-Alternative/other school    <NA>  n/a    n/a           0.77
## 4311 4-Alternative/other school      31   20     11           <NA>
## 4312 4-Alternative/other school      22   15      7           3.55
## 4313 4-Alternative/other school      15   13      2            1.2
## 4314 4-Alternative/other school       7    5      2           <NA>
## 4315 4-Alternative/other school    1746  890    856           60.2
## 4316 4-Alternative/other school      84   43     41              1
## 4317 4-Alternative/other school      27   16     11           1.98
## 4318 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4319 4-Alternative/other school       3    1      2           0.85
## 4320 4-Alternative/other school     136   66     70           5.89
## 4321 4-Alternative/other school     288  192     96             25
## 4322 4-Alternative/other school      52   44      8             10
## 4323 4-Alternative/other school       0    0      0              0
## 4324 4-Alternative/other school     166  104     62           12.8
## 4325 4-Alternative/other school     217  207     10          14.67
## 4326 4-Alternative/other school      36   17     19              3
## 4327 4-Alternative/other school       0    0      0           0.12
## 4328 4-Alternative/other school     232  140     92             24
## 4329 4-Alternative/other school      67   55     12             31
## 4330 4-Alternative/other school     160   99     61           10.2
## 4331 4-Alternative/other school      96   45     51           8.19
## 4332 4-Alternative/other school     160   78     82             14
## 4333 4-Alternative/other school       0    0      0            2.4
## 4334 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4335 4-Alternative/other school      61   36     25           2.89
## 4336 4-Alternative/other school      81   65     16          23.49
## 4337 4-Alternative/other school      22   17      5            0.9
## 4338 4-Alternative/other school     n/a  n/a    n/a              0
## 4339 4-Alternative/other school       0    0      0           <NA>
## 4340 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4341 4-Alternative/other school     137   94     43           8.23
## 4342 4-Alternative/other school      15    9      6           0.88
## 4343 4-Alternative/other school       6    3      3           0.75
## 4344 4-Alternative/other school      21   12      9           1.95
## 4345 4-Alternative/other school       4    1      3           3.04
## 4346 4-Alternative/other school       3    3    n/a           0.97
## 4347 4-Alternative/other school       3    2      1           <NA>
## 4348 4-Alternative/other school       0    0      0              0
## 4349 4-Alternative/other school     n/a  n/a    n/a           2.06
## 4350 4-Alternative/other school     n/a  n/a    n/a              0
## 4351 4-Alternative/other school       0    0      0              0
## 4352 4-Alternative/other school       0    0      0              0
## 4353 4-Alternative/other school       0    0      0              0
## 4354 4-Alternative/other school     116   67     49              4
## 4355 4-Alternative/other school     178  113     65           9.86
## 4356 4-Alternative/other school    <NA>  n/a    n/a              1
## 4357 4-Alternative/other school     187  120     67          11.84
## 4358 4-Alternative/other school      83   37     46           3.51
## 4359 4-Alternative/other school     523  277    246             21
## 4360 4-Alternative/other school     149   77     72          10.13
## 4361 4-Alternative/other school     107   75     32          11.15
## 4362 4-Alternative/other school      98   56     42           5.16
## 4363 4-Alternative/other school      20   17      3              1
## 4364 4-Alternative/other school     160  100     60           8.93
## 4365 4-Alternative/other school      69   40     29              7
## 4366 4-Alternative/other school      35   24     11              1
## 4367 4-Alternative/other school      45    0     45              6
## 4368 4-Alternative/other school     325  204    121          22.12
## 4369 4-Alternative/other school      26   14     12              4
## 4370 4-Alternative/other school      22   19      3           4.88
## 4371 4-Alternative/other school      18   11      7              1
## 4372 4-Alternative/other school      19   13      6           1.55
## 4373 4-Alternative/other school      34   21     13           7.75
## 4374 4-Alternative/other school      50   26     24              4
## 4375 4-Alternative/other school       0    0      0              0
## 4376 4-Alternative/other school       7    7      0              0
## 4377 4-Alternative/other school      37   25     12              7
## 4378 4-Alternative/other school     123   64     59              6
## 4379 4-Alternative/other school       0    0      0              0
## 4380 4-Alternative/other school      41   21     20           5.99
## 4381 4-Alternative/other school      52   38     14              8
## 4382 4-Alternative/other school     134   91     43           7.23
## 4383 4-Alternative/other school      16   10      6           <NA>
## 4384 4-Alternative/other school      59   25     34           2.27
## 4385 4-Alternative/other school      74   43     31             17
## 4386 4-Alternative/other school     190   97     93              9
## 4387 4-Alternative/other school      35   17     18              2
## 4388 4-Alternative/other school     112   73     39            5.2
## 4389 4-Alternative/other school      11    7      4           0.89
## 4390 4-Alternative/other school     647  333    314          38.37
## 4391 4-Alternative/other school       0    0      0           0.05
## 4392 4-Alternative/other school      14   12      2              1
## 4393 4-Alternative/other school      80   43     37            3.3
## 4394 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4395 4-Alternative/other school      18   13      5            0.5
## 4396 4-Alternative/other school      36   23     13            1.2
## 4397 4-Alternative/other school      91   60     31           4.15
## 4398 4-Alternative/other school     505  303    202             31
## 4399 4-Alternative/other school      77   39     38            5.2
## 4400 4-Alternative/other school     402  184    218          16.83
## 4401 4-Alternative/other school     130   71     59              6
## 4402 4-Alternative/other school      69   38     31           4.69
## 4403 4-Alternative/other school      78   61     17            7.6
## 4404 4-Alternative/other school       9    9      0            0.8
## 4405 4-Alternative/other school      19   17      2           1.84
## 4406 4-Alternative/other school       3    3      0              2
## 4407 4-Alternative/other school      89   80      9             13
## 4408 4-Alternative/other school     580  368    212          46.01
## 4409 4-Alternative/other school     337  288     49             43
## 4410 4-Alternative/other school     120   59     61             13
## 4411 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4412 4-Alternative/other school     146   74     72              5
## 4413 4-Alternative/other school    1128  717    411           54.7
## 4414 4-Alternative/other school      38   21     17            2.2
## 4415 4-Alternative/other school      53   26     27              2
## 4416 4-Alternative/other school       0    0      0           <NA>
## 4417 4-Alternative/other school      96   60     36           7.05
## 4418 4-Alternative/other school      98   64     34              6
## 4419 4-Alternative/other school      21   17      4           2.89
## 4420 4-Alternative/other school      63   27     36              9
## 4421 4-Alternative/other school       9    6      3              1
## 4422 4-Alternative/other school       0    0      0           <NA>
## 4423 4-Alternative/other school       3    3      0           <NA>
## 4424 4-Alternative/other school       3    1      2              1
## 4425 4-Alternative/other school      32   22     10            2.5
## 4426 4-Alternative/other school      44   21     23           3.94
## 4427 4-Alternative/other school      19   13      6              2
## 4428 4-Alternative/other school      54   33     21           <NA>
## 4429 4-Alternative/other school      24   13     11              3
## 4430 4-Alternative/other school     100   82     18              6
## 4431 4-Alternative/other school       9    8      1              2
## 4432 4-Alternative/other school      91   77     14             16
## 4433 4-Alternative/other school     103   93     10           22.7
## 4434 4-Alternative/other school     143   64     79            5.7
## 4435 4-Alternative/other school     637  319    318          23.65
## 4436 4-Alternative/other school      64   43     21              5
## 4437 4-Alternative/other school       6    3      3              1
## 4438 4-Alternative/other school      40   19     21          13.53
## 4439 4-Alternative/other school       1    1      0           <NA>
## 4440 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4441 4-Alternative/other school     224  101    123             10
## 4442 4-Alternative/other school     145   85     60             11
## 4443 4-Alternative/other school       2    2      0           2.47
## 4444 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4445 4-Alternative/other school     174  118     56          14.42
## 4446 4-Alternative/other school      24   15      9              2
## 4447 4-Alternative/other school       3    3      0              1
## 4448 4-Alternative/other school       0    0      0              0
## 4449 4-Alternative/other school      19    0     19              2
## 4450 4-Alternative/other school     150   75     75           3.99
## 4451 4-Alternative/other school     291  118    173             13
## 4452 4-Alternative/other school      23   17      6              0
## 4453 4-Alternative/other school      28   22      6              5
## 4454 4-Alternative/other school       0    0      0           8.24
## 4455 4-Alternative/other school      12   11      1           <NA>
## 4456 4-Alternative/other school       1    1      0              1
## 4457 4-Alternative/other school      14    8      6           12.5
## 4458 4-Alternative/other school     393  177    216           28.4
## 4459 4-Alternative/other school      50   28     22              4
## 4460 4-Alternative/other school      53   17     36              4
## 4461 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4462 4-Alternative/other school      88   88    n/a          18.45
## 4463 4-Alternative/other school     226  116    110              2
## 4464 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4465 4-Alternative/other school      32   14     18              1
## 4466 4-Alternative/other school      11    9      2              3
## 4467 4-Alternative/other school     541  326    215           21.9
## 4468 4-Alternative/other school      99   54     45            8.5
## 4469 4-Alternative/other school      70   49     21             24
## 4470 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4471 4-Alternative/other school     n/a  n/a    n/a            5.2
## 4472 4-Alternative/other school      43   43      0            0.1
## 4473 4-Alternative/other school     154   95     59             11
## 4474 4-Alternative/other school       2    0      2              1
## 4475 4-Alternative/other school      32    0     32           3.47
## 4476 4-Alternative/other school      10    4      6           0.87
## 4477 4-Alternative/other school       2    2      0              1
## 4478 4-Alternative/other school      21   18      3           <NA>
## 4479 4-Alternative/other school     244  127    117          12.38
## 4480 4-Alternative/other school       0    0      0           0.17
## 4481 4-Alternative/other school     287  121    166             20
## 4482 4-Alternative/other school     236  146     90          19.83
## 4483 4-Alternative/other school       0    0      0              0
## 4484 4-Alternative/other school       9    7      2              1
## 4485 4-Alternative/other school       4    4      0              2
## 4486 4-Alternative/other school      63   48     15              6
## 4487 4-Alternative/other school     103   42     61             10
## 4488 4-Alternative/other school      59   45     14           6.56
## 4489 4-Alternative/other school       0    0      0              0
## 4490 4-Alternative/other school      77   54     23          31.32
## 4491 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4492 4-Alternative/other school     124   60     64            4.1
## 4493 4-Alternative/other school      37   21     16           <NA>
## 4494 4-Alternative/other school      31   21     10           <NA>
## 4495 4-Alternative/other school      35   21     14           <NA>
## 4496 4-Alternative/other school      16   11      5           <NA>
## 4497 4-Alternative/other school     n/a  n/a    n/a              9
## 4498 4-Alternative/other school       9    0      9           <NA>
## 4499 4-Alternative/other school      83   36     47            5.4
## 4500 4-Alternative/other school       0    0      0              0
## 4501 4-Alternative/other school       0    0      0           <NA>
## 4502 4-Alternative/other school     139   68     71              5
## 4503 4-Alternative/other school     395  235    160          19.67
## 4504 4-Alternative/other school      37   27     10           <NA>
## 4505 4-Alternative/other school     269  153    116              5
## 4506 4-Alternative/other school      34   18     16           5.34
## 4507 4-Alternative/other school     n/a  n/a    n/a              0
## 4508 4-Alternative/other school      40   30     10            1.8
## 4509 4-Alternative/other school      25   18      7           0.96
## 4510 4-Alternative/other school      22   22      0           4.25
## 4511 4-Alternative/other school     136   76     60           5.48
## 4512 4-Alternative/other school     101   59     42              8
## 4513 4-Alternative/other school     275  169    106          17.31
## 4514 4-Alternative/other school     182   77    105          19.57
## 4515 4-Alternative/other school      23   23    n/a           <NA>
## 4516 4-Alternative/other school      53   31     22              0
## 4517 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4518 4-Alternative/other school      10    7      3              2
## 4519 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4520 4-Alternative/other school      82   36     46           9.41
## 4521 4-Alternative/other school      39    0     39              4
## 4522 4-Alternative/other school     114   34     80           12.3
## 4523 4-Alternative/other school     146   58     88              9
## 4524 4-Alternative/other school       0    0      0              0
## 4525 4-Alternative/other school      86   44     42              7
## 4526 4-Alternative/other school     119   38     81              3
## 4527 4-Alternative/other school     238  144     94          25.83
## 4528 4-Alternative/other school      14    1     13            0.8
## 4529 4-Alternative/other school       0    0      0              0
## 4530 4-Alternative/other school      12   10      2              1
## 4531 4-Alternative/other school      23   16      7              1
## 4532 4-Alternative/other school      39   27     12          10.57
## 4533 4-Alternative/other school     256  153    103             11
## 4534 4-Alternative/other school      19   14      5           6.81
## 4535 4-Alternative/other school      19   16      3           3.13
## 4536 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4537 4-Alternative/other school       3    2      1              1
## 4538 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4539 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4540 4-Alternative/other school       5    5      0           <NA>
## 4541 4-Alternative/other school       0    0      0           <NA>
## 4542 4-Alternative/other school    2085 1017   1068           70.5
## 4543 4-Alternative/other school     131   84     47              7
## 4544 4-Alternative/other school      12    0     12           1.98
## 4545 4-Alternative/other school      48   26     22              3
## 4546 4-Alternative/other school     352  189    163              0
## 4547 4-Alternative/other school       0    0      0           <NA>
## 4548 4-Alternative/other school       2    2      0           0.33
## 4549 4-Alternative/other school       4    0      4              0
## 4550 4-Alternative/other school       9    5      4              4
## 4551 4-Alternative/other school     127   71     56           <NA>
## 4552 4-Alternative/other school     n/a  n/a    n/a              0
## 4553 4-Alternative/other school     163  109     54             28
## 4554 4-Alternative/other school       0    0      0              0
## 4555 4-Alternative/other school     434  274    160             24
## 4556 4-Alternative/other school      50   26     24           4.16
## 4557 4-Alternative/other school     180  110     70          12.53
## 4558 4-Alternative/other school      50   26     24            3.5
## 4559 4-Alternative/other school       5    2      3              1
## 4560 4-Alternative/other school      26    9     17           1.85
## 4561 4-Alternative/other school       5    4      1           <NA>
## 4562 4-Alternative/other school       3    1      2           0.62
## 4563 4-Alternative/other school     580  308    272           23.9
## 4564 4-Alternative/other school     289  150    139           13.2
## 4565 4-Alternative/other school      59   36     23              8
## 4566 4-Alternative/other school      44   19     25              5
## 4567 4-Alternative/other school     160  109     51              8
## 4568 4-Alternative/other school     136   88     48            9.5
## 4569 4-Alternative/other school      48   19     29            2.5
## 4570 4-Alternative/other school       3    2      1              1
## 4571 4-Alternative/other school     238  153     85           19.8
## 4572 4-Alternative/other school      24   17      7           2.02
## 4573 4-Alternative/other school     197  109     88             18
## 4574 4-Alternative/other school     178  103     75            6.5
## 4575 4-Alternative/other school      23   15      8              4
## 4576 4-Alternative/other school     n/a  n/a    n/a           3.75
## 4577 4-Alternative/other school     340  173    167           8.73
## 4578 4-Alternative/other school       0    0      0              0
## 4579 4-Alternative/other school       3    1      2              0
## 4580 4-Alternative/other school     112   50     62              3
## 4581 4-Alternative/other school     828  393    435          24.29
## 4582 4-Alternative/other school      10    5      5              1
## 4583 4-Alternative/other school       8    8      0           <NA>
## 4584 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4585 4-Alternative/other school       5    4      1           1.48
## 4586 4-Alternative/other school     218  136     82             13
## 4587 4-Alternative/other school      21   11     10              1
## 4588 4-Alternative/other school       0    0      0            0.5
## 4589 4-Alternative/other school      18    8     10           0.86
## 4590 4-Alternative/other school      64   55      9             13
## 4591 4-Alternative/other school       7    6      1              1
## 4592 4-Alternative/other school       0    0      0              0
## 4593 4-Alternative/other school      68   40     28              0
## 4594 4-Alternative/other school      60   22     38            4.9
## 4595 4-Alternative/other school      61   30     31              5
## 4596 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4597 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4598 4-Alternative/other school     130   82     48              2
## 4599 4-Alternative/other school      94   55     39              5
## 4600 4-Alternative/other school     419  161    258           13.4
## 4601 4-Alternative/other school      22   20      2              4
## 4602 4-Alternative/other school      40   31      9              3
## 4603 4-Alternative/other school     606  317    289          35.51
## 4604 4-Alternative/other school      13   12      1              1
## 4605 4-Alternative/other school     759  479    280          41.01
## 4606 4-Alternative/other school       8    3      5           <NA>
## 4607 4-Alternative/other school     n/a  n/a    n/a              4
## 4608 4-Alternative/other school      36   24     12           1.72
## 4609 4-Alternative/other school     189  122     67           13.5
## 4610 4-Alternative/other school      73   43     30              5
## 4611 4-Alternative/other school      49   41      8           4.07
## 4612 4-Alternative/other school      21   13      8              2
## 4613 4-Alternative/other school     123   80     43             18
## 4614 4-Alternative/other school      68   39     29              3
## 4615 4-Alternative/other school      54   40     14              7
## 4616 4-Alternative/other school      58   45     13             10
## 4617 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4618 4-Alternative/other school       0    0      0           <NA>
## 4619 4-Alternative/other school     188  104     84             19
## 4620 4-Alternative/other school       0    0      0           <NA>
## 4621 4-Alternative/other school      98   42     56          10.04
## 4622 4-Alternative/other school      61   29     32           7.41
## 4623 4-Alternative/other school     120   79     41            5.5
## 4624 4-Alternative/other school      15   15      0              7
## 4625 4-Alternative/other school      63   26     37           6.71
## 4626 4-Alternative/other school     n/a  n/a    n/a              0
## 4627 4-Alternative/other school     200   99    101           10.9
## 4628 4-Alternative/other school      58   47     11             26
## 4629 4-Alternative/other school     477  229    248             19
## 4630 4-Alternative/other school     200   96    104            8.3
## 4631 4-Alternative/other school     130   84     46           8.66
## 4632 4-Alternative/other school      66   39     27           13.6
## 4633 4-Alternative/other school      77   39     38           4.19
## 4634 4-Alternative/other school      67   43     24            5.4
## 4635 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4636 4-Alternative/other school      27   19      8            2.4
## 4637 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4638 4-Alternative/other school      13    6      7           <NA>
## 4639 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4640 4-Alternative/other school      42   24     18              4
## 4641 4-Alternative/other school      11   11    n/a           <NA>
## 4642 4-Alternative/other school     208  134     74           17.1
## 4643 4-Alternative/other school       0    0      0           <NA>
## 4644 4-Alternative/other school       6    3      3           <NA>
## 4645 4-Alternative/other school     148  148      0             24
## 4646 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4647 4-Alternative/other school     126   68     58          10.26
## 4648 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4649 4-Alternative/other school     137  109     28           <NA>
## 4650 4-Alternative/other school      53   45      8              5
## 4651 4-Alternative/other school       0    0      0           <NA>
## 4652 4-Alternative/other school       0    0      0              0
## 4653 4-Alternative/other school      25   17      8           1.33
## 4654 4-Alternative/other school      42   42      0              1
## 4655 4-Alternative/other school       1    1      0           <NA>
## 4656 4-Alternative/other school     145   77     68           9.32
## 4657 4-Alternative/other school      86   50     36              7
## 4658 4-Alternative/other school     209  104    105          19.74
## 4659 4-Alternative/other school     213  104    109           19.4
## 4660 4-Alternative/other school     429  212    217          18.74
## 4661 4-Alternative/other school       6    4      2           <NA>
## 4662 4-Alternative/other school      24   18      6           2.32
## 4663 4-Alternative/other school      10    7      3           1.82
## 4664 4-Alternative/other school      14    7      7           1.91
## 4665 4-Alternative/other school       2    1      1           <NA>
## 4666 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4667 4-Alternative/other school      52   42     10              0
## 4668 4-Alternative/other school      13    9      4           <NA>
## 4669 4-Alternative/other school       7    7      0              2
## 4670 4-Alternative/other school      40   25     15              8
## 4671 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4672 4-Alternative/other school       0    0      0           0.69
## 4673 4-Alternative/other school      98   48     50            7.8
## 4674 4-Alternative/other school     128   51     77            3.9
## 4675 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4676 4-Alternative/other school       0    0      0           6.85
## 4677 4-Alternative/other school      13    7      6           2.43
## 4678 4-Alternative/other school       0    0      0           <NA>
## 4679 4-Alternative/other school      29   20      9            1.7
## 4680 4-Alternative/other school       0    0      0           <NA>
## 4681 4-Alternative/other school       9    9      0              2
## 4682 4-Alternative/other school      99   99      0             12
## 4683 4-Alternative/other school       4    3      1              0
## 4684 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4685 4-Alternative/other school       0    0      0           <NA>
## 4686 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4687 4-Alternative/other school      57   28     29             14
## 4688 4-Alternative/other school      65   47     18              6
## 4689 4-Alternative/other school     279  170    109           19.6
## 4690 4-Alternative/other school       0    0      0              0
## 4691 4-Alternative/other school      17    6     11           <NA>
## 4692 4-Alternative/other school       8    8      0           <NA>
## 4693 4-Alternative/other school      73   33     40           5.32
## 4694 4-Alternative/other school      10   10      0           1.16
## 4695 4-Alternative/other school      65   65      0           <NA>
## 4696 4-Alternative/other school      22   14      8            3.5
## 4697 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4698 4-Alternative/other school      20   20      0              0
## 4699 4-Alternative/other school      21   13      8           1.99
## 4700 4-Alternative/other school    <NA>  n/a    n/a              2
## 4701 4-Alternative/other school     120   99     21             26
## 4702 4-Alternative/other school       0    0      0              0
## 4703 4-Alternative/other school       7    6      1              1
## 4704 4-Alternative/other school      23   11     12              5
## 4705 4-Alternative/other school       6    6      0           <NA>
## 4706 4-Alternative/other school     293  191    102             29
## 4707 4-Alternative/other school      25   16      9           <NA>
## 4708 4-Alternative/other school      17   17      0           <NA>
## 4709 4-Alternative/other school      69   60      9              4
## 4710 4-Alternative/other school     n/a  n/a    n/a              0
## 4711 4-Alternative/other school       0    0      0              0
## 4712 4-Alternative/other school      33   27      6              8
## 4713 4-Alternative/other school       0    0      0              0
## 4714 4-Alternative/other school     587  206    381             27
## 4715 4-Alternative/other school     210  137     73           10.2
## 4716 4-Alternative/other school      50   46      4              5
## 4717 4-Alternative/other school      19   19      0           <NA>
## 4718 4-Alternative/other school      43   27     16            8.2
## 4719 4-Alternative/other school     241  135    106          18.23
## 4720 4-Alternative/other school      70   47     23          11.75
## 4721 4-Alternative/other school      35   14     21              1
## 4722 4-Alternative/other school      13   10      3              3
## 4723 4-Alternative/other school      12    3      9              1
## 4724 4-Alternative/other school     214  132     82          13.77
## 4725 4-Alternative/other school      17    7     10              2
## 4726 4-Alternative/other school       3  n/a      3           0.91
## 4727 4-Alternative/other school      37   15     22           4.76
## 4728 4-Alternative/other school     179  102     77            7.1
## 4729 4-Alternative/other school     327  178    149           21.7
## 4730 4-Alternative/other school      90   43     47            3.1
## 4731 4-Alternative/other school     270  172     98             12
## 4732 4-Alternative/other school     198  108     90              2
## 4733 4-Alternative/other school     n/a  n/a    n/a           0.97
## 4734 4-Alternative/other school      10    3      7              0
## 4735 4-Alternative/other school      19   13      6              4
## 4736 4-Alternative/other school       0  n/a    n/a           <NA>
## 4737 4-Alternative/other school     239  122    117              1
## 4738 4-Alternative/other school    1480  731    749           67.2
## 4739 4-Alternative/other school      95   58     37             10
## 4740 4-Alternative/other school      28   15     13              4
## 4741 4-Alternative/other school      46   22     24           2.41
## 4742 4-Alternative/other school       0    0      0              0
## 4743 4-Alternative/other school     111   67     44            5.5
## 4744 4-Alternative/other school       0    0      0           <NA>
## 4745 4-Alternative/other school     108   42     66            6.5
## 4746 4-Alternative/other school      20   10     10              0
## 4747 4-Alternative/other school      22   16      6           7.51
## 4748 4-Alternative/other school      29   11     18           <NA>
## 4749 4-Alternative/other school      12   10      2              5
## 4750 4-Alternative/other school       7    4      3           <NA>
## 4751 4-Alternative/other school       6    4      2           <NA>
## 4752 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4753 4-Alternative/other school       1    1      0           <NA>
## 4754 4-Alternative/other school      32   20     12           6.27
## 4755 4-Alternative/other school      34   12     22           1.17
## 4756 4-Alternative/other school       0    0      0          24.13
## 4757 4-Alternative/other school       0    0      0              3
## 4758 4-Alternative/other school       4    3      1           <NA>
## 4759 4-Alternative/other school       0    0      0              0
## 4760 4-Alternative/other school     102   73     29          18.91
## 4761 4-Alternative/other school     n/a  n/a    n/a              2
## 4762 4-Alternative/other school       0    0      0           9.45
## 4763 4-Alternative/other school      65   33     32           2.76
## 4764 4-Alternative/other school     103   52     51            2.4
## 4765 4-Alternative/other school      52   23     29            1.5
## 4766 4-Alternative/other school     159   61     98            2.8
## 4767 4-Alternative/other school     213   87    126            3.7
## 4768 4-Alternative/other school     151   60     91            1.2
## 4769 4-Alternative/other school      65   31     34            1.6
## 4770 4-Alternative/other school     188   90     98              2
## 4771 4-Alternative/other school      78   43     35            1.5
## 4772 4-Alternative/other school     104   48     56           2.87
## 4773 4-Alternative/other school      61   28     33            1.5
## 4774 4-Alternative/other school      79   38     41              2
## 4775 4-Alternative/other school     170   65    105           1.75
## 4776 4-Alternative/other school      21   18      3            4.5
## 4777 4-Alternative/other school     101   63     38           <NA>
## 4778 4-Alternative/other school     n/a  n/a    n/a              8
## 4779 4-Alternative/other school      11    6      5           <NA>
## 4780 4-Alternative/other school      24   17      7           <NA>
## 4781 4-Alternative/other school     129   91     38             16
## 4782 4-Alternative/other school      23   19      4              1
## 4783 4-Alternative/other school      38   21     17              1
## 4784 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4785 4-Alternative/other school      35   18     17           <NA>
## 4786 4-Alternative/other school     225  126     99              4
## 4787 4-Alternative/other school      85   55     30           <NA>
## 4788 4-Alternative/other school      18   18      0           <NA>
## 4789 4-Alternative/other school       9    0      9           <NA>
## 4790 4-Alternative/other school      51   51      0           <NA>
## 4791 4-Alternative/other school      22   22      0           <NA>
## 4792 4-Alternative/other school     313  172    141             28
## 4793 4-Alternative/other school     269  137    132          21.32
## 4794 4-Alternative/other school     505  211    294            8.5
## 4795 4-Alternative/other school       4    3      1          54.07
## 4796 4-Alternative/other school       8    5      3              1
## 4797 4-Alternative/other school     225  111    114          21.96
## 4798 4-Alternative/other school     119   78     41           <NA>
## 4799 4-Alternative/other school     111   77     34            7.2
## 4800 4-Alternative/other school     292  166    126           12.3
## 4801 4-Alternative/other school      60   43     17          20.22
## 4802 4-Alternative/other school      15    9      6           2.33
## 4803 4-Alternative/other school      17    6     11              1
## 4804 4-Alternative/other school       3    3      0           <NA>
## 4805 4-Alternative/other school     349  155    194            9.7
## 4806 4-Alternative/other school     208  108    100            9.9
## 4807 4-Alternative/other school      26   26      0              6
## 4808 4-Alternative/other school      75   63     12              9
## 4809 4-Alternative/other school      54   54      0             10
## 4810 4-Alternative/other school     891  441    450           47.5
## 4811 4-Alternative/other school     254  162     92              9
## 4812 4-Alternative/other school     306  189    117              9
## 4813 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4814 4-Alternative/other school      28   28      0           3.08
## 4815 4-Alternative/other school      19   13      6           1.17
## 4816 4-Alternative/other school       4    0      4              1
## 4817 4-Alternative/other school      25   14     11            1.5
## 4818 4-Alternative/other school     404  243    161             10
## 4819 4-Alternative/other school       0    0      0            1.4
## 4820 4-Alternative/other school      68   48     20              5
## 4821 4-Alternative/other school     114   61     53            8.2
## 4822 4-Alternative/other school     304  191    113             12
## 4823 4-Alternative/other school      10    4      6           <NA>
## 4824 4-Alternative/other school     221   83    138           10.2
## 4825 4-Alternative/other school     140   70     70           2.15
## 4826 4-Alternative/other school      48   31     17              0
## 4827 4-Alternative/other school      15    6      9              0
## 4828 4-Alternative/other school      50   20     30           1.53
## 4829 4-Alternative/other school      16   13      3              1
## 4830 4-Alternative/other school      74   36     38          17.21
## 4831 4-Alternative/other school       3    1      2              1
## 4832 4-Alternative/other school       7    1      6              2
## 4833 4-Alternative/other school       7    2      5           0.12
## 4834 4-Alternative/other school       5    2      3              1
## 4835 4-Alternative/other school       0    0      0              0
## 4836 4-Alternative/other school      21   13      8            0.9
## 4837 4-Alternative/other school     111   64     47           6.69
## 4838 4-Alternative/other school      20   17      3              3
## 4839 4-Alternative/other school      24   12     12              1
## 4840 4-Alternative/other school       4    4      0           <NA>
## 4841 4-Alternative/other school      12    7      5              2
## 4842 4-Alternative/other school     101   64     37              1
## 4843 4-Alternative/other school      17    0     17          35.02
## 4844 4-Alternative/other school      22   20      2              2
## 4845 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4846 4-Alternative/other school       0    0      0              0
## 4847 4-Alternative/other school       0    0      0              0
## 4848 4-Alternative/other school      85   39     46            3.3
## 4849 4-Alternative/other school      83   48     35           15.5
## 4850 4-Alternative/other school    <NA>  n/a    n/a              2
## 4851 4-Alternative/other school     314  167    147             17
## 4852 4-Alternative/other school     107   29     78          10.14
## 4853 4-Alternative/other school      71   50     21            8.5
## 4854 4-Alternative/other school      45   45      0              6
## 4855 4-Alternative/other school      83   83      0              5
## 4856 4-Alternative/other school      18   11      7           <NA>
## 4857 4-Alternative/other school      50   38     12              1
## 4858 4-Alternative/other school      64   42     22            9.5
## 4859 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4860 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4861 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4862 4-Alternative/other school       2    2      0           <NA>
## 4863 4-Alternative/other school       1    1      0           <NA>
## 4864 4-Alternative/other school       1    1      0           <NA>
## 4865 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4866 4-Alternative/other school       4    3      1           <NA>
## 4867 4-Alternative/other school      11   11      0           <NA>
## 4868 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4869 4-Alternative/other school       1    1      0           <NA>
## 4870 4-Alternative/other school       1    1      0           <NA>
## 4871 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4872 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4873 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4874 4-Alternative/other school       1    1      0           <NA>
## 4875 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4876 4-Alternative/other school      16   16      0              1
## 4877 4-Alternative/other school      95   58     37              6
## 4878 4-Alternative/other school      10    0     10            0.5
## 4879 4-Alternative/other school      23   17      6              8
## 4880 4-Alternative/other school       4    2      2           <NA>
## 4881 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4882 4-Alternative/other school     n/a  n/a    n/a            n/a
## 4883 4-Alternative/other school     219   95    124              8
## 4884 4-Alternative/other school     n/a  n/a    n/a              1
## 4885 4-Alternative/other school      36   31      5           5.19
## 4886 4-Alternative/other school       4    4      0           1.01
## 4887 4-Alternative/other school       0    0      0           2.33
## 4888 4-Alternative/other school      18   15      3           0.94
## 4889 4-Alternative/other school      90   46     44            2.2
## 4890 4-Alternative/other school      58   23     35           7.38
## 4891 4-Alternative/other school     101   64     37          20.61
## 4892 4-Alternative/other school     326  207    119           13.8
## 4893 4-Alternative/other school      43   27     16              1
## 4894 4-Alternative/other school       6    2      4           <NA>
## 4895 4-Alternative/other school      67    6     61           7.31
## 4896 4-Alternative/other school       0    0      0           1.29
## 4897 4-Alternative/other school      22   19      3              1
## 4898 4-Alternative/other school      69   42     27          13.33
## 4899 4-Alternative/other school      41   30     11           5.09
## 4900 4-Alternative/other school      19   17      2           7.11
## 4901 4-Alternative/other school       4    4      0           2.31
## 4902 4-Alternative/other school     357  190    167          24.71
## 4903 4-Alternative/other school      13    8      5           1.08
## 4904 4-Alternative/other school      35   11     24           2.03
## 4905 4-Alternative/other school      58   23     35           1.75
## 4906 4-Alternative/other school      10    6      4           0.24
## 4907 4-Alternative/other school     605  364    241           25.4
## 4908 4-Alternative/other school       2    2      0           <NA>
## 4909 4-Alternative/other school     138   67     71          13.88
## 4910 4-Alternative/other school     363  192    171          18.82
## 4911 4-Alternative/other school       8    8      0           0.35
## 4912 4-Alternative/other school      12    7      5              1
## 4913 4-Alternative/other school      49   36     13            7.5
## 4914 4-Alternative/other school     367  202    165             19
## 4915 4-Alternative/other school      56   40     16            4.2
## 4916 4-Alternative/other school      17   17      0           <NA>
## 4917 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4918 4-Alternative/other school      67   40     27          10.95
## 4919 4-Alternative/other school     114   57     57           4.43
## 4920 4-Alternative/other school      12    2     10           2.52
## 4921 4-Alternative/other school     131   85     46            7.5
## 4922 4-Alternative/other school     753  426    327             59
## 4923 4-Alternative/other school      91   52     39              1
## 4924 4-Alternative/other school      45   25     20             10
## 4925 4-Alternative/other school      27   15     12              4
## 4926 4-Alternative/other school      49   21     28              6
## 4927 4-Alternative/other school     153   86     67           11.4
## 4928 4-Alternative/other school     154   31    123           <NA>
## 4929 4-Alternative/other school     133   82     51          18.89
## 4930 4-Alternative/other school      57   32     25           6.78
## 4931 4-Alternative/other school      48   41      7          13.77
## 4932 4-Alternative/other school      31    0     31           <NA>
## 4933 4-Alternative/other school     100   62     38              5
## 4934 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4935 4-Alternative/other school     337  161    176          13.52
## 4936 4-Alternative/other school     196   39    157           <NA>
## 4937 4-Alternative/other school      40   27     13              6
## 4938 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4939 4-Alternative/other school       0    0      0           <NA>
## 4940 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4941 4-Alternative/other school      49   22     27            1.5
## 4942 4-Alternative/other school       1    1      0              1
## 4943 4-Alternative/other school     n/a  n/a    n/a              2
## 4944 4-Alternative/other school     n/a  n/a    n/a            7.4
## 4945 4-Alternative/other school      50   35     15             15
## 4946 4-Alternative/other school      39   39      0              2
## 4947 4-Alternative/other school     207  118     89          18.91
## 4948 4-Alternative/other school      48   21     27           <NA>
## 4949 4-Alternative/other school      16   15      1           3.14
## 4950 4-Alternative/other school      52   31     21              8
## 4951 4-Alternative/other school       8    7      1           <NA>
## 4952 4-Alternative/other school      58    0     58              6
## 4953 4-Alternative/other school     156  105     51             17
## 4954 4-Alternative/other school      31   31    n/a            1.9
## 4955 4-Alternative/other school     101   64     37          26.77
## 4956 4-Alternative/other school      75   58     17              5
## 4957 4-Alternative/other school      42   32     10           <NA>
## 4958 4-Alternative/other school     330  214    116             38
## 4959 4-Alternative/other school      10   10      0              1
## 4960 4-Alternative/other school     196  127     69          12.51
## 4961 4-Alternative/other school     151   80     71           19.4
## 4962 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4963 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4964 4-Alternative/other school      66   44     22           6.16
## 4965 4-Alternative/other school      28   15     13              8
## 4966 4-Alternative/other school     221  112    109           <NA>
## 4967 4-Alternative/other school       0    0      0              1
## 4968 4-Alternative/other school      61   31     30            4.2
## 4969 4-Alternative/other school      59   30     29            4.5
## 4970 4-Alternative/other school      46   31     15              1
## 4971 4-Alternative/other school     126   95     31             15
## 4972 4-Alternative/other school      30   25      5           9.02
## 4973 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4974 4-Alternative/other school      21    0     21           3.08
## 4975 4-Alternative/other school      50   22     28              2
## 4976 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 4977 4-Alternative/other school       0    0      0           24.6
## 4978 4-Alternative/other school    1051  523    528          43.51
## 4979 4-Alternative/other school     104  104      0          10.67
## 4980 4-Alternative/other school      36   26     10           2.79
## 4981 4-Alternative/other school     427  213    214           41.2
## 4982 4-Alternative/other school      66    0     66            6.5
## 4983 4-Alternative/other school       0    0      0           <NA>
## 4984 4-Alternative/other school     533  278    255          31.95
## 4985 4-Alternative/other school     143   96     47           11.2
## 4986 4-Alternative/other school     380  211    169          11.85
## 4987 4-Alternative/other school      39   17     22              2
## 4988 4-Alternative/other school      43   43      0              0
## 4989 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4990 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 4991 4-Alternative/other school      23   18      5              0
## 4992 4-Alternative/other school     294  165    129          13.36
## 4993 4-Alternative/other school     200  122     78            8.6
## 4994 4-Alternative/other school       0    0      0           <NA>
## 4995 4-Alternative/other school      71   62      9             10
## 4996 4-Alternative/other school     n/a  n/a    n/a              1
## 4997 4-Alternative/other school      57   40     17            9.5
## 4998 4-Alternative/other school      13    7      6           2.36
## 4999 4-Alternative/other school      26   14     12            1.4
## 5000 4-Alternative/other school     307  154    153             13
## 5001 4-Alternative/other school       0    0      0            6.1
## 5002 4-Alternative/other school       1    0      1           <NA>
## 5003 4-Alternative/other school      40   29     11           7.63
## 5004 4-Alternative/other school     471  227    244          24.84
## 5005 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5006 4-Alternative/other school     101   55     46              2
## 5007 4-Alternative/other school     n/a  n/a    n/a              2
## 5008 4-Alternative/other school      65   29     36              4
## 5009 4-Alternative/other school     241  143     98              6
## 5010 4-Alternative/other school     278  163    115          17.62
## 5011 4-Alternative/other school      58   42     16             10
## 5012 4-Alternative/other school       8    6      2           2.29
## 5013 4-Alternative/other school      69   43     26              7
## 5014 4-Alternative/other school     183   86     97             12
## 5015 4-Alternative/other school       0    0      0           3.72
## 5016 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5017 4-Alternative/other school      15    9      6           1.93
## 5018 4-Alternative/other school      18   12      6              4
## 5019 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5020 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5021 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5022 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5023 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5024 4-Alternative/other school       3    2      1           <NA>
## 5025 4-Alternative/other school       4    4      0           2.15
## 5026 4-Alternative/other school       8    7      1           3.29
## 5027 4-Alternative/other school       3    3      0           <NA>
## 5028 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5029 4-Alternative/other school      35   31      4            7.5
## 5030 4-Alternative/other school      87   59     28              5
## 5031 4-Alternative/other school      44   24     20           7.27
## 5032 4-Alternative/other school       3    0      3           0.05
## 5033 4-Alternative/other school      73   73      0              5
## 5034 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5035 4-Alternative/other school      17   15      2           1.16
## 5036 4-Alternative/other school     337  175    162           8.65
## 5037 4-Alternative/other school     263  178     85           15.5
## 5038 4-Alternative/other school      77   54     23             20
## 5039 4-Alternative/other school      58    0     58           8.86
## 5040 4-Alternative/other school      57    0     57           6.43
## 5041 4-Alternative/other school       0    0      0           <NA>
## 5042 4-Alternative/other school       0    0      0           <NA>
## 5043 4-Alternative/other school       4    2      2              1
## 5044 4-Alternative/other school       0    0      0              0
## 5045 4-Alternative/other school       0    0      0           5.82
## 5046 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5047 4-Alternative/other school      38   25     13            2.4
## 5048 4-Alternative/other school      26   11     15              2
## 5049 4-Alternative/other school       6    6      0              1
## 5050 4-Alternative/other school      65   49     16              2
## 5051 4-Alternative/other school     138  113     25           4.86
## 5052 4-Alternative/other school      10    9      1              1
## 5053 4-Alternative/other school      40   25     15            3.4
## 5054 4-Alternative/other school       0    0      0           <NA>
## 5055 4-Alternative/other school       4    3      1            0.5
## 5056 4-Alternative/other school      21   10     11           7.84
## 5057 4-Alternative/other school      17    9      8              3
## 5058 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5059 4-Alternative/other school     193  193      0             11
## 5060 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5061 4-Alternative/other school       7    5      2           2.91
## 5062 4-Alternative/other school      13    7      6           <NA>
## 5063 4-Alternative/other school      40   40      0           <NA>
## 5064 4-Alternative/other school      29   20      9              9
## 5065 4-Alternative/other school       0    0      0           <NA>
## 5066 4-Alternative/other school     142  103     39          17.07
## 5067 4-Alternative/other school     195  143     52           31.6
## 5068 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5069 4-Alternative/other school     109   73     36          33.97
## 5070 4-Alternative/other school      66   48     18             13
## 5071 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5072 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 5073 4-Alternative/other school      92   39     53              4
## 5074 4-Alternative/other school     252  144    108          27.49
## 5075 4-Alternative/other school       6    4      2           0.37
## 5076 4-Alternative/other school      38   38      0              4
## 5077 4-Alternative/other school     166   87     79           13.7
## 5078 4-Alternative/other school      88   55     33           5.92
## 5079 4-Alternative/other school     194  102     92           <NA>
## 5080 4-Alternative/other school     111   64     47             10
## 5081 4-Alternative/other school      37   37      0              5
## 5082 4-Alternative/other school      10    7      3              1
## 5083 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 5084 4-Alternative/other school     232  166     66            9.2
## 5085 4-Alternative/other school      30   18     12              0
## 5086 4-Alternative/other school      72   28     44           <NA>
## 5087 4-Alternative/other school     111   43     68            5.9
## 5088 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5089 4-Alternative/other school       0    0      0              0
## 5090 4-Alternative/other school      22   13      9            0.5
## 5091 4-Alternative/other school     105   73     32           8.63
## 5092 4-Alternative/other school      19   14      5              3
## 5093 4-Alternative/other school      10    7      3              1
## 5094 4-Alternative/other school     158   65     93          12.17
## 5095 4-Alternative/other school      25   25      0              2
## 5096 4-Alternative/other school      19   11      8           <NA>
## 5097 4-Alternative/other school      19    8     11           <NA>
## 5098 4-Alternative/other school     117   91     26             23
## 5099 4-Alternative/other school      21   15      6              1
## 5100 4-Alternative/other school      16    8      8              4
## 5101 4-Alternative/other school      16    5     11              4
## 5102 4-Alternative/other school      22   12     10              2
## 5103 4-Alternative/other school     132   68     64          10.05
## 5104 4-Alternative/other school     612  301    311             45
## 5105 4-Alternative/other school     290  137    153           <NA>
## 5106 4-Alternative/other school      42   42      0           2.67
## 5107 4-Alternative/other school     n/a  n/a    n/a              3
## 5108 4-Alternative/other school      82   57     25              4
## 5109 4-Alternative/other school      83   46     37              1
## 5110 4-Alternative/other school       5    3      2            0.5
## 5111 4-Alternative/other school     247  154     93             22
## 5112 4-Alternative/other school      71   34     37              3
## 5113 4-Alternative/other school      25   11     14              1
## 5114 4-Alternative/other school     n/a  n/a    n/a           4.05
## 5115 4-Alternative/other school     367  232    135             10
## 5116 4-Alternative/other school     189  107     82          12.07
## 5117 4-Alternative/other school     123   63     60              7
## 5118 4-Alternative/other school     373  254    119             28
## 5119 4-Alternative/other school      10    7      3              4
## 5120 4-Alternative/other school      23   15      8           1.85
## 5121 4-Alternative/other school     191  127     64            7.5
## 5122 4-Alternative/other school     197  102     95           4.62
## 5123 4-Alternative/other school      94   61     33           8.47
## 5124 4-Alternative/other school      72   42     30           3.45
## 5125 4-Alternative/other school      52   30     22            2.4
## 5126 4-Alternative/other school       7    7      0              1
## 5127 4-Alternative/other school       7    5      2              2
## 5128 4-Alternative/other school      27   22      5              7
## 5129 4-Alternative/other school     145   85     60           8.42
## 5130 4-Alternative/other school       4    1      3            0.5
## 5131 4-Alternative/other school     229  149     80          16.94
## 5132 4-Alternative/other school      56   32     24            8.1
## 5133 4-Alternative/other school      14   11      3              1
## 5134 4-Alternative/other school     450  226    224           <NA>
## 5135 4-Alternative/other school     101   63     38           5.03
## 5136 4-Alternative/other school     256  142    114          10.85
## 5137 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5138 4-Alternative/other school      17   14      3           1.18
## 5139 4-Alternative/other school     172  119     53           11.2
## 5140 4-Alternative/other school      30   15     15            1.2
## 5141 4-Alternative/other school       0    0      0           <NA>
## 5142 4-Alternative/other school      59   21     38            4.3
## 5143 4-Alternative/other school     176  101     75           8.52
## 5144 4-Alternative/other school      22   22      0              2
## 5145 4-Alternative/other school      17    9      8           3.47
## 5146 4-Alternative/other school       0    0      0              0
## 5147 4-Alternative/other school      19   13      6              4
## 5148 4-Alternative/other school       0    0      0          15.14
## 5149 4-Alternative/other school     430  255    175          24.29
## 5150 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5151 4-Alternative/other school     267  173     94             15
## 5152 4-Alternative/other school     105   60     45              9
## 5153 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5154 4-Alternative/other school      13   13      0           0.52
## 5155 4-Alternative/other school     162   70     92          13.23
## 5156 4-Alternative/other school     403  216    187          12.55
## 5157 4-Alternative/other school     108   58     50           8.17
## 5158 4-Alternative/other school      32   15     17            0.3
## 5159 4-Alternative/other school     343  201    142          28.05
## 5160 4-Alternative/other school      64   60      4           24.7
## 5161 4-Alternative/other school     176   69    107          11.55
## 5162 4-Alternative/other school    1616  778    838          76.46
## 5163 4-Alternative/other school     283  134    149          31.99
## 5164 4-Alternative/other school     134   74     60          17.76
## 5165 4-Alternative/other school      49   27     22            0.3
## 5166 4-Alternative/other school     123   65     58              4
## 5167 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5168 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5169 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5170 4-Alternative/other school       3    3      0           <NA>
## 5171 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5172 4-Alternative/other school      74   39     35              3
## 5173 4-Alternative/other school       0    0      0           <NA>
## 5174 4-Alternative/other school      74   47     27            4.1
## 5175 4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 5176 4-Alternative/other school      96   54     42           0.01
## 5177 4-Alternative/other school      35   20     15           4.35
## 5178 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5179 4-Alternative/other school      76   47     29            4.2
## 5180 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5181 4-Alternative/other school      66   43     23            4.5
## 5182 4-Alternative/other school      17    4     13              1
## 5183 4-Alternative/other school      18    9      9              1
## 5184 4-Alternative/other school     327  156    171           16.5
## 5185 4-Alternative/other school     109   56     53           12.3
## 5186 4-Alternative/other school     243  148     95           17.8
## 5187 4-Alternative/other school      37   37      0           5.96
## 5188 4-Alternative/other school      34   17     17              6
## 5189 4-Alternative/other school      54   34     20              4
## 5190 4-Alternative/other school      20   12      8            1.5
## 5191 4-Alternative/other school      17   17    n/a           <NA>
## 5192 4-Alternative/other school     133   41     92          13.55
## 5193 4-Alternative/other school     831  412    419             31
## 5194 4-Alternative/other school     164   72     92             16
## 5195 4-Alternative/other school     103   78     25              6
## 5196 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5197 4-Alternative/other school     129   72     57           7.25
## 5198 4-Alternative/other school       0    0      0              0
## 5199 4-Alternative/other school     456  205    251          21.29
## 5200 4-Alternative/other school      18   12      6            6.1
## 5201 4-Alternative/other school      22    0     22              0
## 5202 4-Alternative/other school      19    7     12              2
## 5203 4-Alternative/other school     289  148    141          21.24
## 5204 4-Alternative/other school      25    5     20              3
## 5205 4-Alternative/other school     132   88     44           11.7
## 5206 4-Alternative/other school     285  153    132          16.04
## 5207 4-Alternative/other school     210  152     58             11
## 5208 4-Alternative/other school     264  140    124           17.6
## 5209 4-Alternative/other school      25   18      7              2
## 5210 4-Alternative/other school     118   52     66              4
## 5211 4-Alternative/other school     160  110     50            3.2
## 5212 4-Alternative/other school      57   19     38           4.12
## 5213 4-Alternative/other school      21    8     13              2
## 5214 4-Alternative/other school     297  182    115          17.74
## 5215 4-Alternative/other school       0    0      0          18.26
## 5216 4-Alternative/other school       0    0      0           1.05
## 5217 4-Alternative/other school      99   57     42           7.65
## 5218 4-Alternative/other school      38   25     13              1
## 5219 4-Alternative/other school       0    0      0              0
## 5220 4-Alternative/other school      52   40     12              5
## 5221 4-Alternative/other school      27   27    n/a           <NA>
## 5222 4-Alternative/other school       0    0      0              0
## 5223 4-Alternative/other school       0    0      0              0
## 5224 4-Alternative/other school      34   15     19           3.65
## 5225 4-Alternative/other school       0    0      0              0
## 5226 4-Alternative/other school       0    0      0           0.18
## 5227 4-Alternative/other school      10    8      2           0.99
## 5228 4-Alternative/other school      45   30     15             10
## 5229 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5230 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 5231 4-Alternative/other school     215  107    108           14.1
## 5232 4-Alternative/other school      71   38     33             10
## 5233 4-Alternative/other school      30   17     13           5.01
## 5234 4-Alternative/other school       8    5      3           <NA>
## 5235 4-Alternative/other school      55   24     31              2
## 5236 4-Alternative/other school      19    7     12            0.5
## 5237 4-Alternative/other school      59   39     20              8
## 5238 4-Alternative/other school     525  237    288             31
## 5239 4-Alternative/other school    <NA>  n/a    n/a              1
## 5240 4-Alternative/other school     123   61     62            8.9
## 5241 4-Alternative/other school       0    0      0              0
## 5242 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5243 4-Alternative/other school       2    1      1           <NA>
## 5244 4-Alternative/other school       5    3      2           <NA>
## 5245 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5246 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5247 4-Alternative/other school       1    1      0           <NA>
## 5248 4-Alternative/other school       5    4      1           <NA>
## 5249 4-Alternative/other school       5    3      2           <NA>
## 5250 4-Alternative/other school      13    6      7           2.74
## 5251 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5252 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5253 4-Alternative/other school       6    0      6           <NA>
## 5254 4-Alternative/other school       1    0      1           <NA>
## 5255 4-Alternative/other school     148   91     57          11.94
## 5256 4-Alternative/other school     n/a  n/a    n/a            n/a
## 5257 4-Alternative/other school     185   62    123           9.75
## 5258 4-Alternative/other school       0    0      0           <NA>
## 5259 4-Alternative/other school     159   96     63              5
## 5260 4-Alternative/other school      14   14      0           <NA>
## 5261 4-Alternative/other school     141   81     60           <NA>
## 5262 4-Alternative/other school      35   35      0              4
## 5263 4-Alternative/other school       1    1    n/a           <NA>
##      Pupil.Teacher.Ratio
## 1                    n/a
## 2                    n/a
## 3                    n/a
## 4                  17.02
## 5                  71.43
## 6                    n/a
## 7                   3.85
## 8                    n/a
## 9                    n/a
## 10                   n/a
## 11                   n/a
## 12                   n/a
## 13                   n/a
## 14                 33.33
## 15                   n/a
## 16                   n/a
## 17                   n/a
## 18                   n/a
## 19                  12.8
## 20                 10.92
## 21                   n/a
## 22                   n/a
## 23                   n/a
## 24                 27.62
## 25                   n/a
## 26                 24.36
## 27                  2.93
## 28                   n/a
## 29                 12.03
## 30                  6.86
## 31                  4.89
## 32                   n/a
## 33                 56.82
## 34                  9.22
## 35                     2
## 36                   n/a
## 37                   n/a
## 38                  3.86
## 39                 27.62
## 40                 12.38
## 41                 11.33
## 42                  16.8
## 43                   n/a
## 44                   n/a
## 45                     8
## 46                 15.84
## 47                 18.38
## 48                 22.64
## 49                 16.85
## 50                 30.38
## 51                   n/a
## 52                 20.48
## 53                   n/a
## 54                 16.27
## 55                  7.86
## 56                   n/a
## 57                 17.04
## 58                  7.14
## 59                 12.33
## 60                 17.51
## 61                   n/a
## 62                 32.38
## 63                   n/a
## 64                   4.5
## 65                 34.07
## 66                   7.5
## 67                  11.1
## 68                 17.22
## 69                     0
## 70                   n/a
## 71                   n/a
## 72                 88.75
## 73                  11.5
## 74                    13
## 75                 10.81
## 76                   n/a
## 77                   n/a
## 78                 18.17
## 79                  8.18
## 80                 20.08
## 81                 38.27
## 82                 15.08
## 83                  9.12
## 84                  5.33
## 85                 17.15
## 86                 18.94
## 87                   n/a
## 88                     8
## 89                 14.47
## 90                    10
## 91                     6
## 92                   n/a
## 93                   5.6
## 94                     8
## 95                   6.6
## 96                 21.38
## 97                  29.5
## 98                     6
## 99                 16.92
## 100                 9.86
## 101                  7.5
## 102                 4.32
## 103                  n/a
## 104                12.25
## 105                  n/a
## 106                 1.17
## 107                  n/a
## 108                  n/a
## 109                  n/a
## 110                  n/a
## 111                  n/a
## 112                  n/a
## 113                  n/a
## 114                  n/a
## 115                  n/a
## 116                  3.6
## 117                  n/a
## 118                15.15
## 119                20.07
## 120                  n/a
## 121                  6.5
## 122                  n/a
## 123                  n/a
## 124                11.57
## 125                  7.8
## 126                   22
## 127                    0
## 128                 9.93
## 129                11.39
## 130                28.96
## 131                26.96
## 132                 6.11
## 133                   16
## 134                  n/a
## 135                  n/a
## 136                  n/a
## 137                13.38
## 138                  7.3
## 139                30.61
## 140                51.82
## 141                 3.67
## 142                   21
## 143                  n/a
## 144                17.14
## 145                19.33
## 146                 8.72
## 147                  n/a
## 148                  n/a
## 149                  n/a
## 150                  n/a
## 151                  n/a
## 152                  n/a
## 153                  n/a
## 154                  n/a
## 155                  n/a
## 156                  n/a
## 157                  n/a
## 158                  n/a
## 159                  n/a
## 160                  n/a
## 161                   30
## 162                  n/a
## 163                42.06
## 164                  n/a
## 165                  n/a
## 166                  n/a
## 167                  n/a
## 168                  n/a
## 169                  n/a
## 170                  n/a
## 171                    0
## 172                    0
## 173                  n/a
## 174                  n/a
## 175                  n/a
## 176                  n/a
## 177                  n/a
## 178                  n/a
## 179                  n/a
## 180                    0
## 181                  n/a
## 182                 27.8
## 183                  n/a
## 184                18.11
## 185                  n/a
## 186                 12.5
## 187                14.42
## 188                  n/a
## 189                  n/a
## 190                   19
## 191                17.09
## 192                12.94
## 193                15.93
## 194                  n/a
## 195                 2.35
## 196                 2.81
## 197                    0
## 198                52.25
## 199                  n/a
## 200                  n/a
## 201                15.24
## 202                  n/a
## 203                  9.2
## 204                 9.66
## 205                15.15
## 206                 7.45
## 207                  n/a
## 208                29.64
## 209                  n/a
## 210                  n/a
## 211                 9.82
## 212                  n/a
## 213                  n/a
## 214                   20
## 215                 3.71
## 216                19.33
## 217                 0.91
## 218                10.93
## 219                12.07
## 220                 5.38
## 221                 5.66
## 222                 1.54
## 223                 5.12
## 224                 8.02
## 225                    0
## 226                    6
## 227                 4.35
## 228                  n/a
## 229                 20.8
## 230                 0.69
## 231                    3
## 232                  n/a
## 233                  n/a
## 234                 6.86
## 235                 6.57
## 236                 7.86
## 237                 7.86
## 238                  n/a
## 239                  n/a
## 240                  n/a
## 241                  n/a
## 242                  n/a
## 243                  0.2
## 244                    0
## 245                 5.49
## 246                39.25
## 247                   35
## 248                  n/a
## 249                45.45
## 250                26.12
## 251                 5.41
## 252                  4.1
## 253                  n/a
## 254                   11
## 255                  n/a
## 256                 4.15
## 257                  n/a
## 258                  2.9
## 259                11.67
## 260                  n/a
## 261                    0
## 262                    0
## 263                    0
## 264                  n/a
## 265                22.07
## 266                    3
## 267                  9.2
## 268                  n/a
## 269                 5.03
## 270                  6.5
## 271                  n/a
## 272                    7
## 273                  n/a
## 274                  n/a
## 275                13.55
## 276                 4.76
## 277                  n/a
## 278                  n/a
## 279                13.13
## 280                    3
## 281                  n/a
## 282                   18
## 283                18.81
## 284                21.49
## 285                 12.1
## 286                  3.5
## 287                17.81
## 288                 17.4
## 289                 7.57
## 290                16.94
## 291                  n/a
## 292                18.84
## 293                  n/a
## 294                  n/a
## 295                 3.32
## 296                  3.1
## 297                  n/a
## 298                  n/a
## 299                 6.67
## 300                  n/a
## 301                  3.5
## 302                  n/a
## 303                  n/a
## 304                  n/a
## 305                  8.6
## 306                   12
## 307                  n/a
## 308                13.64
## 309                    6
## 310                  n/a
## 311                   35
## 312                   14
## 313                 7.57
## 314                37.71
## 315                21.43
## 316                  n/a
## 317                  n/a
## 318                 5.79
## 319                  n/a
## 320                  n/a
## 321                    4
## 322                 8.81
## 323                  n/a
## 324                   50
## 325                    0
## 326                 8.97
## 327                10.13
## 328                 9.44
## 329                  n/a
## 330                  n/a
## 331                 8.47
## 332                 4.76
## 333                11.25
## 334                  n/a
## 335                  n/a
## 336                  n/a
## 337                  n/a
## 338                  n/a
## 339                  n/a
## 340                  n/a
## 341                  n/a
## 342                 3.86
## 343                 7.94
## 344                 19.5
## 345                 8.65
## 346                    8
## 347                  n/a
## 348                 4.93
## 349                  n/a
## 350                 4.36
## 351                13.33
## 352                   22
## 353                  3.3
## 354                 1.09
## 355                  n/a
## 356                 20.5
## 357                26.28
## 358                 8.45
## 359                13.33
## 360                22.18
## 361                23.06
## 362                  n/a
## 363                   20
## 364                  n/a
## 365                 9.83
## 366                  6.4
## 367                26.52
## 368                    0
## 369                  n/a
## 370                  6.5
## 371                23.57
## 372                 7.29
## 373                 19.9
## 374                28.49
## 375                 5.79
## 376                17.24
## 377                  n/a
## 378                 5.72
## 379                  n/a
## 380                  n/a
## 381                  n/a
## 382                  n/a
## 383                  n/a
## 384                  n/a
## 385                  n/a
## 386                  n/a
## 387                  n/a
## 388                  n/a
## 389                 8.23
## 390                  n/a
## 391                10.18
## 392                   13
## 393                    8
## 394                  7.5
## 395                  113
## 396                    7
## 397                    9
## 398                11.33
## 399                23.11
## 400                  n/a
## 401                  n/a
## 402                  n/a
## 403                  n/a
## 404                  n/a
## 405                    8
## 406                  n/a
## 407               110.29
## 408                  n/a
## 409                    8
## 410                  n/a
## 411                  n/a
## 412                17.73
## 413                    8
## 414                 6.09
## 415                  n/a
## 416                  6.1
## 417                17.18
## 418                  5.4
## 419                 3.86
## 420                44.49
## 421                  n/a
## 422                18.86
## 423                   13
## 424                 2.29
## 425                  n/a
## 426                24.39
## 427                27.67
## 428                19.17
## 429                21.25
## 430                  n/a
## 431                  n/a
## 432                  n/a
## 433                27.59
## 434                12.09
## 435                 7.56
## 436                 6.14
## 437                  n/a
## 438                 7.14
## 439                  n/a
## 440                12.86
## 441                14.31
## 442                 4.57
## 443                  n/a
## 444                28.73
## 445                  n/a
## 446                19.37
## 447                  n/a
## 448                28.18
## 449                  n/a
## 450                  n/a
## 451                  n/a
## 452                 7.23
## 453                    4
## 454                 5.99
## 455                 3.38
## 456                  n/a
## 457                18.35
## 458                   22
## 459                  n/a
## 460                24.47
## 461                 4.55
## 462                    1
## 463                  n/a
## 464                  2.5
## 465                 9.67
## 466                   29
## 467                  n/a
## 468                 4.23
## 469                  n/a
## 470                  n/a
## 471                  n/a
## 472                18.34
## 473                52.44
## 474                  n/a
## 475                17.71
## 476                20.91
## 477                   16
## 478                13.19
## 479                26.18
## 480                 0.65
## 481                 17.9
## 482                 9.65
## 483                  n/a
## 484                  n/a
## 485                12.37
## 486                   80
## 487                 22.8
## 488                  n/a
## 489                  n/a
## 490                   26
## 491                  n/a
## 492                   13
## 493                15.86
## 494                  n/a
## 495                11.33
## 496                20.24
## 497                  n/a
## 498                  n/a
## 499                  n/a
## 500                  n/a
## 501                   14
## 502                    0
## 503                  n/a
## 504                  n/a
## 505                  n/a
## 506                  n/a
## 507                  n/a
## 508                  n/a
## 509                  n/a
## 510                   14
## 511                 3.74
## 512                13.85
## 513                 8.03
## 514                 4.29
## 515                13.85
## 516                  n/a
## 517                   11
## 518                16.88
## 519                15.14
## 520                    0
## 521                16.54
## 522                29.15
## 523                14.33
## 524                21.21
## 525                 9.09
## 526                 20.7
## 527                  105
## 528                43.33
## 529                  n/a
## 530                  n/a
## 531                 6.76
## 532                    9
## 533                  n/a
## 534                   49
## 535                20.11
## 536                  n/a
## 537                 7.89
## 538                  9.5
## 539                  n/a
## 540                 4.23
## 541                  n/a
## 542                  n/a
## 543                  n/a
## 544                  n/a
## 545                  n/a
## 546                  n/a
## 547                  n/a
## 548                  n/a
## 549                  n/a
## 550                 8.14
## 551                 17.1
## 552                  n/a
## 553                10.45
## 554                   95
## 555                  n/a
## 556                10.94
## 557                  n/a
## 558                 2.31
## 559                  n/a
## 560                  n/a
## 561                   25
## 562                  n/a
## 563                 3.56
## 564                  n/a
## 565                19.29
## 566                38.33
## 567                    1
## 568                    4
## 569                 7.76
## 570                12.57
## 571                    4
## 572                  200
## 573                   25
## 574                  n/a
## 575                14.98
## 576                  n/a
## 577                   30
## 578                  n/a
## 579                 5.79
## 580                12.34
## 581                21.25
## 582                   32
## 583                  n/a
## 584                    4
## 585                11.43
## 586                  n/a
## 587                  n/a
## 588                    0
## 589                   17
## 590                   13
## 591                  n/a
## 592                  n/a
## 593                    0
## 594                26.33
## 595                17.76
## 596                11.46
## 597                13.53
## 598                  n/a
## 599                  n/a
## 600                  7.2
## 601                 9.81
## 602                26.04
## 603                 9.68
## 604                10.23
## 605                 3.57
## 606                 7.71
## 607                  4.5
## 608                20.65
## 609                    0
## 610                15.67
## 611                14.34
## 612                 7.67
## 613                 5.56
## 614                 6.76
## 615                 3.63
## 616                  n/a
## 617                  n/a
## 618                  n/a
## 619                  8.6
## 620                13.78
## 621                 4.71
## 622                15.22
## 623                   12
## 624                16.33
## 625                   35
## 626                16.25
## 627                 1.47
## 628                  n/a
## 629                  n/a
## 630                  n/a
## 631                  n/a
## 632                  n/a
## 633                  n/a
## 634                 3.67
## 635                10.12
## 636                  n/a
## 637                19.24
## 638                14.75
## 639                13.22
## 640                18.73
## 641                26.48
## 642                 9.16
## 643                  n/a
## 644                  9.5
## 645                   16
## 646                    0
## 647                  n/a
## 648                 3.32
## 649                 30.3
## 650                13.05
## 651                 0.46
## 652                25.48
## 653                    5
## 654                 14.5
## 655                 15.5
## 656                  n/a
## 657                48.33
## 658                 7.11
## 659                15.49
## 660                   12
## 661                13.78
## 662                   18
## 663                15.63
## 664                    8
## 665                    5
## 666                    6
## 667                 5.42
## 668                26.59
## 669                  3.5
## 670                23.55
## 671                24.76
## 672                  n/a
## 673                13.58
## 674                15.38
## 675                 7.61
## 676                11.67
## 677                 4.65
## 678                  n/a
## 679               101.75
## 680                  n/a
## 681                  n/a
## 682                 1.57
## 683                  n/a
## 684                  n/a
## 685                16.42
## 686                 7.27
## 687                    0
## 688                12.61
## 689                13.26
## 690                10.49
## 691                    5
## 692                  n/a
## 693                20.05
## 694                11.18
## 695                  n/a
## 696                 11.5
## 697                 7.33
## 698                 4.78
## 699                  n/a
## 700                14.47
## 701                12.85
## 702                   10
## 703                10.88
## 704                  n/a
## 705                 4.05
## 706                  n/a
## 707                42.27
## 708                 5.25
## 709                14.39
## 710                 6.43
## 711                  n/a
## 712                  n/a
## 713                  n/a
## 714                  n/a
## 715                  n/a
## 716                 16.2
## 717                 7.64
## 718                   10
## 719                  n/a
## 720                  n/a
## 721                 9.13
## 722                  n/a
## 723                  n/a
## 724                42.86
## 725                   10
## 726                   20
## 727                 5.33
## 728                36.67
## 729                17.09
## 730                17.82
## 731                11.83
## 732                  n/a
## 733                10.55
## 734                  n/a
## 735                37.46
## 736                  n/a
## 737                    5
## 738                 8.67
## 739                 13.6
## 740                  n/a
## 741                  n/a
## 742                46.88
## 743                  n/a
## 744                20.82
## 745                11.52
## 746                 7.43
## 747                33.33
## 748                    0
## 749                16.02
## 750                  n/a
## 751                   42
## 752                20.15
## 753                16.27
## 754                18.72
## 755                 8.95
## 756                 3.87
## 757                 1.25
## 758                 15.3
## 759                20.03
## 760                16.95
## 761                25.71
## 762                30.16
## 763                 20.4
## 764                  n/a
## 765                  n/a
## 766                  n/a
## 767                  n/a
## 768                  n/a
## 769                13.08
## 770                24.12
## 771                  n/a
## 772                  n/a
## 773                  n/a
## 774                  n/a
## 775                  n/a
## 776                  n/a
## 777                  n/a
## 778                  n/a
## 779                  n/a
## 780                  n/a
## 781                  4.5
## 782                   17
## 783                 2.61
## 784                   14
## 785                 10.5
## 786                  n/a
## 787                  n/a
## 788                  n/a
## 789                  n/a
## 790                  n/a
## 791                 10.5
## 792                    5
## 793                   17
## 794                  n/a
## 795                10.49
## 796                 0.02
## 797                   34
## 798                48.51
## 799                  n/a
## 800                  n/a
## 801                28.07
## 802                  n/a
## 803                14.82
## 804                  n/a
## 805                18.07
## 806                   32
## 807                15.76
## 808                    2
## 809                   17
## 810                   20
## 811                  n/a
## 812                15.33
## 813                  n/a
## 814                 2.75
## 815                    0
## 816                  n/a
## 817                22.86
## 818                   80
## 819                    0
## 820                  n/a
## 821                  n/a
## 822                11.91
## 823                16.17
## 824                 7.25
## 825                  n/a
## 826                 26.1
## 827                   23
## 828                16.57
## 829                 5.94
## 830                   79
## 831                  n/a
## 832                10.85
## 833                24.33
## 834                  8.5
## 835                    8
## 836                  n/a
## 837                  n/a
## 838                    0
## 839                  n/a
## 840                  n/a
## 841                24.59
## 842                26.45
## 843                11.94
## 844                12.53
## 845                    7
## 846                  n/a
## 847                 3.23
## 848                 8.88
## 849                42.54
## 850                  2.3
## 851                  n/a
## 852                18.86
## 853                 23.5
## 854                41.84
## 855                15.49
## 856                 12.6
## 857                 6.56
## 858                13.88
## 859                98.48
## 860                 14.5
## 861                  3.6
## 862                  n/a
## 863                  n/a
## 864                 1.33
## 865                 4.55
## 866                  n/a
## 867                  n/a
## 868                  n/a
## 869                   12
## 870                    2
## 871                 5.83
## 872                 15.5
## 873                   11
## 874                  n/a
## 875                11.82
## 876                 7.65
## 877                21.75
## 878                 7.11
## 879                10.94
## 880                 8.51
## 881                11.31
## 882                  n/a
## 883                  n/a
## 884                  n/a
## 885                 12.5
## 886                  4.9
## 887                  n/a
## 888                    0
## 889                  n/a
## 890                 7.71
## 891                 4.22
## 892                 38.1
## 893                 8.33
## 894                  n/a
## 895                  n/a
## 896                 16.5
## 897                   12
## 898                    0
## 899                  9.6
## 900                 7.61
## 901                    3
## 902                    6
## 903                 8.41
## 904                18.98
## 905                 10.7
## 906                12.45
## 907                15.21
## 908                12.17
## 909                 13.6
## 910                21.75
## 911                11.91
## 912                15.04
## 913                  n/a
## 914                34.33
## 915                20.33
## 916                  n/a
## 917                  n/a
## 918                  n/a
## 919                  n/a
## 920                  n/a
## 921                  n/a
## 922                  n/a
## 923                 8.33
## 924                    1
## 925                  n/a
## 926                  n/a
## 927                24.91
## 928                25.32
## 929                 3.57
## 930                16.33
## 931                17.88
## 932                23.04
## 933                 15.6
## 934                  n/a
## 935                 2.17
## 936                  n/a
## 937                   21
## 938                17.74
## 939                10.63
## 940                19.84
## 941                  n/a
## 942                  7.5
## 943                 5.56
## 944                 27.3
## 945                  n/a
## 946                  n/a
## 947                  n/a
## 948                  n/a
## 949                  n/a
## 950                  n/a
## 951                  n/a
## 952                  n/a
## 953                  n/a
## 954                  n/a
## 955                  n/a
## 956                  5.5
## 957                  n/a
## 958                  n/a
## 959                  n/a
## 960                25.11
## 961                18.84
## 962                16.63
## 963                21.85
## 964                    5
## 965                30.69
## 966                25.08
## 967                13.38
## 968                21.26
## 969                19.08
## 970                18.36
## 971                11.97
## 972                  6.4
## 973                20.51
## 974                  n/a
## 975                11.58
## 976                18.54
## 977                  n/a
## 978                21.27
## 979                19.24
## 980                   19
## 981                 0.88
## 982                15.33
## 983                 15.5
## 984                   64
## 985                   16
## 986                  n/a
## 987                  n/a
## 988                  n/a
## 989                  n/a
## 990                   23
## 991                  n/a
## 992                 15.2
## 993                 6.93
## 994                  n/a
## 995                19.67
## 996                   44
## 997                32.95
## 998                  n/a
## 999                 4.94
## 1000                 n/a
## 1001                 n/a
## 1002                   3
## 1003                3.55
## 1004                  17
## 1005                   0
## 1006                 n/a
## 1007                 n/a
## 1008                5.45
## 1009                7.14
## 1010                 n/a
## 1011                9.88
## 1012                  19
## 1013                 n/a
## 1014               25.38
## 1015               46.43
## 1016                   0
## 1017               13.65
## 1018               10.67
## 1019                 n/a
## 1020                2.87
## 1021                7.84
## 1022                6.33
## 1023                   2
## 1024                4.44
## 1025                 n/a
## 1026               13.91
## 1027               21.75
## 1028                 n/a
## 1029                  20
## 1030                2.31
## 1031               17.14
## 1032                 n/a
## 1033               16.56
## 1034               11.53
## 1035                 n/a
## 1036                 n/a
## 1037               26.12
## 1038               29.33
## 1039                9.96
## 1040                14.7
## 1041                0.15
## 1042                 n/a
## 1043                43.5
## 1044               20.33
## 1045               20.58
## 1046                 n/a
## 1047                 n/a
## 1048                5.67
## 1049                8.57
## 1050                 n/a
## 1051                   8
## 1052               18.63
## 1053                 n/a
## 1054                 n/a
## 1055                0.34
## 1056               48.71
## 1057                  61
## 1058                1.05
## 1059               21.13
## 1060                 n/a
## 1061                8.63
## 1062                 n/a
## 1063                  30
## 1064               59.83
## 1065                 4.5
## 1066                 6.8
## 1067                 n/a
## 1068                 n/a
## 1069                  24
## 1070                 n/a
## 1071               19.07
## 1072                 n/a
## 1073                 n/a
## 1074                 1.4
## 1075                 n/a
## 1076                 n/a
## 1077                4.73
## 1078                9.47
## 1079               18.22
## 1080                   0
## 1081                4.74
## 1082                 n/a
## 1083                8.86
## 1084                   9
## 1085               25.91
## 1086                   0
## 1087                4.67
## 1088                 n/a
## 1089                 n/a
## 1090                 n/a
## 1091                 n/a
## 1092                 n/a
## 1093                 n/a
## 1094                 n/a
## 1095                 n/a
## 1096                 n/a
## 1097                62.5
## 1098               31.57
## 1099                 n/a
## 1100               14.26
## 1101                 5.5
## 1102                 n/a
## 1103               29.75
## 1104                 n/a
## 1105               14.47
## 1106               16.89
## 1107                0.26
## 1108                 n/a
## 1109               38.12
## 1110               39.51
## 1111                  29
## 1112               72.73
## 1113                   4
## 1114               13.76
## 1115                 n/a
## 1116                9.77
## 1117               12.25
## 1118               22.86
## 1119               25.56
## 1120               11.22
## 1121                4.88
## 1122               22.71
## 1123                   8
## 1124               32.13
## 1125                 9.5
## 1126                2.86
## 1127                   8
## 1128                   3
## 1129                10.5
## 1130               11.25
## 1131                7.33
## 1132                 n/a
## 1133                   7
## 1134                 n/a
## 1135                8.44
## 1136                   9
## 1137                7.34
## 1138               17.44
## 1139                 n/a
## 1140               21.59
## 1141                9.41
## 1142                 n/a
## 1143               19.56
## 1144               16.41
## 1145                2.26
## 1146                9.63
## 1147                0.79
## 1148               10.44
## 1149                  16
## 1150                1.92
## 1151                   4
## 1152                   2
## 1153                26.8
## 1154               15.09
## 1155               35.78
## 1156               12.96
## 1157               35.51
## 1158                11.2
## 1159                  19
## 1160                1.67
## 1161                 n/a
## 1162                 4.5
## 1163                 n/a
## 1164               12.88
## 1165               12.31
## 1166                7.18
## 1167                 n/a
## 1168                75.5
## 1169                3.88
## 1170                  25
## 1171                 n/a
## 1172                 n/a
## 1173                5.96
## 1174                 n/a
## 1175               17.61
## 1176                 n/a
## 1177                 n/a
## 1178                2.04
## 1179                3.68
## 1180                6.55
## 1181               15.74
## 1182                  18
## 1183                8.67
## 1184               20.33
## 1185                 n/a
## 1186               17.91
## 1187               11.61
## 1188                 n/a
## 1189                 n/a
## 1190                5.75
## 1191                 n/a
## 1192                27.4
## 1193               11.18
## 1194                35.6
## 1195                 9.5
## 1196                 n/a
## 1197                   0
## 1198               19.64
## 1199               10.88
## 1200               19.06
## 1201                 n/a
## 1202                 n/a
## 1203                   5
## 1204               19.55
## 1205                6.25
## 1206                 n/a
## 1207                   5
## 1208                 n/a
## 1209                   6
## 1210               25.47
## 1211               21.47
## 1212                  36
## 1213               15.65
## 1214               38.22
## 1215               15.88
## 1216                1.33
## 1217                 n/a
## 1218                 7.2
## 1219                 n/a
## 1220                 n/a
## 1221               44.86
## 1222               11.67
## 1223                3.73
## 1224                 n/a
## 1225                 n/a
## 1226                95.5
## 1227                 n/a
## 1228                 255
## 1229                 n/a
## 1230                14.1
## 1231               10.24
## 1232                 n/a
## 1233               20.79
## 1234                3.55
## 1235                5.43
## 1236                 n/a
## 1237                 n/a
## 1238                   4
## 1239                  20
## 1240                 n/a
## 1241                 n/a
## 1242                 3.6
## 1243                4.23
## 1244                4.29
## 1245               18.17
## 1246               15.63
## 1247                 n/a
## 1248                  26
## 1249                 7.1
## 1250                10.8
## 1251                 2.5
## 1252                6.69
## 1253                9.19
## 1254               12.69
## 1255                27.5
## 1256               14.29
## 1257                 n/a
## 1258                2.25
## 1259                10.8
## 1260                 n/a
## 1261                7.39
## 1262                0.54
## 1263                 n/a
## 1264                9.65
## 1265               18.17
## 1266               21.88
## 1267               11.82
## 1268                 6.9
## 1269                 n/a
## 1270                   0
## 1271                 n/a
## 1272                 n/a
## 1273                  26
## 1274                9.11
## 1275               12.48
## 1276                 n/a
## 1277               10.14
## 1278                 n/a
## 1279                 n/a
## 1280                 n/a
## 1281                   9
## 1282               39.22
## 1283                 n/a
## 1284                 n/a
## 1285               15.89
## 1286               10.33
## 1287                5.75
## 1288                 n/a
## 1289                   0
## 1290               17.11
## 1291                 n/a
## 1292                 n/a
## 1293                 n/a
## 1294                4.53
## 1295                1.25
## 1296                 n/a
## 1297                 n/a
## 1298                0.29
## 1299                2.07
## 1300                1.52
## 1301                9.24
## 1302               12.48
## 1303                 n/a
## 1304                7.37
## 1305                   0
## 1306                 n/a
## 1307               23.46
## 1308               21.24
## 1309               23.05
## 1310               22.56
## 1311               23.31
## 1312                 n/a
## 1313                 n/a
## 1314                 n/a
## 1315                 n/a
## 1316                 n/a
## 1317               11.15
## 1318               11.35
## 1319               11.67
## 1320                11.8
## 1321                3.43
## 1322                2.64
## 1323                6.44
## 1324               15.71
## 1325               30.71
## 1326                  18
## 1327               18.44
## 1328               25.82
## 1329                7.08
## 1330                9.56
## 1331               17.35
## 1332               10.38
## 1333                 n/a
## 1334               17.14
## 1335                 n/a
## 1336               21.33
## 1337                11.5
## 1338                 n/a
## 1339               12.36
## 1340                 5.4
## 1341                 n/a
## 1342                8.52
## 1343               10.36
## 1344                20.7
## 1345                  33
## 1346                5.11
## 1347               60.91
## 1348               13.75
## 1349                4.08
## 1350                 n/a
## 1351                9.78
## 1352                  20
## 1353               12.59
## 1354               12.12
## 1355                9.58
## 1356                5.51
## 1357                   0
## 1358                 3.3
## 1359                7.14
## 1360               28.89
## 1361                  32
## 1362                 n/a
## 1363                 n/a
## 1364                 n/a
## 1365                 n/a
## 1366                1.25
## 1367                 n/a
## 1368                 n/a
## 1369                 n/a
## 1370                 n/a
## 1371                 n/a
## 1372                 n/a
## 1373                 n/a
## 1374                 n/a
## 1375               11.22
## 1376               10.07
## 1377                   0
## 1378                 n/a
## 1379                 n/a
## 1380                 8.5
## 1381                   7
## 1382               14.81
## 1383               11.96
## 1384               23.69
## 1385                 n/a
## 1386               12.45
## 1387               19.36
## 1388                   1
## 1389               18.45
## 1390                 n/a
## 1391               38.29
## 1392                5.32
## 1393                  29
## 1394                 n/a
## 1395               14.67
## 1396               13.05
## 1397               17.54
## 1398               14.17
## 1399               11.71
## 1400                 n/a
## 1401               15.15
## 1402               58.62
## 1403                0.25
## 1404                  19
## 1405               12.29
## 1406                3.06
## 1407                16.5
## 1408                 n/a
## 1409                   4
## 1410               20.69
## 1411               21.95
## 1412                   8
## 1413                7.93
## 1414                   0
## 1415                 n/a
## 1416               12.21
## 1417                  32
## 1418               12.93
## 1419                  23
## 1420                87.6
## 1421                   2
## 1422                   2
## 1423                6.73
## 1424                   0
## 1425                 n/a
## 1426               22.44
## 1427                15.5
## 1428               13.14
## 1429                  12
## 1430               25.93
## 1431               102.5
## 1432               16.41
## 1433               21.43
## 1434               23.91
## 1435               10.46
## 1436                   0
## 1437                  14
## 1438                   0
## 1439                 n/a
## 1440                  12
## 1441                  13
## 1442                 n/a
## 1443                   7
## 1444               30.17
## 1445                1.92
## 1446               14.55
## 1447                 n/a
## 1448                   0
## 1449                22.2
## 1450                5.38
## 1451                10.2
## 1452               25.15
## 1453                 n/a
## 1454                 n/a
## 1455                 n/a
## 1456                 n/a
## 1457               22.12
## 1458                 n/a
## 1459                 n/a
## 1460                 n/a
## 1461                 n/a
## 1462               21.87
## 1463               19.88
## 1464               26.61
## 1465                7.93
## 1466                 n/a
## 1467                 3.4
## 1468                  19
## 1469                5.75
## 1470                6.75
## 1471                7.78
## 1472                   0
## 1473               19.86
## 1474                  13
## 1475                 n/a
## 1476                 n/a
## 1477               19.48
## 1478               63.85
## 1479                  19
## 1480               36.36
## 1481                 n/a
## 1482                   5
## 1483                 n/a
## 1484               12.57
## 1485               20.25
## 1486               11.04
## 1487               11.53
## 1488                6.75
## 1489                 n/a
## 1490               13.25
## 1491                   0
## 1492                   0
## 1493                   0
## 1494                 n/a
## 1495               11.31
## 1496               11.28
## 1497                  10
## 1498                  27
## 1499                 n/a
## 1500               23.78
## 1501                6.56
## 1502                 n/a
## 1503               10.33
## 1504               20.29
## 1505               23.57
## 1506                6.67
## 1507                8.57
## 1508                 n/a
## 1509                  85
## 1510                19.9
## 1511               12.98
## 1512                 n/a
## 1513                 n/a
## 1514                 n/a
## 1515               15.79
## 1516                 n/a
## 1517                 n/a
## 1518                9.72
## 1519                 n/a
## 1520                  22
## 1521                 n/a
## 1522               16.52
## 1523                   0
## 1524              193.94
## 1525                 n/a
## 1526                 n/a
## 1527               19.75
## 1528                17.4
## 1529               10.45
## 1530               25.91
## 1531                 n/a
## 1532                 n/a
## 1533                3.36
## 1534                   0
## 1535                  60
## 1536                 240
## 1537                   4
## 1538               12.33
## 1539                 9.5
## 1540               32.33
## 1541                5.29
## 1542                  24
## 1543                  10
## 1544                 n/a
## 1545                 n/a
## 1546                   0
## 1547                 n/a
## 1548                 n/a
## 1549                8.85
## 1550               34.71
## 1551                  10
## 1552                 n/a
## 1553                3.38
## 1554                   0
## 1555                   0
## 1556                 n/a
## 1557                20.2
## 1558                 n/a
## 1559               45.89
## 1560                 n/a
## 1561                 n/a
## 1562                 n/a
## 1563               22.06
## 1564               12.43
## 1565               17.56
## 1566                  23
## 1567                 n/a
## 1568                 n/a
## 1569                4.75
## 1570               28.33
## 1571               23.24
## 1572               11.23
## 1573               12.31
## 1574                11.2
## 1575                 0.5
## 1576                   0
## 1577                1.75
## 1578                2.72
## 1579                9.75
## 1580               20.08
## 1581               21.33
## 1582               23.14
## 1583                7.35
## 1584               15.25
## 1585                 n/a
## 1586                 n/a
## 1587                   0
## 1588                 n/a
## 1589                 4.5
## 1590                1.28
## 1591               22.67
## 1592               13.51
## 1593                7.69
## 1594                 n/a
## 1595                 n/a
## 1596                 n/a
## 1597                 n/a
## 1598                 5.3
## 1599               15.78
## 1600               30.67
## 1601               10.65
## 1602               16.17
## 1603               10.26
## 1604                  15
## 1605                16.2
## 1606                5.51
## 1607               15.92
## 1608               18.08
## 1609                 n/a
## 1610               13.41
## 1611                 n/a
## 1612               15.95
## 1613               20.79
## 1614                9.07
## 1615               31.27
## 1616               10.68
## 1617                10.6
## 1618                 n/a
## 1619               13.99
## 1620               27.71
## 1621                9.58
## 1622                  25
## 1623                 n/a
## 1624                24.5
## 1625               22.42
## 1626                2.79
## 1627               13.03
## 1628                 0.5
## 1629                 n/a
## 1630                19.8
## 1631                 n/a
## 1632                 n/a
## 1633                 n/a
## 1634                  40
## 1635               62.86
## 1636                 n/a
## 1637               25.78
## 1638               18.42
## 1639                3.38
## 1640                 n/a
## 1641                 5.4
## 1642                 n/a
## 1643                 n/a
## 1644                3.71
## 1645               42.22
## 1646                  10
## 1647                5.58
## 1648                27.5
## 1649                   5
## 1650               17.56
## 1651                30.5
## 1652               25.94
## 1653               31.51
## 1654                1.12
## 1655                10.3
## 1656                   1
## 1657                 n/a
## 1658                 n/a
## 1659                 n/a
## 1660                 n/a
## 1661                   3
## 1662                  51
## 1663                 n/a
## 1664                   4
## 1665                   6
## 1666                18.5
## 1667                  11
## 1668                  15
## 1669                   4
## 1670               13.84
## 1671                28.5
## 1672               30.27
## 1673               26.13
## 1674                  13
## 1675               18.67
## 1676               19.85
## 1677                 n/a
## 1678                 n/a
## 1679                 n/a
## 1680               19.43
## 1681                 n/a
## 1682                4.33
## 1683               13.76
## 1684                 n/a
## 1685                 n/a
## 1686               22.22
## 1687                22.1
## 1688               21.26
## 1689               13.16
## 1690                 n/a
## 1691                4.69
## 1692                 n/a
## 1693                 n/a
## 1694               12.98
## 1695                7.46
## 1696                 n/a
## 1697                 n/a
## 1698                 n/a
## 1699               12.42
## 1700                 n/a
## 1701                 n/a
## 1702                 n/a
## 1703                2.31
## 1704                 n/a
## 1705                 n/a
## 1706                 n/a
## 1707                 n/a
## 1708                 n/a
## 1709                   0
## 1710                 n/a
## 1711                 n/a
## 1712               14.81
## 1713                 n/a
## 1714                 n/a
## 1715                 n/a
## 1716                 n/a
## 1717                 n/a
## 1718                 n/a
## 1719                 n/a
## 1720                 n/a
## 1721                  10
## 1722                 n/a
## 1723                 n/a
## 1724                 n/a
## 1725                 n/a
## 1726                 n/a
## 1727                 n/a
## 1728                 n/a
## 1729                 n/a
## 1730                14.7
## 1731                5.75
## 1732                   7
## 1733                1.25
## 1734                19.5
## 1735                   0
## 1736                7.87
## 1737               10.26
## 1738                 n/a
## 1739                 n/a
## 1740                 n/a
## 1741               30.07
## 1742                 n/a
## 1743               18.79
## 1744               18.91
## 1745                 280
## 1746               15.98
## 1747                   0
## 1748               18.96
## 1749                 n/a
## 1750                 n/a
## 1751                 5.5
## 1752                17.2
## 1753                 n/a
## 1754                8.74
## 1755                  10
## 1756               12.11
## 1757                 n/a
## 1758                2.42
## 1759                4.12
## 1760               11.62
## 1761                10.2
## 1762               18.27
## 1763                 n/a
## 1764                2.16
## 1765                 n/a
## 1766                1.26
## 1767                   3
## 1768                4.89
## 1769                8.33
## 1770                 n/a
## 1771                 n/a
## 1772                 n/a
## 1773                5.27
## 1774                 n/a
## 1775                  10
## 1776                21.4
## 1777                 n/a
## 1778                 n/a
## 1779                 n/a
## 1780                 n/a
## 1781               11.35
## 1782                 n/a
## 1783                 n/a
## 1784                3.75
## 1785                 n/a
## 1786                 n/a
## 1787                 n/a
## 1788                 n/a
## 1789                 142
## 1790                 7.5
## 1791                7.17
## 1792                 n/a
## 1793                 n/a
## 1794                  12
## 1795               10.47
## 1796                  65
## 1797                   8
## 1798               18.13
## 1799                 n/a
## 1800                47.5
## 1801                9.57
## 1802               18.79
## 1803                  36
## 1804               17.17
## 1805                 n/a
## 1806                  25
## 1807                   0
## 1808                 n/a
## 1809                 n/a
## 1810                4.67
## 1811                 n/a
## 1812                 2.8
## 1813                8.57
## 1814               20.62
## 1815               22.56
## 1816               14.22
## 1817                  28
## 1818                  10
## 1819               11.97
## 1820               10.61
## 1821                 n/a
## 1822                 n/a
## 1823                   0
## 1824               25.55
## 1825                8.88
## 1826               13.12
## 1827               11.22
## 1828                  16
## 1829                 8.4
## 1830               21.39
## 1831                10.5
## 1832                6.85
## 1833               20.41
## 1834                 2.8
## 1835                6.43
## 1836                  14
## 1837               11.27
## 1838                   2
## 1839                10.5
## 1840                14.5
## 1841                14.5
## 1842                  30
## 1843                8.18
## 1844                 n/a
## 1845               68.21
## 1846                 n/a
## 1847               11.94
## 1848                3.75
## 1849               23.08
## 1850               33.09
## 1851               16.99
## 1852               16.16
## 1853               17.19
## 1854               11.88
## 1855                6.59
## 1856               30.83
## 1857                   0
## 1858                4.83
## 1859               22.29
## 1860                 n/a
## 1861               15.14
## 1862               21.88
## 1863                  35
## 1864               11.74
## 1865               13.29
## 1866               21.54
## 1867                   0
## 1868                4.47
## 1869                 n/a
## 1870                 n/a
## 1871                 n/a
## 1872                 n/a
## 1873                8.33
## 1874                 n/a
## 1875                 n/a
## 1876                14.8
## 1877                8.49
## 1878                 n/a
## 1879                 n/a
## 1880                 n/a
## 1881                 n/a
## 1882                 n/a
## 1883                 n/a
## 1884                 n/a
## 1885               10.66
## 1886                3.36
## 1887               10.34
## 1888                1.53
## 1889               19.12
## 1890                5.15
## 1891                 6.1
## 1892                6.25
## 1893                 n/a
## 1894               10.46
## 1895                 n/a
## 1896                 n/a
## 1897               10.62
## 1898                  44
## 1899               16.99
## 1900                19.5
## 1901                 5.5
## 1902                  12
## 1903                   7
## 1904                9.22
## 1905                 6.5
## 1906                 3.4
## 1907                 n/a
## 1908               24.17
## 1909                4.96
## 1910                8.94
## 1911               13.86
## 1912               15.45
## 1913                2.76
## 1914                 2.4
## 1915                3.79
## 1916                5.34
## 1917                3.94
## 1918                  51
## 1919                 n/a
## 1920                 n/a
## 1921                 n/a
## 1922                 n/a
## 1923                 n/a
## 1924                4500
## 1925                 n/a
## 1926                20.5
## 1927               17.67
## 1928               11.89
## 1929               26.67
## 1930                 n/a
## 1931                8.15
## 1932                 n/a
## 1933                 n/a
## 1934                 n/a
## 1935                  20
## 1936                   8
## 1937               11.57
## 1938                 n/a
## 1939               19.67
## 1940               13.44
## 1941                 n/a
## 1942               24.15
## 1943               15.71
## 1944               18.38
## 1945                5.33
## 1946                   2
## 1947                  15
## 1948                  21
## 1949                 n/a
## 1950                  11
## 1951                 n/a
## 1952                   0
## 1953                  23
## 1954                4.67
## 1955               26.56
## 1956               18.32
## 1957                3.24
## 1958                  10
## 1959                 4.5
## 1960               14.43
## 1961                12.3
## 1962               11.11
## 1963               10.29
## 1964                50.6
## 1965                 n/a
## 1966                   0
## 1967                 n/a
## 1968                 n/a
## 1969                  81
## 1970                11.3
## 1971                   3
## 1972               16.43
## 1973                  12
## 1974                5.94
## 1975                   5
## 1976               11.88
## 1977                 n/a
## 1978               17.61
## 1979                 n/a
## 1980               14.59
## 1981                0.89
## 1982                 n/a
## 1983                15.5
## 1984               15.94
## 1985               54.67
## 1986               11.48
## 1987               11.76
## 1988               22.86
## 1989               55.88
## 1990                 n/a
## 1991               29.98
## 1992                 n/a
## 1993                 n/a
## 1994                4.48
## 1995               19.92
## 1996                36.5
## 1997                   0
## 1998               26.56
## 1999                 n/a
## 2000                 n/a
## 2001               41.36
## 2002               25.15
## 2003               42.77
## 2004                9.33
## 2005                 n/a
## 2006                 n/a
## 2007                 n/a
## 2008                 n/a
## 2009                   5
## 2010                   0
## 2011               11.54
## 2012              147.06
## 2013                   0
## 2014                 n/a
## 2015              293.33
## 2016                 n/a
## 2017                   9
## 2018               38.25
## 2019                3.47
## 2020               14.52
## 2021                  15
## 2022                   1
## 2023                6.33
## 2024                16.5
## 2025                0.84
## 2026               19.32
## 2027               23.55
## 2028                 n/a
## 2029                 n/a
## 2030               16.82
## 2031                 n/a
## 2032               33.33
## 2033               14.13
## 2034                2.75
## 2035                5.67
## 2036                11.2
## 2037               20.57
## 2038                 n/a
## 2039                   2
## 2040                 n/a
## 2041                 n/a
## 2042                 9.5
## 2043                   0
## 2044                  16
## 2045               94.93
## 2046                 n/a
## 2047                8.74
## 2048                4.69
## 2049               21.33
## 2050                 n/a
## 2051               18.43
## 2052               31.26
## 2053                1.66
## 2054                3.34
## 2055                 n/a
## 2056                 n/a
## 2057                 n/a
## 2058                 n/a
## 2059                 n/a
## 2060                8.28
## 2061                   0
## 2062                7.36
## 2063                4.83
## 2064                 n/a
## 2065               19.96
## 2066                 n/a
## 2067               10.25
## 2068                5.33
## 2069               34.04
## 2070                 n/a
## 2071                   5
## 2072                0.92
## 2073                 3.2
## 2074                8.27
## 2075                17.5
## 2076                 2.5
## 2077                 n/a
## 2078                 n/a
## 2079                 n/a
## 2080                 n/a
## 2081                 n/a
## 2082                 n/a
## 2083                4.25
## 2084                0.46
## 2085                 0.8
## 2086               13.87
## 2087                 n/a
## 2088                 n/a
## 2089                 9.6
## 2090               14.33
## 2091                  43
## 2092                   0
## 2093                27.2
## 2094                 n/a
## 2095                 n/a
## 2096                 n/a
## 2097                 n/a
## 2098                 n/a
## 2099                 n/a
## 2100                 n/a
## 2101               12.16
## 2102                19.4
## 2103               19.44
## 2104                5.77
## 2105               18.45
## 2106                1.67
## 2107                 n/a
## 2108                 n/a
## 2109               10.79
## 2110                9.85
## 2111               19.66
## 2112               15.38
## 2113                  11
## 2114                 n/a
## 2115                6.07
## 2116                 3.8
## 2117               28.75
## 2118                 n/a
## 2119                  54
## 2120                   0
## 2121                   0
## 2122                   0
## 2123                   1
## 2124                 n/a
## 2125                 n/a
## 2126               16.22
## 2127               15.71
## 2128                7.21
## 2129                5.68
## 2130               19.29
## 2131                6.73
## 2132               12.57
## 2133                8.08
## 2134                 n/a
## 2135                0.88
## 2136               13.21
## 2137               12.07
## 2138                6.03
## 2139                  39
## 2140                 n/a
## 2141                8.87
## 2142               11.43
## 2143                9.35
## 2144                5.35
## 2145                12.5
## 2146                 n/a
## 2147               18.64
## 2148                 n/a
## 2149                 n/a
## 2150               40.92
## 2151                  24
## 2152                 n/a
## 2153               26.37
## 2154                 n/a
## 2155                9.09
## 2156                8.67
## 2157                 n/a
## 2158               15.64
## 2159               11.75
## 2160               13.32
## 2161                   9
## 2162               10.63
## 2163                  21
## 2164                  14
## 2165                 n/a
## 2166                 6.5
## 2167                10.3
## 2168                 6.8
## 2169                 n/a
## 2170                 n/a
## 2171                 n/a
## 2172                 n/a
## 2173                 n/a
## 2174                 n/a
## 2175                 n/a
## 2176               12.25
## 2177                 n/a
## 2178                 n/a
## 2179                10.2
## 2180               17.65
## 2181                 n/a
## 2182                  21
## 2183                 n/a
## 2184               91.55
## 2185                 n/a
## 2186                 n/a
## 2187               17.42
## 2188                 n/a
## 2189                 n/a
## 2190                 n/a
## 2191                   3
## 2192                 n/a
## 2193               20.29
## 2194                 0.8
## 2195                13.5
## 2196                 n/a
## 2197                 n/a
## 2198                 n/a
## 2199                6.08
## 2200                 n/a
## 2201               47.12
## 2202                 n/a
## 2203                 n/a
## 2204                 n/a
## 2205                 n/a
## 2206                 n/a
## 2207                 n/a
## 2208                 n/a
## 2209                 n/a
## 2210                5.33
## 2211               16.38
## 2212                 n/a
## 2213                 n/a
## 2214                 n/a
## 2215                 n/a
## 2216                 n/a
## 2217                 n/a
## 2218                 n/a
## 2219                 n/a
## 2220                 8.5
## 2221                 9.7
## 2222                 n/a
## 2223                 n/a
## 2224                 n/a
## 2225                 n/a
## 2226                 n/a
## 2227                9.44
## 2228                10.2
## 2229                   8
## 2230                 n/a
## 2231                   4
## 2232                 7.4
## 2233                   6
## 2234               15.13
## 2235                  34
## 2236                6.53
## 2237                  20
## 2238               15.02
## 2239                 n/a
## 2240               10.78
## 2241                6.56
## 2242               18.08
## 2243                 n/a
## 2244                 n/a
## 2245                2.66
## 2246                  15
## 2247                 n/a
## 2248                 n/a
## 2249               20.05
## 2250                 n/a
## 2251                 n/a
## 2252                14.5
## 2253                8.14
## 2254               46.67
## 2255                 n/a
## 2256                 n/a
## 2257                 n/a
## 2258                 n/a
## 2259                   0
## 2260                   0
## 2261               30.76
## 2262               36.47
## 2263                3.55
## 2264               20.81
## 2265                7.21
## 2266               10.59
## 2267                 2.7
## 2268               38.24
## 2269                 n/a
## 2270                   5
## 2271               21.65
## 2272                 n/a
## 2273                4.43
## 2274                 n/a
## 2275                14.6
## 2276                4.43
## 2277                6.75
## 2278                 n/a
## 2279                 8.5
## 2280                7.68
## 2281                 n/a
## 2282                1.71
## 2283               11.43
## 2284                16.6
## 2285                  16
## 2286               20.12
## 2287                 n/a
## 2288                 8.6
## 2289                2.34
## 2290                8.29
## 2291                  15
## 2292               15.25
## 2293               15.05
## 2294                 n/a
## 2295                13.4
## 2296                 5.1
## 2297                 n/a
## 2298                 9.9
## 2299               17.15
## 2300                 n/a
## 2301               21.71
## 2302               21.31
## 2303               22.46
## 2304                 n/a
## 2305                12.5
## 2306                 n/a
## 2307                0.43
## 2308                 n/a
## 2309                 n/a
## 2310                 n/a
## 2311                 n/a
## 2312                 n/a
## 2313                3950
## 2314                   0
## 2315                8.18
## 2316                1.47
## 2317                 n/a
## 2318                 n/a
## 2319                   3
## 2320                   6
## 2321                4.58
## 2322                 n/a
## 2323                 n/a
## 2324               10.45
## 2325                 n/a
## 2326                 n/a
## 2327                 n/a
## 2328                4.36
## 2329                 n/a
## 2330               31.04
## 2331               19.09
## 2332               18.73
## 2333                 n/a
## 2334               11.55
## 2335               75.96
## 2336                 n/a
## 2337                 3.7
## 2338               39.06
## 2339                3.21
## 2340                   0
## 2341                 n/a
## 2342                 2.8
## 2343                4.14
## 2344                   0
## 2345               17.43
## 2346                   7
## 2347                 5.5
## 2348                 n/a
## 2349               13.14
## 2350                   6
## 2351               18.24
## 2352                   0
## 2353               11.87
## 2354               15.69
## 2355               15.53
## 2356                8.06
## 2357               17.83
## 2358               11.58
## 2359                 n/a
## 2360               18.54
## 2361               15.96
## 2362               24.28
## 2363                 8.7
## 2364               14.38
## 2365               17.76
## 2366               10.42
## 2367                 n/a
## 2368               12.39
## 2369               58.82
## 2370                 n/a
## 2371               13.36
## 2372                 n/a
## 2373               65.38
## 2374                 n/a
## 2375                  23
## 2376                1.28
## 2377                 n/a
## 2378                 n/a
## 2379                 190
## 2380               17.92
## 2381                13.9
## 2382               29.57
## 2383                7.88
## 2384                  17
## 2385                9.12
## 2386                   0
## 2387               22.29
## 2388               32.49
## 2389                6.62
## 2390                   3
## 2391                 n/a
## 2392                3.33
## 2393                3.83
## 2394                10.8
## 2395                 9.5
## 2396                 n/a
## 2397                 n/a
## 2398                 9.2
## 2399               21.57
## 2400                9.92
## 2401               13.39
## 2402                 n/a
## 2403               18.67
## 2404               18.94
## 2405                 n/a
## 2406                 n/a
## 2407                16.5
## 2408                  37
## 2409                 n/a
## 2410                 n/a
## 2411               10.14
## 2412                 n/a
## 2413              292.33
## 2414               19.61
## 2415                 n/a
## 2416               65.63
## 2417                 n/a
## 2418                5.96
## 2419                   3
## 2420               11.73
## 2421               43.43
## 2422               21.55
## 2423                 5.5
## 2424                 n/a
## 2425                   0
## 2426                 n/a
## 2427                7.97
## 2428                 n/a
## 2429                 n/a
## 2430               16.29
## 2431                6.59
## 2432                 n/a
## 2433                2.42
## 2434                 n/a
## 2435                 n/a
## 2436                 n/a
## 2437                6.33
## 2438               13.67
## 2439                1.62
## 2440               17.67
## 2441                   5
## 2442                 n/a
## 2443               14.86
## 2444               24.48
## 2445               15.25
## 2446                 1.9
## 2447                0.83
## 2448                8.21
## 2449                 n/a
## 2450                6.46
## 2451                 n/a
## 2452                 n/a
## 2453                 n/a
## 2454               24.67
## 2455                 n/a
## 2456                 n/a
## 2457                3.58
## 2458                 n/a
## 2459                 n/a
## 2460                 n/a
## 2461                 n/a
## 2462                 n/a
## 2463               15.54
## 2464                11.1
## 2465                 n/a
## 2466                6.27
## 2467                 8.8
## 2468                 1.5
## 2469               11.71
## 2470                  12
## 2471               18.83
## 2472               20.74
## 2473                   5
## 2474               21.78
## 2475                 n/a
## 2476                 n/a
## 2477                 n/a
## 2478                   0
## 2479                   0
## 2480                   0
## 2481               12.23
## 2482               21.17
## 2483               17.86
## 2484                 n/a
## 2485                 n/a
## 2486                 n/a
## 2487                 n/a
## 2488                 n/a
## 2489                 n/a
## 2490                 n/a
## 2491                 n/a
## 2492                 n/a
## 2493               43.24
## 2494                8.33
## 2495                 9.6
## 2496               17.95
## 2497                 n/a
## 2498                 n/a
## 2499               16.85
## 2500                 5.5
## 2501               12.56
## 2502                6.18
## 2503                 n/a
## 2504                 n/a
## 2505                  10
## 2506                10.1
## 2507                9.05
## 2508                 6.6
## 2509                9.12
## 2510                  13
## 2511                 n/a
## 2512                 n/a
## 2513                 n/a
## 2514                 n/a
## 2515                 n/a
## 2516                4.86
## 2517                 n/a
## 2518                 n/a
## 2519                 n/a
## 2520                 n/a
## 2521                 n/a
## 2522                3.58
## 2523                 n/a
## 2524                3.86
## 2525                3.87
## 2526                  19
## 2527               13.63
## 2528                 n/a
## 2529                13.6
## 2530               28.14
## 2531               15.72
## 2532               20.29
## 2533               19.76
## 2534                 n/a
## 2535               12.35
## 2536                 n/a
## 2537                 n/a
## 2538                19.8
## 2539               21.48
## 2540               23.61
## 2541                  29
## 2542                6.47
## 2543                 n/a
## 2544                 n/a
## 2545                4.41
## 2546                 n/a
## 2547               20.92
## 2548               11.14
## 2549                 n/a
## 2550                 n/a
## 2551                5.44
## 2552                  19
## 2553                   3
## 2554               17.12
## 2555               18.73
## 2556               18.55
## 2557                 n/a
## 2558                 5.1
## 2559                18.2
## 2560               12.18
## 2561               11.42
## 2562               12.77
## 2563                 7.8
## 2564                   7
## 2565               19.65
## 2566                   3
## 2567                6.91
## 2568                   3
## 2569                7.71
## 2570                4.61
## 2571                 n/a
## 2572                4.05
## 2573                   1
## 2574                8.54
## 2575                 n/a
## 2576                 n/a
## 2577                  27
## 2578                3.16
## 2579                 7.5
## 2580                9.33
## 2581                 6.5
## 2582                 n/a
## 2583                7.43
## 2584                   4
## 2585                 4.5
## 2586                2.43
## 2587                   6
## 2588                8.33
## 2589                 n/a
## 2590                11.5
## 2591                 n/a
## 2592                 n/a
## 2593                 n/a
## 2594                 4.8
## 2595                 n/a
## 2596                 n/a
## 2597                 n/a
## 2598                8.23
## 2599                   0
## 2600                 n/a
## 2601                4.96
## 2602                   2
## 2603                 n/a
## 2604                 n/a
## 2605                 2.8
## 2606                 3.4
## 2607                 n/a
## 2608                 n/a
## 2609                 4.2
## 2610                   0
## 2611               21.21
## 2612                 n/a
## 2613                 n/a
## 2614               10.88
## 2615               11.08
## 2616                 n/a
## 2617                  27
## 2618                9.47
## 2619               44.38
## 2620                 n/a
## 2621                1.09
## 2622                 n/a
## 2623                 2.5
## 2624                 n/a
## 2625               17.51
## 2626                   8
## 2627               58.62
## 2628                   0
## 2629               10.16
## 2630                   0
## 2631                 n/a
## 2632               24.33
## 2633               17.14
## 2634               17.22
## 2635                 n/a
## 2636                 n/a
## 2637                4.34
## 2638                20.3
## 2639               14.79
## 2640                   0
## 2641                  12
## 2642                3.29
## 2643               13.25
## 2644                 4.5
## 2645                   3
## 2646                7.75
## 2647                8.43
## 2648                  10
## 2649                 n/a
## 2650                9.48
## 2651                9.43
## 2652                24.2
## 2653               11.33
## 2654                  28
## 2655               16.21
## 2656                  49
## 2657                3.65
## 2658               13.26
## 2659                2.18
## 2660                 n/a
## 2661                  20
## 2662               26.32
## 2663                2.89
## 2664                 n/a
## 2665                 n/a
## 2666                 n/a
## 2667                6.13
## 2668                10.2
## 2669                11.5
## 2670                12.5
## 2671                 n/a
## 2672               47.06
## 2673               24.39
## 2674               38.33
## 2675                 n/a
## 2676               15.81
## 2677               17.83
## 2678                 n/a
## 2679                 n/a
## 2680                 n/a
## 2681                 n/a
## 2682               11.41
## 2683               30.81
## 2684                  23
## 2685               12.84
## 2686                 6.6
## 2687                  16
## 2688               16.51
## 2689                 n/a
## 2690               20.27
## 2691                  13
## 2692                8.43
## 2693                 n/a
## 2694                13.8
## 2695               15.33
## 2696                8.63
## 2697                8.88
## 2698               23.06
## 2699                  10
## 2700                 n/a
## 2701                 n/a
## 2702                 n/a
## 2703               13.64
## 2704                3.62
## 2705                  24
## 2706                 n/a
## 2707                9.71
## 2708                 n/a
## 2709                 n/a
## 2710                15.5
## 2711                   5
## 2712               13.67
## 2713                8.84
## 2714               41.65
## 2715                 7.5
## 2716                 n/a
## 2717               12.62
## 2718                 n/a
## 2719                 n/a
## 2720                 n/a
## 2721                1.63
## 2722                8.75
## 2723                 n/a
## 2724                5.67
## 2725                 n/a
## 2726                 n/a
## 2727               10.69
## 2728                  24
## 2729                 n/a
## 2730                 n/a
## 2731                 n/a
## 2732                4.45
## 2733                 n/a
## 2734                   0
## 2735                   0
## 2736                  13
## 2737               26.53
## 2738               21.89
## 2739                 n/a
## 2740                   9
## 2741                 n/a
## 2742               18.86
## 2743               13.33
## 2744                   0
## 2745                 n/a
## 2746                9.01
## 2747                 n/a
## 2748               15.17
## 2749                 n/a
## 2750               14.03
## 2751                 n/a
## 2752                7.01
## 2753               14.86
## 2754               20.25
## 2755                2.22
## 2756               11.66
## 2757               11.25
## 2758                 n/a
## 2759               34.56
## 2760                 280
## 2761               23.86
## 2762                3.33
## 2763                16.7
## 2764               26.71
## 2765                 6.6
## 2766                 n/a
## 2767                 n/a
## 2768                   7
## 2769                9.67
## 2770               21.21
## 2771                  15
## 2772                 n/a
## 2773                  20
## 2774               10.98
## 2775               23.39
## 2776               17.39
## 2777                 9.2
## 2778                8.63
## 2779               12.12
## 2780                 n/a
## 2781                   6
## 2782                 6.1
## 2783                14.5
## 2784                   7
## 2785                7.41
## 2786                   6
## 2787                5.03
## 2788               25.22
## 2789                0.33
## 2790                4.88
## 2791                 n/a
## 2792                   0
## 2793               14.67
## 2794                 n/a
## 2795               45.83
## 2796                 n/a
## 2797               11.88
## 2798               18.81
## 2799                6.31
## 2800               17.38
## 2801               16.39
## 2802                  20
## 2803               18.18
## 2804               14.48
## 2805                  10
## 2806                 n/a
## 2807               10.26
## 2808                 n/a
## 2809               47.21
## 2810                10.5
## 2811                 n/a
## 2812                7.27
## 2813               17.81
## 2814               15.87
## 2815               11.63
## 2816                10.1
## 2817               10.66
## 2818                  11
## 2819                 n/a
## 2820                4.08
## 2821                 n/a
## 2822                   5
## 2823               12.86
## 2824                 n/a
## 2825               16.13
## 2826                 n/a
## 2827                3.55
## 2828                 n/a
## 2829                5.25
## 2830               17.22
## 2831                 7.4
## 2832               10.18
## 2833               12.88
## 2834               15.09
## 2835                26.3
## 2836                7.29
## 2837                19.6
## 2838                7.93
## 2839                  10
## 2840                5.11
## 2841                  23
## 2842                6.25
## 2843                6.26
## 2844                   6
## 2845                8.57
## 2846               18.06
## 2847                6.93
## 2848               16.72
## 2849               19.19
## 2850               17.22
## 2851                 n/a
## 2852                22.5
## 2853                3.71
## 2854                  14
## 2855                5.44
## 2856                 n/a
## 2857               11.55
## 2858                 n/a
## 2859                  16
## 2860                  26
## 2861                 n/a
## 2862                24.5
## 2863                 n/a
## 2864                   9
## 2865                 n/a
## 2866                 n/a
## 2867               10.66
## 2868               16.89
## 2869               12.89
## 2870                 n/a
## 2871               36.91
## 2872                 n/a
## 2873               13.75
## 2874                 n/a
## 2875               21.16
## 2876                 n/a
## 2877                  15
## 2878                 n/a
## 2879               26.33
## 2880               25.65
## 2881                 n/a
## 2882               10.04
## 2883               18.41
## 2884                 n/a
## 2885                 n/a
## 2886                 n/a
## 2887                 n/a
## 2888                  10
## 2889                11.6
## 2890                 n/a
## 2891                10.6
## 2892               15.62
## 2893                 n/a
## 2894                4.53
## 2895                 n/a
## 2896               23.46
## 2897                 n/a
## 2898               23.33
## 2899                 n/a
## 2900                 n/a
## 2901                0.86
## 2902                 n/a
## 2903                 n/a
## 2904                 5.7
## 2905                 n/a
## 2906                 n/a
## 2907                8.75
## 2908                 n/a
## 2909               20.92
## 2910                8.33
## 2911                 n/a
## 2912                 n/a
## 2913               24.73
## 2914                 2.3
## 2915                   6
## 2916                 n/a
## 2917                5.26
## 2918                 n/a
## 2919                 n/a
## 2920                 n/a
## 2921                0.49
## 2922               14.68
## 2923                1.27
## 2924               29.27
## 2925               25.83
## 2926                 n/a
## 2927                 n/a
## 2928                 5.8
## 2929               26.55
## 2930                 n/a
## 2931                 n/a
## 2932                 n/a
## 2933                47.5
## 2934                 n/a
## 2935                2.57
## 2936                  12
## 2937               21.17
## 2938                 n/a
## 2939               18.36
## 2940               21.18
## 2941               11.76
## 2942               61.25
## 2943                21.8
## 2944               24.65
## 2945                2.39
## 2946                 n/a
## 2947               27.11
## 2948                  15
## 2949               13.68
## 2950                1.62
## 2951               30.67
## 2952               18.67
## 2953                8.25
## 2954                  17
## 2955                 n/a
## 2956                 n/a
## 2957               27.14
## 2958                9.83
## 2959                   8
## 2960                   3
## 2961                   2
## 2962                39.6
## 2963               13.28
## 2964               10.26
## 2965               18.25
## 2966                7.46
## 2967                7.78
## 2968               15.83
## 2969               16.49
## 2970                  16
## 2971                 6.5
## 2972               14.38
## 2973                 n/a
## 2974               11.25
## 2975               10.31
## 2976               25.77
## 2977               14.67
## 2978                 n/a
## 2979                 1.5
## 2980                 n/a
## 2981                 n/a
## 2982               12.38
## 2983                 n/a
## 2984               22.44
## 2985                 n/a
## 2986                 n/a
## 2987                 n/a
## 2988                 n/a
## 2989               14.55
## 2990               17.71
## 2991                4.14
## 2992                 n/a
## 2993                 n/a
## 2994                 9.5
## 2995                 n/a
## 2996                9.59
## 2997                7.57
## 2998                2.31
## 2999                 n/a
## 3000               10.78
## 3001                7.67
## 3002                 n/a
## 3003                1.88
## 3004                 n/a
## 3005                 n/a
## 3006               19.33
## 3007               20.95
## 3008                 n/a
## 3009                 n/a
## 3010                   2
## 3011                4.67
## 3012                  11
## 3013                7.24
## 3014               14.78
## 3015               10.41
## 3016                3.33
## 3017                  57
## 3018                   4
## 3019                3.95
## 3020                10.9
## 3021               24.41
## 3022                 7.5
## 3023                 n/a
## 3024               15.11
## 3025               20.49
## 3026                8.17
## 3027                14.2
## 3028                  23
## 3029                  29
## 3030                10.4
## 3031                  17
## 3032                 n/a
## 3033                 n/a
## 3034                 n/a
## 3035               18.57
## 3036                2.08
## 3037                 n/a
## 3038                 n/a
## 3039                   9
## 3040                31.6
## 3041               14.41
## 3042                 5.8
## 3043                 n/a
## 3044                 n/a
## 3045                 n/a
## 3046                 n/a
## 3047               12.75
## 3048                 n/a
## 3049                 n/a
## 3050                10.5
## 3051               13.13
## 3052               37.88
## 3053                 n/a
## 3054                9.24
## 3055                 n/a
## 3056                   6
## 3057                1.53
## 3058                7.89
## 3059                8.67
## 3060                8.33
## 3061                 6.4
## 3062                 n/a
## 3063               40.25
## 3064                8.75
## 3065                   0
## 3066                   5
## 3067               23.75
## 3068                27.5
## 3069                 7.5
## 3070               10.83
## 3071                   5
## 3072               14.58
## 3073                 n/a
## 3074               13.33
## 3075                 n/a
## 3076                  10
## 3077                8.95
## 3078                6.89
## 3079                 n/a
## 3080               20.74
## 3081               14.24
## 3082                12.5
## 3083                   6
## 3084                 n/a
## 3085               12.69
## 3086                 n/a
## 3087               30.64
## 3088               19.09
## 3089                 9.6
## 3090                13.5
## 3091                  75
## 3092                4.04
## 3093               14.97
## 3094               11.36
## 3095               16.04
## 3096               14.72
## 3097                2.73
## 3098                 n/a
## 3099                 n/a
## 3100                2.83
## 3101                 n/a
## 3102               12.57
## 3103                16.8
## 3104               17.26
## 3105                 n/a
## 3106                 n/a
## 3107                4.95
## 3108                 n/a
## 3109               12.13
## 3110                   4
## 3111                 189
## 3112                 n/a
## 3113               23.62
## 3114                9.54
## 3115                  18
## 3116                24.8
## 3117                33.3
## 3118                 n/a
## 3119               56.52
## 3120               20.74
## 3121               29.33
## 3122               24.05
## 3123                27.4
## 3124                8.59
## 3125                 n/a
## 3126                2.63
## 3127                 n/a
## 3128                 n/a
## 3129                 n/a
## 3130                  35
## 3131                 n/a
## 3132                9.44
## 3133               13.77
## 3134                0.71
## 3135                8.15
## 3136               19.62
## 3137               17.84
## 3138                35.7
## 3139                10.5
## 3140                   0
## 3141               12.21
## 3142                  86
## 3143                   2
## 3144                 n/a
## 3145                6.81
## 3146               10.91
## 3147                 n/a
## 3148                   9
## 3149                11.1
## 3150               17.92
## 3151                  51
## 3152               11.67
## 3153                 n/a
## 3154                 n/a
## 3155                   0
## 3156                2.82
## 3157                38.6
## 3158                 n/a
## 3159                 n/a
## 3160                5.48
## 3161                6.07
## 3162                   0
## 3163                4.69
## 3164                 n/a
## 3165               18.57
## 3166                 n/a
## 3167                 n/a
## 3168                21.5
## 3169               22.97
## 3170                 n/a
## 3171                2.95
## 3172                5.58
## 3173                 n/a
## 3174                 n/a
## 3175                 n/a
## 3176                 n/a
## 3177                 n/a
## 3178                 n/a
## 3179                 n/a
## 3180                 n/a
## 3181              115.83
## 3182                4.28
## 3183                 n/a
## 3184                5.88
## 3185                 n/a
## 3186                 n/a
## 3187                 n/a
## 3188                   4
## 3189                  22
## 3190               17.54
## 3191               14.77
## 3192                 n/a
## 3193                10.5
## 3194                18.2
## 3195                19.6
## 3196                 n/a
## 3197                 n/a
## 3198                 n/a
## 3199                1.33
## 3200                8.33
## 3201                 n/a
## 3202                6.67
## 3203                9.85
## 3204               17.93
## 3205               29.33
## 3206               40.73
## 3207               12.18
## 3208                  25
## 3209               17.71
## 3210               13.52
## 3211                   7
## 3212                7.52
## 3213                 n/a
## 3214                 n/a
## 3215                7.05
## 3216                8.22
## 3217               42.42
## 3218               17.14
## 3219                   0
## 3220                   7
## 3221               15.83
## 3222                21.5
## 3223                 n/a
## 3224                  40
## 3225                 n/a
## 3226                 n/a
## 3227                 n/a
## 3228                 n/a
## 3229                 n/a
## 3230                 n/a
## 3231                 n/a
## 3232                 n/a
## 3233                 n/a
## 3234               16.96
## 3235                  23
## 3236                 n/a
## 3237               12.05
## 3238                1.59
## 3239                10.9
## 3240                 8.8
## 3241                 4.7
## 3242               16.08
## 3243                3.24
## 3244                 n/a
## 3245                 n/a
## 3246                 n/a
## 3247               15.67
## 3248                   0
## 3249                10.1
## 3250                 n/a
## 3251                 n/a
## 3252               24.48
## 3253                12.2
## 3254               12.84
## 3255                  18
## 3256               22.41
## 3257                  34
## 3258               33.33
## 3259               13.67
## 3260               14.29
## 3261               11.99
## 3262                 n/a
## 3263                 8.5
## 3264                 n/a
## 3265                2.53
## 3266                8.65
## 3267                4.22
## 3268               11.43
## 3269               21.04
## 3270                4.67
## 3271               18.46
## 3272                 2.5
## 3273                21.6
## 3274               24.55
## 3275                  15
## 3276                12.8
## 3277               38.24
## 3278               21.09
## 3279               18.22
## 3280                 n/a
## 3281                6.45
## 3282                 n/a
## 3283               10.99
## 3284               19.46
## 3285               17.38
## 3286                 9.4
## 3287               29.41
## 3288                   6
## 3289               34.86
## 3290                3.77
## 3291                 n/a
## 3292                 n/a
## 3293                   2
## 3294               16.67
## 3295                 n/a
## 3296                 n/a
## 3297                 n/a
## 3298                 n/a
## 3299               15.85
## 3300                   9
## 3301                 n/a
## 3302               18.97
## 3303                15.5
## 3304                  12
## 3305                0.01
## 3306                 n/a
## 3307                  19
## 3308                 n/a
## 3309                 n/a
## 3310                 n/a
## 3311                 n/a
## 3312                 n/a
## 3313                 n/a
## 3314                 n/a
## 3315                   6
## 3316                  24
## 3317                27.8
## 3318               12.67
## 3319                 n/a
## 3320                 n/a
## 3321               33.12
## 3322               31.98
## 3323                  11
## 3324                 n/a
## 3325                3.33
## 3326                1.77
## 3327               18.03
## 3328               10.32
## 3329               31.93
## 3330                4.29
## 3331                 n/a
## 3332                 n/a
## 3333                 n/a
## 3334                 n/a
## 3335                 n/a
## 3336                 n/a
## 3337                 n/a
## 3338                3.16
## 3339                 n/a
## 3340                 n/a
## 3341                 n/a
## 3342                 n/a
## 3343                2.96
## 3344               11.79
## 3345                 n/a
## 3346                 n/a
## 3347                 n/a
## 3348                 n/a
## 3349                 n/a
## 3350                 n/a
## 3351                 n/a
## 3352                6.39
## 3353                17.5
## 3354                 n/a
## 3355                12.2
## 3356                7.93
## 3357                 n/a
## 3358                4.43
## 3359                 n/a
## 3360                9.37
## 3361                7.33
## 3362                  13
## 3363                   0
## 3364                17.5
## 3365               18.77
## 3366                 n/a
## 3367                5.56
## 3368                 n/a
## 3369                 n/a
## 3370                 n/a
## 3371                5.65
## 3372                 n/a
## 3373                 9.4
## 3374               56.92
## 3375               11.74
## 3376                  46
## 3377                  20
## 3378               49.01
## 3379                   0
## 3380                 n/a
## 3381                 n/a
## 3382                 n/a
## 3383               11.39
## 3384                8.94
## 3385                 n/a
## 3386                22.2
## 3387               12.56
## 3388                12.8
## 3389               20.95
## 3390                 2.2
## 3391                 n/a
## 3392                2.11
## 3393                 n/a
## 3394               12.62
## 3395               11.65
## 3396                6.21
## 3397                44.5
## 3398                 n/a
## 3399                 2.5
## 3400                 n/a
## 3401                5.67
## 3402                 n/a
## 3403                2.81
## 3404                2.14
## 3405                   0
## 3406                 n/a
## 3407                 n/a
## 3408                9.94
## 3409                   0
## 3410                12.6
## 3411               14.64
## 3412               37.33
## 3413                 n/a
## 3414                 n/a
## 3415                1.69
## 3416                 n/a
## 3417                  20
## 3418                 n/a
## 3419                 n/a
## 3420                3.33
## 3421                 n/a
## 3422                 n/a
## 3423                 n/a
## 3424                 n/a
## 3425                6.28
## 3426                   0
## 3427                23.5
## 3428               13.84
## 3429                 234
## 3430                 n/a
## 3431                3.64
## 3432               20.48
## 3433                6.25
## 3434                 n/a
## 3435                 n/a
## 3436                7.82
## 3437               13.33
## 3438                44.5
## 3439               12.26
## 3440                 n/a
## 3441               13.07
## 3442                23.2
## 3443               18.18
## 3444               22.14
## 3445               35.44
## 3446                 n/a
## 3447               17.81
## 3448                 n/a
## 3449                5.85
## 3450               25.35
## 3451               12.87
## 3452               14.29
## 3453               11.95
## 3454                 n/a
## 3455                 8.5
## 3456               30.56
## 3457                10.5
## 3458                12.5
## 3459               15.62
## 3460                4.14
## 3461                39.4
## 3462               14.87
## 3463                11.5
## 3464                 4.5
## 3465                6.86
## 3466                 n/a
## 3467                 n/a
## 3468                 n/a
## 3469                 n/a
## 3470               20.67
## 3471                 n/a
## 3472               11.67
## 3473                3.96
## 3474                 n/a
## 3475                28.2
## 3476                 n/a
## 3477               16.67
## 3478                9.76
## 3479               14.52
## 3480                 n/a
## 3481                 n/a
## 3482                 n/a
## 3483                12.4
## 3484                 n/a
## 3485               21.61
## 3486                 n/a
## 3487                8.06
## 3488               21.43
## 3489               11.22
## 3490               24.27
## 3491                7.07
## 3492                   0
## 3493                  64
## 3494                 n/a
## 3495                 n/a
## 3496               22.43
## 3497                  16
## 3498               18.56
## 3499               29.25
## 3500                 7.5
## 3501                 n/a
## 3502                22.5
## 3503                 n/a
## 3504                 n/a
## 3505                 n/a
## 3506                 n/a
## 3507                 n/a
## 3508                 n/a
## 3509                 n/a
## 3510                20.3
## 3511               12.19
## 3512                6.55
## 3513                 n/a
## 3514                   4
## 3515               25.42
## 3516                   0
## 3517               17.91
## 3518               12.93
## 3519                3.57
## 3520                  26
## 3521                 n/a
## 3522              155.36
## 3523               27.71
## 3524                13.1
## 3525                 n/a
## 3526                6.27
## 3527               10.33
## 3528               14.52
## 3529                55.5
## 3530                  15
## 3531                 n/a
## 3532               14.38
## 3533               15.29
## 3534               36.73
## 3535                12.1
## 3536                8.21
## 3537                 n/a
## 3538               32.67
## 3539               10.35
## 3540               21.25
## 3541               34.98
## 3542                  14
## 3543               22.45
## 3544               27.89
## 3545                  31
## 3546                 n/a
## 3547                 n/a
## 3548                 n/a
## 3549               16.87
## 3550                 n/a
## 3551               18.89
## 3552                 2.9
## 3553               20.55
## 3554               12.71
## 3555               21.16
## 3556                 n/a
## 3557                5.48
## 3558                 7.5
## 3559                   9
## 3560                 n/a
## 3561               19.31
## 3562                 n/a
## 3563                4.31
## 3564                 n/a
## 3565                  21
## 3566                  77
## 3567               14.36
## 3568                  13
## 3569                15.2
## 3570                4.54
## 3571                3.94
## 3572                5.45
## 3573               10.21
## 3574                 7.3
## 3575                 n/a
## 3576                5.83
## 3577               22.92
## 3578               20.72
## 3579                9.14
## 3580               18.55
## 3581                1.93
## 3582                 n/a
## 3583                 n/a
## 3584                 n/a
## 3585                 n/a
## 3586                 n/a
## 3587                 n/a
## 3588                 n/a
## 3589                 n/a
## 3590                32.5
## 3591                 n/a
## 3592                 n/a
## 3593               55.24
## 3594                 n/a
## 3595                  46
## 3596                3.19
## 3597                  23
## 3598                 n/a
## 3599                 n/a
## 3600               42.73
## 3601               14.38
## 3602               29.55
## 3603                 n/a
## 3604                 n/a
## 3605                 n/a
## 3606               12.17
## 3607                  18
## 3608                9.14
## 3609                 n/a
## 3610                7.81
## 3611               13.32
## 3612               59.16
## 3613               13.78
## 3614               10.87
## 3615                8.67
## 3616               12.05
## 3617               16.46
## 3618                25.5
## 3619                14.4
## 3620                 n/a
## 3621               23.44
## 3622                   3
## 3623               15.83
## 3624                   4
## 3625               18.24
## 3626               22.79
## 3627               19.81
## 3628                12.2
## 3629               17.39
## 3630                 n/a
## 3631                  24
## 3632                  90
## 3633                 n/a
## 3634                   0
## 3635                 n/a
## 3636                  20
## 3637                 9.5
## 3638                8.73
## 3639               10.43
## 3640                   0
## 3641                6.21
## 3642                12.8
## 3643                 n/a
## 3644                 6.5
## 3645                  37
## 3646                9.91
## 3647                 n/a
## 3648                 n/a
## 3649                7.67
## 3650                   0
## 3651                16.5
## 3652               21.06
## 3653                   0
## 3654               15.69
## 3655                 9.4
## 3656                 n/a
## 3657               10.16
## 3658                 n/a
## 3659                5.21
## 3660                 n/a
## 3661                5.95
## 3662                 n/a
## 3663                  20
## 3664                2.51
## 3665                 n/a
## 3666                 n/a
## 3667                 n/a
## 3668                 n/a
## 3669                 n/a
## 3670                 n/a
## 3671                1.32
## 3672                 n/a
## 3673                 n/a
## 3674                 n/a
## 3675                7.71
## 3676                 n/a
## 3677                 n/a
## 3678               13.33
## 3679                   3
## 3680                4.21
## 3681                7.25
## 3682                 5.5
## 3683                 n/a
## 3684                 n/a
## 3685                 9.5
## 3686                 n/a
## 3687                16.5
## 3688                9.17
## 3689                27.5
## 3690                  34
## 3691                 n/a
## 3692                 9.4
## 3693                8.71
## 3694                 n/a
## 3695                17.5
## 3696                 n/a
## 3697                7.83
## 3698                6.22
## 3699               13.25
## 3700               14.49
## 3701               23.75
## 3702                 n/a
## 3703               12.29
## 3704                6.86
## 3705                 n/a
## 3706              311.76
## 3707               20.24
## 3708                3.33
## 3709               19.13
## 3710                   3
## 3711               13.75
## 3712                   7
## 3713               53.17
## 3714                3.57
## 3715                8.75
## 3716                 9.2
## 3717                 n/a
## 3718                2.95
## 3719               24.03
## 3720               11.73
## 3721               10.42
## 3722                 n/a
## 3723                  27
## 3724               33.33
## 3725               27.48
## 3726                 8.8
## 3727                   3
## 3728                   5
## 3729                 n/a
## 3730               22.83
## 3731                   8
## 3732                4.37
## 3733               17.54
## 3734               19.43
## 3735                  33
## 3736                8.73
## 3737               31.04
## 3738                5.15
## 3739                5.39
## 3740                7.36
## 3741                0.82
## 3742                 n/a
## 3743                 n/a
## 3744                 4.8
## 3745                   7
## 3746                 n/a
## 3747                   8
## 3748               15.87
## 3749               24.11
## 3750                21.6
## 3751               19.38
## 3752                 n/a
## 3753                 n/a
## 3754                 n/a
## 3755                   2
## 3756                 n/a
## 3757                   0
## 3758                 n/a
## 3759                2.69
## 3760                   8
## 3761                 n/a
## 3762               15.14
## 3763               18.57
## 3764                   5
## 3765                5.33
## 3766                   4
## 3767                38.5
## 3768                17.4
## 3769                9.67
## 3770               15.15
## 3771                5.91
## 3772                   8
## 3773                 n/a
## 3774               18.03
## 3775                3.93
## 3776               47.67
## 3777                3.62
## 3778                9.61
## 3779                  37
## 3780                   4
## 3781                 n/a
## 3782                7.78
## 3783               15.37
## 3784                 n/a
## 3785               11.56
## 3786                8.85
## 3787                 n/a
## 3788                 n/a
## 3789                 n/a
## 3790                7.17
## 3791                23.9
## 3792                  18
## 3793               13.43
## 3794               15.55
## 3795               20.83
## 3796                6.64
## 3797               28.13
## 3798                4.69
## 3799                11.5
## 3800                 n/a
## 3801               25.18
## 3802                 n/a
## 3803                6.91
## 3804                8.77
## 3805                 n/a
## 3806               15.29
## 3807               14.16
## 3808                8.57
## 3809                8.09
## 3810                22.9
## 3811                 n/a
## 3812                 2.5
## 3813                 n/a
## 3814               12.32
## 3815                6.79
## 3816                 n/a
## 3817                 n/a
## 3818               17.56
## 3819                7.25
## 3820                3.98
## 3821                1.27
## 3822                4.92
## 3823                   9
## 3824               12.77
## 3825                4.22
## 3826                   8
## 3827                3.72
## 3828               14.97
## 3829                6.09
## 3830               16.49
## 3831               21.53
## 3832                 n/a
## 3833                 n/a
## 3834               21.43
## 3835                9.29
## 3836               13.01
## 3837               19.25
## 3838               15.83
## 3839                 8.1
## 3840               17.89
## 3841               20.67
## 3842                6.28
## 3843                 n/a
## 3844                  29
## 3845                 n/a
## 3846                  24
## 3847                 n/a
## 3848                 n/a
## 3849                7.75
## 3850                5.75
## 3851               20.66
## 3852                 n/a
## 3853                 n/a
## 3854                 n/a
## 3855                 n/a
## 3856                 n/a
## 3857                 5.6
## 3858                  20
## 3859                 n/a
## 3860                8.33
## 3861                3.62
## 3862                5.71
## 3863                   0
## 3864                5.07
## 3865                 n/a
## 3866                4.16
## 3867                 n/a
## 3868               11.72
## 3869                 n/a
## 3870                   0
## 3871                 n/a
## 3872                 n/a
## 3873               11.47
## 3874                 n/a
## 3875               23.88
## 3876                7.09
## 3877                38.5
## 3878                 8.4
## 3879                8.09
## 3880                5.56
## 3881                2.82
## 3882                2.81
## 3883                8.72
## 3884               12.05
## 3885                8.98
## 3886                18.5
## 3887                3.33
## 3888                   4
## 3889               14.49
## 3890                  44
## 3891                33.5
## 3892               25.45
## 3893               10.67
## 3894                16.3
## 3895                   0
## 3896                 n/a
## 3897                  18
## 3898                 6.5
## 3899               16.26
## 3900                   0
## 3901                 n/a
## 3902                 n/a
## 3903                  12
## 3904                8.54
## 3905                 n/a
## 3906               16.08
## 3907                 n/a
## 3908                  16
## 3909                 n/a
## 3910                   3
## 3911                2.84
## 3912                 n/a
## 3913               14.29
## 3914                 n/a
## 3915                  20
## 3916                   1
## 3917                5.67
## 3918                3.36
## 3919                 n/a
## 3920               27.14
## 3921               16.21
## 3922                  33
## 3923                 n/a
## 3924                27.5
## 3925               14.33
## 3926               17.33
## 3927                   8
## 3928               35.67
## 3929                4.44
## 3930                 n/a
## 3931                 n/a
## 3932               10.77
## 3933                   0
## 3934               37.88
## 3935                  26
## 3936               10.57
## 3937                 5.5
## 3938               17.33
## 3939               12.65
## 3940                0.59
## 3941               11.61
## 3942                 n/a
## 3943               15.06
## 3944                4.29
## 3945                 n/a
## 3946                8.19
## 3947                6.35
## 3948                8.96
## 3949                 n/a
## 3950                5.84
## 3951               16.55
## 3952                12.5
## 3953                5.97
## 3954                5.62
## 3955               14.67
## 3956                   6
## 3957                8.11
## 3958                 n/a
## 3959                 n/a
## 3960                4.48
## 3961                  16
## 3962               13.67
## 3963               13.91
## 3964               22.72
## 3965               18.75
## 3966               16.44
## 3967               17.43
## 3968                17.2
## 3969                14.8
## 3970                14.6
## 3971               27.56
## 3972               18.14
## 3973               18.67
## 3974               17.14
## 3975               16.49
## 3976               13.25
## 3977               16.25
## 3978               19.33
## 3979               20.92
## 3980               13.81
## 3981               17.17
## 3982               14.17
## 3983               16.67
## 3984               11.55
## 3985                29.5
## 3986               19.49
## 3987               15.72
## 3988                21.8
## 3989               20.33
## 3990               13.75
## 3991                  20
## 3992                  15
## 3993                21.4
## 3994               14.25
## 3995                   0
## 3996                8.35
## 3997               33.75
## 3998                 n/a
## 3999                 n/a
## 4000                6.43
## 4001                 8.5
## 4002                  27
## 4003                   0
## 4004                   7
## 4005               15.12
## 4006                   5
## 4007                9.66
## 4008                 n/a
## 4009                 n/a
## 4010                 n/a
## 4011                 n/a
## 4012                   0
## 4013                   0
## 4014               15.81
## 4015                 4.3
## 4016               17.86
## 4017                 n/a
## 4018                 n/a
## 4019                6.17
## 4020               11.05
## 4021                 n/a
## 4022                5.29
## 4023                 n/a
## 4024                 n/a
## 4025                 n/a
## 4026                 n/a
## 4027                 n/a
## 4028                 n/a
## 4029                  21
## 4030                 n/a
## 4031                 n/a
## 4032                 n/a
## 4033                 n/a
## 4034                 n/a
## 4035                 n/a
## 4036                 n/a
## 4037                 6.9
## 4038                9.62
## 4039               14.66
## 4040               24.09
## 4041                 n/a
## 4042                23.1
## 4043               15.56
## 4044                 n/a
## 4045                 7.5
## 4046                   5
## 4047               17.43
## 4048               15.71
## 4049                 n/a
## 4050                0.82
## 4051               10.16
## 4052               24.46
## 4053               16.57
## 4054                 n/a
## 4055               10.25
## 4056                 n/a
## 4057                 n/a
## 4058                  48
## 4059                  10
## 4060                 6.5
## 4061                0.04
## 4062               33.07
## 4063               42.26
## 4064                 n/a
## 4065                 n/a
## 4066               83.33
## 4067               15.89
## 4068                 n/a
## 4069                4.09
## 4070                 n/a
## 4071                5.48
## 4072               13.91
## 4073               18.08
## 4074                  13
## 4075                 n/a
## 4076                 7.6
## 4077                6.23
## 4078               16.84
## 4079                   6
## 4080               14.92
## 4081               25.69
## 4082                6.86
## 4083                 7.2
## 4084                6.54
## 4085                 n/a
## 4086                  64
## 4087                 n/a
## 4088                 n/a
## 4089                 7.5
## 4090                 n/a
## 4091                  10
## 4092                 n/a
## 4093               12.82
## 4094                9.61
## 4095               22.59
## 4096                9.35
## 4097                5.75
## 4098                24.2
## 4099               10.89
## 4100                1.22
## 4101               16.59
## 4102               23.33
## 4103               10.18
## 4104                16.5
## 4105                10.1
## 4106                 3.5
## 4107                 n/a
## 4108                  16
## 4109                  12
## 4110               10.96
## 4111                 n/a
## 4112                  13
## 4113                4.59
## 4114                0.46
## 4115                   2
## 4116                 n/a
## 4117                 n/a
## 4118                8.12
## 4119                   0
## 4120                 n/a
## 4121                 n/a
## 4122                 n/a
## 4123                 n/a
## 4124                6.62
## 4125                11.5
## 4126               13.86
## 4127               41.42
## 4128                 n/a
## 4129                   0
## 4130                 n/a
## 4131               14.06
## 4132                0.14
## 4133                35.5
## 4134                   5
## 4135                  10
## 4136                 n/a
## 4137               14.34
## 4138                 n/a
## 4139                9.97
## 4140                 n/a
## 4141                5.71
## 4142                 n/a
## 4143                   6
## 4144                6.94
## 4145                 n/a
## 4146                 n/a
## 4147                  14
## 4148                 n/a
## 4149               12.98
## 4150               18.77
## 4151                   0
## 4152                 n/a
## 4153                   5
## 4154                7.85
## 4155                7.69
## 4156                 n/a
## 4157                 n/a
## 4158                6.71
## 4159                 n/a
## 4160                  47
## 4161                 n/a
## 4162                   5
## 4163               28.87
## 4164                 n/a
## 4165                 n/a
## 4166                 n/a
## 4167                 n/a
## 4168                 n/a
## 4169                 n/a
## 4170                 3.2
## 4171                 n/a
## 4172                   0
## 4173                  22
## 4174                 n/a
## 4175                   0
## 4176                 n/a
## 4177                11.8
## 4178                   3
## 4179                7.86
## 4180               31.43
## 4181                25.5
## 4182                  19
## 4183               23.44
## 4184                 n/a
## 4185               17.86
## 4186               12.65
## 4187               18.18
## 4188               21.01
## 4189                 n/a
## 4190               18.75
## 4191               13.18
## 4192               26.67
## 4193               23.43
## 4194                5.86
## 4195               20.22
## 4196               312.5
## 4197                 n/a
## 4198                 n/a
## 4199                4.88
## 4200                4.25
## 4201                  67
## 4202                 n/a
## 4203                 n/a
## 4204               16.57
## 4205              142.69
## 4206               10.75
## 4207               13.13
## 4208               10.32
## 4209               18.42
## 4210                  14
## 4211               14.59
## 4212               20.12
## 4213               32.81
## 4214                 n/a
## 4215               27.26
## 4216               27.81
## 4217               22.58
## 4218                  27
## 4219                21.2
## 4220               31.98
## 4221               31.44
## 4222               38.18
## 4223               29.31
## 4224                3.05
## 4225               15.99
## 4226                 n/a
## 4227               14.29
## 4228               12.04
## 4229                 n/a
## 4230              130.37
## 4231                 n/a
## 4232                 n/a
## 4233                 n/a
## 4234                 n/a
## 4235                 8.5
## 4236                3.51
## 4237                9.33
## 4238               14.18
## 4239               13.47
## 4240                17.5
## 4241               15.51
## 4242                3.64
## 4243               22.47
## 4244               18.34
## 4245                 n/a
## 4246                8.07
## 4247                   0
## 4248               19.81
## 4249               13.39
## 4250                   0
## 4251                   0
## 4252                8.17
## 4253               14.91
## 4254                4.44
## 4255               20.48
## 4256                3.05
## 4257               14.18
## 4258                8.55
## 4259                 n/a
## 4260               17.83
## 4261                 n/a
## 4262                8.56
## 4263                18.7
## 4264                 155
## 4265                3.25
## 4266                6.31
## 4267               13.19
## 4268               21.67
## 4269                  12
## 4270                   7
## 4271                 n/a
## 4272                 n/a
## 4273               12.63
## 4274                2.13
## 4275                   0
## 4276                0.91
## 4277                10.5
## 4278                8.17
## 4279                7.33
## 4280                 n/a
## 4281                 n/a
## 4282                 n/a
## 4283                   5
## 4284                2.72
## 4285                 n/a
## 4286               12.41
## 4287                   2
## 4288                  17
## 4289                 n/a
## 4290               12.42
## 4291                 n/a
## 4292               11.62
## 4293                9.28
## 4294               12.13
## 4295                1.53
## 4296               12.82
## 4297               18.01
## 4298               11.67
## 4299                 n/a
## 4300               16.67
## 4301                7.45
## 4302                0.06
## 4303                7.19
## 4304               10.71
## 4305                 n/a
## 4306                6.74
## 4307                   5
## 4308                   3
## 4309                 n/a
## 4310                 n/a
## 4311                 n/a
## 4312                 6.2
## 4313                12.5
## 4314                 n/a
## 4315                  29
## 4316                  84
## 4317               13.64
## 4318                 n/a
## 4319                3.53
## 4320               23.09
## 4321               11.52
## 4322                 5.2
## 4323                 n/a
## 4324               12.97
## 4325               14.79
## 4326                  12
## 4327                   0
## 4328                9.67
## 4329                2.16
## 4330               15.69
## 4331               11.72
## 4332               11.43
## 4333                   0
## 4334                 n/a
## 4335               21.11
## 4336                3.45
## 4337               24.44
## 4338                 n/a
## 4339                 n/a
## 4340                 n/a
## 4341               16.65
## 4342               17.05
## 4343                   8
## 4344               10.77
## 4345                1.32
## 4346                3.09
## 4347                 n/a
## 4348                 n/a
## 4349                 n/a
## 4350                 n/a
## 4351                 n/a
## 4352                 n/a
## 4353                 n/a
## 4354                  29
## 4355               18.05
## 4356                 n/a
## 4357               15.79
## 4358               23.65
## 4359                24.9
## 4360               14.71
## 4361                 9.6
## 4362               18.99
## 4363                  20
## 4364               17.92
## 4365                9.86
## 4366                  35
## 4367                 7.5
## 4368               14.69
## 4369                 6.5
## 4370                4.51
## 4371                  18
## 4372               12.26
## 4373                4.39
## 4374                12.5
## 4375                 n/a
## 4376                 n/a
## 4377                5.29
## 4378                20.5
## 4379                 n/a
## 4380                6.84
## 4381                 6.5
## 4382               18.53
## 4383                 n/a
## 4384               25.99
## 4385                4.35
## 4386               21.11
## 4387                17.5
## 4388               21.54
## 4389               12.36
## 4390               16.86
## 4391                   0
## 4392                  14
## 4393               24.24
## 4394                 n/a
## 4395                  36
## 4396                  30
## 4397               21.93
## 4398               16.29
## 4399               14.81
## 4400               23.89
## 4401               21.67
## 4402               14.71
## 4403               10.26
## 4404               11.25
## 4405               10.33
## 4406                 1.5
## 4407                6.85
## 4408               12.61
## 4409                7.84
## 4410                9.23
## 4411                 n/a
## 4412                29.2
## 4413               20.62
## 4414               17.27
## 4415                26.5
## 4416                 n/a
## 4417               13.62
## 4418               16.33
## 4419                7.27
## 4420                   7
## 4421                   9
## 4422                 n/a
## 4423                 n/a
## 4424                   3
## 4425                12.8
## 4426               11.17
## 4427                 9.5
## 4428                 n/a
## 4429                   8
## 4430               16.67
## 4431                 4.5
## 4432                5.69
## 4433                4.54
## 4434               25.09
## 4435               26.93
## 4436                12.8
## 4437                   6
## 4438                2.96
## 4439                 n/a
## 4440                 n/a
## 4441                22.4
## 4442               13.18
## 4443                0.81
## 4444                 n/a
## 4445               12.07
## 4446                  12
## 4447                   3
## 4448                 n/a
## 4449                 9.5
## 4450               37.59
## 4451               22.38
## 4452                 n/a
## 4453                 5.6
## 4454                   0
## 4455                 n/a
## 4456                   1
## 4457                1.12
## 4458               13.84
## 4459                12.5
## 4460               13.25
## 4461                 n/a
## 4462                4.77
## 4463                 113
## 4464                 n/a
## 4465                  32
## 4466                3.67
## 4467                24.7
## 4468               11.65
## 4469                2.92
## 4470                 n/a
## 4471                 n/a
## 4472                 430
## 4473                  14
## 4474                   2
## 4475                9.22
## 4476               11.49
## 4477                   2
## 4478                 n/a
## 4479               19.71
## 4480                   0
## 4481               14.35
## 4482                11.9
## 4483                 n/a
## 4484                   9
## 4485                   2
## 4486                10.5
## 4487                10.3
## 4488                8.99
## 4489                 n/a
## 4490                2.46
## 4491                 n/a
## 4492               30.24
## 4493                 n/a
## 4494                 n/a
## 4495                 n/a
## 4496                 n/a
## 4497                 n/a
## 4498                 n/a
## 4499               15.37
## 4500                 n/a
## 4501                 n/a
## 4502                27.8
## 4503               20.08
## 4504                 n/a
## 4505                53.8
## 4506                6.37
## 4507                 n/a
## 4508               22.22
## 4509               26.04
## 4510                5.18
## 4511               24.82
## 4512               12.63
## 4513               15.89
## 4514                 9.3
## 4515                 n/a
## 4516                 n/a
## 4517                 n/a
## 4518                   5
## 4519                 n/a
## 4520                8.71
## 4521                9.75
## 4522                9.27
## 4523               16.22
## 4524                 n/a
## 4525               12.29
## 4526               39.67
## 4527                9.21
## 4528                17.5
## 4529                 n/a
## 4530                  12
## 4531                  23
## 4532                3.69
## 4533               23.27
## 4534                2.79
## 4535                6.07
## 4536                 n/a
## 4537                   3
## 4538                 n/a
## 4539                 n/a
## 4540                 n/a
## 4541                 n/a
## 4542               29.57
## 4543               18.71
## 4544                6.06
## 4545                  16
## 4546                 n/a
## 4547                 n/a
## 4548                6.06
## 4549                 n/a
## 4550                2.25
## 4551                 n/a
## 4552                 n/a
## 4553                5.82
## 4554                 n/a
## 4555               18.08
## 4556               12.02
## 4557               14.37
## 4558               14.29
## 4559                   5
## 4560               14.05
## 4561                 n/a
## 4562                4.84
## 4563               24.27
## 4564               21.89
## 4565                7.38
## 4566                 8.8
## 4567                  20
## 4568               14.32
## 4569                19.2
## 4570                   3
## 4571               12.02
## 4572               11.88
## 4573               10.94
## 4574               27.38
## 4575                5.75
## 4576                 n/a
## 4577               38.95
## 4578                 n/a
## 4579                 n/a
## 4580               37.33
## 4581               34.09
## 4582                  10
## 4583                 n/a
## 4584                 n/a
## 4585                3.38
## 4586               16.77
## 4587                  21
## 4588                   0
## 4589               20.93
## 4590                4.92
## 4591                   7
## 4592                 n/a
## 4593                 n/a
## 4594               12.24
## 4595                12.2
## 4596                 n/a
## 4597                 n/a
## 4598                  65
## 4599                18.8
## 4600               31.27
## 4601                 5.5
## 4602               13.33
## 4603               17.07
## 4604                  13
## 4605               18.51
## 4606                 n/a
## 4607                 n/a
## 4608               20.93
## 4609                  14
## 4610                14.6
## 4611               12.04
## 4612                10.5
## 4613                6.83
## 4614               22.67
## 4615                7.71
## 4616                 5.8
## 4617                 n/a
## 4618                 n/a
## 4619                9.89
## 4620                 n/a
## 4621                9.76
## 4622                8.23
## 4623               21.82
## 4624                2.14
## 4625                9.39
## 4626                 n/a
## 4627               18.35
## 4628                2.23
## 4629               25.11
## 4630                24.1
## 4631               15.01
## 4632                4.85
## 4633               18.38
## 4634               12.41
## 4635                 n/a
## 4636               11.25
## 4637                 n/a
## 4638                 n/a
## 4639                 n/a
## 4640                10.5
## 4641                 n/a
## 4642               12.16
## 4643                 n/a
## 4644                 n/a
## 4645                6.17
## 4646                 n/a
## 4647               12.28
## 4648                 n/a
## 4649                 n/a
## 4650                10.6
## 4651                 n/a
## 4652                 n/a
## 4653                18.8
## 4654                  42
## 4655                 n/a
## 4656               15.56
## 4657               12.29
## 4658               10.59
## 4659               10.98
## 4660               22.89
## 4661                 n/a
## 4662               10.34
## 4663                5.49
## 4664                7.33
## 4665                 n/a
## 4666                 n/a
## 4667                 n/a
## 4668                 n/a
## 4669                 3.5
## 4670                   5
## 4671                 n/a
## 4672                   0
## 4673               12.56
## 4674               32.82
## 4675                 n/a
## 4676                   0
## 4677                5.35
## 4678                 n/a
## 4679               17.06
## 4680                 n/a
## 4681                 4.5
## 4682                8.25
## 4683                 n/a
## 4684                 n/a
## 4685                 n/a
## 4686                 n/a
## 4687                4.07
## 4688               10.83
## 4689               14.23
## 4690                 n/a
## 4691                 n/a
## 4692                 n/a
## 4693               13.72
## 4694                8.62
## 4695                 n/a
## 4696                6.29
## 4697                 n/a
## 4698                 n/a
## 4699               10.55
## 4700                 n/a
## 4701                4.62
## 4702                 n/a
## 4703                   7
## 4704                 4.6
## 4705                 n/a
## 4706                10.1
## 4707                 n/a
## 4708                 n/a
## 4709               17.25
## 4710                 n/a
## 4711                 n/a
## 4712                4.13
## 4713                 n/a
## 4714               21.74
## 4715               20.59
## 4716                  10
## 4717                 n/a
## 4718                5.24
## 4719               13.22
## 4720                5.96
## 4721                  35
## 4722                4.33
## 4723                  12
## 4724               15.54
## 4725                 8.5
## 4726                 3.3
## 4727                7.77
## 4728               25.21
## 4729               15.07
## 4730               29.03
## 4731                22.5
## 4732                  99
## 4733                 n/a
## 4734                 n/a
## 4735                4.75
## 4736                 n/a
## 4737                 239
## 4738               22.02
## 4739                 9.5
## 4740                   7
## 4741               19.09
## 4742                 n/a
## 4743               20.18
## 4744                 n/a
## 4745               16.62
## 4746                 n/a
## 4747                2.93
## 4748                 n/a
## 4749                 2.4
## 4750                 n/a
## 4751                 n/a
## 4752                 n/a
## 4753                 n/a
## 4754                 5.1
## 4755               29.06
## 4756                   0
## 4757                   0
## 4758                 n/a
## 4759                 n/a
## 4760                5.39
## 4761                 n/a
## 4762                   0
## 4763               23.55
## 4764               42.92
## 4765               34.67
## 4766               56.79
## 4767               57.57
## 4768              125.83
## 4769               40.63
## 4770                  94
## 4771                  52
## 4772               36.24
## 4773               40.67
## 4774                39.5
## 4775               97.14
## 4776                4.67
## 4777                 n/a
## 4778                 n/a
## 4779                 n/a
## 4780                 n/a
## 4781                8.06
## 4782                  23
## 4783                  38
## 4784                 n/a
## 4785                 n/a
## 4786               56.25
## 4787                 n/a
## 4788                 n/a
## 4789                 n/a
## 4790                 n/a
## 4791                 n/a
## 4792               11.18
## 4793               12.62
## 4794               59.41
## 4795                0.07
## 4796                   8
## 4797               10.25
## 4798                 n/a
## 4799               15.42
## 4800               23.74
## 4801                2.97
## 4802                6.44
## 4803                  17
## 4804                 n/a
## 4805               35.98
## 4806               21.01
## 4807                4.33
## 4808                8.33
## 4809                 5.4
## 4810               18.76
## 4811               28.22
## 4812                  34
## 4813                 n/a
## 4814                9.09
## 4815               16.24
## 4816                   4
## 4817               16.67
## 4818                40.4
## 4819                   0
## 4820                13.6
## 4821                13.9
## 4822               25.33
## 4823                 n/a
## 4824               21.67
## 4825               65.12
## 4826                 n/a
## 4827                 n/a
## 4828               32.68
## 4829                  16
## 4830                 4.3
## 4831                   3
## 4832                 3.5
## 4833               58.33
## 4834                   5
## 4835                 n/a
## 4836               23.33
## 4837               16.59
## 4838                6.67
## 4839                  24
## 4840                 n/a
## 4841                   6
## 4842                 101
## 4843                0.49
## 4844                  11
## 4845                 n/a
## 4846                 n/a
## 4847                 n/a
## 4848               25.76
## 4849                5.35
## 4850                 n/a
## 4851               18.47
## 4852               10.55
## 4853                8.35
## 4854                 7.5
## 4855                16.6
## 4856                 n/a
## 4857                  50
## 4858                6.74
## 4859                 n/a
## 4860                 n/a
## 4861                 n/a
## 4862                 n/a
## 4863                 n/a
## 4864                 n/a
## 4865                 n/a
## 4866                 n/a
## 4867                 n/a
## 4868                 n/a
## 4869                 n/a
## 4870                 n/a
## 4871                 n/a
## 4872                 n/a
## 4873                 n/a
## 4874                 n/a
## 4875                 n/a
## 4876                  16
## 4877               15.83
## 4878                  20
## 4879                2.88
## 4880                 n/a
## 4881                 n/a
## 4882                 n/a
## 4883               27.38
## 4884                 n/a
## 4885                6.94
## 4886                3.96
## 4887                   0
## 4888               19.15
## 4889               40.91
## 4890                7.86
## 4891                 4.9
## 4892               23.62
## 4893                  43
## 4894                 n/a
## 4895                9.17
## 4896                   0
## 4897                  22
## 4898                5.18
## 4899                8.06
## 4900                2.67
## 4901                1.73
## 4902               14.45
## 4903               12.04
## 4904               17.24
## 4905               33.14
## 4906               41.67
## 4907               23.82
## 4908                 n/a
## 4909                9.94
## 4910               19.29
## 4911               22.86
## 4912                  12
## 4913                6.53
## 4914               19.32
## 4915               13.33
## 4916                 n/a
## 4917                 n/a
## 4918                6.12
## 4919               25.73
## 4920                4.76
## 4921               17.47
## 4922               12.76
## 4923                  91
## 4924                 4.5
## 4925                6.75
## 4926                8.17
## 4927               13.42
## 4928                 n/a
## 4929                7.04
## 4930                8.41
## 4931                3.49
## 4932                 n/a
## 4933                  20
## 4934                 n/a
## 4935               24.93
## 4936                 n/a
## 4937                6.67
## 4938                 n/a
## 4939                 n/a
## 4940                 n/a
## 4941               32.67
## 4942                   1
## 4943                 n/a
## 4944                 n/a
## 4945                3.33
## 4946                19.5
## 4947               10.95
## 4948                 n/a
## 4949                 5.1
## 4950                 6.5
## 4951                 n/a
## 4952                9.67
## 4953                9.18
## 4954               16.32
## 4955                3.77
## 4956                  15
## 4957                 n/a
## 4958                8.68
## 4959                  10
## 4960               15.67
## 4961                7.78
## 4962                 n/a
## 4963                 n/a
## 4964               10.71
## 4965                 3.5
## 4966                 n/a
## 4967                   0
## 4968               14.52
## 4969               13.11
## 4970                  46
## 4971                 8.4
## 4972                3.33
## 4973                 n/a
## 4974                6.82
## 4975                  25
## 4976                 n/a
## 4977                   0
## 4978               24.16
## 4979                9.75
## 4980                12.9
## 4981               10.36
## 4982               10.15
## 4983                 n/a
## 4984               16.68
## 4985               12.77
## 4986               32.07
## 4987                19.5
## 4988                 n/a
## 4989                 n/a
## 4990                 n/a
## 4991                 n/a
## 4992               22.01
## 4993               23.26
## 4994                 n/a
## 4995                 7.1
## 4996                 n/a
## 4997                   6
## 4998                5.51
## 4999               18.57
## 5000               23.62
## 5001                   0
## 5002                 n/a
## 5003                5.24
## 5004               18.96
## 5005                 n/a
## 5006                50.5
## 5007                 n/a
## 5008               16.25
## 5009               40.17
## 5010               15.78
## 5011                 5.8
## 5012                3.49
## 5013                9.86
## 5014               15.25
## 5015                   0
## 5016                 n/a
## 5017                7.77
## 5018                 4.5
## 5019                 n/a
## 5020                 n/a
## 5021                 n/a
## 5022                 n/a
## 5023                 n/a
## 5024                 n/a
## 5025                1.86
## 5026                2.43
## 5027                 n/a
## 5028                 n/a
## 5029                4.67
## 5030                17.4
## 5031                6.05
## 5032                  60
## 5033                14.6
## 5034                 n/a
## 5035               14.66
## 5036               38.96
## 5037               16.97
## 5038                3.85
## 5039                6.55
## 5040                8.86
## 5041                 n/a
## 5042                 n/a
## 5043                   4
## 5044                 n/a
## 5045                   0
## 5046                 n/a
## 5047               15.83
## 5048                  13
## 5049                   6
## 5050                32.5
## 5051                28.4
## 5052                  10
## 5053               11.76
## 5054                 n/a
## 5055                   8
## 5056                2.68
## 5057                5.67
## 5058                 n/a
## 5059               17.55
## 5060                 n/a
## 5061                2.41
## 5062                 n/a
## 5063                 n/a
## 5064                3.22
## 5065                 n/a
## 5066                8.32
## 5067                6.17
## 5068                 n/a
## 5069                3.21
## 5070                5.08
## 5071                 n/a
## 5072                 n/a
## 5073                  23
## 5074                9.17
## 5075               16.22
## 5076                 9.5
## 5077               12.12
## 5078               14.86
## 5079                 n/a
## 5080                11.1
## 5081                 7.4
## 5082                  10
## 5083                 n/a
## 5084               25.22
## 5085                 n/a
## 5086                 n/a
## 5087               18.81
## 5088                 n/a
## 5089                 n/a
## 5090                  44
## 5091               12.17
## 5092                6.33
## 5093                  10
## 5094               12.98
## 5095                12.5
## 5096                 n/a
## 5097                 n/a
## 5098                5.09
## 5099                  21
## 5100                   4
## 5101                   4
## 5102                  11
## 5103               13.13
## 5104                13.6
## 5105                 n/a
## 5106               15.73
## 5107                 n/a
## 5108                20.5
## 5109                  83
## 5110                  10
## 5111               11.23
## 5112               23.67
## 5113                  25
## 5114                 n/a
## 5115                36.7
## 5116               15.66
## 5117               17.57
## 5118               13.32
## 5119                 2.5
## 5120               12.43
## 5121               25.47
## 5122               42.64
## 5123                11.1
## 5124               20.87
## 5125               21.67
## 5126                   7
## 5127                 3.5
## 5128                3.86
## 5129               17.22
## 5130                   8
## 5131               13.52
## 5132                6.91
## 5133                  14
## 5134                 n/a
## 5135               20.08
## 5136               23.59
## 5137                 n/a
## 5138               14.41
## 5139               15.36
## 5140                  25
## 5141                 n/a
## 5142               13.72
## 5143               20.66
## 5144                  11
## 5145                 4.9
## 5146                 n/a
## 5147                4.75
## 5148                   0
## 5149                17.7
## 5150                 n/a
## 5151                17.8
## 5152               11.67
## 5153                 n/a
## 5154                  25
## 5155               12.24
## 5156               32.11
## 5157               13.22
## 5158              106.67
## 5159               12.23
## 5160                2.59
## 5161               15.24
## 5162               21.14
## 5163                8.85
## 5164                7.55
## 5165              163.33
## 5166               30.75
## 5167                 n/a
## 5168                 n/a
## 5169                 n/a
## 5170                 n/a
## 5171                 n/a
## 5172               24.67
## 5173                 n/a
## 5174               18.05
## 5175                 n/a
## 5176                9600
## 5177                8.05
## 5178                 n/a
## 5179                18.1
## 5180                 n/a
## 5181               14.67
## 5182                  17
## 5183                  18
## 5184               19.82
## 5185                8.86
## 5186               13.65
## 5187                6.21
## 5188                5.67
## 5189                13.5
## 5190               13.33
## 5191                 n/a
## 5192                9.82
## 5193               26.81
## 5194               10.25
## 5195               17.17
## 5196                 n/a
## 5197               17.79
## 5198                 n/a
## 5199               21.42
## 5200                2.95
## 5201                 n/a
## 5202                 9.5
## 5203               13.61
## 5204                8.33
## 5205               11.28
## 5206               17.77
## 5207               19.09
## 5208                  15
## 5209                12.5
## 5210                29.5
## 5211                  50
## 5212               13.83
## 5213                10.5
## 5214               16.74
## 5215                   0
## 5216                   0
## 5217               12.94
## 5218                  38
## 5219                 n/a
## 5220                10.4
## 5221                 n/a
## 5222                 n/a
## 5223                 n/a
## 5224                9.32
## 5225                 n/a
## 5226                   0
## 5227                10.1
## 5228                 4.5
## 5229                 n/a
## 5230                 n/a
## 5231               15.25
## 5232                 7.1
## 5233                5.99
## 5234                 n/a
## 5235                27.5
## 5236                  38
## 5237                7.38
## 5238               16.94
## 5239                 n/a
## 5240               13.82
## 5241                 n/a
## 5242                 n/a
## 5243                 n/a
## 5244                 n/a
## 5245                 n/a
## 5246                 n/a
## 5247                 n/a
## 5248                 n/a
## 5249                 n/a
## 5250                4.74
## 5251                 n/a
## 5252                 n/a
## 5253                 n/a
## 5254                 n/a
## 5255                12.4
## 5256                 n/a
## 5257               18.97
## 5258                 n/a
## 5259                31.8
## 5260                 n/a
## 5261                 n/a
## 5262                8.75
## 5263                 n/a
##  [ reached 'max' / getOption("max.print") -- omitted 267 rows ]

Some Regional Service Agency (RESA), or a Regular local school district that is NOT a component of a supervisory union, or State agency providing elem and/or secondary level instruction are considered a 4-Alternative type

#Table of school status and counts
table((public_school$Updated.Status))
## 
##                    1-Open                  2-Closed                     3-New 
##                     97175                         2                      1124 
##                   4-Added 5-Changed Boundary/Agency                6-Inactive 
##                        77                       110                       500 
##                  7-Future                8-Reopened 
##                       319                        41
#Do we have any information for school that is "Added" or "Future" status? 
public_school %>% filter(Updated.Status == "7-Future" | Updated.Status == "4-Added")
##         State.Name ST
## 1        MINNESOTA MN
## 2          FLORIDA FL
## 3          FLORIDA FL
## 4          FLORIDA FL
## 5          FLORIDA FL
## 6          FLORIDA FL
## 7        MINNESOTA MN
## 8             UTAH UT
## 9          ALABAMA AL
## 10          HAWAII HI
## 11      NEW MEXICO NM
## 12            IOWA IA
## 13      NEW MEXICO NM
## 14  NORTH CAROLINA NC
## 15            OHIO OH
## 16  NORTH CAROLINA NC
## 17  NORTH CAROLINA NC
## 18            UTAH UT
## 19  NORTH CAROLINA NC
## 20            OHIO OH
## 21            OHIO OH
## 22       MINNESOTA MN
## 23           IDAHO ID
## 24  NORTH CAROLINA NC
## 25            UTAH UT
## 26  NORTH CAROLINA NC
## 27         FLORIDA FL
## 28            IOWA IA
## 29           TEXAS TX
## 30       WISCONSIN WI
## 31           TEXAS TX
## 32       MINNESOTA MN
## 33  SOUTH CAROLINA SC
## 34            IOWA IA
## 35  SOUTH CAROLINA SC
## 36         FLORIDA FL
## 37  NORTH CAROLINA NC
## 38       MINNESOTA MN
## 39    SOUTH DAKOTA SD
## 40            UTAH UT
## 41            UTAH UT
## 42           TEXAS TX
## 43           TEXAS TX
## 44  SOUTH CAROLINA SC
## 45         FLORIDA FL
## 46         FLORIDA FL
## 47         FLORIDA FL
## 48           TEXAS TX
## 49   WEST VIRGINIA WV
## 50   WEST VIRGINIA WV
## 51   WEST VIRGINIA WV
## 52   WEST VIRGINIA WV
## 53   WEST VIRGINIA WV
## 54       MINNESOTA MN
## 55       MINNESOTA MN
## 56  NORTH CAROLINA NC
## 57  NORTH CAROLINA NC
## 58           TEXAS TX
## 59   NEW HAMPSHIRE NH
## 60   NEW HAMPSHIRE NH
## 61       WISCONSIN WI
## 62            UTAH UT
## 63  NORTH CAROLINA NC
## 64       WISCONSIN WI
## 65  NORTH CAROLINA NC
## 66            OHIO OH
## 67           TEXAS TX
## 68         FLORIDA FL
## 69            UTAH UT
## 70       WISCONSIN WI
## 71       WISCONSIN WI
## 72  NORTH CAROLINA NC
## 73       MINNESOTA MN
## 74  NORTH CAROLINA NC
## 75            OHIO OH
## 76            OHIO OH
## 77        VIRGINIA VA
## 78           TEXAS TX
## 79       MINNESOTA MN
## 80       MINNESOTA MN
## 81       MINNESOTA MN
## 82         FLORIDA FL
## 83         FLORIDA FL
## 84            UTAH UT
## 85       MINNESOTA MN
## 86      NEW JERSEY NJ
## 87       MINNESOTA MN
## 88  NORTH CAROLINA NC
## 89            OHIO OH
## 90  NORTH CAROLINA NC
## 91    SOUTH DAKOTA SD
## 92       MINNESOTA MN
## 93  NORTH CAROLINA NC
## 94         FLORIDA FL
## 95         FLORIDA FL
## 96           TEXAS TX
## 97         FLORIDA FL
## 98         FLORIDA FL
## 99           TEXAS TX
## 100          TEXAS TX
## 101      WISCONSIN WI
## 102       VIRGINIA VA
## 103           OHIO OH
## 104      MINNESOTA MN
## 105      MINNESOTA MN
## 106           OHIO OH
## 107 SOUTH CAROLINA SC
## 108 SOUTH CAROLINA SC
## 109 NORTH CAROLINA NC
## 110          TEXAS TX
## 111      WISCONSIN WI
## 112          TEXAS TX
## 113      MINNESOTA MN
## 114       MICHIGAN MI
## 115        FLORIDA FL
## 116      MINNESOTA MN
## 117      MINNESOTA MN
## 118          TEXAS TX
## 119 NORTH CAROLINA NC
## 120          TEXAS TX
## 121          TEXAS TX
## 122        ARIZONA AZ
## 123      MINNESOTA MN
## 124          TEXAS TX
## 125          TEXAS TX
## 126           UTAH UT
## 127      MINNESOTA MN
## 128       VIRGINIA VA
## 129      MINNESOTA MN
## 130      MINNESOTA MN
## 131      MINNESOTA MN
## 132        FLORIDA FL
## 133       MICHIGAN MI
## 134        FLORIDA FL
## 135      WISCONSIN WI
## 136          IDAHO ID
## 137      MINNESOTA MN
## 138      MINNESOTA MN
## 139      MINNESOTA MN
## 140          IDAHO ID
## 141      MINNESOTA MN
## 142      MINNESOTA MN
## 143 NORTH CAROLINA NC
## 144       VIRGINIA VA
## 145      MINNESOTA MN
## 146 NORTH CAROLINA NC
## 147        FLORIDA FL
## 148           OHIO OH
## 149          TEXAS TX
## 150           OHIO OH
## 151      MINNESOTA MN
## 152          IDAHO ID
## 153           OHIO OH
## 154           UTAH UT
## 155      MINNESOTA MN
## 156        FLORIDA FL
## 157      MINNESOTA MN
## 158          TEXAS TX
## 159        INDIANA IN
## 160      MINNESOTA MN
## 161     NEW MEXICO NM
## 162        FLORIDA FL
## 163           UTAH UT
## 164          TEXAS TX
## 165          TEXAS TX
## 166          TEXAS TX
## 167 NORTH CAROLINA NC
## 168      WISCONSIN WI
## 169       VIRGINIA VA
## 170          TEXAS TX
## 171          IDAHO ID
## 172 NORTH CAROLINA NC
## 173          TEXAS TX
## 174      MINNESOTA MN
## 175        FLORIDA FL
## 176        FLORIDA FL
## 177      WISCONSIN WI
## 178  NEW HAMPSHIRE NH
## 179  NEW HAMPSHIRE NH
## 180      WISCONSIN WI
## 181      WISCONSIN WI
## 182 SOUTH CAROLINA SC
## 183      MINNESOTA MN
## 184      MINNESOTA MN
## 185      MINNESOTA MN
## 186           UTAH UT
## 187          TEXAS TX
## 188        FLORIDA FL
## 189       Delaware DE
## 190          TEXAS TX
## 191           UTAH UT
## 192          TEXAS TX
## 193        ARIZONA AZ
## 194        FLORIDA FL
## 195        INDIANA IN
## 196           OHIO OH
## 197        FLORIDA FL
## 198           OHIO OH
## 199        INDIANA IN
## 200        FLORIDA FL
## 201      MINNESOTA MN
## 202      MINNESOTA MN
## 203          TEXAS TX
## 204          TEXAS TX
## 205          TEXAS TX
## 206          TEXAS TX
## 207          TEXAS TX
## 208   NORTH DAKOTA ND
## 209 NORTH CAROLINA NC
## 210      MINNESOTA MN
## 211           OHIO OH
## 212           OHIO OH
## 213        FLORIDA FL
## 214          TEXAS TX
## 215           OHIO OH
## 216           OHIO OH
## 217        INDIANA IN
## 218 NORTH CAROLINA NC
## 219      WISCONSIN WI
## 220           OHIO OH
## 221        FLORIDA FL
## 222           OHIO OH
## 223   NORTH DAKOTA ND
## 224   NORTH DAKOTA ND
## 225          TEXAS TX
## 226 NORTH CAROLINA NC
## 227 NORTH CAROLINA NC
## 228 NORTH CAROLINA NC
## 229 NORTH CAROLINA NC
## 230 NORTH CAROLINA NC
## 231 NORTH CAROLINA NC
## 232          TEXAS TX
## 233      MINNESOTA MN
## 234        FLORIDA FL
## 235        FLORIDA FL
## 236        ARIZONA AZ
## 237          TEXAS TX
## 238          TEXAS TX
## 239          TEXAS TX
## 240          TEXAS TX
## 241          TEXAS TX
## 242          TEXAS TX
## 243          TEXAS TX
## 244          TEXAS TX
## 245          TEXAS TX
## 246          TEXAS TX
## 247           UTAH UT
## 248          TEXAS TX
## 249          TEXAS TX
## 250      WISCONSIN WI
## 251          TEXAS TX
## 252          TEXAS TX
## 253 NORTH CAROLINA NC
## 254      MINNESOTA MN
## 255          TEXAS TX
## 256           UTAH UT
## 257      MINNESOTA MN
## 258           IOWA IA
## 259           IOWA IA
## 260      MINNESOTA MN
## 261      MINNESOTA MN
## 262      MINNESOTA MN
## 263          Idaho ID
## 264   SOUTH DAKOTA SD
## 265     NEW JERSEY NJ
## 266           IOWA IA
## 267           IOWA IA
## 268      MINNESOTA MN
## 269      WISCONSIN WI
## 270        FLORIDA FL
## 271   NORTH DAKOTA ND
## 272        FLORIDA FL
## 273   SOUTH DAKOTA SD
## 274      MINNESOTA MN
## 275          IDAHO ID
## 276        ALABAMA AL
## 277      MINNESOTA MN
## 278        FLORIDA FL
## 279        FLORIDA FL
## 280          TEXAS TX
## 281        FLORIDA FL
## 282           OHIO OH
## 283 SOUTH CAROLINA SC
## 284      MINNESOTA MN
## 285      MINNESOTA MN
## 286      MINNESOTA MN
## 287          IDAHO ID
## 288       NEW YORK NY
## 289           IOWA IA
## 290 NORTH CAROLINA NC
## 291          TEXAS TX
## 292      MINNESOTA MN
## 293          TEXAS TX
## 294          TEXAS TX
## 295        FLORIDA FL
## 296        FLORIDA FL
## 297   NORTH DAKOTA ND
## 298      WISCONSIN WI
## 299           OHIO OH
## 300           OHIO OH
## 301      WISCONSIN WI
## 302 NORTH CAROLINA NC
## 303      WISCONSIN WI
## 304       MICHIGAN MI
## 305 NORTH CAROLINA NC
## 306      MINNESOTA MN
## 307      MINNESOTA MN
## 308       MICHIGAN MI
## 309          TEXAS TX
## 310      MINNESOTA MN
## 311      WISCONSIN WI
## 312      MINNESOTA MN
## 313      MINNESOTA MN
## 314        FLORIDA FL
## 315        FLORIDA FL
## 316        FLORIDA FL
## 317           IOWA IA
## 318        FLORIDA FL
## 319 NORTH CAROLINA NC
## 320        FLORIDA FL
## 321           OHIO OH
## 322 NORTH CAROLINA NC
## 323      WISCONSIN WI
## 324      MINNESOTA MN
## 325        FLORIDA FL
## 326   SOUTH DAKOTA SD
## 327 NORTH CAROLINA NC
## 328          IDAHO ID
## 329      MINNESOTA MN
## 330      MINNESOTA MN
## 331           OHIO OH
## 332          TEXAS TX
## 333          IDAHO ID
## 334           OHIO OH
## 335        FLORIDA FL
## 336   NORTH DAKOTA ND
## 337 NORTH CAROLINA NC
## 338 NORTH CAROLINA NC
## 339          TEXAS TX
## 340        FLORIDA FL
## 341          TEXAS TX
## 342 NORTH CAROLINA NC
## 343 SOUTH CAROLINA SC
## 344      MINNESOTA MN
## 345          TEXAS TX
## 346      MINNESOTA MN
## 347          IDAHO ID
## 348          TEXAS TX
## 349        FLORIDA FL
## 350      WISCONSIN WI
## 351        FLORIDA FL
## 352          TEXAS TX
## 353      MINNESOTA MN
## 354        FLORIDA FL
## 355        FLORIDA FL
## 356      MINNESOTA MN
## 357          TEXAS TX
## 358        FLORIDA FL
## 359        FLORIDA FL
## 360        ALABAMA AL
## 361           IOWA IA
## 362          TEXAS TX
## 363       VIRGINIA VA
## 364 NORTH CAROLINA NC
## 365 SOUTH CAROLINA SC
## 366      MINNESOTA MN
## 367       VIRGINIA VA
## 368       VIRGINIA VA
## 369       VIRGINIA VA
## 370       KENTUCKY KY
## 371      MINNESOTA MN
## 372   NORTH DAKOTA ND
## 373      MINNESOTA MN
## 374        FLORIDA FL
## 375      MINNESOTA MN
## 376       MICHIGAN MI
## 377          TEXAS TX
## 378        FLORIDA FL
## 379 NORTH CAROLINA NC
## 380          TEXAS TX
## 381   NORTH DAKOTA ND
## 382 NORTH CAROLINA NC
## 383      MINNESOTA MN
## 384           OHIO OH
## 385   SOUTH DAKOTA SD
## 386       VIRGINIA VA
## 387   NORTH DAKOTA ND
## 388          TEXAS TX
## 389 NORTH CAROLINA NC
## 390  NEW HAMPSHIRE NH
## 391      WISCONSIN WI
## 392           OHIO OH
## 393       VIRGINIA VA
## 394          TEXAS TX
## 395          TEXAS TX
## 396          TEXAS TX
##                                                      School.Name  NCES.SchID
## 1                                             112 ALC Seat-Based 2.70819e+11
## 2                                                      25 E SW 4 1.20144e+11
## 3                                                       37 M W 4 1.20144e+11
## 4                                                       49-E-W-4 1.20144e+11
## 5                                                       72 E W 7 1.20144e+11
## 6                                     ACCELERATION ACADEMIES LLC 1.20039e+11
## 7                                               Acorn Montessori 2.70045e+11
## 8                                         Advantage Arts Academy 4.90020e+11
## 9                Alabama Virtual Academy at Eufaula City Schools 1.01410e+10
## 10                               Alaka'i O Kaua'i Charter School 1.50003e+11
## 11                         ALBUQUERQUE COLLEGIATE CHARTER SCHOOL 3.50018e+11
## 12                                         Aurelia Middle School 1.90348e+11
## 13                                     ALTURA PREPARATORY SCHOOL 3.50018e+11
## 14                                         Anson Charter Academy 3.70044e+11
## 15                       Ansonia Pre-School at Ansonia Methodist 3.90466e+11
## 16                                        Apex Friendship Middle 3.70472e+11
## 17                                    ASU Academy at Middle Fork 3.70043e+11
## 18                                           Apple Valley School 4.90063e+11
## 19                                   Apprentice Academy HS of NC 3.70044e+11
## 20                                                 APS Preschool 3.90435e+11
## 21                                 Arcanum Early Learning Center 3.90466e+11
## 22                           Art & Science Academy Middle School 2.70040e+11
## 23  ARTE I RPTCS (Regional Professional Technical Charter School 1.60219e+11
## 24                         Ascend Leadership Academy: Lee County 3.70044e+11
## 25                        Ascent Academies of Utah - West Valley 4.90017e+11
## 26                                Ashe County Early College High 3.70021e+11
## 27                               ATHENIAN ACADEMY CHARTER SCHOOL 1.20108e+11
## 28                                            Aurelia Elementary 1.90348e+11
## 29                       BARACK OBAMA EL MALE LEADERSHIP ACADEMY 4.81623e+11
## 30                                                    BDUSD4Kids 5.50096e+11
## 31                                               BEAR BRANCH INT 4.82874e+11
## 32                                   Beaver Lake Voluntary Pre-K 2.72385e+11
## 33                                    Belton Preparatory Academy 4.50391e+11
## 34                                            Aldrich Elementary 1.90651e+11
## 35                         Bettis Preparatory Leadership Academy 4.50390e+11
## 36                                       NORTHWEST MIDDLE SCHOOL 1.20051e+11
## 37                                          Bladen Early College 3.70039e+11
## 38                                     BLC School Readiness Plus 2.70609e+11
## 39                                          Blue Sky Colony - 04 4.60000e+11
## 40                                    Bluffdale Middle School #1 4.90042e+11
## 41                                           Bluffdale School #2 4.90042e+11
## 42                                       BOB AND BETTY NELSON EL 4.80809e+11
## 43                                                        NEW EL 4.84389e+11
## 44                                     Bowen's Corner Elementary 4.50117e+11
## 45                                    BRIDGEPREP ACADEMY COLLIER 1.20033e+11
## 46                        BRIDGEPREP ACADEMY OF ADVANCED STUDIES 1.20039e+11
## 47                             BRIDGEPREP ACADEMY OSCEOLA COUNTY 1.20147e+11
## 48                                 BRIDGEWAY PREPARATORY ACADEMY 4.80146e+11
## 49                              BROOKE INTERMEDIATE SCHOOL NORTH 5.40015e+11
## 50                              BROOKE INTERMEDIATE SCHOOL SOUTH 5.40015e+11
## 51                                          BROOKE MIDDLE SCHOOL 5.40015e+11
## 52                                   BROOKE PRIMARY SCHOOL NORTH 5.40015e+11
## 53                                   BROOKE PRIMARY SCHOOL SOUTH 5.40015e+11
## 54                                 Brooklyn Center Middle School 2.70624e+11
## 55                                          Brookview Elementary 2.73819e+11
## 56                                         Bryan Road Elementary 3.70472e+11
## 57                                     Buckhorn Creek Elementary 3.70472e+11
## 58                                                    NEW EL #41 4.82517e+11
## 59                        Capital City Public Charter School (E) 3.30331e+11
## 60                        Capital City Public Charter School (H) 3.30331e+11
## 61                                                  Capital High 5.50852e+11
## 62                                    Capstone Classical Academy 4.90020e+11
## 63                          Cardinal Charter Academy West Campus 3.70044e+11
## 64   Carmen Middle School of Science and Technology South Campus 5.50960e+11
## 65                                 Carolina Charter Academy: CFA 3.70042e+11
## 66                             Carrollton Early Childhood Center 3.90453e+11
## 67                                                 CAST STEM H S 4.84095e+11
## 68                                              CATAPULT ACADEMY 1.20039e+11
## 69                                             Cedar Valley High 4.90003e+11
## 70                                          Central Oaks Academy 5.51707e+11
## 71                                      Chain Exploration Center 5.51584e+11
## 72                                  Albemarle Road Relief School 3.70297e+11
## 73                           Chisago County Schools' Life Work C 2.70002e+11
## 74                                              CITI High School 3.70327e+11
## 75                                   Clear Fork Valley Preschool 3.90494e+11
## 76                                   CNE Early Childhood Academy 3.90463e+11
## 77                             Colonel Fred Cherry Middle School 5.10371e+11
## 78                                                        NEW EL 4.84092e+11
## 79                               Columbia Academy Anchor Program 2.70951e+11
## 80                           Columbia Heights Transition Program 2.70951e+11
## 81                             Community of Peace Academy Middle 2.70012e+11
## 82               CREATIVE INSPIRATION JOURNEY SCHOOL OF ST CLOUD 1.20147e+11
## 83                                     CREEKSIDE CHARTER ACADEMY 1.20087e+11
## 84                                       Creekside Middle School 4.90042e+11
## 85                                              CROSSROADS SOUTH 2.73354e+11
## 86                                    CUMBERLAND TRANS ED CENTER 3.40009e+11
## 87                           Customized Alternative Solutions fo 2.70003e+11
## 88                                D.C. Virgo Preparatory Academy 3.70043e+11
## 89                                         Danville Intermediate 3.90478e+11
## 90                                 Davidson Charter Academy: CFA 3.70042e+11
## 91                                     Dawson Colony School - 20 4.60740e+11
## 92                                    Deer River High School ALP 2.71014e+11
## 93                                             Discovery Charter 3.70042e+11
## 94                                           ELEMENTARY SCHOOL Y 1.20030e+11
## 95                  DIXIE VIRTUAL INSTRUCTION (COURSE OFFERINGS) 1.20045e+11
## 96                                                 DON CARTER EL 4.82658e+11
## 97                           DOWNTOWN DORAL CHARTER UPPER SCHOOL 1.20039e+11
## 98                                PATEL INSTITUTE FOR INNOVATION 1.20087e+11
## 99                                         DR RONALD E MCNAIR JH 4.80809e+11
## 100                DR SARAH JANDRUCKO ACADEMY FOR EARLY LEARNERS 4.82892e+11
## 101                         Eagles' Wings Virtual Charter School 5.51398e+11
## 102                                       Early Childhood Center 5.10012e+11
## 103                  Early Childhood Education and Family Center 3.90438e+11
## 104                                Early Childhood Family Center 2.73333e+11
## 105                                            Early Ed Highland 2.73384e+11
## 106                                        East Elementary Annex 3.90488e+11
## 107                                           East Light Academy 4.50390e+11
## 108                                            East Link Academy 4.50390e+11
## 109                                         East Voyager Academy 3.70042e+11
## 110                                                       EL #31 4.82391e+11
## 111                                           Eleva-Strum Middle 5.50420e+11
## 112                                         ELIAS HERRERA MIDDLE 4.84365e+11
## 113                                  Elk River Middle School ALC 2.71137e+11
## 114                                          Elliott Street Bldg 2.68090e+11
## 115                                                       ENCORE 1.20087e+11
## 116                                                 Enrich Alden 2.70033e+11
## 117                                             Enrich Kingsland 2.70033e+11
## 118                                           ESCONDIDO NORTH EL 4.82499e+11
## 119                          Essie Mae Kiser Foxx Charter School 3.70043e+11
## 120                                ETOILE ACADEMY CHARTER SCHOOL 4.80146e+11
## 121                                      EUGENE 'GENE' KRANZ J H 4.81707e+11
## 122                                   EVIT - East Valley Academy 4.09731e+10
## 123                               Fairview School Readiness Plus 2.73243e+11
## 124                                                       NEW EL 4.82382e+11
## 125                                        FAR NORTH DALLAS AREA 4.81623e+11
## 126                                              Farmington High 4.90021e+11
## 127                                                    FEC Pre K 2.71176e+11
## 128                                  Ferdinand T. Day Elementary 5.10012e+11
## 129                                             First Step Adams 2.70033e+11
## 130                                             First Step Alden 2.70033e+11
## 131                                      FIT Academy High School 2.70043e+11
## 132                                  FLORIDA CONNECTIONS ACADEMY 1.20087e+11
## 133                                Francis Street Primary School 2.60111e+11
## 134                                                K-8 SCHOOL LL 1.20174e+11
## 135                                       Friess Lake Elementary 5.50008e+11
## 136                                         FUTURE PUBLIC SCHOOL 1.60018e+11
## 137                                                     GATE 4/5 2.73819e+11
## 138                          Gateway STEM Academy Charter School 2.70045e+11
## 139                                      Gateway to College - IS 2.70003e+11
## 140                                           GEM PREP: MERIDIAN 1.60018e+11
## 141                                Gene Dillon Elementary School 2.70444e+11
## 142                                    Gladstone Voluntary Pre-K 2.72385e+11
## 143                                      Global Achievers School 3.70044e+11
## 144                                       Goshen Post Elementary 5.10225e+11
## 145                          Granada Huntley East Chain Middle S 2.71304e+11
## 146                                            Granville Academy 3.70180e+11
## 147              GULFSTREAM EARLY CHILDHOOD CENTER OF EXCELLENCE 1.20018e+11
## 148                                     Hamilton Local Preschool 3.90470e+11
## 149                    HARMONY SCHOOL OF EXCELLENCE - SUGAR LAND 4.80141e+11
## 150                                   Harold Lewis Center School 3.90455e+11
## 151                                     Hawthorne Readiness Plus 2.73180e+11
## 152                                 HAYDEN CANYON CHARTER SCHOOL 1.60018e+11
## 153                                           Headstart Eastland 3.90445e+11
## 154                                           Herriman School #6 4.90042e+11
## 155                             Hiawatha College Prep - Northrop 2.70029e+11
## 156                                              HIGH SCHOOL TTT 1.20087e+11
## 157                                Hmong College Prep Academy ES 2.70034e+11
## 158                                                   HOFIUS INT 4.82574e+11
## 159                                       Horace Mann Elementary 1.80471e+11
## 160                          Horizon Science Academy Twin Cities 2.70045e+11
## 161                                                HOZHO ACADEMY 3.50018e+11
## 162                                         ICAN CHARTER ACADEMY 1.20087e+11
## 163                              Ignite Entrepreneurship Academy 4.90019e+11
## 164                             ILTEXAS - FORT WORTH/SAGINAW H S 4.80144e+11
## 165                                    ILTEXAS - HOUSTON OREM EL 4.80144e+11
## 166                                ILTEXAS - HOUSTON OREM MIDDLE 4.80144e+11
## 167                                Innovation Early College High 3.70001e+11
## 168                            Isthmus Montessori Academy Public 5.50008e+11
## 169                                           James Blair Middle 5.10402e+11
## 170                                              JIM SPRADLEY EL 4.83600e+11
## 171                                      JOHN V EVANS ELEMENTARY 1.60066e+11
## 172                                     Johnston Charter Academy 3.70043e+11
## 173                  KATHERINE JOHNSON TECHNOLOGY MAGNET ACADEMY 4.81686e+11
## 174                          Kenyon-Wanamingo High School Credit 2.79144e+11
## 175                                 NORTHWEST ELEMENTARY  SCHOOL 1.20051e+11
## 176                                         KIPP SUNRISE ACADEMY 1.20039e+11
## 177                                     Koshkonong Trails School 5.50210e+11
## 178                     Kreiva Academy Public Charter School (H) 3.30331e+11
## 179                     Kreiva Academy Public Charter School (M) 3.30331e+11
## 180                                     Lakeland STAR Acad (LSA) 5.50963e+11
## 181 Lakeland STAR School--Strong Talented Adventurous Remarkable 5.50969e+11
## 182                             Lakes and Bridges Charter School 4.50390e+11
## 183                                        Lakes Country Academy 2.70008e+11
## 184                                 Lakes Country Academy - ALEX 2.70008e+11
## 185                                  Lakes Country Academy - MHD 2.70008e+11
## 186                                    Lakeview Academy Campus 2 4.90004e+11
## 187                                         LANNY FRASIER MIDDLE 4.83039e+11
## 188                        LARKIN SCHOOL FOR THE HEALTH SCIENCES 1.20039e+11
## 189                                       Laurel New School Hold 1.00081e+11
## 190                                                LAWLER MIDDLE 4.82001e+11
## 191                                                 LEAP Academy 4.90020e+11
## 192                              LEGACY SCHOOL OF SPORT SCIENCES 4.80146e+11
## 193                        Legacy Traditional School - East Mesa 4.00962e+10
## 194                  LEVY VIRTUAL INSTRUCTION (COURSE OFFERINGS) 1.20114e+11
## 195                               Lewis Cass Polytechnic Academy 1.81068e+11
## 196                                     Liberty Community Center 3.90439e+11
## 197                                            LIFEBRIDGE CENTER 1.20177e+11
## 198                                          Lima HS - Preschool 3.90442e+11
## 199                                           Lincoln Elementary 1.80102e+11
## 200                                     LINCOLN MEMORIAL ACADEMY 1.20123e+11
## 201                                Lionsgate Academy - Shoreview 2.70032e+11
## 202                                             Lirio Montessori 2.70045e+11
## 203                                                   LISCANO EL 4.82001e+11
## 204                                             LIZZIE CURTIS EL 4.83318e+11
## 205                                       LUBBOCK-COOPER EAST EL 4.81518e+11
## 206                                                 MAGNOLIA INT 4.82874e+11
## 207                                                       NEW EL 4.81965e+11
## 208                               MAPLE VALLEY ELEMENTARY SCHOOL 3.81202e+11
## 209                         Marine Sci. & Tech. Early College HS 3.70063e+11
## 210                                   Marshall EC Voluntary PreK 2.71894e+11
## 211                                                Mason Central 3.90505e+11
## 212                                          Massillon Preschool 3.90444e+11
## 213                                    MATER ACADEMY AT ST CLOUD 1.20147e+11
## 214                                                        ES141 4.82566e+11
## 215                                                      Mayfair 3.90449e+11
## 216                                             Maysville O TAGS 3.90489e+11
## 217                             McCutchanville Elementary School 1.80345e+11
## 218                              McDowell Academy for Innovation 3.70294e+11
## 219                                       Meadow View Elementary 5.51464e+11
## 220                                     Mercer County Head Start 3.91003e+11
## 221                                             MIDDLE SCHOOL AA 1.20147e+11
## 222                                Mississinawa Valley Preschool 3.90467e+11
## 223                             MISSOURI RIDGE ELEMENTARY SCHOOL 3.81376e+11
## 224                                 MISSOURI RIDGE MIDDLE SCHOOL 3.81376e+11
## 225                                     MOE AND GENE JOHNSON H S 4.80001e+11
## 226                                       Monroe Charter Academy 3.70043e+11
## 227                                    Montcross Charter Academy 3.70041e+11
## 228                            Moore Montessori Community School 3.70043e+11
## 229                               Moss Street Partnership School 3.70043e+11
## 230                                   Mountain Island Day School 3.70044e+11
## 231                                     Mountain View Elementary 3.70048e+11
## 232                                                        MS055 4.82566e+11
## 233                                              MSED Birth to 3 2.70007e+11
## 234                 NAVIGATOR ACADEMY OF LEADERSHIP HILLSBOROUGH 1.20087e+11
## 235                                              NEOCITY ACADEMY 1.20147e+11
## 236                                 New America School - Phoenix 4.00935e+10
## 237                                   NEW EARLY CHILDHOOD CENTER 4.80945e+11
## 238                                                       NEW EL 4.81551e+11
## 239                                                       NEW EL 4.81521e+11
## 240                                                   NEW EL 166 4.83510e+11
## 241                                                       NEW EL 4.81437e+11
## 242                                                       NEW EL 4.83702e+11
## 243                                                       NEW EL 4.84590e+11
## 244                                                       NEW EL 4.83927e+11
## 245                                                      NEW H S 4.81119e+11
## 246                                                  NEW H S #14 4.82517e+11
## 247                                   New High School - Herriman 4.90042e+11
## 248                                                       NEW IS 4.83432e+11
## 249                                                   NEW JR #16 4.82517e+11
## 250                             New School for Youth Empowerment 5.50960e+11
## 251                                           NEW VOCATIONAL H S 4.84044e+11
## 252                                            NEWTON COLLINS EL 4.81662e+11
## 253                                      Next Generation Academy 3.70044e+11
## 254                          Nicollet Early Childhood Special Ed 2.72358e+11
## 255                                            NIXON-SMILEY DAEP 4.83555e+11
## 256            No. UT. Acad. of Math Engineering & Science Ogden 4.90006e+11
## 257                                              Nompeng Academy 2.70030e+11
## 258                           North Fayette Valley Middle School 1.90001e+11
## 259                                     North Liberty Elementary 1.91470e+11
## 260                                            Elementary #9 TBD 2.74216e+11
## 261                          Northern Lights Academy Cooperative 2.70044e+11
## 262                                      Northrop Readiness Plus 2.73180e+11
## 263                                     NORTHWEST CHILDRENS HOME 1.60186e+11
## 264                          Northwestern Cyber High School - 92 4.65175e+11
## 265                                        Ocean Trans Ed Center 3.40009e+11
## 266                                  OABCIG Elementary-Ida Grove 1.92160e+11
## 267                                        OABCIG Sr High School 1.92160e+11
## 268                                   Onamia Intermediate School 2.72505e+11
## 269                                    One City Senior Preschool 5.50008e+11
## 270                                       ORLANDO GIFTED ACADEMY 1.20144e+11
## 271                                   P S BERG ELEMENTARY SCHOOL 3.80004e+11
## 272                                                K-8 SCHOOL KK 1.20174e+11
## 273                            Parkston Virtual High School - 92 4.65430e+11
## 274                                            Pathway to Change 2.70002e+11
## 275                                  PEACE VALLEY CHARTER SCHOOL 1.60018e+11
## 276                                        Pike Road High School 1.00195e+10
## 277                               Pine County Transition Program 2.70002e+11
## 278              PINEAPPLE COVE CLASSICAL ACADEMY WEST MELBOURNE 1.20015e+11
## 279                         PINECREST COLLEGIATE ACADEMY CHARTER 1.20144e+11
## 280                                                 PINNACLE INT 4.81281e+11
## 281                           PLATO ACADEMY CHARTER SCHOOL (K-8) 1.20153e+11
## 282                                       Poland North Preschool 3.90483e+11
## 283                                                 Polaris Tech 4.50390e+11
## 284                                         Prairie Care Mankato 2.71878e+11
## 285                                      Prodeo Academy St. Paul 2.70038e+11
## 286                               Progeny Academy Charter School 2.70044e+11
## 287                                  PROJECT IMPACT STEM ACADEMY 1.60018e+11
## 288                   BRONX SCHOOL FOR CONTINUOUS LEARNING (THE) 3.60014e+11
## 289                                           Radiant Elementary 1.93051e+11
## 290                                          Raleigh Oak Charter 3.70043e+11
## 291                                 RALPH AND MARY LYNN BOYER EL 4.83600e+11
## 292                                               Raptor Program 2.79135e+11
## 293                                          RAUL PERALES MIDDLE 4.84365e+11
## 294                                              RECOVERY CAMPUS 4.84068e+11
## 295                RENAISSANCE CHARTER SCHOOL AT CENTRAL FLORIDA 1.20144e+11
## 296                       RENAISSANCE CHARTER SCHOOL AT SEMINOLE 1.20171e+11
## 297                          RICHARDTON-TAYLOR ELEMENTARY SCHOOL 3.80005e+11
## 298                                             Richfield Middle 5.50008e+11
## 299                             Rising Stars Academy on Glenmore 3.90438e+11
## 300                             Rising Stars Academy on Harrison 3.90438e+11
## 301                                            Riverdale Academy 5.51014e+11
## 302                            Roanoke Rapids Early College High 3.70390e+11
## 303                                         Rocketship Northside 5.50008e+11
## 304                                RoerinkKnoll Education Center 2.68090e+11
## 305                                   Rolesville Charter Academy 3.70043e+11
## 306                                           Rondo Center Pre-K 2.73384e+11
## 307                          Royalton Public Schools Early Child 2.73252e+11
## 308                                     Saginaw Covenant Academy 2.60111e+11
## 309                                                SAN ISIDRO EL 4.84365e+11
## 310                                       Sandburg Middle School 2.73178e+11
## 311                                                      SASD 4K 5.51455e+11
## 312                                     School Readiness Program 2.72295e+11
## 313                          Skillbuilding Opportunities for Aca 2.70002e+11
## 314                      SLAM ACADEMY OF SOUTH TAMPA MIDDLE/HIGH 1.20087e+11
## 315                       SLAM ACADEMY OF SOUTH TAMPA ELEMENTARY 1.20087e+11
## 316                                                    SLAM BOCA 1.20150e+11
## 317                                           Solon Intermediate 1.92658e+11
## 318                   SOUTH FLORIDA INTERNATIONAL CHARTER SCHOOL 1.20033e+11
## 319                                            South Garner High 3.70472e+11
## 320                                        SOUTH LAKE ELEMENTARY 1.20015e+11
## 321           South Preschool Center located at Starlight School 3.90445e+11
## 322                                 Southside Ashpole Elementary 3.70044e+11
## 323                      Southwestern Wisconsin Community Middle 5.50630e+11
## 324                          Spectrum Middle School - Grades 7-8 2.70028e+11
## 325              SPORTS LEADERSHIP AND MANAGEMENT ACADEMY  (SLAM 1.20147e+11
## 326                                 Stagebarn Middle School - 10 4.66993e+11
## 327                              Stanly County Virtual Education 3.70432e+11
## 328                                           STAR MIDDLE SCHOOL 1.60210e+11
## 329                                                 Star Program 2.79146e+11
## 330                                      STEP Academy Elementary 2.70037e+11
## 331                                         Stiles Family Center 3.90448e+11
## 332                                         STONE HOTCHKISS AREA 4.81623e+11
## 333                                   STRICKER ELEMENTARY SCHOOL 1.60171e+11
## 334                                                       Summit 3.90449e+11
## 335                        SUNCOAST TECHNICAL COLLEGE NORTH PORT 1.20168e+11
## 336                                   SUNDALE COLONY HIGH SCHOOL 3.81293e+11
## 337                                         Surf City Elementary 3.70357e+11
## 338                                             Surf City Middle 3.70357e+11
## 339                                                    TALLEY EL 4.82001e+11
## 340                                              TAPP CHILD CARE 1.20165e+11
## 341                                   TBD EARLY CHILDHOOD CENTER 4.81623e+11
## 342                        The Experiential School of Greensboro 3.70043e+11
## 343                              The Montessori School of Camden 4.50391e+11
## 344                                            The Studio School 2.70044e+11
## 345                                          THOMPSON MONTESSORI 4.81623e+11
## 346                               Three Rivers Montessori School 2.70045e+11
## 347                                    THUNDER RIDGE HIGH SCHOOL 1.60093e+11
## 348                                          TITCHE BLANTON AREA 4.81623e+11
## 349                                              HIGH SCHOOL FFF 1.20147e+11
## 350                                     Token Springs Elementary 5.51464e+11
## 351                             TRADE LOGISTICS AVIATION ACADEMY 1.20147e+11
## 352                                                 TRADITION EL 4.81785e+11
## 353                                              Transition Plus 2.72292e+11
## 354                     TRUE NORTH CLASSICAL ACADEMY HIGH SCHOOL 1.20039e+11
## 355                           TRUE NORTH CLASSICAL ACADEMY SOUTH 1.20039e+11
## 356                            Twin Cities International Schools 2.70019e+11
## 357                                                    UHLAND EL 4.80001e+11
## 358                                        PASCO CHARTER ACADEMY 1.20153e+11
## 359                 UNION VIRTUAL INSTRUCTION (COURSE OFFERINGS) 1.20189e+11
## 360                                    University Charter School 1.00199e+10
## 361                                     Valley Elementary School 1.90001e+11
## 362                                         VALOR PUBLIC SCHOOLS 4.80146e+11
## 363                            Victory Academy/Ready for Success 5.10294e+11
## 364                                     Villa Heights Elementary 3.70297e+11
## 365                             Virtus Academy of South Carolina 4.50391e+11
## 366                                                       Vision 2.70002e+11
## 367            Virginia School for the Deaf and Blind Elementary 5.10006e+11
## 368                  Virginia School for the Deaf and Blind High 5.10006e+11
## 369                Virginia School for the Deaf and Blind Middle 5.10006e+11
## 370                                        W.E.B. DuBois Academy 2.10299e+11
## 371                          Warroad Alternative Learning Progra 2.74185e+11
## 372                                        WARWICK MIDDLE SCHOOL 3.81926e+11
## 373                                       Waseca Early Childhood 2.74188e+11
## 374        WASHINGTON ACADEMY OF VARYING EXCEPTIONALITIES (WAVE) 1.20201e+11
## 375                             Washington School Readiness Plus 2.70609e+11
## 376                                  WAY Academy  Roseville Site 2.60102e+11
## 377                                              WELLBORN MIDDLE 4.80735e+11
## 378                          WENDELL KRINN TECHNICAL HIGH SCHOOL 1.20153e+11
## 379                                           West Cabarrus High 3.70053e+11
## 380                                             WEST DALLAS AREA 4.81623e+11
## 381                            WEST FARGO SHEYENNE MIDDLE SCHOOL 3.81941e+11
## 382                                        West Rowan Elementary 3.70405e+11
## 383                                              West Transition 2.70003e+11
## 384                                    Western Reserve Preschool 3.90477e+11
## 385                          Whole Grade Sharing with Burke - 04 4.60767e+11
## 386                                  Willard Intermediate School 5.10225e+11
## 387                                WILLOW PARK ELEMENTARY SCHOOL 3.81941e+11
## 388                                                   WILMER TBD 4.81623e+11
## 389                                         Wilson Middle School 3.70297e+11
## 390                        Windham Academy Public Charter School 3.30331e+11
## 391                                                 WISE Academy 5.51038e+11
## 392                                        Wood County Preschool 3.90436e+11
## 393                                  Woodrow Wilson Intermediate 5.10111e+11
## 394                                              WORTHAM OAKS EL 4.82499e+11
## 395                                                WYLIE EAST EL 4.84650e+11
## 396                              YELLOWSTONE COLLEGE PREPARATORY 4.80146e+11
##                                                 Agency_Name         County_Name
## 1                       EASTERN CARVER COUNTY PUBLIC SCHOOL       Carver County
## 2                                                    ORANGE       Orange County
## 3                                                    ORANGE       Orange County
## 4                                                    ORANGE       Orange County
## 5                                                    ORANGE       Orange County
## 6                                                      DADE   Miami-Dade County
## 7                       Minnesota Wildflower Montessori Sch     Hennepin County
## 8                                    Advantage Arts Academy        Davis County
## 9                                              Eufaula City      Barbour County
## 10                           Hawaii Department of Education        Kauai County
## 11                    ALBUQUERQUE COLLEGIATE CHARTER SCHOOL   Bernalillo County
## 12                                Alta Comm School District     Cherokee County
## 13                                ALTURA PREPARATORY SCHOOL   Bernalillo County
## 14                                    Anson Charter Academy        Union County
## 15                                            Ansonia Local        Darke County
## 16                                      Wake County Schools         Wake County
## 17                  Appalachian State U Academy Middle Fork      Forsyth County
## 18                                            Nebo District         Utah County
## 19                              Apprentice Academy HS of NC        Union County
## 20                                               Akron City       Summit County
## 21                                     Arcanum-Butler Local        Darke County
## 22                                  ART AND SCIENCE ACADEMY       Isanti County
## 23                           MINIDOKA COUNTY JOINT DISTRICT   Twin Falls County
## 24                    Ascend Leadership Academy: Lee County       Durham County
## 25                                 Ascent Academies of Utah    Salt Lake County
## 26                                      Ashe County Schools         Ashe County
## 27                                                      LEE     Pinellas County
## 28                                Alta Comm School District     Cherokee County
## 29                                               DALLAS ISD       Dallas County
## 30                       Beaver Dam Unified School District        Dodge County
## 31                                             MAGNOLIA ISD   Montgomery County
## 32                      NORTH ST PAUL-MAPLEWOOD OAKDALE DIS       Ramsey County
## 33                             Charter Institute at Erskine     Anderson County
## 34                         Cedar Falls Comm School District   Black Hawk County
## 35                        SC Public Charter School District    Edgefield County
## 36                                                 ESCAMBIA     Escambia County
## 37                                    Bladen County Schools       Bladen County
## 38                          BRAINERD PUBLIC SCHOOL DISTRICT    Crow Wing County
## 39                             Milbank School District 25-4        Grant County
## 40                                          Jordan District    Salt Lake County
## 41                                          Jordan District    Salt Lake County
## 42                                                ALVIN ISD     Brazoria County
## 43                                          VAN ALSTYNE ISD      Grayson County
## 44                                              Berkeley 01     Berkeley County
## 45                                                  COLLIER   Miami-Dade County
## 46                                                     DADE   Miami-Dade County
## 47                                                  OSCEOLA      Osceola County
## 48                            BRIDGEWAY PREPARATORY ACADEMY       Dallas County
## 49                                    BROOKE COUNTY SCHOOLS       Brooke County
## 50                                    BROOKE COUNTY SCHOOLS       Brooke County
## 51                                    BROOKE COUNTY SCHOOLS       Brooke County
## 52                                    BROOKE COUNTY SCHOOLS       Brooke County
## 53                                    BROOKE COUNTY SCHOOLS       Brooke County
## 54                          BROOKLYN CENTER SCHOOL DISTRICT     Hennepin County
## 55                      STILLWATER AREA PUBLIC SCHOOL DIST.   Washington County
## 56                                      Wake County Schools         Wake County
## 57                                      Wake County Schools         Wake County
## 58                                                 KATY ISD    Fort Bend County
## 59                       Capital City Public Charter School    Merrimack County
## 60                       Capital City Public Charter School    Merrimack County
## 61                     Madison Metropolitan School District         Dane County
## 62                               Capstone Classical Academy        Weber County
## 63                     Cardinal Charter Academy West Campus         Wake County
## 64                                Milwaukee School District    Milwaukee County
## 65                            Carolina Charter Academy: CFA         Wake County
## 66                              Carrollton Exempted Village      Carroll County
## 67                                            SOUTHWEST ISD        Bexar County
## 68                                                     DADE   Miami-Dade County
## 69                                          Alpine District         Utah County
## 70                         Wisconsin Rapids School District      Portage County
## 71                                  Waupaca School District      Waupaca County
## 72                            Charlotte-Mecklenburg Schools  Mecklenburg County
## 73                       ST. CROIX RIVER EDUCATION DISTRICT      Chisago County
## 74                                 Nash-Rocky Mount Schools         Nash County
## 75                                  Clear Fork Valley Local     Richland County
## 76                              Clermont Northeastern Local     Clermont County
## 77                                   SUFFOLK CITY PBLC SCHS        Suffolk city
## 78                                            SOUTHSIDE ISD        Bexar County
## 79                      COLUMBIA HEIGHTS PUBLIC SCHOOL DIST        Anoka County
## 80                      COLUMBIA HEIGHTS PUBLIC SCHOOL DIST        Anoka County
## 81                               COMMUNITY OF PEACE ACADEMY       Ramsey County
## 82                                                  OSCEOLA      Osceola County
## 83                                             HILLSBOROUGH      Broward County
## 84                                          Jordan District    Salt Lake County
## 85                       ST. FRANCIS PUBLIC SCHOOL DISTRICT        Anoka County
## 86  OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES   Cumberland County
## 87                         INTERMEDIATE SCHOOL DISTRICT 917       Dakota County
## 88                           D.C. Virgo Preparatory Academy  New Hanover County
## 89                                           Danville Local         Knox County
## 90                            Davidson Charter Academy: CFA     Davidson County
## 91                           Bon Homme School District 04-2    Bon Homme County
## 92                        DEER RIVER PUBLIC SCHOOL DISTRICT       Itasca County
## 93                                 Discovery Charter School       Durham County
## 94                                                     CLAY         Clay County
## 95                                                    DIXIE        Dixie County
## 96                                               LAMAR CISD    Fort Bend County
## 97                                                     DADE   Miami-Dade County
## 98                                             HILLSBOROUGH Hillsborough County
## 99                                                ALVIN ISD     Brazoria County
## 100                                           MANSFIELD ISD      Tarrant County
## 101                           Solon Springs School District      Douglas County
## 102                               ALEXANDRIA CITY PBLC SCHS     Alexandria city
## 103                           Columbus City School District     Franklin County
## 104                         SPRING LAKE PARK PUBLIC SCHOOLS        Anoka County
## 105                         ST. PAUL PUBLIC SCHOOL DISTRICT       Ramsey County
## 106                                            Morgan Local       Morgan County
## 107                       SC Public Charter School District     Berkeley County
## 108                       SC Public Charter School District   Greenville County
## 109                                    East Voyager Academy  Mecklenburg County
## 110                                              HUMBLE ISD       Harris County
## 111                             Eleva-Strum School District  Trempealeau County
## 112                                              UNITED ISD         Webb County
## 113                        ELK RIVER PUBLIC SCHOOL DISTRICT    Sherburne County
## 114                                         Ottawa Area ISD       Ottawa County
## 115                                            HILLSBOROUGH Hillsborough County
## 116                        SOUTHERN MN EDUCATION CONSORTIUM     Freeborn County
## 117                        SOUTHERN MN EDUCATION CONSORTIUM     Fillmore County
## 118                                              JUDSON ISD        Bexar County
## 119                     Essie Mae Kiser Foxx Charter School        Rowan County
## 120                           ETOILE ACADEMY CHARTER SCHOOL       Harris County
## 121                                           DICKINSON ISD    Galveston County
## 122                     East Valley Institute of Technology     Maricopa County
## 123                        ROSEVILLE PUBLIC SCHOOL DISTRICT       Ramsey County
## 124                                             HUFFMAN ISD       Harris County
## 125                                              DALLAS ISD       Dallas County
## 126                                          Davis District        Davis County
## 127                        FARIBAULT PUBLIC SCHOOL DISTRICT         Rice County
## 128                               ALEXANDRIA CITY PBLC SCHS     Alexandria city
## 129                        SOUTHERN MN EDUCATION CONSORTIUM        Mower County
## 130                        SOUTHERN MN EDUCATION CONSORTIUM     Freeborn County
## 131                                             FIT Academy       Dakota County
## 132                                            HILLSBOROUGH Hillsborough County
## 133                           Francis Street Primary School      Jackson County
## 134                                               ST. JOHNS    St. Johns County
## 135                          Holy Hill Area School District   Washington County
## 136                               FUTURE PUBLIC SCHOOL INC.          Ada County
## 137                     STILLWATER AREA PUBLIC SCHOOL DIST.   Washington County
## 138                                    Gateway STEM Academy     Hennepin County
## 139                        INTERMEDIATE SCHOOL DISTRICT 287     Hennepin County
## 140                                 GEM PREP: MERIDIAN INC.          Ada County
## 141                          BEMIDJI PUBLIC SCHOOL DISTRICT     Beltrami County
## 142                     NORTH ST PAUL-MAPLEWOOD OAKDALE DIS       Ramsey County
## 143                                 Global Achievers School         Wake County
## 144                                    LOUDOUN CO PBLC SCHS      Loudoun County
## 145                     Granada Huntley East Chain Elementa       Martin County
## 146                                Granville County Schools    Granville County
## 147                                                 BROWARD      Broward County
## 148                                          Hamilton Local     Franklin County
## 149                     HARMONY SCHOOL OF SCIENCE - HOUSTON    Fort Bend County
## 150                             Marysville Exempted Village        Union County
## 151                        ROCHESTER PUBLIC SCHOOL DISTRICT      Olmsted County
## 152                       HAYDEN CANYON CHARTER SCHOOL INC.     Kootenai County
## 153                                             Newark City      Licking County
## 154                                         Jordan District    Salt Lake County
## 155                                      HIAWATHA ACADEMIES     Hennepin County
## 156                                            HILLSBOROUGH Hillsborough County
## 157                              HMONG COLLEGE PREP ACADEMY       Ramsey County
## 158                                               KLEIN ISD       Harris County
## 159                              Huntington Co Com Sch Corp   Huntington County
## 160                     Horizon Science Academy Twin Cities       Ramsey County
## 161                                           HOZHO ACADEMY     McKinley County
## 162                                            HILLSBOROUGH Hillsborough County
## 163                         Ignite Entrepreneurship Academy         Utah County
## 164                 INTERNATIONAL LEADERSHIP OF TEXAS (ILT)      Tarrant County
## 165                 INTERNATIONAL LEADERSHIP OF TEXAS (ILT)       Harris County
## 166                 INTERNATIONAL LEADERSHIP OF TEXAS (ILT)       Harris County
## 167                                     Pitt County Schools         Pitt County
## 168                Isthmus Montessori Academy Public Agency         Dane County
## 169                       WILLIAMSBURG-JAMES CITY PBLC SCHS   Williamsburg city
## 170                                             PROSPER ISD       Collin County
## 171                            CASSIA COUNTY JOINT DISTRICT       Cassia County
## 172                                Johnston Charter Academy     Johnston County
## 173                                              DESOTO ISD       Dallas County
## 174                       GOODHUE COUNTY EDUCATION DISTRICT      Goodhue County
## 175                                                ESCAMBIA     Escambia County
## 176                                                    DADE   Miami-Dade County
## 177                               Cambridge School District         Dane County
## 178           Kreiva Academy Public Charter School District Hillsborough County
## 179           Kreiva Academy Public Charter School District Hillsborough County
## 180                            Lakeland UHS School District       Oneida County
## 181                             Minocqua J1 School District       Oneida County
## 182                       SC Public Charter School District      Pickens County
## 183                     REGION 4-LAKES COUNTRY SERVICE COOP   Otter Tail County
## 184                     REGION 4-LAKES COUNTRY SERVICE COOP      Douglas County
## 185                     REGION 4-LAKES COUNTRY SERVICE COOP         Clay County
## 186                                        Lakeview Academy         Utah County
## 187                                            MESQUITE ISD       Dallas County
## 188                                                    DADE   Miami-Dade County
## 189                                  Laurel School District       Sussex County
## 190                                              FRISCO ISD       Collin County
## 191                                            LEAP Academy        Davis County
## 192                         LEGACY SCHOOL OF SPORT SCIENCES       Harris County
## 193                   Legacy Traditional School - East Mesa     Maricopa County
## 194                                                    LEVY         Levy County
## 195                                      Lewis Cass Schools         Cass County
## 196                                           Delaware City     Delaware County
## 197                                               ST. LUCIE    St. Lucie County
## 198                                               Lima City        Allen County
## 199                        Brownsburg Community School Corp    Hendricks County
## 200                                                 MANATEE      Manatee County
## 201                                       LIONSGATE ACADEMY       Ramsey County
## 202                     Minnesota Wildflower Montessori Sch     Hennepin County
## 203                                              FRISCO ISD       Collin County
## 204                                           NORTHWEST ISD      Tarrant County
## 205                                      LUBBOCK-COOPER ISD      Lubbock County
## 206                                            MAGNOLIA ISD   Montgomery County
## 207                                           FORT BEND ISD    Fort Bend County
## 208                                          MAPLE VALLEY 4         Cass County
## 209                          Carteret County Public Schools     Carteret County
## 210                         MARSHALL PUBLIC SCHOOL DISTRICT         Lyon County
## 211                                              Mason City       Warren County
## 212                                          Massillon City        Stark County
## 213                                                 OSCEOLA      Osceola County
## 214                                             KILLEEN ISD         Bell County
## 215                                             Toledo City        Lucas County
## 216                                         Maysville Local    Muskingum County
## 217                      Evansville Vanderburgh School Corp  Vanderburgh County
## 218                                 McDowell County Schools     McDowell County
## 219                        Sun Prairie Area School District         Dane County
## 220                                             Celina City       Mercer County
## 221                                                 OSCEOLA      Osceola County
## 222                               Mississinawa Valley Local        Darke County
## 223                                       WILLIAMS COUNTY 8     Williams County
## 224                                       WILLIAMS COUNTY 8     Williams County
## 225                                               HAYS CISD         Hays County
## 226                                  Monroe Charter Academy        Union County
## 227                               Montcross Charter Academy         Wake County
## 228                       Moore Montessori Community School        Moore County
## 229                          Moss Street Partnership School   Rockingham County
## 230                              Mountain Island Day School  Mecklenburg County
## 231                                    Burke County Schools        Burke County
## 232                                             KILLEEN ISD         Bell County
## 233                            MID STATE EDUCATION DISTRICT     Morrison County
## 234                                            HILLSBOROUGH Hillsborough County
## 235                                                 OSCEOLA      Osceola County
## 236                            New America School - Phoenix     Maricopa County
## 237                                        BARBERS HILL ISD     Chambers County
## 238                                            CRANDALL ISD      Kaufman County
## 239                                             COPPELL ISD       Dallas County
## 240                                               PLANO ISD       Collin County
## 241                                           CLEVELAND ISD      Liberty County
## 242                                          RICHARDSON ISD       Dallas County
## 243                                              WILLIS ISD   Montgomery County
## 244                                            SANTA FE ISD    Galveston County
## 245                                          BRAZOSPORT ISD     Brazoria County
## 246                                                KATY ISD    Fort Bend County
## 247                                         Jordan District    Salt Lake County
## 248                                            PASADENA ISD       Harris County
## 249                                                KATY ISD    Fort Bend County
## 250                               Milwaukee School District    Milwaukee County
## 251                                              SLATON ISD      Lubbock County
## 252                                           DEL VALLE ISD       Travis County
## 253                                 Next Generation Academy     Guilford County
## 254                         NICOLLET PUBLIC SCHOOL DISTRICT     Nicollet County
## 255                                                POTH ISD     Gonzales County
## 256            No. UT. Acad. for Math Engineering & Science        Weber County
## 257                                           NOBLE ACADEMY     Hennepin County
## 258                      North Fayette Comm School District      Fayette County
## 259                          Iowa City Comm School District      Johnson County
## 260                          WAYZATA PUBLIC SCHOOL DISTRICT     Hennepin County
## 261                     Northern Lights Academy Cooperative      Carlton County
## 262                        ROCHESTER PUBLIC SCHOOL DISTRICT      Olmsted County
## 263                           LEWISTON INDEPENDENT DISTRICT    Nez Perce County
## 264                  Northwestern Area School District 56-7        Spink County
## 265 OFFICE OF EDUCATION DEPARTMENT OF CHILDREN AND FAMILIES        Ocean County
## 266                     Odebolt-Arthur Comm School District          Ida County
## 267                     Odebolt-Arthur Comm School District          Ida County
## 268                           ONAMIA PUBLIC SCHOOL DISTRICT   Mille Lacs County
## 269                        One City Senior Preschool Agency         Dane County
## 270                                                  ORANGE       Orange County
## 271                                             DICKINSON 1        Stark County
## 272                                               ST. JOHNS    St. Johns County
## 273                           Parkston School District 33-3   Hutchinson County
## 274                      ST. CROIX RIVER EDUCATION DISTRICT      Chisago County
## 275                        PEACE VALLEY CHARTER SCHOOL INC.          Ada County
## 276                                          Pike Road City   Montgomery County
## 277                      ST. CROIX RIVER EDUCATION DISTRICT         Pine County
## 278                                                 BREVARD      Brevard County
## 279                                                  ORANGE       Orange County
## 280                                              CANYON ISD      Randall County
## 281                                                   PASCO        Pasco County
## 282                                            Poland Local     Mahoning County
## 283                       SC Public Charter School District       Jasper County
## 284                          MANKATO PUBLIC SCHOOL DISTRICT   Blue Earth County
## 285                                          PRODEO ACADEMY       Ramsey County
## 286                          Progeny Academy Charter School     Hennepin County
## 287                        PROJECT IMPACT STEM ACADEMY INC.          Ada County
## 288                       NYC SPECIAL SCHOOLS - DISTRICT 75        Bronx County
## 289                             Waukee Comm School District       Dallas County
## 290                              Raleigh Oak Charter School         Wake County
## 291                                             PROSPER ISD       Collin County
## 292                           RIVER BEND EDUCATION DISTRICT        Brown County
## 293                                              UNITED ISD         Webb County
## 294                                   SOUTH SAN ANTONIO ISD        Bexar County
## 295                                                  ORANGE       Orange County
## 296                                                SEMINOLE     Seminole County
## 297                                    RICHARDTON-TAYLOR 34        Stark County
## 298                          Holy Hill Area School District   Washington County
## 299                                         Cincinnati City     Hamilton County
## 300                                         Cincinnati City     Hamilton County
## 301                               Riverdale School District        Grant County
## 302                             Roanoke Rapids City Schools      Halifax County
## 303                      Rocketship Education Wisconsin Inc    Milwaukee County
## 304                                         Ottawa Area ISD       Ottawa County
## 305                              Rolesville Charter Academy         Wake County
## 306                         ST. PAUL PUBLIC SCHOOL DISTRICT       Ramsey County
## 307                         ROYALTON PUBLIC SCHOOL DISTRICT     Morrison County
## 308                                Saginaw Covenant Academy      Saginaw County
## 309                                              UNITED ISD         Webb County
## 310                      ROBBINSDALE PUBLIC SCHOOL DISTRICT     Hennepin County
## 311                          Stoughton Area School District         Dane County
## 312                      MOUNDS VIEW PUBLIC SCHOOL DISTRICT       Ramsey County
## 313                      ST. CROIX RIVER EDUCATION DISTRICT      Chisago County
## 314                                            HILLSBOROUGH Hillsborough County
## 315                                            HILLSBOROUGH Hillsborough County
## 316                                              PALM BEACH   Palm Beach County
## 317                              Solon Comm School District      Johnson County
## 318                                                 COLLIER      Broward County
## 319                                     Wake County Schools         Wake County
## 320                                                 BREVARD      Brevard County
## 321                                   New Philadelphia City   Tuscarawas County
## 322                              Innovative School District      Robeson County
## 323                  Southwestern Wisconsin School District        Grant County
## 324                                    SPECTRUM HIGH SCHOOL    Sherburne County
## 325                                                 OSCEOLA      Osceola County
## 326                              Meade School District 46-1        Meade County
## 327                                   Stanly County Schools       Stanly County
## 328                             JOINT SCHOOL DISTRICT NO. 2          Ada County
## 329                         WEST CENTRAL EDUCATION DISTRICT      Stearns County
## 330                             STEP ACADEMY CHARTER SCHOOL       Ramsey County
## 331                                      South-Western City     Franklin County
## 332                                              DALLAS ISD       Dallas County
## 333                                       KIMBERLY DISTRICT   Twin Falls County
## 334                                             Toledo City        Lucas County
## 335                                                SARASOTA     Sarasota County
## 336                                                MILNOR 2       Ransom County
## 337                                   Pender County Schools       Pender County
## 338                                   Pender County Schools       Pender County
## 339                                              FRISCO ISD       Collin County
## 340                                              SANTA ROSA   Santa Rosa County
## 341                                              DALLAS ISD       Dallas County
## 342                   The Experiential School of Greensboro     Guilford County
## 343                            Charter Institute at Erskine      Kershaw County
## 344                                       The Studio School     Hennepin County
## 345                                              DALLAS ISD       Dallas County
## 346                          Three Rivers Montessori School    Sherburne County
## 347                               BONNEVILLE JOINT DISTRICT   Bonneville County
## 348                                              DALLAS ISD       Dallas County
## 349                                                 OSCEOLA      Osceola County
## 350                        Sun Prairie Area School District         Dane County
## 351                                                 OSCEOLA      Osceola County
## 352                                        EAST CENTRAL ISD        Bexar County
## 353                         WESTONKA PUBLIC SCHOOL DISTRICT     Hennepin County
## 354                                                    DADE   Miami-Dade County
## 355                                                    DADE   Miami-Dade County
## 356                     MINNESOTA INTERNATIONAL MIDDLE CHTR     Hennepin County
## 357                                               HAYS CISD         Hays County
## 358                                                   PASCO      Broward County
## 359                                                   UNION        Union County
## 360                               University Charter School       Sumter County
## 361                      North Fayette Comm School District      Fayette County
## 362                                    VALOR PUBLIC SCHOOLS       Travis County
## 363                               PITTSYLVANIA CO PBLC SCHS Pittsylvania County
## 364                           Charlotte-Mecklenburg Schools  Mecklenburg County
## 365                            Charter Institute at Erskine     Florence County
## 366                      ST. CROIX RIVER EDUCATION DISTRICT         Pine County
## 367                                           VSDB-STAUNTON       Staunton city
## 368                                           VSDB-STAUNTON       Staunton city
## 369                                           VSDB-STAUNTON       Staunton city
## 370                                        Jefferson County    Jefferson County
## 371                          WARROAD PUBLIC SCHOOL DISTRICT       Roseau County
## 372                                              WARWICK 29       Benson County
## 373                           WASECA PUBLIC SCHOOL DISTRICT       Waseca County
## 374                                              WASHINGTON   Washington County
## 375                         BRAINERD PUBLIC SCHOOL DISTRICT    Crow Wing County
## 376                                           W-A-Y Academy       Macomb County
## 377                                     COLLEGE STATION ISD       Brazos County
## 378                                                   PASCO        Pasco County
## 379                                 Cabarrus County Schools     Cabarrus County
## 380                                              DALLAS ISD       Dallas County
## 381                                            WEST FARGO 6         Cass County
## 382                                 Rowan-Salisbury Schools        Rowan County
## 383                        INTERMEDIATE SCHOOL DISTRICT 287     Hennepin County
## 384                                   Western Reserve Local        Huron County
## 385                                      South Central 26-5      Gregory County
## 386                                    LOUDOUN CO PBLC SCHS      Loudoun County
## 387                                            WEST FARGO 6         Cass County
## 388                                              DALLAS ISD       Dallas County
## 389                           Charlotte-Mecklenburg Schools  Mecklenburg County
## 390                   Windham Academy Public Charter School   Rockingham County
## 391                                 Nekoosa School District         Wood County
## 392                      Bowling Green City School District         Wood County
## 393                                 DANVILLE CITY PBLC SCHS       Danville city
## 394                                              JUDSON ISD        Bexar County
## 395                                               WYLIE ISD       Taylor County
## 396                         YELLOWSTONE COLLEGE PREPARATORY       Harris County
##     COUNTY.ID Urban.centric.Locale Latitude  Longitude
## 1       27019     21-Suburb: Large 44.84280  -93.59659
## 2       12095       11-City: Large 28.55016  -81.38425
## 3       12095       11-City: Large 28.55016  -81.38425
## 4       12095       11-City: Large 28.55016  -81.38425
## 5       12095       11-City: Large 28.55016  -81.38425
## 6       12086     21-Suburb: Large 25.92714  -80.17987
## 7       27053       11-City: Large 44.93445  -93.27185
## 8       49011     21-Suburb: Large 40.97327 -111.87647
## 9        1005     32-Town: Distant 31.88756  -85.15773
## 10      15007     41-Rural: Fringe 21.96216 -159.47826
## 11      35001       11-City: Large 35.08357 -106.64885
## 12      19035    42-Rural: Distant 42.71461  -95.42870
## 13      35001       11-City: Large 35.08357 -106.64885
## 14      37179     21-Suburb: Large 35.04428  -80.74383
## 15      39037    42-Rural: Distant 40.21266  -84.63828
## 16      37183     41-Rural: Fringe 35.70030  -78.91073
## 17      37067     21-Suburb: Large 36.14139  -80.16825
## 18      49049      31-Town: Fringe 39.98959 -111.78319
## 19      37179     21-Suburb: Large 34.95508  -80.76354
## 20      39153    12-City: Mid-size 41.12177  -81.55420
## 21      39037    42-Rural: Distant 39.99525  -84.55588
## 22      27059     41-Rural: Fringe 45.50424  -93.23180
## 23      16083      33-Town: Remote 42.58223 -114.47639
## 24      37063     21-Suburb: Large 35.96729  -78.78814
## 25      49035     21-Suburb: Large 40.68867 -112.02541
## 26      37009     41-Rural: Fringe 36.39424  -81.47609
## 27      12103     21-Suburb: Large 28.00401  -82.75432
## 28      19035    42-Rural: Distant 42.71461  -95.42870
## 29      48113       11-City: Large 32.69389  -96.76834
## 30      55027     32-Town: Distant 43.46581  -88.82104
## 31      48339  22-Suburb: Mid-size 30.20192  -95.57728
## 32      27123     21-Suburb: Large 44.97326  -92.99445
## 33      45007     41-Rural: Fringe 34.49661  -82.53415
## 34      19013       13-City: Small 42.49537  -92.45962
## 35      45037    42-Rural: Distant 33.66170  -81.85746
## 36      12033     41-Rural: Fringe 30.53260  -87.38563
## 37      37017    42-Rural: Distant 34.64581  -78.73133
## 38      27035      33-Town: Remote 46.36206  -94.17510
## 39      46051    42-Rural: Distant 45.09667  -96.51941
## 40      49035     21-Suburb: Large 40.47695 -111.92548
## 41      49035     21-Suburb: Large 40.49145 -111.95654
## 42      48039     41-Rural: Fringe 29.38541  -95.28656
## 43      48181      31-Town: Fringe 33.43053  -96.58437
## 44      45015     21-Suburb: Large 32.94651  -80.00402
## 45      12086       13-City: Small 25.69419  -80.38267
## 46      12086       13-City: Small 25.69419  -80.38267
## 47      12097     21-Suburb: Large 28.29880  -81.36142
## 48      48113     21-Suburb: Large 32.95438  -96.87411
## 49      54009     23-Suburb: Small 40.33093  -80.59421
## 50      54009     41-Rural: Fringe 40.27260  -80.53821
## 51      54009     41-Rural: Fringe 40.30451  -80.58877
## 52      54009     23-Suburb: Small 40.32456  -80.57886
## 53      54009     23-Suburb: Small 40.27782  -80.61009
## 54      27053     21-Suburb: Large 45.07469  -93.29708
## 55      27163     21-Suburb: Large 44.93288  -92.88046
## 56      37183     41-Rural: Fringe 35.66514  -78.58889
## 57      37183     41-Rural: Fringe 35.61725  -78.84435
## 58      48157     41-Rural: Fringe 29.69609  -95.86807
## 59      33013    42-Rural: Distant 43.37354  -71.65502
## 60      33013    42-Rural: Distant 43.37354  -71.65502
## 61      55025       11-City: Large 43.08585  -89.37174
## 62      49057     21-Suburb: Large 41.29925 -112.04914
## 63      37183     21-Suburb: Large 35.80128  -78.78074
## 64      55079       11-City: Large 43.01850  -87.94712
## 65      37183     21-Suburb: Large 35.62607  -78.79717
## 66      39019     41-Rural: Fringe 40.55930  -81.09716
## 67      48029     41-Rural: Fringe 29.29313  -98.58756
## 68      12086     21-Suburb: Large 25.47553  -80.40965
## 69      49049     41-Rural: Fringe 40.36288 -111.95825
## 70      55097     41-Rural: Fringe 44.35942  -89.71714
## 71      55135     41-Rural: Fringe 44.35443  -89.16879
## 72      37119       11-City: Large 35.20888  -80.74736
## 73      27025     41-Rural: Fringe 45.50766  -92.96452
## 74      37127       13-City: Small 35.94122  -77.80762
## 75      39139     41-Rural: Fringe 40.61974  -82.50702
## 76      39025     21-Suburb: Large 39.11789  -84.13663
## 77      51800     21-Suburb: Large 36.88496  -76.41829
## 78      48029     41-Rural: Fringe 29.26410  -98.46998
## 79      27003     21-Suburb: Large 45.05617  -93.24956
## 80      27003     21-Suburb: Large 45.05626  -93.24007
## 81      27123       11-City: Large 44.97421  -93.08051
## 82      12097     21-Suburb: Large 28.23355  -81.25738
## 83      12011    12-City: Mid-size 26.20606  -80.13723
## 84      49035     41-Rural: Fringe 40.56396 -112.01722
## 85      27003     41-Rural: Fringe 45.37674  -93.38842
## 86      34011     41-Rural: Fringe 39.44739  -75.04624
## 87      27037     21-Suburb: Large 44.74147  -93.11446
## 88      37129    12-City: Mid-size 34.25069  -77.94046
## 89      39083    42-Rural: Distant 40.44755  -82.26062
## 90      37057     21-Suburb: Large 35.84797  -80.27151
## 91      46009     43-Rural: Remote 43.08149  -97.88300
## 92      27061    42-Rural: Distant 47.33445  -93.79172
## 93      37063       11-City: Large 36.12916  -78.86483
## 94      12019     21-Suburb: Large 30.16268  -81.84413
## 95      12029      33-Town: Remote 29.63767  -83.13277
## 96      48157     21-Suburb: Large 29.55851  -95.78545
## 97      12086     21-Suburb: Large 25.81940  -80.33399
## 98      12057       11-City: Large 27.94921  -82.45232
## 99      48039     21-Suburb: Large 29.55687  -95.42006
## 100     48439       11-City: Large 32.63413  -97.09039
## 101     55031    42-Rural: Distant 46.34609  -91.83128
## 102     51510    12-City: Mid-size 38.83356  -77.12619
## 103     39049       11-City: Large 40.00653  -82.90848
## 104     27003     21-Suburb: Large 45.11386  -93.24702
## 105     27123       11-City: Large 44.91399  -93.17044
## 106     39115     41-Rural: Fringe 39.66189  -81.86095
## 107     45015     41-Rural: Fringe 32.91700  -79.90638
## 108     45045     21-Suburb: Large 34.89541  -82.34422
## 109     37119       11-City: Large 35.33705  -80.97878
## 110     48201     21-Suburb: Large 30.00798  -95.26295
## 111     55121    42-Rural: Distant 44.56131  -91.42052
## 112     48479       11-City: Large 27.58056  -99.48403
## 113     27141     21-Suburb: Large 45.31214  -93.57924
## 114     26139  22-Suburb: Mid-size 43.06465  -86.22259
## 115     12057       11-City: Large 27.95517  -82.45438
## 116     27047    42-Rural: Distant 43.67252  -93.57428
## 117     27045    42-Rural: Distant 43.69715  -92.38829
## 118     48029     21-Suburb: Large 29.47487  -98.32179
## 119     37159  22-Suburb: Mid-size 35.65216  -80.44969
## 120     48201       11-City: Large 29.70933  -95.50001
## 121     48167     41-Rural: Fringe 29.48266  -95.00517
## 122      4013       11-City: Large 33.39948 -111.84953
## 123     27123     21-Suburb: Large 45.00405  -93.18073
## 124     48201     21-Suburb: Large 30.02726  -95.08768
## 125     48113       11-City: Large 32.79693  -96.78618
## 126     49011     21-Suburb: Large 40.96610 -111.89959
## 127     27131     32-Town: Distant 44.28568  -93.28570
## 128     51510    12-City: Mid-size 38.83193  -77.12344
## 129     27099    42-Rural: Distant 43.56566  -92.71830
## 130     27047    42-Rural: Distant 43.67312  -93.57402
## 131     27037     21-Suburb: Large 44.73451  -93.21189
## 132     12057     21-Suburb: Large 28.00092  -82.35865
## 133     26075       13-City: Small 42.23205  -84.40427
## 134     12109     23-Suburb: Small 29.89772  -81.31689
## 135     55131     41-Rural: Fringe 43.25294  -88.25880
## 136     16001     21-Suburb: Large 43.63714 -116.24493
## 137     27163     21-Suburb: Large 45.04425  -92.81278
## 138     27053     21-Suburb: Large 44.86773  -93.23842
## 139     27053     21-Suburb: Large 45.09659  -93.39487
## 140     16001     21-Suburb: Large 43.59001 -116.35992
## 141     27007     41-Rural: Fringe 47.46886  -94.93472
## 142     27123     21-Suburb: Large 45.00021  -93.04032
## 143     37183     21-Suburb: Large 35.80094  -78.48506
## 144     51107     41-Rural: Fringe 38.92628  -77.56776
## 145     27091    42-Rural: Distant 43.69787  -94.34569
## 146     37077    42-Rural: Distant 36.15341  -78.57227
## 147     12011     21-Suburb: Large 25.98370  -80.15270
## 148     39049     21-Suburb: Large 39.86034  -82.98360
## 149     48157       13-City: Small 29.64196  -95.61875
## 150     39159     32-Town: Distant 40.23732  -83.34583
## 151     27109    12-City: Mid-size 44.01546  -92.45688
## 152     16055     41-Rural: Fringe 47.79640 -116.78206
## 153     39089     23-Suburb: Small 40.06214  -82.36383
## 154     49035     41-Rural: Fringe 40.49469 -111.99423
## 155     27053       11-City: Large 44.91839  -93.25023
## 156     12057       11-City: Large 27.94927  -82.45214
## 157     27123       11-City: Large 44.97519  -93.16387
## 158     48201     21-Suburb: Large 30.11535  -95.54881
## 159     18069     41-Rural: Fringe 40.85862  -85.50596
## 160     27123       11-City: Large 44.97157  -93.09345
## 161     35031      33-Town: Remote 35.52669 -108.74022
## 162     12057       11-City: Large 27.94927  -82.45214
## 163     49049     21-Suburb: Large 40.43704 -111.87607
## 164     48439       11-City: Large 32.92213  -97.35712
## 165     48201       11-City: Large 29.62672  -95.33422
## 166     48201       11-City: Large 29.62672  -95.33422
## 167     37147       13-City: Small 35.60472  -77.36208
## 168     55025       11-City: Large 43.11921  -89.35425
## 169     51830     23-Suburb: Small 37.29155  -76.72663
## 170     48085     41-Rural: Fringe 33.18991  -96.77984
## 171     16031     41-Rural: Fringe 42.51436 -113.80313
## 172     37101     21-Suburb: Large 35.66017  -78.49420
## 173     48113     21-Suburb: Large 32.57028  -96.83057
## 174     27049    42-Rural: Distant 44.26785  -92.98972
## 175     12033     41-Rural: Fringe 30.57999  -87.33878
## 176     12086     21-Suburb: Large 25.83657  -80.23491
## 177     55025     41-Rural: Fringe 42.97745  -89.01533
## 178     33011    12-City: Mid-size 42.99477  -71.45992
## 179     33011    12-City: Mid-size 42.99477  -71.45992
## 180     55085     43-Rural: Remote 45.88744  -89.70604
## 181     55085     43-Rural: Remote 45.88659  -89.72218
## 182     45077       13-City: Small 34.82885  -82.57501
## 183     27111      33-Town: Remote 46.28638  -96.11581
## 184     27041      33-Town: Remote 45.88612  -95.39032
## 185     27027  22-Suburb: Mid-size 46.85050  -96.75691
## 186     49049     21-Suburb: Large 40.36852 -111.92819
## 187     48113     21-Suburb: Large 32.81757  -96.63179
## 188     12086       11-City: Large 25.84891  -80.18499
## 189     10005     23-Suburb: Small 38.55202  -75.56905
## 190     48085     21-Suburb: Large 33.13621  -96.76670
## 191     49011     21-Suburb: Large 41.03163 -111.95601
## 192     48201     21-Suburb: Large 30.07408  -95.39468
## 193      4013       11-City: Large 33.36347 -111.60296
## 194     12075    42-Rural: Distant 29.45804  -82.63477
## 195     18017     41-Rural: Fringe 40.57463  -86.19235
## 196     39041     21-Suburb: Large 40.29026  -83.07609
## 197     12111     21-Suburb: Large 27.43927  -80.32749
## 198     39003       13-City: Small 40.74134  -84.09725
## 199     18063     21-Suburb: Large 39.82335  -86.37487
## 200     12081     21-Suburb: Large 27.52692  -82.56205
## 201     27123     21-Suburb: Large 45.04934  -93.12563
## 202     27053       11-City: Large 44.94791  -93.25593
## 203     48085     41-Rural: Fringe 33.17153  -96.76028
## 204     48439       11-City: Large 32.91502  -97.34141
## 205     48303  22-Suburb: Mid-size 33.47262 -101.84886
## 206     48339      31-Town: Fringe 30.19920  -95.75267
## 207     48157       13-City: Small 29.58887  -95.62221
## 208     38017     43-Rural: Remote 46.92109  -97.67498
## 209     37031     32-Town: Distant 34.72406  -76.75786
## 210     27083      33-Town: Remote 44.43865  -95.78481
## 211     39165     21-Suburb: Large 39.36222  -84.31114
## 212     39151       13-City: Small 40.80723  -81.50074
## 213     12097     41-Rural: Fringe 28.24981  -81.22964
## 214     48027    12-City: Mid-size 31.11480  -97.71036
## 215     39095       11-City: Large 41.71338  -83.55757
## 216     39119     32-Town: Distant 39.87928  -82.05185
## 217     18163  22-Suburb: Mid-size 38.07447  -87.51810
## 218     37111     32-Town: Distant 35.65909  -82.02778
## 219     55025     21-Suburb: Large 43.17464  -89.26505
## 220     39107    42-Rural: Distant 40.68128  -84.64845
## 221     12097     41-Rural: Fringe 28.18327  -81.15307
## 222     39037     41-Rural: Fringe 40.22196  -84.74888
## 223     38105    42-Rural: Distant 48.23320 -103.71090
## 224     38105    42-Rural: Distant 48.23320 -103.71090
## 225     48209     41-Rural: Fringe 30.09933  -97.89256
## 226     37179     21-Suburb: Large 35.04428  -80.74383
## 227     37183       11-City: Large 35.78455  -78.63819
## 228     37125     32-Town: Distant 35.17735  -79.39421
## 229     37157     32-Town: Distant 36.36561  -79.67938
## 230     37119       11-City: Large 35.26123  -80.93860
## 231     37023       13-City: Small 35.75377  -81.70143
## 232     48027    12-City: Mid-size 31.11480  -97.71036
## 233     27097     32-Town: Distant 45.97534  -94.33026
## 234     12057     21-Suburb: Large 27.93702  -82.28760
## 235     12097     21-Suburb: Large 28.29437  -81.36079
## 236      4013       11-City: Large 33.45361 -111.72778
## 237     48071     41-Rural: Fringe 29.83683  -94.84707
## 238     48257     41-Rural: Fringe 32.62326  -96.45800
## 239     48113    12-City: Mid-size 32.93748  -96.96564
## 240     48085       11-City: Large 33.00934  -96.78950
## 241     48291      31-Town: Fringe 30.33822  -95.08765
## 242     48113    12-City: Mid-size 32.94432  -96.73257
## 243     48339  22-Suburb: Mid-size 30.42848  -95.48337
## 244     48167  22-Suburb: Mid-size 29.38190  -95.10572
## 245     48039     23-Suburb: Small 29.02456  -95.41297
## 246     48157     21-Suburb: Large 29.78033  -95.83269
## 247     49035     41-Rural: Fringe 40.49076 -111.99253
## 248     48201     21-Suburb: Large 29.67807  -95.19161
## 249     48157     21-Suburb: Large 29.78033  -95.83269
## 250     55079       11-City: Large 43.05576  -87.95812
## 251     48303      31-Town: Fringe 33.43696 -101.64137
## 252     48453     41-Rural: Fringe 30.15306  -97.71363
## 253     37081       11-City: Large 36.03913  -79.81697
## 254     27103    42-Rural: Distant 44.28140  -94.18687
## 255     48177     43-Rural: Remote 29.26741  -97.63663
## 256     49057       13-City: Small 41.18773 -111.94699
## 257     27053     21-Suburb: Large 45.06704  -93.34083
## 258     19065     43-Rural: Remote 42.97219  -91.65429
## 259     19103  22-Suburb: Mid-size 41.75600  -91.60231
## 260     27053       13-City: Small 44.98119  -93.50137
## 261     27017      31-Town: Fringe 46.71732  -92.44845
## 262     27109    12-City: Mid-size 44.03177  -92.46717
## 263     16069       13-City: Small 46.41494 -117.01635
## 264     46115     43-Rural: Remote 45.15615  -98.50009
## 265     34029     21-Suburb: Large 39.97622  -74.19736
## 266     19093     43-Rural: Remote 42.34206  -95.46542
## 267     19093     43-Rural: Remote 42.33581  -95.46349
## 268     27095     43-Rural: Remote 46.06049  -93.67402
## 269     55025       11-City: Large 43.04387  -89.39215
## 270     12095       11-City: Large 28.56123  -81.35935
## 271     38089      33-Town: Remote 46.88258 -102.79023
## 272     12109     23-Suburb: Small 29.89772  -81.31689
## 273     46067     43-Rural: Remote 43.48821  -97.83099
## 274     27025     32-Town: Distant 45.39089  -92.82807
## 275     16001    12-City: Mid-size 43.58694 -116.20206
## 276      1101     41-Rural: Fringe 32.33827  -86.02819
## 277     27115     43-Rural: Remote 46.01610  -92.93978
## 278     12009    12-City: Mid-size 28.00484  -80.67415
## 279     12095     21-Suburb: Large 28.50190  -81.15192
## 280     48381    12-City: Mid-size 35.12674 -101.87844
## 281     12101     21-Suburb: Large 28.21641  -82.66867
## 282     39099     21-Suburb: Large 41.03399  -80.61862
## 283     45053     41-Rural: Fringe 32.49573  -80.98604
## 284     27013       13-City: Small 44.16739  -93.99835
## 285     27123       11-City: Large 44.97628  -93.10714
## 286     27053     21-Suburb: Large 44.86773  -93.23842
## 287     16001      31-Town: Fringe 43.50402 -116.41433
## 288     36005       11-City: Large 40.87244  -73.87594
## 289     19049     41-Rural: Fringe 41.60009  -93.86195
## 290     37183       11-City: Large 35.89771  -78.65367
## 291     48085     41-Rural: Fringe 33.26452  -96.80851
## 292     27015     32-Town: Distant 44.29978  -94.44669
## 293     48479       11-City: Large 27.59588  -99.48153
## 294     48029       11-City: Large 29.34114  -98.54666
## 295     12095     21-Suburb: Large 28.60905  -81.21659
## 296     12117     41-Rural: Fringe 28.65961  -81.17729
## 297     38089     43-Rural: Remote 46.88589 -102.30828
## 298     55131     41-Rural: Fringe 43.25013  -88.19190
## 299     39061     21-Suburb: Large 39.15031  -84.61203
## 300     39061       11-City: Large 39.14729  -84.59791
## 301     55043    42-Rural: Distant 43.19324  -90.43567
## 302     37083     32-Town: Distant 36.45809  -77.65420
## 303     55079       11-City: Large 43.11798  -87.99062
## 304     26139     23-Suburb: Small 42.79096  -86.08764
## 305     37183     21-Suburb: Large 35.90894  -78.47984
## 306     27123       11-City: Large 44.95070  -93.12282
## 307     27097    42-Rural: Distant 45.82870  -94.28214
## 308     26145       13-City: Small 43.43249  -83.93004
## 309     48479     41-Rural: Fringe 27.62072  -99.45870
## 310     27053     21-Suburb: Large 45.00482  -93.36425
## 311     55025     21-Suburb: Large 42.91890  -89.21754
## 312     27123     21-Suburb: Large 45.07121  -93.21524
## 313     27025     32-Town: Distant 45.39089  -92.82807
## 314     12057     21-Suburb: Large 28.06841  -82.57077
## 315     12057       11-City: Large 27.94921  -82.45232
## 316     12099     21-Suburb: Large 26.34131  -80.20989
## 317     19103    42-Rural: Distant 41.80358  -91.49782
## 318     12011    12-City: Mid-size 26.10668  -80.14124
## 319     37183     41-Rural: Fringe 35.65502  -78.57968
## 320     12009       13-City: Small 28.61463  -80.85371
## 321     39157     32-Town: Distant 40.47841  -81.45774
## 322     37155    42-Rural: Distant 34.53236  -79.29777
## 323     55043    42-Rural: Distant 42.53217  -90.43805
## 324     27141     21-Suburb: Large 45.29426  -93.54943
## 325     12097     21-Suburb: Large 28.29880  -81.36142
## 326     46093     41-Rural: Fringe 44.20156 -103.35507
## 327     37167     32-Town: Distant 35.36614  -80.19657
## 328     16001     41-Rural: Fringe 43.71179 -116.47355
## 329     27145     32-Town: Distant 45.67316  -94.81538
## 330     27123       11-City: Large 44.95974  -93.06498
## 331     39049     21-Suburb: Large 39.94796  -83.12479
## 332     48113       11-City: Large 32.79693  -96.78618
## 333     16083     41-Rural: Fringe 42.54180 -114.37376
## 334     39095       11-City: Large 41.66144  -83.51759
## 335     12115       13-City: Small 27.09573  -82.15756
## 336     38073     43-Rural: Remote 46.32370  -97.44197
## 337     37141     41-Rural: Fringe 34.46319  -77.57528
## 338     37141     41-Rural: Fringe 34.46256  -77.57436
## 339     48085     21-Suburb: Large 33.12655  -96.76671
## 340     12113     21-Suburb: Large 30.62443  -87.04082
## 341     48113       11-City: Large 32.87655  -96.76844
## 342     37081       11-City: Large 36.13679  -79.81044
## 343     45055      31-Town: Fringe 34.25261  -80.63111
## 344     27053       11-City: Large 44.97587  -93.26500
## 345     48113       11-City: Large 32.74553  -96.75266
## 346     27141     21-Suburb: Large 45.32109  -93.55945
## 347     16019     41-Rural: Fringe 43.49916 -111.93612
## 348     48113       11-City: Large 32.79693  -96.78618
## 349     12097     21-Suburb: Large 28.33548  -81.29411
## 350     55025     41-Rural: Fringe 43.20295  -89.25053
## 351     12097     21-Suburb: Large 28.29885  -81.36132
## 352     48029    42-Rural: Distant 29.42758  -98.23104
## 353     27053     41-Rural: Fringe 44.95491  -93.67201
## 354     12086     21-Suburb: Large 25.72670  -80.26323
## 355     12086     21-Suburb: Large 25.70291  -80.34548
## 356     27053       11-City: Large 44.99055  -93.28268
## 357     48209     41-Rural: Fringe 29.97182  -97.78538
## 358     12011    12-City: Mid-size 26.20606  -80.13723
## 359     12125     32-Town: Distant 30.01532  -82.33954
## 360      1119     43-Rural: Remote 32.58629  -88.18907
## 361     19065     43-Rural: Remote 42.97219  -91.65429
## 362     48453       11-City: Large 30.17933  -97.77982
## 363     51143    42-Rural: Distant 36.82012  -79.39708
## 364     37119       11-City: Large 35.23673  -80.81327
## 365     45041     23-Suburb: Small 34.16635  -79.75844
## 366     27115      33-Town: Remote 45.81990  -92.96939
## 367     51790       13-City: Small 38.15066  -79.06397
## 368     51790       13-City: Small 38.15066  -79.06397
## 369     51790       13-City: Small 38.15066  -79.06397
## 370     21111     21-Suburb: Large 38.19979  -85.68558
## 371     27135     43-Rural: Remote 48.91084  -95.32978
## 372     38005     43-Rural: Remote 47.85766  -98.71055
## 373     27161     32-Town: Distant 44.07825  -93.50137
## 374     12133     41-Rural: Fringe 30.76320  -85.55532
## 375     27035      33-Town: Remote 46.35251  -94.19681
## 376     26099     21-Suburb: Large 42.51571  -82.95976
## 377     48041     41-Rural: Fringe 30.52541  -96.29479
## 378     12101     21-Suburb: Large 28.27162  -82.68756
## 379     37025       13-City: Small 35.36269  -80.71500
## 380     48113       11-City: Large 32.79693  -96.78618
## 381     38017  22-Suburb: Mid-size 46.82010  -96.88455
## 382     37159    42-Rural: Distant 35.72909  -80.67950
## 383     27053     21-Suburb: Large 44.90105  -93.42134
## 384     39077    42-Rural: Distant 41.25161  -82.39907
## 385     46053     43-Rural: Remote 43.18132  -99.29028
## 386     51107     41-Rural: Fringe 38.92758  -77.58964
## 387     38017    12-City: Mid-size 46.86011  -96.86942
## 388     48113       11-City: Large 32.79693  -96.78618
## 389     37119       11-City: Large 35.25012  -80.94403
## 390     33015  22-Suburb: Mid-size 42.81087  -71.25375
## 391     55141     41-Rural: Fringe 44.30934  -89.91668
## 392     39173      31-Town: Fringe 41.37056  -83.63872
## 393     51590     32-Town: Distant 36.59901  -79.38200
## 394     48029     21-Suburb: Large 29.55308  -98.32942
## 395     48441     41-Rural: Fringe 32.36955  -99.72533
## 396     48201       11-City: Large 29.73743  -95.35558
##                                        Title.I.School.Status Updated.Status
## 1                                                        n/a        4-Added
## 2                                                        n/a       7-Future
## 3                                                        n/a       7-Future
## 4                                                        n/a       7-Future
## 5                                                        n/a       7-Future
## 6                                                        n/a       7-Future
## 7                                                        n/a       7-Future
## 8                                                        n/a       7-Future
## 9                                                        n/a       7-Future
## 10                                                       n/a       7-Future
## 11                                                       n/a       7-Future
## 12                                                       n/a       7-Future
## 13                                                       n/a       7-Future
## 14                                                       n/a       7-Future
## 15                                                       n/a        4-Added
## 16                                                       n/a       7-Future
## 17                                                       n/a       7-Future
## 18                                                       n/a       7-Future
## 19                                                       n/a       7-Future
## 20                                                       n/a        4-Added
## 21                                                       n/a        4-Added
## 22                      2-Title I targeted assistance school        4-Added
## 23                                                       n/a       7-Future
## 24                                                       n/a       7-Future
## 25                                                       n/a       7-Future
## 26                                                       n/a       7-Future
## 27                                                       n/a       7-Future
## 28                                                       n/a       7-Future
## 29                                                       n/a       7-Future
## 30                                                       n/a       7-Future
## 31                                                       n/a       7-Future
## 32                                                       n/a        4-Added
## 33                                                       n/a       7-Future
## 34                                                       n/a       7-Future
## 35                                                       n/a       7-Future
## 36                                                       n/a       7-Future
## 37                                                       n/a       7-Future
## 38                                                       n/a        4-Added
## 39                                                       n/a       7-Future
## 40                                                       n/a       7-Future
## 41                                                       n/a       7-Future
## 42                                                       n/a       7-Future
## 43                                                       n/a       7-Future
## 44                                                       n/a       7-Future
## 45                                                       n/a       7-Future
## 46                                                       n/a       7-Future
## 47                                                       n/a       7-Future
## 48                                                       n/a       7-Future
## 49                                                       n/a       7-Future
## 50                                                       n/a       7-Future
## 51                                                       n/a       7-Future
## 52                                                       n/a       7-Future
## 53                                                       n/a       7-Future
## 54                               5-Title I schoolwide school        4-Added
## 55                      2-Title I targeted assistance school        4-Added
## 56                                                       n/a       7-Future
## 57                                                       n/a       7-Future
## 58                                                       n/a       7-Future
## 59                                                       n/a       7-Future
## 60                                                       n/a       7-Future
## 61                                                       n/a       7-Future
## 62                                                       n/a       7-Future
## 63                                                       n/a       7-Future
## 64                                                       n/a       7-Future
## 65                                                       n/a       7-Future
## 66                                                       n/a        4-Added
## 67                                                       n/a       7-Future
## 68                                                       n/a       7-Future
## 69                                                       n/a       7-Future
## 70                                                       n/a       7-Future
## 71                                                       n/a       7-Future
## 72                                                       n/a       7-Future
## 73                                                       n/a       7-Future
## 74                                                       n/a       7-Future
## 75                                                       n/a        4-Added
## 76           4-Title I schoolwide eligible school-No program        4-Added
## 77                                                       n/a       7-Future
## 78                                                       n/a       7-Future
## 79                                                       n/a       7-Future
## 80                                                       n/a       7-Future
## 81                               5-Title I schoolwide school        4-Added
## 82                                                       n/a       7-Future
## 83                                                       n/a       7-Future
## 84                                                       n/a       7-Future
## 85                               5-Title I schoolwide school        4-Added
## 86                                                       n/a        4-Added
## 87                                    6-Not a Title I school        4-Added
## 88                                                       n/a       7-Future
## 89                                                       n/a        4-Added
## 90                                                       n/a       7-Future
## 91                                                       n/a       7-Future
## 92                               5-Title I schoolwide school        4-Added
## 93                                                       n/a       7-Future
## 94                                                       n/a       7-Future
## 95                                                       n/a        4-Added
## 96                                                       n/a       7-Future
## 97                                                       n/a       7-Future
## 98                                                       n/a       7-Future
## 99                                                       n/a       7-Future
## 100                                                      n/a       7-Future
## 101                                                      n/a       7-Future
## 102                                                      n/a       7-Future
## 103                                                      n/a        4-Added
## 104                     2-Title I targeted assistance school        4-Added
## 105                                                      n/a       7-Future
## 106                                                      n/a        4-Added
## 107                                                      n/a       7-Future
## 108                                                      n/a       7-Future
## 109                                                      n/a       7-Future
## 110                                                      n/a       7-Future
## 111                                                      n/a       7-Future
## 112                                                      n/a       7-Future
## 113                                                      n/a       7-Future
## 114                                                      n/a        4-Added
## 115                                                      n/a       7-Future
## 116                                                      n/a       7-Future
## 117                                   6-Not a Title I school        4-Added
## 118                                                      n/a       7-Future
## 119                                                      n/a       7-Future
## 120                                                      n/a       7-Future
## 121                                                      n/a       7-Future
## 122                                                      n/a        4-Added
## 123                              5-Title I schoolwide school        4-Added
## 124                                                      n/a       7-Future
## 125                                                      n/a       7-Future
## 126                                                      n/a       7-Future
## 127                              5-Title I schoolwide school        4-Added
## 128                                                      n/a       7-Future
## 129                                   6-Not a Title I school        4-Added
## 130                                   6-Not a Title I school        4-Added
## 131                                                      n/a       7-Future
## 132                                                      n/a       7-Future
## 133                                                      n/a       7-Future
## 134                                                      n/a       7-Future
## 135                                                      n/a       7-Future
## 136                                                      n/a       7-Future
## 137                     2-Title I targeted assistance school        4-Added
## 138                                                      n/a       7-Future
## 139                                                      n/a        4-Added
## 140                                                      n/a       7-Future
## 141                                                      n/a       7-Future
## 142                              5-Title I schoolwide school        4-Added
## 143                                                      n/a       7-Future
## 144                                                      n/a       7-Future
## 145                                                      n/a       7-Future
## 146                                                      n/a       7-Future
## 147                                                      n/a       7-Future
## 148                                   6-Not a Title I school        4-Added
## 149                                                      n/a       7-Future
## 150                                                      n/a        4-Added
## 151                                                      n/a        4-Added
## 152                                                      n/a       7-Future
## 153                                                      n/a        4-Added
## 154                                                      n/a       7-Future
## 155                                                      n/a       7-Future
## 156                                                      n/a       7-Future
## 157                                                      n/a       7-Future
## 158                                                      n/a       7-Future
## 159                                                      n/a       7-Future
## 160                                                      n/a       7-Future
## 161                                                      n/a       7-Future
## 162                                                      n/a       7-Future
## 163                                                      n/a       7-Future
## 164                                                      n/a       7-Future
## 165                                                      n/a       7-Future
## 166                                                      n/a       7-Future
## 167                                                      n/a       7-Future
## 168                                                      n/a       7-Future
## 169                                                      n/a       7-Future
## 170                                                      n/a       7-Future
## 171                                                      n/a       7-Future
## 172                                                      n/a       7-Future
## 173                                                      n/a       7-Future
## 174                                                      n/a        4-Added
## 175                                                      n/a       7-Future
## 176                                                      n/a       7-Future
## 177                                                      n/a       7-Future
## 178                                                      n/a       7-Future
## 179                                                      n/a       7-Future
## 180                                                      n/a       7-Future
## 181                                                      n/a       7-Future
## 182                                                      n/a       7-Future
## 183                                                      n/a        4-Added
## 184                                                      n/a        4-Added
## 185                                                      n/a        4-Added
## 186                                                      n/a       7-Future
## 187                                                      n/a       7-Future
## 188                                                      n/a       7-Future
## 189                                                      n/a       7-Future
## 190                                                      n/a       7-Future
## 191                                                      n/a       7-Future
## 192                                                      n/a       7-Future
## 193                                                      n/a       7-Future
## 194                                                      n/a        4-Added
## 195                                                      n/a       7-Future
## 196                                                      n/a        4-Added
## 197                                   6-Not a Title I school        4-Added
## 198                                                      n/a        4-Added
## 199                                                      n/a       7-Future
## 200                                                      n/a       7-Future
## 201                                                      n/a       7-Future
## 202                                                      n/a       7-Future
## 203                                                      n/a       7-Future
## 204                                                      n/a       7-Future
## 205                                                      n/a       7-Future
## 206                                                      n/a       7-Future
## 207                                                      n/a       7-Future
## 208                                                      n/a       7-Future
## 209                                                      n/a       7-Future
## 210                     2-Title I targeted assistance school        4-Added
## 211                                                      n/a        4-Added
## 212 1-Title I targeted assistance eligible school-No program        4-Added
## 213                                                      n/a       7-Future
## 214                                                      n/a       7-Future
## 215                                                      n/a        4-Added
## 216                                                      n/a        4-Added
## 217                                                      n/a       7-Future
## 218                                                      n/a       7-Future
## 219                                                      n/a       7-Future
## 220                                                      n/a        4-Added
## 221                                                      n/a       7-Future
## 222                                                      n/a        4-Added
## 223                                                      n/a       7-Future
## 224                                                      n/a       7-Future
## 225                                                      n/a       7-Future
## 226                                                      n/a       7-Future
## 227                                                      n/a       7-Future
## 228                                                      n/a       7-Future
## 229                                                      n/a       7-Future
## 230                                                      n/a       7-Future
## 231                                                      n/a       7-Future
## 232                                                      n/a       7-Future
## 233                                   6-Not a Title I school        4-Added
## 234                                                      n/a       7-Future
## 235                                                      n/a       7-Future
## 236                                                      n/a       7-Future
## 237                                                      n/a       7-Future
## 238                                                      n/a       7-Future
## 239                                                      n/a       7-Future
## 240                                                      n/a       7-Future
## 241                                                      n/a       7-Future
## 242                                                      n/a       7-Future
## 243                                                      n/a       7-Future
## 244                                                      n/a       7-Future
## 245                                                      n/a       7-Future
## 246                                                      n/a       7-Future
## 247                                                      n/a       7-Future
## 248                                                      n/a       7-Future
## 249                                                      n/a       7-Future
## 250                                                      n/a       7-Future
## 251                                                      n/a       7-Future
## 252                                                      n/a       7-Future
## 253                                                      n/a       7-Future
## 254                                                      n/a       7-Future
## 255                                                      n/a       7-Future
## 256                                                      n/a       7-Future
## 257                                                      n/a       7-Future
## 258                                                      n/a       7-Future
## 259                                                      n/a       7-Future
## 260                                                      n/a       7-Future
## 261                                   6-Not a Title I school        4-Added
## 262                              5-Title I schoolwide school        4-Added
## 263                                   6-Not a Title I school        4-Added
## 264                                                      n/a       7-Future
## 265                                                      n/a        4-Added
## 266                                                      n/a       7-Future
## 267                                                      n/a       7-Future
## 268                              5-Title I schoolwide school        4-Added
## 269                                                      n/a       7-Future
## 270                                                      n/a       7-Future
## 271                                                      n/a       7-Future
## 272                                                      n/a       7-Future
## 273                                                      n/a       7-Future
## 274                                                      n/a       7-Future
## 275                                                      n/a       7-Future
## 276                                                      n/a       7-Future
## 277                                                      n/a       7-Future
## 278                                                      n/a       7-Future
## 279                                                      n/a       7-Future
## 280                                                      n/a       7-Future
## 281                                                      n/a       7-Future
## 282                                                      n/a        4-Added
## 283                                                      n/a       7-Future
## 284                              5-Title I schoolwide school        4-Added
## 285                                                      n/a       7-Future
## 286                                                      n/a       7-Future
## 287                                                      n/a       7-Future
## 288                                   6-Not a Title I school        4-Added
## 289                                                      n/a       7-Future
## 290                                                      n/a       7-Future
## 291                                                      n/a       7-Future
## 292                                                      n/a        4-Added
## 293                                                      n/a       7-Future
## 294                                                      n/a       7-Future
## 295                                                      n/a       7-Future
## 296                                                      n/a       7-Future
## 297                                                      n/a       7-Future
## 298                                                      n/a       7-Future
## 299                                   6-Not a Title I school        4-Added
## 300                                   6-Not a Title I school        4-Added
## 301                                                      n/a       7-Future
## 302                                                      n/a       7-Future
## 303                                                      n/a       7-Future
## 304                                                      n/a        4-Added
## 305                                                      n/a       7-Future
## 306                                                      n/a        4-Added
## 307                     2-Title I targeted assistance school        4-Added
## 308                                                      n/a       7-Future
## 309                                                      n/a       7-Future
## 310                              5-Title I schoolwide school        4-Added
## 311                                                      n/a       7-Future
## 312                                                      n/a       7-Future
## 313                                                      n/a       7-Future
## 314                                                      n/a       7-Future
## 315                                                      n/a       7-Future
## 316                                                      n/a       7-Future
## 317                                                      n/a       7-Future
## 318                                                      n/a       7-Future
## 319                                                      n/a       7-Future
## 320                                                      n/a       7-Future
## 321                                                      n/a        4-Added
## 322                                                      n/a       7-Future
## 323                                                      n/a       7-Future
## 324                                                      n/a       7-Future
## 325                                                      n/a       7-Future
## 326                                                      n/a       7-Future
## 327                                                      n/a       7-Future
## 328                                                      n/a       7-Future
## 329                                                      n/a        4-Added
## 330                              5-Title I schoolwide school        4-Added
## 331                                                      n/a        4-Added
## 332                                                      n/a       7-Future
## 333                                                      n/a       7-Future
## 334                                                      n/a        4-Added
## 335                                                      n/a       7-Future
## 336                                                      n/a       7-Future
## 337                                                      n/a       7-Future
## 338                                                      n/a       7-Future
## 339                                                      n/a       7-Future
## 340                                                      n/a       7-Future
## 341                                                      n/a       7-Future
## 342                                                      n/a       7-Future
## 343                                                      n/a       7-Future
## 344                                                      n/a       7-Future
## 345                                                      n/a       7-Future
## 346                                                      n/a       7-Future
## 347                                                      n/a       7-Future
## 348                                                      n/a       7-Future
## 349                                                      n/a       7-Future
## 350                                                      n/a       7-Future
## 351                                                      n/a       7-Future
## 352                                                      n/a       7-Future
## 353                                                      n/a       7-Future
## 354                                                      n/a       7-Future
## 355                                                      n/a       7-Future
## 356                                                      n/a       7-Future
## 357                                                      n/a       7-Future
## 358                                                      n/a       7-Future
## 359                                                      n/a        4-Added
## 360                                                      n/a       7-Future
## 361                                                      n/a       7-Future
## 362                                                      n/a       7-Future
## 363                                                      n/a       7-Future
## 364                                                      n/a       7-Future
## 365                                                      n/a       7-Future
## 366                                                      n/a       7-Future
## 367                                                      n/a       7-Future
## 368                                                      n/a       7-Future
## 369                                                      n/a       7-Future
## 370                                                      n/a       7-Future
## 371                                                      n/a       7-Future
## 372                                                      n/a       7-Future
## 373                                                      n/a       7-Future
## 374                                                      n/a       7-Future
## 375                                                      n/a        4-Added
## 376                                                      n/a       7-Future
## 377                                                      n/a       7-Future
## 378                                                      n/a       7-Future
## 379                                                      n/a       7-Future
## 380                                                      n/a       7-Future
## 381                                                      n/a       7-Future
## 382                                                      n/a       7-Future
## 383                                   6-Not a Title I school        4-Added
## 384                                                      n/a        4-Added
## 385                                                      n/a       7-Future
## 386                                                      n/a       7-Future
## 387                                                      n/a       7-Future
## 388                                                      n/a       7-Future
## 389                                                      n/a       7-Future
## 390                                                      n/a       7-Future
## 391                                                      n/a       7-Future
## 392                                                      n/a        4-Added
## 393                                                      n/a       7-Future
## 394                                                      n/a       7-Future
## 395                                                      n/a       7-Future
## 396                                                      n/a       7-Future
##                                                                        Agency.Type
## 1   1-Regular local school district that is NOT a component of a supervisory union
## 2   1-Regular local school district that is NOT a component of a supervisory union
## 3   1-Regular local school district that is NOT a component of a supervisory union
## 4   1-Regular local school district that is NOT a component of a supervisory union
## 5   1-Regular local school district that is NOT a component of a supervisory union
## 6   1-Regular local school district that is NOT a component of a supervisory union
## 7                                                   7-Independent Charter District
## 8                                                   7-Independent Charter District
## 9   1-Regular local school district that is NOT a component of a supervisory union
## 10  1-Regular local school district that is NOT a component of a supervisory union
## 11                                                  7-Independent Charter District
## 12  1-Regular local school district that is NOT a component of a supervisory union
## 13                                                  7-Independent Charter District
## 14                                                  7-Independent Charter District
## 15  1-Regular local school district that is NOT a component of a supervisory union
## 16  1-Regular local school district that is NOT a component of a supervisory union
## 17  1-Regular local school district that is NOT a component of a supervisory union
## 18  1-Regular local school district that is NOT a component of a supervisory union
## 19                                                  7-Independent Charter District
## 20  1-Regular local school district that is NOT a component of a supervisory union
## 21  1-Regular local school district that is NOT a component of a supervisory union
## 22                                                  7-Independent Charter District
## 23  1-Regular local school district that is NOT a component of a supervisory union
## 24                                                  7-Independent Charter District
## 25                                                  7-Independent Charter District
## 26  1-Regular local school district that is NOT a component of a supervisory union
## 27  1-Regular local school district that is NOT a component of a supervisory union
## 28  1-Regular local school district that is NOT a component of a supervisory union
## 29  1-Regular local school district that is NOT a component of a supervisory union
## 30  1-Regular local school district that is NOT a component of a supervisory union
## 31  1-Regular local school district that is NOT a component of a supervisory union
## 32  1-Regular local school district that is NOT a component of a supervisory union
## 33                                                  7-Independent Charter District
## 34  1-Regular local school district that is NOT a component of a supervisory union
## 35                                                  7-Independent Charter District
## 36  1-Regular local school district that is NOT a component of a supervisory union
## 37  1-Regular local school district that is NOT a component of a supervisory union
## 38  1-Regular local school district that is NOT a component of a supervisory union
## 39  1-Regular local school district that is NOT a component of a supervisory union
## 40  1-Regular local school district that is NOT a component of a supervisory union
## 41  1-Regular local school district that is NOT a component of a supervisory union
## 42  1-Regular local school district that is NOT a component of a supervisory union
## 43  1-Regular local school district that is NOT a component of a supervisory union
## 44  1-Regular local school district that is NOT a component of a supervisory union
## 45  1-Regular local school district that is NOT a component of a supervisory union
## 46  1-Regular local school district that is NOT a component of a supervisory union
## 47  1-Regular local school district that is NOT a component of a supervisory union
## 48                                                  7-Independent Charter District
## 49  1-Regular local school district that is NOT a component of a supervisory union
## 50  1-Regular local school district that is NOT a component of a supervisory union
## 51  1-Regular local school district that is NOT a component of a supervisory union
## 52  1-Regular local school district that is NOT a component of a supervisory union
## 53  1-Regular local school district that is NOT a component of a supervisory union
## 54  1-Regular local school district that is NOT a component of a supervisory union
## 55  1-Regular local school district that is NOT a component of a supervisory union
## 56  1-Regular local school district that is NOT a component of a supervisory union
## 57  1-Regular local school district that is NOT a component of a supervisory union
## 58  1-Regular local school district that is NOT a component of a supervisory union
## 59                                                  7-Independent Charter District
## 60                                                  7-Independent Charter District
## 61  1-Regular local school district that is NOT a component of a supervisory union
## 62                                                  7-Independent Charter District
## 63                                                  7-Independent Charter District
## 64  1-Regular local school district that is NOT a component of a supervisory union
## 65                                                  7-Independent Charter District
## 66  1-Regular local school district that is NOT a component of a supervisory union
## 67  1-Regular local school district that is NOT a component of a supervisory union
## 68  1-Regular local school district that is NOT a component of a supervisory union
## 69  1-Regular local school district that is NOT a component of a supervisory union
## 70  1-Regular local school district that is NOT a component of a supervisory union
## 71  1-Regular local school district that is NOT a component of a supervisory union
## 72  1-Regular local school district that is NOT a component of a supervisory union
## 73                                      4-Regional Education Service Agency (RESA)
## 74  1-Regular local school district that is NOT a component of a supervisory union
## 75  1-Regular local school district that is NOT a component of a supervisory union
## 76  1-Regular local school district that is NOT a component of a supervisory union
## 77  1-Regular local school district that is NOT a component of a supervisory union
## 78  1-Regular local school district that is NOT a component of a supervisory union
## 79  1-Regular local school district that is NOT a component of a supervisory union
## 80  1-Regular local school district that is NOT a component of a supervisory union
## 81                                                  7-Independent Charter District
## 82  1-Regular local school district that is NOT a component of a supervisory union
## 83  1-Regular local school district that is NOT a component of a supervisory union
## 84  1-Regular local school district that is NOT a component of a supervisory union
## 85  1-Regular local school district that is NOT a component of a supervisory union
## 86          5-State agency providing elementary and/or secondary level instruction
## 87                                      4-Regional Education Service Agency (RESA)
## 88  1-Regular local school district that is NOT a component of a supervisory union
## 89  1-Regular local school district that is NOT a component of a supervisory union
## 90                                                  7-Independent Charter District
## 91  1-Regular local school district that is NOT a component of a supervisory union
## 92  1-Regular local school district that is NOT a component of a supervisory union
## 93                                                  7-Independent Charter District
## 94  1-Regular local school district that is NOT a component of a supervisory union
## 95  1-Regular local school district that is NOT a component of a supervisory union
## 96  1-Regular local school district that is NOT a component of a supervisory union
## 97  1-Regular local school district that is NOT a component of a supervisory union
## 98  1-Regular local school district that is NOT a component of a supervisory union
## 99  1-Regular local school district that is NOT a component of a supervisory union
## 100 1-Regular local school district that is NOT a component of a supervisory union
## 101 1-Regular local school district that is NOT a component of a supervisory union
## 102 1-Regular local school district that is NOT a component of a supervisory union
## 103 1-Regular local school district that is NOT a component of a supervisory union
## 104 1-Regular local school district that is NOT a component of a supervisory union
## 105 1-Regular local school district that is NOT a component of a supervisory union
## 106 1-Regular local school district that is NOT a component of a supervisory union
## 107                                                 7-Independent Charter District
## 108                                                 7-Independent Charter District
## 109                                                 7-Independent Charter District
## 110 1-Regular local school district that is NOT a component of a supervisory union
## 111 1-Regular local school district that is NOT a component of a supervisory union
## 112 1-Regular local school district that is NOT a component of a supervisory union
## 113 1-Regular local school district that is NOT a component of a supervisory union
## 114                                     4-Regional Education Service Agency (RESA)
## 115 1-Regular local school district that is NOT a component of a supervisory union
## 116                                     4-Regional Education Service Agency (RESA)
## 117                                     4-Regional Education Service Agency (RESA)
## 118 1-Regular local school district that is NOT a component of a supervisory union
## 119                                                 7-Independent Charter District
## 120                                                 7-Independent Charter District
## 121 1-Regular local school district that is NOT a component of a supervisory union
## 122                                           9-Specialized public school district
## 123 1-Regular local school district that is NOT a component of a supervisory union
## 124 1-Regular local school district that is NOT a component of a supervisory union
## 125 1-Regular local school district that is NOT a component of a supervisory union
## 126 1-Regular local school district that is NOT a component of a supervisory union
## 127 1-Regular local school district that is NOT a component of a supervisory union
## 128 1-Regular local school district that is NOT a component of a supervisory union
## 129                                     4-Regional Education Service Agency (RESA)
## 130                                     4-Regional Education Service Agency (RESA)
## 131                                                 7-Independent Charter District
## 132 1-Regular local school district that is NOT a component of a supervisory union
## 133                                                 7-Independent Charter District
## 134 1-Regular local school district that is NOT a component of a supervisory union
## 135 1-Regular local school district that is NOT a component of a supervisory union
## 136                                                 7-Independent Charter District
## 137 1-Regular local school district that is NOT a component of a supervisory union
## 138                                                 7-Independent Charter District
## 139                                     4-Regional Education Service Agency (RESA)
## 140                                                 7-Independent Charter District
## 141 1-Regular local school district that is NOT a component of a supervisory union
## 142 1-Regular local school district that is NOT a component of a supervisory union
## 143                                                 7-Independent Charter District
## 144 1-Regular local school district that is NOT a component of a supervisory union
## 145 1-Regular local school district that is NOT a component of a supervisory union
## 146 1-Regular local school district that is NOT a component of a supervisory union
## 147 1-Regular local school district that is NOT a component of a supervisory union
## 148 1-Regular local school district that is NOT a component of a supervisory union
## 149                                                 7-Independent Charter District
## 150 1-Regular local school district that is NOT a component of a supervisory union
## 151 1-Regular local school district that is NOT a component of a supervisory union
## 152                                                 7-Independent Charter District
## 153 1-Regular local school district that is NOT a component of a supervisory union
## 154 1-Regular local school district that is NOT a component of a supervisory union
## 155                                                 7-Independent Charter District
## 156 1-Regular local school district that is NOT a component of a supervisory union
## 157                                                 7-Independent Charter District
## 158 1-Regular local school district that is NOT a component of a supervisory union
## 159 1-Regular local school district that is NOT a component of a supervisory union
## 160                                                 7-Independent Charter District
## 161                                                 7-Independent Charter District
## 162 1-Regular local school district that is NOT a component of a supervisory union
## 163                                                 7-Independent Charter District
## 164                                                 7-Independent Charter District
## 165                                                 7-Independent Charter District
## 166                                                 7-Independent Charter District
## 167 1-Regular local school district that is NOT a component of a supervisory union
## 168                                                 7-Independent Charter District
## 169 1-Regular local school district that is NOT a component of a supervisory union
## 170 1-Regular local school district that is NOT a component of a supervisory union
## 171 1-Regular local school district that is NOT a component of a supervisory union
## 172                                                 7-Independent Charter District
## 173 1-Regular local school district that is NOT a component of a supervisory union
## 174                                     4-Regional Education Service Agency (RESA)
## 175 1-Regular local school district that is NOT a component of a supervisory union
## 176 1-Regular local school district that is NOT a component of a supervisory union
## 177 1-Regular local school district that is NOT a component of a supervisory union
## 178                                                 7-Independent Charter District
## 179                                                 7-Independent Charter District
## 180 1-Regular local school district that is NOT a component of a supervisory union
## 181 1-Regular local school district that is NOT a component of a supervisory union
## 182                                                 7-Independent Charter District
## 183                                     4-Regional Education Service Agency (RESA)
## 184                                     4-Regional Education Service Agency (RESA)
## 185                                     4-Regional Education Service Agency (RESA)
## 186                                                 7-Independent Charter District
## 187 1-Regular local school district that is NOT a component of a supervisory union
## 188 1-Regular local school district that is NOT a component of a supervisory union
## 189 1-Regular local school district that is NOT a component of a supervisory union
## 190 1-Regular local school district that is NOT a component of a supervisory union
## 191                                                 7-Independent Charter District
## 192                                                 7-Independent Charter District
## 193                                                 7-Independent Charter District
## 194 1-Regular local school district that is NOT a component of a supervisory union
## 195 1-Regular local school district that is NOT a component of a supervisory union
## 196 1-Regular local school district that is NOT a component of a supervisory union
## 197 1-Regular local school district that is NOT a component of a supervisory union
## 198 1-Regular local school district that is NOT a component of a supervisory union
## 199 1-Regular local school district that is NOT a component of a supervisory union
## 200 1-Regular local school district that is NOT a component of a supervisory union
## 201                                                 7-Independent Charter District
## 202                                                 7-Independent Charter District
## 203 1-Regular local school district that is NOT a component of a supervisory union
## 204 1-Regular local school district that is NOT a component of a supervisory union
## 205 1-Regular local school district that is NOT a component of a supervisory union
## 206 1-Regular local school district that is NOT a component of a supervisory union
## 207 1-Regular local school district that is NOT a component of a supervisory union
## 208 1-Regular local school district that is NOT a component of a supervisory union
## 209 1-Regular local school district that is NOT a component of a supervisory union
## 210 1-Regular local school district that is NOT a component of a supervisory union
## 211 1-Regular local school district that is NOT a component of a supervisory union
## 212 1-Regular local school district that is NOT a component of a supervisory union
## 213 1-Regular local school district that is NOT a component of a supervisory union
## 214 1-Regular local school district that is NOT a component of a supervisory union
## 215 1-Regular local school district that is NOT a component of a supervisory union
## 216 1-Regular local school district that is NOT a component of a supervisory union
## 217 1-Regular local school district that is NOT a component of a supervisory union
## 218 1-Regular local school district that is NOT a component of a supervisory union
## 219 1-Regular local school district that is NOT a component of a supervisory union
## 220 1-Regular local school district that is NOT a component of a supervisory union
## 221 1-Regular local school district that is NOT a component of a supervisory union
## 222 1-Regular local school district that is NOT a component of a supervisory union
## 223 1-Regular local school district that is NOT a component of a supervisory union
## 224 1-Regular local school district that is NOT a component of a supervisory union
## 225 1-Regular local school district that is NOT a component of a supervisory union
## 226                                                 7-Independent Charter District
## 227                                                 7-Independent Charter District
## 228                                                 7-Independent Charter District
## 229 1-Regular local school district that is NOT a component of a supervisory union
## 230                                                 7-Independent Charter District
## 231 1-Regular local school district that is NOT a component of a supervisory union
## 232 1-Regular local school district that is NOT a component of a supervisory union
## 233                                     4-Regional Education Service Agency (RESA)
## 234 1-Regular local school district that is NOT a component of a supervisory union
## 235 1-Regular local school district that is NOT a component of a supervisory union
## 236                                                 7-Independent Charter District
## 237 1-Regular local school district that is NOT a component of a supervisory union
## 238 1-Regular local school district that is NOT a component of a supervisory union
## 239 1-Regular local school district that is NOT a component of a supervisory union
## 240 1-Regular local school district that is NOT a component of a supervisory union
## 241 1-Regular local school district that is NOT a component of a supervisory union
## 242 1-Regular local school district that is NOT a component of a supervisory union
## 243 1-Regular local school district that is NOT a component of a supervisory union
## 244 1-Regular local school district that is NOT a component of a supervisory union
## 245 1-Regular local school district that is NOT a component of a supervisory union
## 246 1-Regular local school district that is NOT a component of a supervisory union
## 247 1-Regular local school district that is NOT a component of a supervisory union
## 248 1-Regular local school district that is NOT a component of a supervisory union
## 249 1-Regular local school district that is NOT a component of a supervisory union
## 250 1-Regular local school district that is NOT a component of a supervisory union
## 251 1-Regular local school district that is NOT a component of a supervisory union
## 252 1-Regular local school district that is NOT a component of a supervisory union
## 253                                                 7-Independent Charter District
## 254 1-Regular local school district that is NOT a component of a supervisory union
## 255 1-Regular local school district that is NOT a component of a supervisory union
## 256                                                 7-Independent Charter District
## 257                                                 7-Independent Charter District
## 258 1-Regular local school district that is NOT a component of a supervisory union
## 259 1-Regular local school district that is NOT a component of a supervisory union
## 260 1-Regular local school district that is NOT a component of a supervisory union
## 261                                     4-Regional Education Service Agency (RESA)
## 262 1-Regular local school district that is NOT a component of a supervisory union
## 263 1-Regular local school district that is NOT a component of a supervisory union
## 264 1-Regular local school district that is NOT a component of a supervisory union
## 265         5-State agency providing elementary and/or secondary level instruction
## 266 1-Regular local school district that is NOT a component of a supervisory union
## 267 1-Regular local school district that is NOT a component of a supervisory union
## 268 1-Regular local school district that is NOT a component of a supervisory union
## 269                                                 7-Independent Charter District
## 270 1-Regular local school district that is NOT a component of a supervisory union
## 271 1-Regular local school district that is NOT a component of a supervisory union
## 272 1-Regular local school district that is NOT a component of a supervisory union
## 273 1-Regular local school district that is NOT a component of a supervisory union
## 274                                     4-Regional Education Service Agency (RESA)
## 275                                                 7-Independent Charter District
## 276 1-Regular local school district that is NOT a component of a supervisory union
## 277                                     4-Regional Education Service Agency (RESA)
## 278 1-Regular local school district that is NOT a component of a supervisory union
## 279 1-Regular local school district that is NOT a component of a supervisory union
## 280 1-Regular local school district that is NOT a component of a supervisory union
## 281 1-Regular local school district that is NOT a component of a supervisory union
## 282 1-Regular local school district that is NOT a component of a supervisory union
## 283                                                 7-Independent Charter District
## 284 1-Regular local school district that is NOT a component of a supervisory union
## 285                                                 7-Independent Charter District
## 286                                                 7-Independent Charter District
## 287                                                 7-Independent Charter District
## 288             2-Local school district that is a component of a supervisory union
## 289 1-Regular local school district that is NOT a component of a supervisory union
## 290                                                 7-Independent Charter District
## 291 1-Regular local school district that is NOT a component of a supervisory union
## 292                                     4-Regional Education Service Agency (RESA)
## 293 1-Regular local school district that is NOT a component of a supervisory union
## 294 1-Regular local school district that is NOT a component of a supervisory union
## 295 1-Regular local school district that is NOT a component of a supervisory union
## 296 1-Regular local school district that is NOT a component of a supervisory union
## 297 1-Regular local school district that is NOT a component of a supervisory union
## 298 1-Regular local school district that is NOT a component of a supervisory union
## 299 1-Regular local school district that is NOT a component of a supervisory union
## 300 1-Regular local school district that is NOT a component of a supervisory union
## 301 1-Regular local school district that is NOT a component of a supervisory union
## 302 1-Regular local school district that is NOT a component of a supervisory union
## 303                                                 7-Independent Charter District
## 304                                     4-Regional Education Service Agency (RESA)
## 305                                                 7-Independent Charter District
## 306 1-Regular local school district that is NOT a component of a supervisory union
## 307 1-Regular local school district that is NOT a component of a supervisory union
## 308                                                 7-Independent Charter District
## 309 1-Regular local school district that is NOT a component of a supervisory union
## 310 1-Regular local school district that is NOT a component of a supervisory union
## 311 1-Regular local school district that is NOT a component of a supervisory union
## 312 1-Regular local school district that is NOT a component of a supervisory union
## 313                                     4-Regional Education Service Agency (RESA)
## 314 1-Regular local school district that is NOT a component of a supervisory union
## 315 1-Regular local school district that is NOT a component of a supervisory union
## 316 1-Regular local school district that is NOT a component of a supervisory union
## 317 1-Regular local school district that is NOT a component of a supervisory union
## 318 1-Regular local school district that is NOT a component of a supervisory union
## 319 1-Regular local school district that is NOT a component of a supervisory union
## 320 1-Regular local school district that is NOT a component of a supervisory union
## 321 1-Regular local school district that is NOT a component of a supervisory union
## 322         5-State agency providing elementary and/or secondary level instruction
## 323 1-Regular local school district that is NOT a component of a supervisory union
## 324                                                 7-Independent Charter District
## 325 1-Regular local school district that is NOT a component of a supervisory union
## 326 1-Regular local school district that is NOT a component of a supervisory union
## 327 1-Regular local school district that is NOT a component of a supervisory union
## 328 1-Regular local school district that is NOT a component of a supervisory union
## 329                                     4-Regional Education Service Agency (RESA)
## 330                                                 7-Independent Charter District
## 331 1-Regular local school district that is NOT a component of a supervisory union
## 332 1-Regular local school district that is NOT a component of a supervisory union
## 333 1-Regular local school district that is NOT a component of a supervisory union
## 334 1-Regular local school district that is NOT a component of a supervisory union
## 335 1-Regular local school district that is NOT a component of a supervisory union
## 336 1-Regular local school district that is NOT a component of a supervisory union
## 337 1-Regular local school district that is NOT a component of a supervisory union
## 338 1-Regular local school district that is NOT a component of a supervisory union
## 339 1-Regular local school district that is NOT a component of a supervisory union
## 340 1-Regular local school district that is NOT a component of a supervisory union
## 341 1-Regular local school district that is NOT a component of a supervisory union
## 342                                                 7-Independent Charter District
## 343                                                 7-Independent Charter District
## 344                                                 7-Independent Charter District
## 345 1-Regular local school district that is NOT a component of a supervisory union
## 346                                                 7-Independent Charter District
## 347 1-Regular local school district that is NOT a component of a supervisory union
## 348 1-Regular local school district that is NOT a component of a supervisory union
## 349 1-Regular local school district that is NOT a component of a supervisory union
## 350 1-Regular local school district that is NOT a component of a supervisory union
## 351 1-Regular local school district that is NOT a component of a supervisory union
## 352 1-Regular local school district that is NOT a component of a supervisory union
## 353 1-Regular local school district that is NOT a component of a supervisory union
## 354 1-Regular local school district that is NOT a component of a supervisory union
## 355 1-Regular local school district that is NOT a component of a supervisory union
## 356                                                 7-Independent Charter District
## 357 1-Regular local school district that is NOT a component of a supervisory union
## 358 1-Regular local school district that is NOT a component of a supervisory union
## 359 1-Regular local school district that is NOT a component of a supervisory union
## 360                                                 7-Independent Charter District
## 361 1-Regular local school district that is NOT a component of a supervisory union
## 362                                                 7-Independent Charter District
## 363 1-Regular local school district that is NOT a component of a supervisory union
## 364 1-Regular local school district that is NOT a component of a supervisory union
## 365                                                 7-Independent Charter District
## 366                                     4-Regional Education Service Agency (RESA)
## 367         5-State agency providing elementary and/or secondary level instruction
## 368         5-State agency providing elementary and/or secondary level instruction
## 369         5-State agency providing elementary and/or secondary level instruction
## 370 1-Regular local school district that is NOT a component of a supervisory union
## 371 1-Regular local school district that is NOT a component of a supervisory union
## 372 1-Regular local school district that is NOT a component of a supervisory union
## 373 1-Regular local school district that is NOT a component of a supervisory union
## 374 1-Regular local school district that is NOT a component of a supervisory union
## 375 1-Regular local school district that is NOT a component of a supervisory union
## 376                                                 7-Independent Charter District
## 377 1-Regular local school district that is NOT a component of a supervisory union
## 378 1-Regular local school district that is NOT a component of a supervisory union
## 379 1-Regular local school district that is NOT a component of a supervisory union
## 380 1-Regular local school district that is NOT a component of a supervisory union
## 381 1-Regular local school district that is NOT a component of a supervisory union
## 382 1-Regular local school district that is NOT a component of a supervisory union
## 383                                     4-Regional Education Service Agency (RESA)
## 384 1-Regular local school district that is NOT a component of a supervisory union
## 385 1-Regular local school district that is NOT a component of a supervisory union
## 386 1-Regular local school district that is NOT a component of a supervisory union
## 387 1-Regular local school district that is NOT a component of a supervisory union
## 388 1-Regular local school district that is NOT a component of a supervisory union
## 389 1-Regular local school district that is NOT a component of a supervisory union
## 390                                                 7-Independent Charter District
## 391 1-Regular local school district that is NOT a component of a supervisory union
## 392 1-Regular local school district that is NOT a component of a supervisory union
## 393 1-Regular local school district that is NOT a component of a supervisory union
## 394 1-Regular local school district that is NOT a component of a supervisory union
## 395 1-Regular local school district that is NOT a component of a supervisory union
## 396                                                 7-Independent Charter District
##                    School.Type Members Male Female FTE.Equivalent
## 1   4-Alternative/other school       0    0      0              0
## 2             1-Regular school     n/a  n/a    n/a            n/a
## 3             1-Regular school     n/a  n/a    n/a            n/a
## 4             1-Regular school     n/a  n/a    n/a            n/a
## 5             1-Regular school     n/a  n/a    n/a            n/a
## 6   4-Alternative/other school     n/a  n/a    n/a            n/a
## 7             1-Regular school     n/a  n/a    n/a            n/a
## 8             1-Regular school     n/a  n/a    n/a            n/a
## 9             1-Regular school     n/a  n/a    n/a            n/a
## 10            1-Regular school     n/a  n/a    n/a            n/a
## 11            1-Regular school     n/a  n/a    n/a            n/a
## 12            1-Regular school     n/a  n/a    n/a            n/a
## 13            1-Regular school     n/a  n/a    n/a            n/a
## 14            1-Regular school     n/a  n/a    n/a            n/a
## 15            1-Regular school     n/a  n/a    n/a              0
## 16            1-Regular school     n/a  n/a    n/a            n/a
## 17            1-Regular school     n/a  n/a    n/a            n/a
## 18            1-Regular school     n/a  n/a    n/a            n/a
## 19            1-Regular school     n/a  n/a    n/a            n/a
## 20            1-Regular school     n/a  n/a    n/a              0
## 21            1-Regular school     n/a  n/a    n/a              0
## 22            1-Regular school     143   60     83            5.6
## 23         3-Vocational school     n/a  n/a    n/a            n/a
## 24            1-Regular school     n/a  n/a    n/a            n/a
## 25            1-Regular school     n/a  n/a    n/a            n/a
## 26            1-Regular school     n/a  n/a    n/a            n/a
## 27            1-Regular school     n/a  n/a    n/a            n/a
## 28            1-Regular school     n/a  n/a    n/a            n/a
## 29            1-Regular school     n/a  n/a    n/a            n/a
## 30            1-Regular school     n/a  n/a    n/a            n/a
## 31            1-Regular school     n/a  n/a    n/a            n/a
## 32            1-Regular school     n/a  n/a    n/a           <NA>
## 33            1-Regular school     n/a  n/a    n/a            n/a
## 34            1-Regular school     n/a  n/a    n/a            n/a
## 35            1-Regular school     n/a  n/a    n/a            n/a
## 36            1-Regular school     n/a  n/a    n/a            n/a
## 37            1-Regular school     n/a  n/a    n/a            n/a
## 38            1-Regular school       0    0      0              0
## 39            1-Regular school     n/a  n/a    n/a            n/a
## 40            1-Regular school     n/a  n/a    n/a            n/a
## 41            1-Regular school     n/a  n/a    n/a            n/a
## 42            1-Regular school     n/a  n/a    n/a            n/a
## 43            1-Regular school     n/a  n/a    n/a            n/a
## 44            1-Regular school     n/a  n/a    n/a            n/a
## 45            1-Regular school     n/a  n/a    n/a            n/a
## 46            1-Regular school     n/a  n/a    n/a            n/a
## 47            1-Regular school     n/a  n/a    n/a            n/a
## 48            1-Regular school     n/a  n/a    n/a            n/a
## 49            1-Regular school     n/a  n/a    n/a            n/a
## 50            1-Regular school     n/a  n/a    n/a            n/a
## 51            1-Regular school     n/a  n/a    n/a            n/a
## 52            1-Regular school     n/a  n/a    n/a            n/a
## 53            1-Regular school     n/a  n/a    n/a            n/a
## 54            1-Regular school     373  194    179          25.71
## 55            1-Regular school     423  199    224           25.6
## 56            1-Regular school     n/a  n/a    n/a            n/a
## 57            1-Regular school     n/a  n/a    n/a            n/a
## 58            1-Regular school     n/a  n/a    n/a            n/a
## 59            1-Regular school     n/a  n/a    n/a            n/a
## 60            1-Regular school     n/a  n/a    n/a            n/a
## 61  4-Alternative/other school     n/a  n/a    n/a            n/a
## 62            1-Regular school     n/a  n/a    n/a            n/a
## 63            1-Regular school     n/a  n/a    n/a            n/a
## 64            1-Regular school     n/a  n/a    n/a            n/a
## 65            1-Regular school     n/a  n/a    n/a            n/a
## 66            1-Regular school     n/a  n/a    n/a              0
## 67            1-Regular school     n/a  n/a    n/a            n/a
## 68  4-Alternative/other school     n/a  n/a    n/a            n/a
## 69            1-Regular school     n/a  n/a    n/a            n/a
## 70            1-Regular school     n/a  n/a    n/a            n/a
## 71            1-Regular school     n/a  n/a    n/a            n/a
## 72            1-Regular school     n/a  n/a    n/a            n/a
## 73  2-Special education school     n/a  n/a    n/a            n/a
## 74            1-Regular school     n/a  n/a    n/a            n/a
## 75            1-Regular school     n/a  n/a    n/a              0
## 76            1-Regular school      40   23     17              2
## 77            1-Regular school     n/a  n/a    n/a            n/a
## 78            1-Regular school     n/a  n/a    n/a            n/a
## 79  4-Alternative/other school     n/a  n/a    n/a            n/a
## 80  2-Special education school     n/a  n/a    n/a            n/a
## 81            1-Regular school     148   79     69           <NA>
## 82            1-Regular school     n/a  n/a    n/a            n/a
## 83            1-Regular school     n/a  n/a    n/a            n/a
## 84            1-Regular school     n/a  n/a    n/a            n/a
## 85  4-Alternative/other school      28   28      0           <NA>
## 86  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 87  2-Special education school       5    5    n/a           1.11
## 88            1-Regular school     n/a  n/a    n/a            n/a
## 89            1-Regular school     n/a  n/a    n/a              0
## 90            1-Regular school     n/a  n/a    n/a            n/a
## 91            1-Regular school     n/a  n/a    n/a            n/a
## 92  4-Alternative/other school      11    6      5            0.8
## 93            1-Regular school     n/a  n/a    n/a            n/a
## 94            1-Regular school     n/a  n/a    n/a            n/a
## 95            1-Regular school       0    0      0           <NA>
## 96            1-Regular school     n/a  n/a    n/a            n/a
## 97            1-Regular school     n/a  n/a    n/a            n/a
## 98            1-Regular school     n/a  n/a    n/a            n/a
## 99            1-Regular school     n/a  n/a    n/a            n/a
## 100           1-Regular school     n/a  n/a    n/a            n/a
## 101           1-Regular school     n/a  n/a    n/a            n/a
## 102           1-Regular school     n/a  n/a    n/a            n/a
## 103           1-Regular school     n/a  n/a    n/a              0
## 104           1-Regular school      31   14     17           <NA>
## 105 2-Special education school     n/a  n/a    n/a            n/a
## 106           1-Regular school     n/a  n/a    n/a              0
## 107           1-Regular school     n/a  n/a    n/a            n/a
## 108           1-Regular school     n/a  n/a    n/a            n/a
## 109           1-Regular school     n/a  n/a    n/a            n/a
## 110           1-Regular school     n/a  n/a    n/a            n/a
## 111           1-Regular school     n/a  n/a    n/a            n/a
## 112           1-Regular school     n/a  n/a    n/a            n/a
## 113 4-Alternative/other school     n/a  n/a    n/a            n/a
## 114 2-Special education school       0    0      0              0
## 115           1-Regular school     n/a  n/a    n/a            n/a
## 116 2-Special education school     n/a  n/a    n/a            n/a
## 117 2-Special education school       8    6      2           <NA>
## 118           1-Regular school     n/a  n/a    n/a            n/a
## 119           1-Regular school     n/a  n/a    n/a            n/a
## 120           1-Regular school     n/a  n/a    n/a            n/a
## 121           1-Regular school     n/a  n/a    n/a            n/a
## 122        3-Vocational school     n/a  n/a    n/a           <NA>
## 123           1-Regular school      31   14     17           <NA>
## 124           1-Regular school     n/a  n/a    n/a            n/a
## 125           1-Regular school     n/a  n/a    n/a            n/a
## 126           1-Regular school     n/a  n/a    n/a            n/a
## 127           1-Regular school      23   11     12           <NA>
## 128           1-Regular school     n/a  n/a    n/a            n/a
## 129 2-Special education school      17   13      4           <NA>
## 130 2-Special education school       8    6      2           <NA>
## 131 4-Alternative/other school     n/a  n/a    n/a            n/a
## 132           1-Regular school     n/a  n/a    n/a            n/a
## 133           1-Regular school     n/a  n/a    n/a            n/a
## 134           1-Regular school     n/a  n/a    n/a            n/a
## 135           1-Regular school     n/a  n/a    n/a            n/a
## 136           1-Regular school     n/a  n/a    n/a            n/a
## 137           1-Regular school      43   24     19              3
## 138           1-Regular school     n/a  n/a    n/a            n/a
## 139 4-Alternative/other school     n/a  n/a    n/a              0
## 140           1-Regular school     n/a  n/a    n/a            n/a
## 141           1-Regular school     n/a  n/a    n/a            n/a
## 142           1-Regular school      43   15     28           <NA>
## 143           1-Regular school     n/a  n/a    n/a            n/a
## 144           1-Regular school     n/a  n/a    n/a            n/a
## 145           1-Regular school     n/a  n/a    n/a            n/a
## 146           1-Regular school     n/a  n/a    n/a            n/a
## 147           1-Regular school     n/a  n/a    n/a            n/a
## 148           1-Regular school     140   64     76              0
## 149           1-Regular school     n/a  n/a    n/a            n/a
## 150           1-Regular school     n/a  n/a    n/a              0
## 151           1-Regular school       0    0      0              0
## 152           1-Regular school     n/a  n/a    n/a            n/a
## 153           1-Regular school     n/a  n/a    n/a              0
## 154           1-Regular school     n/a  n/a    n/a            n/a
## 155           1-Regular school     n/a  n/a    n/a            n/a
## 156           1-Regular school     n/a  n/a    n/a            n/a
## 157           1-Regular school     n/a  n/a    n/a            n/a
## 158           1-Regular school     n/a  n/a    n/a            n/a
## 159           1-Regular school     n/a  n/a    n/a            n/a
## 160           1-Regular school     n/a  n/a    n/a            n/a
## 161           1-Regular school     n/a  n/a    n/a            n/a
## 162           1-Regular school     n/a  n/a    n/a            n/a
## 163           1-Regular school     n/a  n/a    n/a            n/a
## 164           1-Regular school     n/a  n/a    n/a            n/a
## 165           1-Regular school     n/a  n/a    n/a            n/a
## 166           1-Regular school     n/a  n/a    n/a            n/a
## 167           1-Regular school     n/a  n/a    n/a            n/a
## 168           1-Regular school     n/a  n/a    n/a            n/a
## 169           1-Regular school     n/a  n/a    n/a            n/a
## 170           1-Regular school     n/a  n/a    n/a            n/a
## 171           1-Regular school     n/a  n/a    n/a            n/a
## 172           1-Regular school     n/a  n/a    n/a            n/a
## 173           1-Regular school     n/a  n/a    n/a            n/a
## 174 4-Alternative/other school       0    0      0              0
## 175           1-Regular school     n/a  n/a    n/a            n/a
## 176           1-Regular school     n/a  n/a    n/a            n/a
## 177           1-Regular school     n/a  n/a    n/a            n/a
## 178           1-Regular school     n/a  n/a    n/a            n/a
## 179           1-Regular school     n/a  n/a    n/a            n/a
## 180           1-Regular school     n/a  n/a    n/a            n/a
## 181           1-Regular school     n/a  n/a    n/a            n/a
## 182           1-Regular school     n/a  n/a    n/a            n/a
## 183 2-Special education school       0    0      0              3
## 184 2-Special education school       0    0      0              0
## 185 2-Special education school       0    0      0              0
## 186           1-Regular school     n/a  n/a    n/a            n/a
## 187           1-Regular school     n/a  n/a    n/a            n/a
## 188           1-Regular school     n/a  n/a    n/a            n/a
## 189           1-Regular school     n/a  n/a    n/a            n/a
## 190           1-Regular school     n/a  n/a    n/a            n/a
## 191           1-Regular school     n/a  n/a    n/a            n/a
## 192           1-Regular school     n/a  n/a    n/a            n/a
## 193           1-Regular school     n/a  n/a    n/a            n/a
## 194           1-Regular school       0    0      0           <NA>
## 195           1-Regular school     n/a  n/a    n/a            n/a
## 196           1-Regular school     n/a  n/a    n/a              0
## 197 4-Alternative/other school      21   21      0              2
## 198           1-Regular school     n/a  n/a    n/a              0
## 199           1-Regular school     n/a  n/a    n/a            n/a
## 200           1-Regular school     n/a  n/a    n/a            n/a
## 201           1-Regular school     n/a  n/a    n/a            n/a
## 202           1-Regular school     n/a  n/a    n/a            n/a
## 203           1-Regular school     n/a  n/a    n/a            n/a
## 204           1-Regular school     n/a  n/a    n/a            n/a
## 205           1-Regular school     n/a  n/a    n/a            n/a
## 206           1-Regular school     n/a  n/a    n/a            n/a
## 207           1-Regular school     n/a  n/a    n/a            n/a
## 208           1-Regular school     n/a  n/a    n/a            n/a
## 209           1-Regular school     n/a  n/a    n/a            n/a
## 210           1-Regular school      72   42     30           <NA>
## 211           1-Regular school     n/a  n/a    n/a              0
## 212           1-Regular school     142   72     70              0
## 213           1-Regular school     n/a  n/a    n/a            n/a
## 214           1-Regular school     n/a  n/a    n/a            n/a
## 215           1-Regular school     n/a  n/a    n/a             10
## 216           1-Regular school     n/a  n/a    n/a              0
## 217           1-Regular school     n/a  n/a    n/a            n/a
## 218           1-Regular school     n/a  n/a    n/a            n/a
## 219           1-Regular school     n/a  n/a    n/a            n/a
## 220           1-Regular school     n/a  n/a    n/a              0
## 221           1-Regular school     n/a  n/a    n/a            n/a
## 222           1-Regular school     n/a  n/a    n/a              0
## 223           1-Regular school     n/a  n/a    n/a            n/a
## 224           1-Regular school     n/a  n/a    n/a            n/a
## 225           1-Regular school     n/a  n/a    n/a            n/a
## 226           1-Regular school     n/a  n/a    n/a            n/a
## 227           1-Regular school     n/a  n/a    n/a            n/a
## 228           1-Regular school     n/a  n/a    n/a            n/a
## 229           1-Regular school     n/a  n/a    n/a            n/a
## 230           1-Regular school     n/a  n/a    n/a            n/a
## 231           1-Regular school     n/a  n/a    n/a            n/a
## 232           1-Regular school     n/a  n/a    n/a            n/a
## 233 2-Special education school      17    9      8           <NA>
## 234           1-Regular school     n/a  n/a    n/a            n/a
## 235           1-Regular school     n/a  n/a    n/a            n/a
## 236           1-Regular school     n/a  n/a    n/a            n/a
## 237           1-Regular school     n/a  n/a    n/a            n/a
## 238           1-Regular school     n/a  n/a    n/a            n/a
## 239           1-Regular school     n/a  n/a    n/a            n/a
## 240           1-Regular school     n/a  n/a    n/a            n/a
## 241           1-Regular school     n/a  n/a    n/a            n/a
## 242           1-Regular school     n/a  n/a    n/a            n/a
## 243           1-Regular school     n/a  n/a    n/a            n/a
## 244           1-Regular school     n/a  n/a    n/a            n/a
## 245           1-Regular school     n/a  n/a    n/a            n/a
## 246           1-Regular school     n/a  n/a    n/a            n/a
## 247           1-Regular school     n/a  n/a    n/a            n/a
## 248           1-Regular school     n/a  n/a    n/a            n/a
## 249           1-Regular school     n/a  n/a    n/a            n/a
## 250           1-Regular school     n/a  n/a    n/a            n/a
## 251           1-Regular school     n/a  n/a    n/a            n/a
## 252           1-Regular school     n/a  n/a    n/a            n/a
## 253           1-Regular school     n/a  n/a    n/a            n/a
## 254 2-Special education school     n/a  n/a    n/a            n/a
## 255 4-Alternative/other school     n/a  n/a    n/a            n/a
## 256           1-Regular school     n/a  n/a    n/a            n/a
## 257           1-Regular school     n/a  n/a    n/a            n/a
## 258           1-Regular school     n/a  n/a    n/a            n/a
## 259           1-Regular school     n/a  n/a    n/a            n/a
## 260           1-Regular school     n/a  n/a    n/a            n/a
## 261 2-Special education school       3    3      0           <NA>
## 262           1-Regular school       8    3      5           <NA>
## 263 2-Special education school      14   13      1            0.5
## 264           1-Regular school     n/a  n/a    n/a            n/a
## 265 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 266           1-Regular school     n/a  n/a    n/a            n/a
## 267           1-Regular school     n/a  n/a    n/a            n/a
## 268           1-Regular school     335  175    160          19.04
## 269           1-Regular school     n/a  n/a    n/a            n/a
## 270           1-Regular school     n/a  n/a    n/a            n/a
## 271           1-Regular school     n/a  n/a    n/a            n/a
## 272           1-Regular school     n/a  n/a    n/a            n/a
## 273           1-Regular school     n/a  n/a    n/a            n/a
## 274 2-Special education school     n/a  n/a    n/a            n/a
## 275           1-Regular school     n/a  n/a    n/a            n/a
## 276           1-Regular school     n/a  n/a    n/a            n/a
## 277 2-Special education school     n/a  n/a    n/a            n/a
## 278           1-Regular school     n/a  n/a    n/a            n/a
## 279           1-Regular school     n/a  n/a    n/a            n/a
## 280           1-Regular school     n/a  n/a    n/a            n/a
## 281           1-Regular school     n/a  n/a    n/a            n/a
## 282           1-Regular school     n/a  n/a    n/a              0
## 283           1-Regular school     n/a  n/a    n/a            n/a
## 284 4-Alternative/other school      10    6      4           <NA>
## 285           1-Regular school     n/a  n/a    n/a            n/a
## 286           1-Regular school     n/a  n/a    n/a            n/a
## 287           1-Regular school     n/a  n/a    n/a            n/a
## 288           1-Regular school     342  272     70          95.04
## 289           1-Regular school     n/a  n/a    n/a            n/a
## 290           1-Regular school     n/a  n/a    n/a            n/a
## 291           1-Regular school     n/a  n/a    n/a            n/a
## 292 2-Special education school     n/a  n/a    n/a           <NA>
## 293           1-Regular school     n/a  n/a    n/a            n/a
## 294 4-Alternative/other school     n/a  n/a    n/a            n/a
## 295           1-Regular school     n/a  n/a    n/a            n/a
## 296           1-Regular school     n/a  n/a    n/a            n/a
## 297           1-Regular school     n/a  n/a    n/a            n/a
## 298           1-Regular school     n/a  n/a    n/a            n/a
## 299           1-Regular school      61   27     34              4
## 300           1-Regular school      30   16     14              2
## 301 4-Alternative/other school     n/a  n/a    n/a            n/a
## 302           1-Regular school     n/a  n/a    n/a            n/a
## 303           1-Regular school     n/a  n/a    n/a            n/a
## 304 2-Special education school       0    0      0              0
## 305           1-Regular school     n/a  n/a    n/a            n/a
## 306           1-Regular school       0    0      0              0
## 307           1-Regular school      73   46     27           5.25
## 308           1-Regular school     n/a  n/a    n/a            n/a
## 309           1-Regular school     n/a  n/a    n/a            n/a
## 310           1-Regular school     561  312    249          33.55
## 311           1-Regular school     n/a  n/a    n/a            n/a
## 312           1-Regular school     n/a  n/a    n/a            n/a
## 313 2-Special education school     n/a  n/a    n/a            n/a
## 314           1-Regular school     n/a  n/a    n/a            n/a
## 315           1-Regular school     n/a  n/a    n/a            n/a
## 316           1-Regular school     n/a  n/a    n/a            n/a
## 317           1-Regular school     n/a  n/a    n/a            n/a
## 318           1-Regular school     n/a  n/a    n/a            n/a
## 319           1-Regular school     n/a  n/a    n/a            n/a
## 320           1-Regular school     n/a  n/a    n/a            n/a
## 321           1-Regular school     n/a  n/a    n/a              0
## 322           1-Regular school     n/a  n/a    n/a            n/a
## 323           1-Regular school     n/a  n/a    n/a            n/a
## 324           1-Regular school     n/a  n/a    n/a            n/a
## 325           1-Regular school     n/a  n/a    n/a            n/a
## 326           1-Regular school     n/a  n/a    n/a            n/a
## 327           1-Regular school     n/a  n/a    n/a            n/a
## 328           1-Regular school     n/a  n/a    n/a            n/a
## 329 2-Special education school       0    0      0              0
## 330           1-Regular school     151   73     78           1.23
## 331           1-Regular school     n/a  n/a    n/a              0
## 332           1-Regular school     n/a  n/a    n/a            n/a
## 333           1-Regular school     n/a  n/a    n/a            n/a
## 334           1-Regular school     n/a  n/a    n/a              0
## 335        3-Vocational school     n/a  n/a    n/a            n/a
## 336           1-Regular school     n/a  n/a    n/a            n/a
## 337           1-Regular school     n/a  n/a    n/a            n/a
## 338           1-Regular school     n/a  n/a    n/a            n/a
## 339           1-Regular school     n/a  n/a    n/a            n/a
## 340           1-Regular school     n/a  n/a    n/a            n/a
## 341           1-Regular school     n/a  n/a    n/a            n/a
## 342           1-Regular school     n/a  n/a    n/a            n/a
## 343           1-Regular school     n/a  n/a    n/a            n/a
## 344           1-Regular school     n/a  n/a    n/a            n/a
## 345           1-Regular school     n/a  n/a    n/a            n/a
## 346           1-Regular school     n/a  n/a    n/a            n/a
## 347           1-Regular school     n/a  n/a    n/a            n/a
## 348           1-Regular school     n/a  n/a    n/a            n/a
## 349           1-Regular school     n/a  n/a    n/a            n/a
## 350           1-Regular school     n/a  n/a    n/a            n/a
## 351           1-Regular school     n/a  n/a    n/a            n/a
## 352           1-Regular school     n/a  n/a    n/a            n/a
## 353 2-Special education school     n/a  n/a    n/a            n/a
## 354           1-Regular school     n/a  n/a    n/a            n/a
## 355           1-Regular school     n/a  n/a    n/a            n/a
## 356           1-Regular school     n/a  n/a    n/a            n/a
## 357           1-Regular school     n/a  n/a    n/a            n/a
## 358           1-Regular school     n/a  n/a    n/a            n/a
## 359           1-Regular school       0    0      0           <NA>
## 360           1-Regular school     n/a  n/a    n/a            n/a
## 361           1-Regular school     n/a  n/a    n/a            n/a
## 362           1-Regular school     n/a  n/a    n/a            n/a
## 363 4-Alternative/other school     n/a  n/a    n/a            n/a
## 364           1-Regular school     n/a  n/a    n/a            n/a
## 365           1-Regular school     n/a  n/a    n/a            n/a
## 366 2-Special education school     n/a  n/a    n/a            n/a
## 367 2-Special education school     n/a  n/a    n/a            n/a
## 368 2-Special education school     n/a  n/a    n/a            n/a
## 369 2-Special education school     n/a  n/a    n/a            n/a
## 370 4-Alternative/other school     n/a  n/a    n/a            n/a
## 371 4-Alternative/other school     n/a  n/a    n/a            n/a
## 372           1-Regular school     n/a  n/a    n/a            n/a
## 373 2-Special education school     n/a  n/a    n/a            n/a
## 374 2-Special education school     n/a  n/a    n/a            n/a
## 375           1-Regular school       0    0      0              0
## 376           1-Regular school     n/a  n/a    n/a            n/a
## 377           1-Regular school     n/a  n/a    n/a            n/a
## 378           1-Regular school     n/a  n/a    n/a            n/a
## 379           1-Regular school     n/a  n/a    n/a            n/a
## 380           1-Regular school     n/a  n/a    n/a            n/a
## 381           1-Regular school     n/a  n/a    n/a            n/a
## 382           1-Regular school     n/a  n/a    n/a            n/a
## 383 2-Special education school       6    5      1           <NA>
## 384           1-Regular school     n/a  n/a    n/a              1
## 385           1-Regular school     n/a  n/a    n/a            n/a
## 386           1-Regular school     n/a  n/a    n/a            n/a
## 387           1-Regular school     n/a  n/a    n/a            n/a
## 388           1-Regular school     n/a  n/a    n/a            n/a
## 389           1-Regular school     n/a  n/a    n/a            n/a
## 390           1-Regular school     n/a  n/a    n/a            n/a
## 391           1-Regular school     n/a  n/a    n/a            n/a
## 392           1-Regular school     n/a  n/a    n/a              0
## 393           1-Regular school     n/a  n/a    n/a            n/a
## 394           1-Regular school     n/a  n/a    n/a            n/a
## 395           1-Regular school     n/a  n/a    n/a            n/a
## 396           1-Regular school     n/a  n/a    n/a            n/a
##     Pupil.Teacher.Ratio
## 1                   n/a
## 2                   n/a
## 3                   n/a
## 4                   n/a
## 5                   n/a
## 6                   n/a
## 7                   n/a
## 8                   n/a
## 9                   n/a
## 10                  n/a
## 11                  n/a
## 12                  n/a
## 13                  n/a
## 14                  n/a
## 15                  n/a
## 16                  n/a
## 17                  n/a
## 18                  n/a
## 19                  n/a
## 20                  n/a
## 21                  n/a
## 22                25.54
## 23                  n/a
## 24                  n/a
## 25                  n/a
## 26                  n/a
## 27                  n/a
## 28                  n/a
## 29                  n/a
## 30                  n/a
## 31                  n/a
## 32                  n/a
## 33                  n/a
## 34                  n/a
## 35                  n/a
## 36                  n/a
## 37                  n/a
## 38                  n/a
## 39                  n/a
## 40                  n/a
## 41                  n/a
## 42                  n/a
## 43                  n/a
## 44                  n/a
## 45                  n/a
## 46                  n/a
## 47                  n/a
## 48                  n/a
## 49                  n/a
## 50                  n/a
## 51                  n/a
## 52                  n/a
## 53                  n/a
## 54                14.51
## 55                16.52
## 56                  n/a
## 57                  n/a
## 58                  n/a
## 59                  n/a
## 60                  n/a
## 61                  n/a
## 62                  n/a
## 63                  n/a
## 64                  n/a
## 65                  n/a
## 66                  n/a
## 67                  n/a
## 68                  n/a
## 69                  n/a
## 70                  n/a
## 71                  n/a
## 72                  n/a
## 73                  n/a
## 74                  n/a
## 75                  n/a
## 76                   20
## 77                  n/a
## 78                  n/a
## 79                  n/a
## 80                  n/a
## 81                  n/a
## 82                  n/a
## 83                  n/a
## 84                  n/a
## 85                  n/a
## 86                  n/a
## 87                  4.5
## 88                  n/a
## 89                  n/a
## 90                  n/a
## 91                  n/a
## 92                13.75
## 93                  n/a
## 94                  n/a
## 95                  n/a
## 96                  n/a
## 97                  n/a
## 98                  n/a
## 99                  n/a
## 100                 n/a
## 101                 n/a
## 102                 n/a
## 103                 n/a
## 104                 n/a
## 105                 n/a
## 106                 n/a
## 107                 n/a
## 108                 n/a
## 109                 n/a
## 110                 n/a
## 111                 n/a
## 112                 n/a
## 113                 n/a
## 114                 n/a
## 115                 n/a
## 116                 n/a
## 117                 n/a
## 118                 n/a
## 119                 n/a
## 120                 n/a
## 121                 n/a
## 122                 n/a
## 123                 n/a
## 124                 n/a
## 125                 n/a
## 126                 n/a
## 127                 n/a
## 128                 n/a
## 129                 n/a
## 130                 n/a
## 131                 n/a
## 132                 n/a
## 133                 n/a
## 134                 n/a
## 135                 n/a
## 136                 n/a
## 137               14.33
## 138                 n/a
## 139                 n/a
## 140                 n/a
## 141                 n/a
## 142                 n/a
## 143                 n/a
## 144                 n/a
## 145                 n/a
## 146                 n/a
## 147                 n/a
## 148                 n/a
## 149                 n/a
## 150                 n/a
## 151                 n/a
## 152                 n/a
## 153                 n/a
## 154                 n/a
## 155                 n/a
## 156                 n/a
## 157                 n/a
## 158                 n/a
## 159                 n/a
## 160                 n/a
## 161                 n/a
## 162                 n/a
## 163                 n/a
## 164                 n/a
## 165                 n/a
## 166                 n/a
## 167                 n/a
## 168                 n/a
## 169                 n/a
## 170                 n/a
## 171                 n/a
## 172                 n/a
## 173                 n/a
## 174                 n/a
## 175                 n/a
## 176                 n/a
## 177                 n/a
## 178                 n/a
## 179                 n/a
## 180                 n/a
## 181                 n/a
## 182                 n/a
## 183                   0
## 184                 n/a
## 185                 n/a
## 186                 n/a
## 187                 n/a
## 188                 n/a
## 189                 n/a
## 190                 n/a
## 191                 n/a
## 192                 n/a
## 193                 n/a
## 194                 n/a
## 195                 n/a
## 196                 n/a
## 197                10.5
## 198                 n/a
## 199                 n/a
## 200                 n/a
## 201                 n/a
## 202                 n/a
## 203                 n/a
## 204                 n/a
## 205                 n/a
## 206                 n/a
## 207                 n/a
## 208                 n/a
## 209                 n/a
## 210                 n/a
## 211                 n/a
## 212                 n/a
## 213                 n/a
## 214                 n/a
## 215                 n/a
## 216                 n/a
## 217                 n/a
## 218                 n/a
## 219                 n/a
## 220                 n/a
## 221                 n/a
## 222                 n/a
## 223                 n/a
## 224                 n/a
## 225                 n/a
## 226                 n/a
## 227                 n/a
## 228                 n/a
## 229                 n/a
## 230                 n/a
## 231                 n/a
## 232                 n/a
## 233                 n/a
## 234                 n/a
## 235                 n/a
## 236                 n/a
## 237                 n/a
## 238                 n/a
## 239                 n/a
## 240                 n/a
## 241                 n/a
## 242                 n/a
## 243                 n/a
## 244                 n/a
## 245                 n/a
## 246                 n/a
## 247                 n/a
## 248                 n/a
## 249                 n/a
## 250                 n/a
## 251                 n/a
## 252                 n/a
## 253                 n/a
## 254                 n/a
## 255                 n/a
## 256                 n/a
## 257                 n/a
## 258                 n/a
## 259                 n/a
## 260                 n/a
## 261                 n/a
## 262                 n/a
## 263                  28
## 264                 n/a
## 265                 n/a
## 266                 n/a
## 267                 n/a
## 268               17.59
## 269                 n/a
## 270                 n/a
## 271                 n/a
## 272                 n/a
## 273                 n/a
## 274                 n/a
## 275                 n/a
## 276                 n/a
## 277                 n/a
## 278                 n/a
## 279                 n/a
## 280                 n/a
## 281                 n/a
## 282                 n/a
## 283                 n/a
## 284                 n/a
## 285                 n/a
## 286                 n/a
## 287                 n/a
## 288                 3.6
## 289                 n/a
## 290                 n/a
## 291                 n/a
## 292                 n/a
## 293                 n/a
## 294                 n/a
## 295                 n/a
## 296                 n/a
## 297                 n/a
## 298                 n/a
## 299               15.25
## 300                  15
## 301                 n/a
## 302                 n/a
## 303                 n/a
## 304                 n/a
## 305                 n/a
## 306                 n/a
## 307                13.9
## 308                 n/a
## 309                 n/a
## 310               16.72
## 311                 n/a
## 312                 n/a
## 313                 n/a
## 314                 n/a
## 315                 n/a
## 316                 n/a
## 317                 n/a
## 318                 n/a
## 319                 n/a
## 320                 n/a
## 321                 n/a
## 322                 n/a
## 323                 n/a
## 324                 n/a
## 325                 n/a
## 326                 n/a
## 327                 n/a
## 328                 n/a
## 329                 n/a
## 330              122.76
## 331                 n/a
## 332                 n/a
## 333                 n/a
## 334                 n/a
## 335                 n/a
## 336                 n/a
## 337                 n/a
## 338                 n/a
## 339                 n/a
## 340                 n/a
## 341                 n/a
## 342                 n/a
## 343                 n/a
## 344                 n/a
## 345                 n/a
## 346                 n/a
## 347                 n/a
## 348                 n/a
## 349                 n/a
## 350                 n/a
## 351                 n/a
## 352                 n/a
## 353                 n/a
## 354                 n/a
## 355                 n/a
## 356                 n/a
## 357                 n/a
## 358                 n/a
## 359                 n/a
## 360                 n/a
## 361                 n/a
## 362                 n/a
## 363                 n/a
## 364                 n/a
## 365                 n/a
## 366                 n/a
## 367                 n/a
## 368                 n/a
## 369                 n/a
## 370                 n/a
## 371                 n/a
## 372                 n/a
## 373                 n/a
## 374                 n/a
## 375                 n/a
## 376                 n/a
## 377                 n/a
## 378                 n/a
## 379                 n/a
## 380                 n/a
## 381                 n/a
## 382                 n/a
## 383                 n/a
## 384                 n/a
## 385                 n/a
## 386                 n/a
## 387                 n/a
## 388                 n/a
## 389                 n/a
## 390                 n/a
## 391                 n/a
## 392                 n/a
## 393                 n/a
## 394                 n/a
## 395                 n/a
## 396                 n/a

There are 396 schools with future or added status. Any schools under the “7-Future” status do not have enrollment information. Some “Added schools” have information on enrollment and some schools do not.

public_school %>% filter(Updated.Status == "5-Changed Boundary/Agency")
##     State.Name ST                                           School.Name
## 1      VERMONT VT                                Addison Central School
## 2     ARKANSAS AR                                   ADKINS PRE-K CENTER
## 3      VERMONT VT                               Albert D. Lawton School
## 4    LOUISIANA LA              Alice M. Harte Elementary Charter School
## 5    LOUISIANA LA                                Audubon Charter School
## 6      VERMONT VT                         Bellows Free Academy UHSD #48
## 7    LOUISIANA LA                         Benjamin Franklin High School
## 8      VERMONT VT                               Bingham Memorial School
## 9      VERMONT VT                                      Braintree School
## 10    MICHIGAN MI                 Brenda Scott Academy for Theatre Arts
## 11   LOUISIANA LA                                     Bricolage Academy
## 12     VERMONT VT                               Bridport Central School
## 13     VERMONT VT                                     Brookfield School
## 14    MICHIGAN MI                         Burns ElementaryMiddle School
## 15  CALIFORNIA CA                              Celerity Himalia Charter
## 16  CALIFORNIA CA                                Celerity Rolas Charter
## 17    MICHIGAN MI                                   Central High School
## 18     VERMONT VT                    Champlain Valley Union High School
## 19     VERMONT VT                              Charlotte Central School
## 20  NEW MEXICO NM                              CIEN AGUAS INTERNATIONAL
## 21    MICHIGAN MI                Consolidated Community School Services
## 22     VERMONT VT                          Crossett Brook Middle School
## 23    MICHIGAN MI                                     Denby High School
## 24    MICHIGAN MI                                          Detroit Prep
## 25       MAINE ME                              Dirigo Elementary School
## 26       MAINE ME                                    Dirigo High School
## 27     VERMONT VT                                   Eden Central School
## 28   LOUISIANA LA                                 Edna Karr High School
## 29   LOUISIANA LA                   Einstein Charter at Sherwood Forest
## 30   LOUISIANA LA     Einstein Charter High School at Sarah Towles Reed
## 31   LOUISIANA LA      Einstein Charter Middle Sch at Sarah Towles Reed
## 32   LOUISIANA LA           Einstein Charter School at Village De L'Est
## 33   LOUISIANA LA                       Eleanor McMain Secondary School
## 34   LOUISIANA LA                                        ENCORE Academy
## 35     VERMONT VT                               Essex Elementary School
## 36     VERMONT VT                                     Essex High School
## 37     VERMONT VT                                   Essex Middle School
## 38     VERMONT VT                               Fairfield Center School
## 39     VERMONT VT                             Fayston Elementary School
## 40     VERMONT VT                            Ferrisburgh Central School
## 41     VERMONT VT                              Founders Memorial School
## 42   LOUISIANA LA              GEO Prep Mid-City of Greater Baton Rouge
## 43     VERMONT VT           Green Mountain Technology and Career Center
## 44     VERMONT VT                             Harwood Union High School
## 45     VERMONT VT                           Harwood Union Middle School
## 46    MICHIGAN MI                                      Ford High School
## 47     VERMONT VT                                       Hiawatha School
## 48     VERMONT VT                           Hinesburg Elementary School
## 49     ARIZONA AZ             Hope College and Career Readiness Academy
## 50     VERMONT VT                           Hyde Park Elementary School
## 51      NEVADA NV                              Independence High School
## 52  NEW MEXICO NM                  INTERNATIONAL SCHOOL AT MESA DEL SOL
## 53    MICHIGAN MI                IshpemingNegauneeNICE Comm Ed Division
## 54   WISCONSIN WI                                     JEDI Virtual K-12
## 55     VERMONT VT                             Johnson Elementary School
## 56  New Mexico NM                                LA RESOLANA LEADERSHIP
## 57   LOUISIANA LA                 Lake Forest Elementary Charter School
## 58     VERMONT VT                            Lamoille Union High School
## 59     VERMONT VT                          Lamoille Union Middle School
## 60   LOUISIANA LA                         Linwood Public Charter School
## 61   LOUISIANA LA                                 Lusher Charter School
## 62  CALIFORNIA CA                              Magnolia Science Academy
## 63  CALIFORNIA CA                            Magnolia Science Academy 2
## 64  CALIFORNIA CA                            Magnolia Science Academy 3
## 65    MICHIGAN MI                                 Law Elementary School
## 66    MICHIGAN MI           Mary McLeod Bethune ElementaryMiddle School
## 67   LOUISIANA LA                            McDonogh 42 Charter School
## 68     VERMONT VT                               Middlebury ID #4 School
## 69     VERMONT VT                          Middlebury Union High School
## 70     VERMONT VT                        Middlebury Union Middle School
## 71     VERMONT VT                            Moretown Elementary School
## 72    MICHIGAN MI                                   Mumford High School
## 73   LOUISIANA LA        New Orleans Charter Science and Mathematics HS
## 74    MICHIGAN MI                         Nolan ElementaryMiddle School
## 75   LOUISIANA LA                             Northshore Charter School
## 76     VERMONT VT                            Northwest Technical Center
## 77  CALIFORNIA CA                              Pacific View Charter 2.0
## 78    MICHIGAN MI                                  Pershing High School
## 79     MONTANA MT                                            Plains 7-8
## 80     MONTANA MT                              Plains Elementary School
## 81     VERMONT VT                            Randolph Elementary School
## 82     VERMONT VT                      Randolph Technical Career Center
## 83     VERMONT VT                            Randolph Union High School
## 84     VERMONT VT                              Ripton Elementary School
## 85   LOUISIANA LA                     Robert Russa Moton Charter School
## 86     VERMONT VT                            Salisbury Community School
## 87     VERMONT VT                            Shelburne Community School
## 88     VERMONT VT                            Shoreham Elementary School
## 89    MICHIGAN MI                              Southeastern High School
## 90     VERMONT VT                     St. Albans City Elementary School
## 91     VERMONT VT                    St. Albans Town Educational Center
## 92     VERMONT VT                                  Summit Street School
## 93     MONTANA MT                                 Surprise Creek School
## 94  CALIFORNIA CA                               Sycamore Valley Academy
## 95       MAINE ME                        T W Kelly Dirigo Middle School
## 96     VERMONT VT                         Thatcher Brook Primary School
## 97     VERMONT VT                     The Center for Technology - Essex
## 98     VERMONT VT                                 Thomas Fleming School
## 99   LOUISIANA LA                                        Thrive Academy
## 100    VERMONT VT                     Vergennes Union Elementary School
## 101    VERMONT VT                           Vergennes Union High School
## 102    VERMONT VT                          Waitsfield Elementary School
## 103    VERMONT VT                              Warren Elementary School
## 104    VERMONT VT                          Waterville Elementary School
## 105    VERMONT VT                            Westford Elementary School
## 106    VERMONT VT                           Weybridge Elementary School
## 107 NEW MEXICO NM WILLIAM W &  JOSEPHINE DORN CHARTER  COMMUNITY SCHOOL
## 108    VERMONT VT                                     Williston Schools
## 109  LOUISIANA LA                                 Wilson Charter School
## 110   COLORADO CO                                YAMPAH MOUNTAIN SCHOOL
##       NCES.SchID                                                  Agency_Name
## 1   500040000000                    Addison Northwest Unified School District
## 2    50041900901                   JACKSONVILLE NORTH PULASKI SCHOOL DISTRICT
## 3   500040000000 Essex-Westford Educational Community Unified School District
## 4   220028000000                      Alice M Harte Elementary Charter School
## 5   220029000000                                       Audubon Charter School
## 6   500040000000                            Maple Run Unified School District
## 7   220030000000                                Benjamin Franklin High School
## 8   500040000000                      Addison Central Unified School District
## 9   500040000000                     Orange Southwest Unified School District
## 10  260110000000                    Detroit Public Schools Community District
## 11  220029000000                                            Bricolage Academy
## 12  500040000000                      Addison Central Unified School District
## 13  500040000000                     Orange Southwest Unified School District
## 14  260110000000                    Detroit Public Schools Community District
## 15   60144612162                                       SBE - Celerity Himalia
## 16   60144812120                                         SBE - Celerity Rolas
## 17  260110000000                    Detroit Public Schools Community District
## 18  500040000000                     Champlain Valley Unified School District
## 19  500040000000                     Champlain Valley Unified School District
## 20  350006000000                                   ALBUQUERQUE PUBLIC SCHOOLS
## 21  261560000000                                Engadine Consolidated Schools
## 22  500040000000                              Harwood Unified School District
## 23  260110000000                    Detroit Public Schools Community District
## 24  260105000000                                  Detroit Achievement Academy
## 25  231483000000                                                       RSU 56
## 26  231483000000                                                       RSU 56
## 27  500040000000                            Lamoille North Modified USD #058A
## 28  220029000000                                        Edna Karr High School
## 29  220029000000                          Einstein Charter at Sherwood Forest
## 30  220030000000            Einstein Charter High School at Sarah Towles Reed
## 31  220028000000             Einstein Charter Middle Sch at Sarah Towles Reed
## 32  220028000000                  Einstein Charter School at Village De L'Est
## 33  220029000000                              Eleanor McMain Secondary School
## 34  220029000000                                               ENCORE Academy
## 35  500040000000 Essex-Westford Educational Community Unified School District
## 36  500040000000 Essex-Westford Educational Community Unified School District
## 37  500040000000 Essex-Westford Educational Community Unified School District
## 38  500040000000                            Maple Run Unified School District
## 39  500040000000                              Harwood Unified School District
## 40  500040000000                    Addison Northwest Unified School District
## 41  500040000000 Essex-Westford Educational Community Unified School District
## 42  220030000000                     GEO Prep Mid-City of Greater Baton Rouge
## 43  500040000000                            Lamoille North Modified USD #058B
## 44  500040000000                              Harwood Unified School District
## 45  500040000000                              Harwood Unified School District
## 46  260110000000                    Detroit Public Schools Community District
## 47  500040000000 Essex-Westford Educational Community Unified School District
## 48  500040000000                     Champlain Valley Unified School District
## 49   40386003535                            Maricopa County Regional District
## 50  500040000000                            Lamoille North Modified USD #058A
## 51  320002000000                                 CORRECTIONAL SCHOOL DISTRICT
## 52  350006000000                                   ALBUQUERQUE PUBLIC SCHOOLS
## 53  261953000000                       Ishpeming Public School District No. 1
## 54  550771000000                              Lake Mills Area School District
## 55  500040000000                            Lamoille North Modified USD #058A
## 56  350006000000                                   ALBUQUERQUE PUBLIC SCHOOLS
## 57  220028000000                        Lake Forest Elementary Charter School
## 58  500040000000                            Lamoille North Modified USD #058B
## 59  500040000000                            Lamoille North Modified USD #058B
## 60  220005000000                                 Recovery School District-LDE
## 61  220030000000                                        Lusher Charter School
## 62   69107810524                       Los Angeles County Office of Education
## 63   69107811842                       Los Angeles County Office of Education
## 64   69107812010                       Los Angeles County Office of Education
## 65  260110000000                    Detroit Public Schools Community District
## 66  260110000000                    Detroit Public Schools Community District
## 67  220028000000                                   McDonogh 42 Charter School
## 68  500040000000                      Addison Central Unified School District
## 69  500040000000                      Addison Central Unified School District
## 70  500040000000                      Addison Central Unified School District
## 71  500040000000                              Harwood Unified School District
## 72  260110000000                    Detroit Public Schools Community District
## 73  220028000000               New Orleans Charter Science and Mathematics HS
## 74  260110000000                    Detroit Public Schools Community District
## 75  220024000000                             City of Bogalusa School District
## 76  500040000000                            Maple Run Unified School District
## 77   60005208486                                          Eureka City Schools
## 78  260110000000                    Detroit Public Schools Community District
## 79  302085000000                                                  Plains K-12
## 80  302085000000                                                  Plains K-12
## 81  500040000000                     Orange Southwest Unified School District
## 82  500040000000                     Orange Southwest Unified School District
## 83  500040000000                     Orange Southwest Unified School District
## 84  500040000000                      Addison Central Unified School District
## 85  220029000000                            Robert Russa Moton Charter School
## 86  500040000000                      Addison Central Unified School District
## 87  500040000000                     Champlain Valley Unified School District
## 88  500040000000                      Addison Central Unified School District
## 89  260110000000                    Detroit Public Schools Community District
## 90  500040000000                            Maple Run Unified School District
## 91  500040000000                            Maple Run Unified School District
## 92  500040000000 Essex-Westford Educational Community Unified School District
## 93  302499000000                                        Stanford K-12 Schools
## 94   69104513015                            Tulare County Office of Education
## 95  231483000000                                                       RSU 56
## 96  500040000000                              Harwood Unified School District
## 97  500040000000 Essex-Westford Educational Community Unified School District
## 98  500040000000 Essex-Westford Educational Community Unified School District
## 99  220029000000                                               Thrive Academy
## 100 500040000000                    Addison Northwest Unified School District
## 101 500040000000                    Addison Northwest Unified School District
## 102 500040000000                              Harwood Unified School District
## 103 500040000000                              Harwood Unified School District
## 104 500040000000                            Lamoille North Modified USD #058A
## 105 500040000000 Essex-Westford Educational Community Unified School District
## 106 500040000000                      Addison Central Unified School District
## 107 350006000000                                   ALBUQUERQUE PUBLIC SCHOOLS
## 108 500040000000                     Champlain Valley Unified School District
## 109 220030000000                                        Wilson Charter School
## 110  80029201503                                         COLORADO RIVER BOCES
##                 County_Name COUNTY.ID Urban.centric.Locale Latitude  Longitude
## 1            Addison County     50001    42-Rural: Distant 44.08794  -73.30500
## 2            Pulaski County      5119     41-Rural: Fringe 34.83923  -92.13725
## 3         Chittenden County     50007  22-Suburb: Mid-size 44.48700  -73.09846
## 4            Orleans Parish     22071       11-City: Large 29.93532  -90.00935
## 5            Orleans Parish     22071       11-City: Large 29.93414  -90.12996
## 6           Franklin County     50011     32-Town: Distant 44.80813  -73.08324
## 7            Orleans Parish     22071       11-City: Large 30.02437  -90.06549
## 8            Addison County     50001     41-Rural: Fringe 43.96401  -73.20651
## 9             Orange County     50017     43-Rural: Remote 43.95570  -72.72235
## 10             Wayne County     26163       11-City: Large 42.42934  -83.00319
## 11           Orleans Parish     22071       11-City: Large 29.98111  -90.08697
## 12           Addison County     50001    42-Rural: Distant 43.98109  -73.31581
## 13            Orange County     50017    42-Rural: Distant 44.01632  -72.60672
## 14             Wayne County     26163       11-City: Large 42.39369  -83.19098
## 15       Los Angeles County      6037       11-City: Large 34.00254 -118.25930
## 16       Los Angeles County      6037       11-City: Large 34.13957 -118.19778
## 17             Wayne County     26163       11-City: Large 42.38363  -83.11181
## 18        Chittenden County     50007    42-Rural: Distant 44.34472  -73.10992
## 19        Chittenden County     50007     41-Rural: Fringe 44.31514  -73.22678
## 20        Bernalillo County     35001       11-City: Large 35.05334 -106.62396
## 21          Chippewa County     26033      33-Town: Remote 46.26054  -84.46587
## 22        Washington County     50023     41-Rural: Fringe 44.32111  -72.75284
## 23             Wayne County     26163       11-City: Large 42.42666  -82.95695
## 24             Wayne County     26163       11-City: Large 42.36235  -82.99794
## 25            Oxford County     23017    42-Rural: Distant 44.52236  -70.45512
## 26            Oxford County     23017    42-Rural: Distant 44.54013  -70.45268
## 27          Lamoille County     50015    42-Rural: Distant 44.70412  -72.56368
## 28           Orleans Parish     22071       11-City: Large 29.92042  -90.00356
## 29           Orleans Parish     22071       11-City: Large 30.02508  -89.95467
## 30           Orleans Parish     22071       11-City: Large 30.04142  -89.93263
## 31           Orleans Parish     22071       11-City: Large 30.04142  -89.93263
## 32           Orleans Parish     22071       11-City: Large 30.04142  -89.93263
## 33           Orleans Parish     22071       11-City: Large 29.94229  -90.11154
## 34           Orleans Parish     22071       11-City: Large 29.98146  -90.09785
## 35        Chittenden County     50007     41-Rural: Fringe 44.51302  -73.05552
## 36        Chittenden County     50007  22-Suburb: Mid-size 44.49763  -73.10851
## 37        Chittenden County     50007  22-Suburb: Mid-size 44.49916  -73.05874
## 38          Franklin County     50011    42-Rural: Distant 44.80055  -72.94790
## 39        Washington County     50023    42-Rural: Distant 44.17919  -72.88418
## 40           Addison County     50001     41-Rural: Fringe 44.20684  -73.24793
## 41        Chittenden County     50007  22-Suburb: Mid-size 44.50044  -73.05532
## 42  East Baton Rouge Parish     22033    12-City: Mid-size 30.46486  -91.11673
## 43          Lamoille County     50015    42-Rural: Distant 44.60196  -72.63065
## 44        Washington County     50023    42-Rural: Distant 44.25406  -72.78648
## 45        Washington County     50023    42-Rural: Distant 44.25406  -72.78648
## 46             Wayne County     26163       11-City: Large 42.43938  -83.23803
## 47        Chittenden County     50007  22-Suburb: Mid-size 44.48903  -73.12789
## 48        Chittenden County     50007    42-Rural: Distant 44.32629  -73.10777
## 49          Maricopa County      4013       11-City: Large 33.38909 -112.04666
## 50          Lamoille County     50015    42-Rural: Distant 44.59206  -72.61360
## 51              Elko County     32007     41-Rural: Fringe 40.88057 -115.72686
## 52        Bernalillo County     35001     41-Rural: Fringe 34.99284 -106.61726
## 53         Marquette County     26103      33-Town: Remote 46.49941  -87.60890
## 54         Jefferson County     55055     41-Rural: Fringe 42.84269  -88.69962
## 55          Lamoille County     50015    42-Rural: Distant 44.63713  -72.67515
## 56        Bernalillo County     35001       11-City: Large 35.08155 -106.58706
## 57           Orleans Parish     22071       11-City: Large 30.03481  -89.96084
## 58          Lamoille County     50015    42-Rural: Distant 44.60138  -72.63070
## 59          Lamoille County     50015    42-Rural: Distant 44.60138  -72.63070
## 60             Caddo Parish     22017    12-City: Mid-size 32.44010  -93.76418
## 61           Orleans Parish     22071       11-City: Large 29.93431  -90.11431
## 62       Los Angeles County      6037       11-City: Large 34.20072 -118.53052
## 63       Los Angeles County      6037       11-City: Large 34.18698 -118.50695
## 64       Los Angeles County      6037       13-City: Small 33.85017 -118.25122
## 65             Wayne County     26163       11-City: Large 42.43806  -83.02980
## 66             Wayne County     26163       11-City: Large 42.40926  -83.15169
## 67           Orleans Parish     22071       11-City: Large 29.97840  -90.07122
## 68           Addison County     50001     32-Town: Distant 44.01054  -73.16161
## 69           Addison County     50001     32-Town: Distant 44.00678  -73.16343
## 70           Addison County     50001     41-Rural: Fringe 43.99831  -73.15257
## 71        Washington County     50023    42-Rural: Distant 44.24751  -72.76261
## 72             Wayne County     26163       11-City: Large 42.42141  -83.16319
## 73           Orleans Parish     22071       11-City: Large 29.93333  -90.11465
## 74             Wayne County     26163       11-City: Large 42.43628  -83.09173
## 75        Washington Parish     22117     41-Rural: Fringe 30.80424  -89.85806
## 76          Franklin County     50011     32-Town: Distant 44.80777  -73.08247
## 77          Humboldt County      6023      33-Town: Remote 40.78352 -124.16922
## 78             Wayne County     26163       11-City: Large 42.43154  -83.06321
## 79           Sanders County     30089     43-Rural: Remote 47.46518 -114.88524
## 80           Sanders County     30089     43-Rural: Remote 47.46518 -114.88524
## 81            Orange County     50017     43-Rural: Remote 43.93400  -72.66039
## 82            Orange County     50017     43-Rural: Remote 43.93173  -72.65918
## 83            Orange County     50017     43-Rural: Remote 43.93095  -72.65970
## 84           Addison County     50001    42-Rural: Distant 43.98524  -73.03824
## 85           Orleans Parish     22071       11-City: Large 30.03940  -89.99605
## 86           Addison County     50001    42-Rural: Distant 43.91984  -73.11792
## 87        Chittenden County     50007  22-Suburb: Mid-size 44.38059  -73.23516
## 88           Addison County     50001    42-Rural: Distant 43.89185  -73.31639
## 89             Wayne County     26163       11-City: Large 42.37511  -82.97797
## 90          Franklin County     50011     32-Town: Distant 44.82033  -73.09150
## 91          Franklin County     50011     32-Town: Distant 44.80150  -73.08610
## 92        Chittenden County     50007  22-Suburb: Mid-size 44.49330  -73.11359
## 93      Judith Basin County     30045     43-Rural: Remote 47.16980 -110.34067
## 94            Tulare County      6107     41-Rural: Fringe 36.29837 -119.42090
## 95            Oxford County     23017    42-Rural: Distant 44.55023  -70.45339
## 96        Washington County     50023     32-Town: Distant 44.33915  -72.75321
## 97        Chittenden County     50007  22-Suburb: Mid-size 44.49825  -73.11018
## 98        Chittenden County     50007  22-Suburb: Mid-size 44.49482  -73.11365
## 99  East Baton Rouge Parish     22033    12-City: Mid-size 30.38807  -91.18835
## 100          Addison County     50001     32-Town: Distant 44.16709  -73.24834
## 101          Addison County     50001     32-Town: Distant 44.17001  -73.24336
## 102       Washington County     50023    42-Rural: Distant 44.19438  -72.81935
## 103       Washington County     50023    42-Rural: Distant 44.11643  -72.85270
## 104         Lamoille County     50015    42-Rural: Distant 44.72682  -72.74837
## 105       Chittenden County     50007    42-Rural: Distant 44.60281  -73.01885
## 106          Addison County     50001     41-Rural: Fringe 44.04176  -73.21230
## 107       Bernalillo County     35001       11-City: Large 35.07187 -106.64349
## 108       Chittenden County     50007  22-Suburb: Mid-size 44.44066  -73.07359
## 109          Orleans Parish     22071       11-City: Large 29.94628  -90.10225
## 110         Garfield County      8045     41-Rural: Fringe 39.54834 -107.33445
##                                                 Title.I.School.Status
## 1                                         5-Title I schoolwide school
## 2                                              6-Not a Title I school
## 3                                2-Title I targeted assistance school
## 4                                         5-Title I schoolwide school
## 5                                         5-Title I schoolwide school
## 6                                              6-Not a Title I school
## 7                                              6-Not a Title I school
## 8                                              6-Not a Title I school
## 9                                         5-Title I schoolwide school
## 10                                        5-Title I schoolwide school
## 11                                             6-Not a Title I school
## 12                                        5-Title I schoolwide school
## 13                                        5-Title I schoolwide school
## 14                                        5-Title I schoolwide school
## 15                                                               <NA>
## 16                                                               <NA>
## 17                                        5-Title I schoolwide school
## 18                                             6-Not a Title I school
## 19                                             6-Not a Title I school
## 20                    4-Title I schoolwide eligible school-No program
## 21           1-Title I targeted assistance eligible school-No program
## 22                                             6-Not a Title I school
## 23                                        5-Title I schoolwide school
## 24                               2-Title I targeted assistance school
## 25                                        5-Title I schoolwide school
## 26                    4-Title I schoolwide eligible school-No program
## 27                                        5-Title I schoolwide school
## 28                                        5-Title I schoolwide school
## 29                                        5-Title I schoolwide school
## 30                                        5-Title I schoolwide school
## 31                                        5-Title I schoolwide school
## 32                                        5-Title I schoolwide school
## 33                                        5-Title I schoolwide school
## 34                                        5-Title I schoolwide school
## 35                               2-Title I targeted assistance school
## 36                                             6-Not a Title I school
## 37                               2-Title I targeted assistance school
## 38                                        5-Title I schoolwide school
## 39                                             6-Not a Title I school
## 40                               2-Title I targeted assistance school
## 41                               2-Title I targeted assistance school
## 42                                        5-Title I schoolwide school
## 43                                                                n/a
## 44                                        5-Title I schoolwide school
## 45                                             6-Not a Title I school
## 46                                        5-Title I schoolwide school
## 47                               2-Title I targeted assistance school
## 48                               2-Title I targeted assistance school
## 49                                             6-Not a Title I school
## 50                                        5-Title I schoolwide school
## 51                                                                n/a
## 52                                        5-Title I schoolwide school
## 53                                             6-Not a Title I school
## 54                                             6-Not a Title I school
## 55                                        5-Title I schoolwide school
## 56                                        5-Title I schoolwide school
## 57                                        5-Title I schoolwide school
## 58                    4-Title I schoolwide eligible school-No program
## 59                    4-Title I schoolwide eligible school-No program
## 60                                        5-Title I schoolwide school
## 61                                             6-Not a Title I school
## 62                                        5-Title I schoolwide school
## 63                                        5-Title I schoolwide school
## 64                                        5-Title I schoolwide school
## 65                                        5-Title I schoolwide school
## 66                                        5-Title I schoolwide school
## 67                                        5-Title I schoolwide school
## 68                                        5-Title I schoolwide school
## 69           1-Title I targeted assistance eligible school-No program
## 70           1-Title I targeted assistance eligible school-No program
## 71                                             6-Not a Title I school
## 72                                        5-Title I schoolwide school
## 73                                        5-Title I schoolwide school
## 74                                        5-Title I schoolwide school
## 75                                                               <NA>
## 76                                                                n/a
## 77                                        5-Title I schoolwide school
## 78                                        5-Title I schoolwide school
## 79                                        5-Title I schoolwide school
## 80                                        5-Title I schoolwide school
## 81                                        5-Title I schoolwide school
## 82                                                                n/a
## 83                                        5-Title I schoolwide school
## 84           1-Title I targeted assistance eligible school-No program
## 85                                        5-Title I schoolwide school
## 86                               2-Title I targeted assistance school
## 87                               2-Title I targeted assistance school
## 88                                        5-Title I schoolwide school
## 89                                        5-Title I schoolwide school
## 90                                        5-Title I schoolwide school
## 91                                             6-Not a Title I school
## 92                               2-Title I targeted assistance school
## 93                    4-Title I schoolwide eligible school-No program
## 94                               2-Title I targeted assistance school
## 95  3-Title I schoolwide eligible-Title I targeted assistance program
## 96                                        5-Title I schoolwide school
## 97                                                                n/a
## 98                               2-Title I targeted assistance school
## 99                                        5-Title I schoolwide school
## 100                                       5-Title I schoolwide school
## 101                              2-Title I targeted assistance school
## 102                                            6-Not a Title I school
## 103                                       5-Title I schoolwide school
## 104                                       5-Title I schoolwide school
## 105                                            6-Not a Title I school
## 106                                            6-Not a Title I school
## 107                                       5-Title I schoolwide school
## 108                              2-Title I targeted assistance school
## 109                                       5-Title I schoolwide school
## 110                                            6-Not a Title I school
##                Updated.Status
## 1   5-Changed Boundary/Agency
## 2   5-Changed Boundary/Agency
## 3   5-Changed Boundary/Agency
## 4   5-Changed Boundary/Agency
## 5   5-Changed Boundary/Agency
## 6   5-Changed Boundary/Agency
## 7   5-Changed Boundary/Agency
## 8   5-Changed Boundary/Agency
## 9   5-Changed Boundary/Agency
## 10  5-Changed Boundary/Agency
## 11  5-Changed Boundary/Agency
## 12  5-Changed Boundary/Agency
## 13  5-Changed Boundary/Agency
## 14  5-Changed Boundary/Agency
## 15  5-Changed Boundary/Agency
## 16  5-Changed Boundary/Agency
## 17  5-Changed Boundary/Agency
## 18  5-Changed Boundary/Agency
## 19  5-Changed Boundary/Agency
## 20  5-Changed Boundary/Agency
## 21  5-Changed Boundary/Agency
## 22  5-Changed Boundary/Agency
## 23  5-Changed Boundary/Agency
## 24  5-Changed Boundary/Agency
## 25  5-Changed Boundary/Agency
## 26  5-Changed Boundary/Agency
## 27  5-Changed Boundary/Agency
## 28  5-Changed Boundary/Agency
## 29  5-Changed Boundary/Agency
## 30  5-Changed Boundary/Agency
## 31  5-Changed Boundary/Agency
## 32  5-Changed Boundary/Agency
## 33  5-Changed Boundary/Agency
## 34  5-Changed Boundary/Agency
## 35  5-Changed Boundary/Agency
## 36  5-Changed Boundary/Agency
## 37  5-Changed Boundary/Agency
## 38  5-Changed Boundary/Agency
## 39  5-Changed Boundary/Agency
## 40  5-Changed Boundary/Agency
## 41  5-Changed Boundary/Agency
## 42  5-Changed Boundary/Agency
## 43  5-Changed Boundary/Agency
## 44  5-Changed Boundary/Agency
## 45  5-Changed Boundary/Agency
## 46  5-Changed Boundary/Agency
## 47  5-Changed Boundary/Agency
## 48  5-Changed Boundary/Agency
## 49  5-Changed Boundary/Agency
## 50  5-Changed Boundary/Agency
## 51  5-Changed Boundary/Agency
## 52  5-Changed Boundary/Agency
## 53  5-Changed Boundary/Agency
## 54  5-Changed Boundary/Agency
## 55  5-Changed Boundary/Agency
## 56  5-Changed Boundary/Agency
## 57  5-Changed Boundary/Agency
## 58  5-Changed Boundary/Agency
## 59  5-Changed Boundary/Agency
## 60  5-Changed Boundary/Agency
## 61  5-Changed Boundary/Agency
## 62  5-Changed Boundary/Agency
## 63  5-Changed Boundary/Agency
## 64  5-Changed Boundary/Agency
## 65  5-Changed Boundary/Agency
## 66  5-Changed Boundary/Agency
## 67  5-Changed Boundary/Agency
## 68  5-Changed Boundary/Agency
## 69  5-Changed Boundary/Agency
## 70  5-Changed Boundary/Agency
## 71  5-Changed Boundary/Agency
## 72  5-Changed Boundary/Agency
## 73  5-Changed Boundary/Agency
## 74  5-Changed Boundary/Agency
## 75  5-Changed Boundary/Agency
## 76  5-Changed Boundary/Agency
## 77  5-Changed Boundary/Agency
## 78  5-Changed Boundary/Agency
## 79  5-Changed Boundary/Agency
## 80  5-Changed Boundary/Agency
## 81  5-Changed Boundary/Agency
## 82  5-Changed Boundary/Agency
## 83  5-Changed Boundary/Agency
## 84  5-Changed Boundary/Agency
## 85  5-Changed Boundary/Agency
## 86  5-Changed Boundary/Agency
## 87  5-Changed Boundary/Agency
## 88  5-Changed Boundary/Agency
## 89  5-Changed Boundary/Agency
## 90  5-Changed Boundary/Agency
## 91  5-Changed Boundary/Agency
## 92  5-Changed Boundary/Agency
## 93  5-Changed Boundary/Agency
## 94  5-Changed Boundary/Agency
## 95  5-Changed Boundary/Agency
## 96  5-Changed Boundary/Agency
## 97  5-Changed Boundary/Agency
## 98  5-Changed Boundary/Agency
## 99  5-Changed Boundary/Agency
## 100 5-Changed Boundary/Agency
## 101 5-Changed Boundary/Agency
## 102 5-Changed Boundary/Agency
## 103 5-Changed Boundary/Agency
## 104 5-Changed Boundary/Agency
## 105 5-Changed Boundary/Agency
## 106 5-Changed Boundary/Agency
## 107 5-Changed Boundary/Agency
## 108 5-Changed Boundary/Agency
## 109 5-Changed Boundary/Agency
## 110 5-Changed Boundary/Agency
##                                                                        Agency.Type
## 1               2-Local school district that is a component of a supervisory union
## 2   1-Regular local school district that is NOT a component of a supervisory union
## 3               2-Local school district that is a component of a supervisory union
## 4                                                   7-Independent Charter District
## 5                                                   7-Independent Charter District
## 6               2-Local school district that is a component of a supervisory union
## 7                                                   7-Independent Charter District
## 8               2-Local school district that is a component of a supervisory union
## 9               2-Local school district that is a component of a supervisory union
## 10  1-Regular local school district that is NOT a component of a supervisory union
## 11                                                  7-Independent Charter District
## 12              2-Local school district that is a component of a supervisory union
## 13              2-Local school district that is a component of a supervisory union
## 14  1-Regular local school district that is NOT a component of a supervisory union
## 15                                                  7-Independent Charter District
## 16                                                  7-Independent Charter District
## 17  1-Regular local school district that is NOT a component of a supervisory union
## 18              2-Local school district that is a component of a supervisory union
## 19              2-Local school district that is a component of a supervisory union
## 20  1-Regular local school district that is NOT a component of a supervisory union
## 21  1-Regular local school district that is NOT a component of a supervisory union
## 22              2-Local school district that is a component of a supervisory union
## 23  1-Regular local school district that is NOT a component of a supervisory union
## 24                                                  7-Independent Charter District
## 25  1-Regular local school district that is NOT a component of a supervisory union
## 26  1-Regular local school district that is NOT a component of a supervisory union
## 27              2-Local school district that is a component of a supervisory union
## 28                                                  7-Independent Charter District
## 29                                                  7-Independent Charter District
## 30                                                  7-Independent Charter District
## 31                                                  7-Independent Charter District
## 32                                                  7-Independent Charter District
## 33                                                  7-Independent Charter District
## 34                                                  7-Independent Charter District
## 35              2-Local school district that is a component of a supervisory union
## 36              2-Local school district that is a component of a supervisory union
## 37              2-Local school district that is a component of a supervisory union
## 38              2-Local school district that is a component of a supervisory union
## 39              2-Local school district that is a component of a supervisory union
## 40              2-Local school district that is a component of a supervisory union
## 41              2-Local school district that is a component of a supervisory union
## 42                                                  7-Independent Charter District
## 43              2-Local school district that is a component of a supervisory union
## 44              2-Local school district that is a component of a supervisory union
## 45              2-Local school district that is a component of a supervisory union
## 46  1-Regular local school district that is NOT a component of a supervisory union
## 47              2-Local school district that is a component of a supervisory union
## 48              2-Local school district that is a component of a supervisory union
## 49  1-Regular local school district that is NOT a component of a supervisory union
## 50              2-Local school district that is a component of a supervisory union
## 51                                                      8-Other education agencies
## 52  1-Regular local school district that is NOT a component of a supervisory union
## 53  1-Regular local school district that is NOT a component of a supervisory union
## 54  1-Regular local school district that is NOT a component of a supervisory union
## 55              2-Local school district that is a component of a supervisory union
## 56  1-Regular local school district that is NOT a component of a supervisory union
## 57                                                  7-Independent Charter District
## 58              2-Local school district that is a component of a supervisory union
## 59              2-Local school district that is a component of a supervisory union
## 60                                                  7-Independent Charter District
## 61                                                  7-Independent Charter District
## 62  1-Regular local school district that is NOT a component of a supervisory union
## 63  1-Regular local school district that is NOT a component of a supervisory union
## 64  1-Regular local school district that is NOT a component of a supervisory union
## 65  1-Regular local school district that is NOT a component of a supervisory union
## 66  1-Regular local school district that is NOT a component of a supervisory union
## 67                                                  7-Independent Charter District
## 68              2-Local school district that is a component of a supervisory union
## 69              2-Local school district that is a component of a supervisory union
## 70              2-Local school district that is a component of a supervisory union
## 71              2-Local school district that is a component of a supervisory union
## 72  1-Regular local school district that is NOT a component of a supervisory union
## 73                                                  7-Independent Charter District
## 74  1-Regular local school district that is NOT a component of a supervisory union
## 75  1-Regular local school district that is NOT a component of a supervisory union
## 76              2-Local school district that is a component of a supervisory union
## 77  1-Regular local school district that is NOT a component of a supervisory union
## 78  1-Regular local school district that is NOT a component of a supervisory union
## 79  1-Regular local school district that is NOT a component of a supervisory union
## 80  1-Regular local school district that is NOT a component of a supervisory union
## 81              2-Local school district that is a component of a supervisory union
## 82              2-Local school district that is a component of a supervisory union
## 83              2-Local school district that is a component of a supervisory union
## 84              2-Local school district that is a component of a supervisory union
## 85                                                  7-Independent Charter District
## 86              2-Local school district that is a component of a supervisory union
## 87              2-Local school district that is a component of a supervisory union
## 88              2-Local school district that is a component of a supervisory union
## 89  1-Regular local school district that is NOT a component of a supervisory union
## 90              2-Local school district that is a component of a supervisory union
## 91              2-Local school district that is a component of a supervisory union
## 92              2-Local school district that is a component of a supervisory union
## 93  1-Regular local school district that is NOT a component of a supervisory union
## 94  1-Regular local school district that is NOT a component of a supervisory union
## 95  1-Regular local school district that is NOT a component of a supervisory union
## 96              2-Local school district that is a component of a supervisory union
## 97              2-Local school district that is a component of a supervisory union
## 98              2-Local school district that is a component of a supervisory union
## 99          5-State agency providing elementary and/or secondary level instruction
## 100             2-Local school district that is a component of a supervisory union
## 101             2-Local school district that is a component of a supervisory union
## 102             2-Local school district that is a component of a supervisory union
## 103             2-Local school district that is a component of a supervisory union
## 104             2-Local school district that is a component of a supervisory union
## 105             2-Local school district that is a component of a supervisory union
## 106             2-Local school district that is a component of a supervisory union
## 107 1-Regular local school district that is NOT a component of a supervisory union
## 108             2-Local school district that is a component of a supervisory union
## 109                                                 7-Independent Charter District
## 110                                           9-Specialized public school district
##                    School.Type Members Male Female FTE.Equivalent
## 1             1-Regular school      81   46     35           8.85
## 2             1-Regular school     223  108    115             11
## 3             1-Regular school     363  180    183             33
## 4             1-Regular school     786  387    399             39
## 5             1-Regular school     858  420    438          57.61
## 6             1-Regular school     836  425    411           81.6
## 7             1-Regular school     970  405    565           51.8
## 8             1-Regular school      93   50     43           8.25
## 9             1-Regular school      88   51     37            6.5
## 10            1-Regular school     728  366    362           29.3
## 11            1-Regular school     443  258    185          25.33
## 12            1-Regular school      77   39     38            6.9
## 13            1-Regular school      70   43     27              5
## 14            1-Regular school     331  169    162             20
## 15            1-Regular school     615  319    296             20
## 16            1-Regular school     309  158    151           <NA>
## 17            1-Regular school     364  220    144             17
## 18            1-Regular school    1300  652    648          87.99
## 19            1-Regular school     389  209    180          27.55
## 20            1-Regular school     423  224    199          24.95
## 21  4-Alternative/other school      94   47     47            7.3
## 22            1-Regular school     271  134    137           30.5
## 23            1-Regular school     511  268    243             26
## 24            1-Regular school      75   42     33              5
## 25            1-Regular school     375  202    173             26
## 26            1-Regular school     225  113    112           18.2
## 27            1-Regular school     145   76     69           15.4
## 28            1-Regular school    1109  558    551             61
## 29            1-Regular school     479  227    252             30
## 30            1-Regular school     161   89     72             21
## 31            1-Regular school     356  201    155             27
## 32            1-Regular school     466  230    236             32
## 33            1-Regular school     802  338    464             43
## 34            1-Regular school     561  274    287           28.9
## 35            1-Regular school     574  299    275           35.8
## 36            1-Regular school    1184  620    564         101.34
## 37            1-Regular school     415  198    217          37.32
## 38            1-Regular school     250  123    127          22.42
## 39            1-Regular school     104   58     46           10.2
## 40            1-Regular school     158   85     73          16.05
## 41            1-Regular school     420  221    199           34.9
## 42            1-Regular school     711  368    343             32
## 43         3-Vocational school       0    0      0           19.8
## 44            1-Regular school     480  246    234          53.93
## 45            1-Regular school     142   68     74          14.67
## 46            1-Regular school     456  260    196             23
## 47            1-Regular school     210  111     99           19.3
## 48            1-Regular school     583  302    281           34.8
## 49            1-Regular school     110   66     44              8
## 50            1-Regular school     220   91    129           25.5
## 51  4-Alternative/other school       0    0      0           <NA>
## 52            1-Regular school     313  168    145          30.85
## 53  4-Alternative/other school      18   11      7           3.02
## 54  4-Alternative/other school     127   58     69              6
## 55            1-Regular school     281  150    131           23.2
## 56            1-Regular school      78   44     34           2.03
## 57            1-Regular school     629  311    318          37.76
## 58            1-Regular school     437  221    216           45.7
## 59            1-Regular school     275  131    144           28.2
## 60            1-Regular school     901  418    483             42
## 61            1-Regular school    1761  839    922         110.41
## 62            1-Regular school     543  281    262           26.1
## 63            1-Regular school     471  272    199           21.5
## 64            1-Regular school     455  236    219             17
## 65            1-Regular school     476  255    221             26
## 66            1-Regular school     552  283    269             29
## 67            1-Regular school     408  212    196             19
## 68            1-Regular school     529  279    250           31.6
## 69            1-Regular school     576  305    271           46.2
## 70            1-Regular school     281  140    141           25.8
## 71            1-Regular school     143   71     72          11.16
## 72            1-Regular school     944  485    459             50
## 73            1-Regular school     473  225    248             37
## 74            1-Regular school     359  180    179             17
## 75            1-Regular school     617  323    294             34
## 76         3-Vocational school       0    0      0           15.8
## 77            1-Regular school     191  111     80           12.5
## 78            1-Regular school     346  184    162             16
## 79            1-Regular school      82   48     34              4
## 80            1-Regular school     234  116    118          16.84
## 81            1-Regular school     317  181    136          21.95
## 82         3-Vocational school       0    0      0           15.4
## 83            1-Regular school     372  192    180          34.75
## 84            1-Regular school      59   30     29            4.8
## 85            1-Regular school     344  157    187          20.25
## 86            1-Regular school     113   59     54            9.8
## 87            1-Regular school     849  425    424          52.85
## 88            1-Regular school     105   49     56              8
## 89            1-Regular school     160   86     74           14.1
## 90            1-Regular school     821  428    393           76.6
## 91            1-Regular school     790  422    368           67.5
## 92            1-Regular school     348  192    156           18.8
## 93            1-Regular school       7    5      2              1
## 94            1-Regular school     378  185    193           13.5
## 95            1-Regular school     159   84     75           11.8
## 96            1-Regular school     464  224    240          37.45
## 97         3-Vocational school       0    0      0          46.77
## 98            1-Regular school     229  132     97          18.25
## 99  2-Special education school     158   78     80             20
## 100           1-Regular school     275  144    131          26.85
## 101           1-Regular school     450  233    217          44.85
## 102           1-Regular school     135   71     64          10.84
## 103           1-Regular school     168   76     92          14.35
## 104           1-Regular school      92   47     45           10.9
## 105           1-Regular school     196   89    107          16.21
## 106           1-Regular school      64   30     34              5
## 107           1-Regular school      53   32     21              5
## 108           1-Regular school    1152  600    552           70.3
## 109           1-Regular school     643  337    306             31
## 110 4-Alternative/other school     153   73     80          11.75
##     Pupil.Teacher.Ratio
## 1                  9.15
## 2                 20.27
## 3                    11
## 4                 20.15
## 5                 14.89
## 6                 10.25
## 7                 18.73
## 8                 11.27
## 9                 13.54
## 10                24.85
## 11                17.49
## 12                11.16
## 13                   14
## 14                16.55
## 15                30.75
## 16                  n/a
## 17                21.41
## 18                14.77
## 19                14.12
## 20                16.95
## 21                12.88
## 22                 8.89
## 23                19.65
## 24                   15
## 25                14.42
## 26                12.36
## 27                 9.42
## 28                18.18
## 29                15.97
## 30                 7.67
## 31                13.19
## 32                14.56
## 33                18.65
## 34                19.41
## 35                16.03
## 36                11.68
## 37                11.12
## 38                11.15
## 39                 10.2
## 40                 9.84
## 41                12.03
## 42                22.22
## 43                    0
## 44                  8.9
## 45                 9.68
## 46                19.83
## 47                10.88
## 48                16.75
## 49                13.75
## 50                 8.63
## 51                  n/a
## 52                10.15
## 53                 5.96
## 54                21.17
## 55                12.11
## 56                38.42
## 57                16.66
## 58                 9.56
## 59                 9.75
## 60                21.45
## 61                15.95
## 62                 20.8
## 63                21.91
## 64                26.76
## 65                18.31
## 66                19.03
## 67                21.47
## 68                16.74
## 69                12.47
## 70                10.89
## 71                12.81
## 72                18.88
## 73                12.78
## 74                21.12
## 75                18.15
## 76                    0
## 77                15.28
## 78                21.63
## 79                 20.5
## 80                 13.9
## 81                14.44
## 82                    0
## 83                10.71
## 84                12.29
## 85                16.99
## 86                11.53
## 87                16.06
## 88                13.13
## 89                11.35
## 90                10.72
## 91                 11.7
## 92                18.51
## 93                    7
## 94                   28
## 95                13.47
## 96                12.39
## 97                    0
## 98                12.55
## 99                  7.9
## 100               10.24
## 101               10.03
## 102               12.45
## 103               11.71
## 104                8.44
## 105               12.09
## 106                12.8
## 107                10.6
## 108               16.39
## 109               20.74
## 110               13.02

We do have enrollment information for these schools that changed boundaries

public_school %>% filter(Updated.Status == "8-Reopened")
##     State.Name ST                               School.Name   NCES.SchID
## 1      Florida FL         BAKER VIRTUAL INSTRUCTION PROGRAM 120006000000
## 2     Illinois IL               Bonnie McBeth  Learning Ctr 173174000000
## 3      Florida FL      BRADFORD VIRTUAL INSTRUCTION PROGRAM 120012000000
## 4  MISSISSIPPI MS            CANTON PUBLIC 9TH GRADE SCHOOL 280090000000
## 5      Florida FL        CITRUS VIRTUAL INSTRUCTION PROGRAM 120027000000
## 6       Alaska AK                       Clarks Point School  20071000331
## 7     Nebraska NE                    CLEARWATER HIGH SCHOOL 310012000000
## 8   California CA                            Coastal Buttes  69100407910
## 9       Oregon OR                      Columbia City School 411172000000
## 10      Nevada NV                  Desert Willow Elementary 320006000000
## 11  CALIFORNIA CA                        Dogwood Elementary  61683012918
## 12  New Mexico NM                              DULCE MIDDLE 350081000000
## 13        Ohio OH                    Early Learning Program 390435000000
## 14 Mississippi MS        EVA GORDON UPPER ELEMENTARY SCHOOL 280408000000
## 15  Washington WA                     Evergreen High School 530354000000
## 16     FLORIDA FL             EXCELSIOR PREP CHARTER SCHOOL 120087000000
## 17  California CA                      Exeter Community Day  60142308662
## 18     Florida FL        HARDEE VIRTUAL INSTRUCTION PROGRAM 120075000000
## 19  California CA                 Holbrook Language Academy  62637003953
## 20     FLORIDA FL                         INNOVATION MIDDLE 120144000000
## 21     FLORIDA FL                  LAUREATE PARK ELEMENTARY 120144000000
## 22    KENTUCKY KY           Logan County Alternative School 210354000000
## 23     Florida FL                LONGWOOD ELEMENTARY SCHOOL 120171000000
## 24       Idaho ID              NAMPA EARLY CHILDHOOD CENTER 160234000000
## 25   Wisconsin WI                           Nekoosa Academy 551038000000
## 26  New Jersey NJ                 New Jersey Virtual School 348024000000
## 27 Mississippi MS              North Pontotoc Middle School 280366000000
## 28    Nebraska NE                       ORCHARD HIGH SCHOOL 310012000000
## 29  California CA             Peninsula High (Continuation)  63498005925
## 30  NEW JERSEY NJ                  Programs at Park Academy 341251000000
## 31      Nevada NV                Silver Stage Middle School 320030000000
## 32        Utah UT                              Slate Canyon 490081000000
## 33 Mississippi MS                        SOUTH PIKE JR HIGH 280408000000
## 34     FLORIDA FL ST. CLOUD PREPARATORY ACADEMY HIGH SCHOOL 120147000000
## 35     FLORIDA FL      SUNLAKE ACADEMY OF MATH AND SCIENCES 120087000000
## 36  California CA                 Tecopa-Francis Elementary  61068001187
## 37  California CA        Tree of Life International Charter  60768000736
## 38  Washington WA                          Tyee High School 530354000000
## 39  New Jersey NJ                      WEST SIDE HIGH SCOOL 341134000000
## 40     FLORIDA FL                     WESTPOINTE ELEMENTARY 120144000000
## 41     FLORIDA FL                      WILDLIGHT ELEMENTARY 120135000000
##                                       Agency_Name            County_Name
## 1                                           BAKER           Baker County
## 2                               Plainfield SD 202            Will County
## 3                                        BRADFORD        Bradford County
## 4                       CANTON PUBLIC SCHOOL DIST         Madison County
## 5                                          CITRUS          Citrus County
## 6                Southwest Region School District Dillingham Census Area
## 7                     NEBRASKA UNIFIED DISTRICT 1        Antelope County
## 8               Colusa County Office of Education          Colusa County
## 9                                St Helens SD 502        Columbia County
## 10                   CLARK COUNTY SCHOOL DISTRICT           Clark County
## 11                               Heber Elementary        Imperial County
## 12                      DULCE INDEPENDENT SCHOOLS      Rio Arriba County
## 13                                     Akron City          Summit County
## 14                         SOUTH PIKE SCHOOL DIST            Pike County
## 15                       Highline School District            King County
## 16                                   HILLSBOROUGH    Hillsborough County
## 17                                 Exeter Unified          Tulare County
## 18                                         HARDEE          Hardee County
## 19                             Mt. Diablo Unified    Contra Costa County
## 20                                         ORANGE          Orange County
## 21                                         ORANGE          Orange County
## 22                                   Logan County           Logan County
## 23                                       SEMINOLE        Seminole County
## 24                          NAMPA SCHOOL DISTRICT          Canyon County
## 25                        Nekoosa School District            Wood County
## 26 Monmouth-Ocean Educational Services Commission        Monmouth County
## 27                        PONTOTOC CO SCHOOL DIST        Pontotoc County
## 28                    NEBRASKA UNIFIED DISTRICT 1        Antelope County
## 29                           San Mateo Union High       San Mateo County
## 30   PASCACK VALLEY REGIONAL HIGH SCHOOL DISTRICT          Bergen County
## 31                    LYON COUNTY SCHOOL DISTRICT            Lyon County
## 32                                 Provo District            Utah County
## 33                         SOUTH PIKE SCHOOL DIST            Pike County
## 34                                        OSCEOLA         Osceola County
## 35                                   HILLSBOROUGH    Hillsborough County
## 36                           Death Valley Unified            Inyo County
## 37                       Cascade Union Elementary          Shasta County
## 38                       Highline School District            King County
## 39                  NEWARK PUBLIC SCHOOL DISTRICT           Essex County
## 40                                         ORANGE          Orange County
## 41                                         NASSAU          Nassau County
##    COUNTY.ID Urban.centric.Locale Latitude  Longitude
## 1      12003     32-Town: Distant 30.27694  -82.11836
## 2      17197     21-Suburb: Large 41.59690  -88.19347
## 3      12007     32-Town: Distant 29.95182  -82.11285
## 4      28089     41-Rural: Fringe 32.62160  -89.98869
## 5      12017     23-Suburb: Small 28.83506  -82.34237
## 6       2070     43-Rural: Remote 58.83528 -158.54402
## 7      31003     43-Rural: Remote 42.17050  -98.19354
## 8       6011     41-Rural: Fringe 39.16037 -122.13678
## 9      41009      31-Town: Fringe 45.89135 -122.80874
## 10     32003       11-City: Large 36.16436 -115.09948
## 11      6025     41-Rural: Fringe 32.73915 -115.53208
## 12     35039     43-Rural: Remote 36.94281 -106.98826
## 13     39153    12-City: Mid-size 41.06680  -81.56489
## 14     28113    42-Rural: Distant 31.15886  -90.45515
## 15     53033     21-Suburb: Large 47.49970 -122.34552
## 16     12057     21-Suburb: Large 28.05698  -82.43463
## 17      6107  22-Suburb: Mid-size 36.29740 -119.13451
## 18     12049     32-Town: Distant 27.55814  -81.81415
## 19      6013     21-Suburb: Large 37.99331 -122.02707
## 20     12095     41-Rural: Fringe 28.42251  -81.21034
## 21     12095     41-Rural: Fringe 28.36583  -81.26799
## 22     21141     41-Rural: Fringe 36.84469  -86.84866
## 23     12117     21-Suburb: Large 28.70282  -81.33111
## 24     16027  22-Suburb: Mid-size 43.55212 -116.53923
## 25     55141     41-Rural: Fringe 44.30953  -89.90951
## 26     34025     21-Suburb: Large 40.25790  -74.07413
## 27     28115    42-Rural: Distant 34.36400  -89.02684
## 28     31003     43-Rural: Remote 42.33794  -98.23772
## 29      6081     21-Suburb: Large 37.61239 -122.42833
## 30     34003     21-Suburb: Large 40.99407  -74.01108
## 31     32019    42-Rural: Distant 39.39088 -119.28359
## 32     49049    12-City: Mid-size 40.20770 -111.62814
## 33     28113    42-Rural: Distant 31.14834  -90.46298
## 34     12097     21-Suburb: Large 28.22885  -81.30401
## 35     12057     21-Suburb: Large 28.14346  -82.49473
## 36      6027     43-Rural: Remote 35.84882 -116.21694
## 37      6089  22-Suburb: Mid-size 40.46642 -122.33276
## 38     53033     21-Suburb: Large 47.43532 -122.27889
## 39     34013       11-City: Large 40.74211  -74.20314
## 40     12095       11-City: Large 28.52013  -81.49384
## 41     12089     41-Rural: Fringe 30.63290  -81.64081
##                                                Title.I.School.Status
## 1                                                                n/a
## 2                                             6-Not a Title I school
## 3                                             6-Not a Title I school
## 4                                             6-Not a Title I school
## 5                                                                n/a
## 6  3-Title I schoolwide eligible-Title I targeted assistance program
## 7                                             6-Not a Title I school
## 8                                                                n/a
## 9                                        5-Title I schoolwide school
## 10                                                               n/a
## 11                                       5-Title I schoolwide school
## 12                                                               n/a
## 13                                                               n/a
## 14                                       5-Title I schoolwide school
## 15                                            6-Not a Title I school
## 16                                       5-Title I schoolwide school
## 17                                                               n/a
## 18                                                               n/a
## 19          1-Title I targeted assistance eligible school-No program
## 20                                            6-Not a Title I school
## 21                                            6-Not a Title I school
## 22                                                               n/a
## 23          1-Title I targeted assistance eligible school-No program
## 24                                            6-Not a Title I school
## 25          1-Title I targeted assistance eligible school-No program
## 26                                                               n/a
## 27                                            6-Not a Title I school
## 28                                            6-Not a Title I school
## 29                              2-Title I targeted assistance school
## 30                                            6-Not a Title I school
## 31                                       5-Title I schoolwide school
## 32                                            6-Not a Title I school
## 33                                       5-Title I schoolwide school
## 34                                            6-Not a Title I school
## 35          1-Title I targeted assistance eligible school-No program
## 36                                            6-Not a Title I school
## 37                                                              <NA>
## 38                                            6-Not a Title I school
## 39                                                               n/a
## 40                                            6-Not a Title I school
## 41          1-Title I targeted assistance eligible school-No program
##    Updated.Status
## 1      8-Reopened
## 2      8-Reopened
## 3      8-Reopened
## 4      8-Reopened
## 5      8-Reopened
## 6      8-Reopened
## 7      8-Reopened
## 8      8-Reopened
## 9      8-Reopened
## 10     8-Reopened
## 11     8-Reopened
## 12     8-Reopened
## 13     8-Reopened
## 14     8-Reopened
## 15     8-Reopened
## 16     8-Reopened
## 17     8-Reopened
## 18     8-Reopened
## 19     8-Reopened
## 20     8-Reopened
## 21     8-Reopened
## 22     8-Reopened
## 23     8-Reopened
## 24     8-Reopened
## 25     8-Reopened
## 26     8-Reopened
## 27     8-Reopened
## 28     8-Reopened
## 29     8-Reopened
## 30     8-Reopened
## 31     8-Reopened
## 32     8-Reopened
## 33     8-Reopened
## 34     8-Reopened
## 35     8-Reopened
## 36     8-Reopened
## 37     8-Reopened
## 38     8-Reopened
## 39     8-Reopened
## 40     8-Reopened
## 41     8-Reopened
##                                                                       Agency.Type
## 1  1-Regular local school district that is NOT a component of a supervisory union
## 2  1-Regular local school district that is NOT a component of a supervisory union
## 3  1-Regular local school district that is NOT a component of a supervisory union
## 4  1-Regular local school district that is NOT a component of a supervisory union
## 5  1-Regular local school district that is NOT a component of a supervisory union
## 6  1-Regular local school district that is NOT a component of a supervisory union
## 7  1-Regular local school district that is NOT a component of a supervisory union
## 8  1-Regular local school district that is NOT a component of a supervisory union
## 9  1-Regular local school district that is NOT a component of a supervisory union
## 10 1-Regular local school district that is NOT a component of a supervisory union
## 11 1-Regular local school district that is NOT a component of a supervisory union
## 12 1-Regular local school district that is NOT a component of a supervisory union
## 13 1-Regular local school district that is NOT a component of a supervisory union
## 14 1-Regular local school district that is NOT a component of a supervisory union
## 15 1-Regular local school district that is NOT a component of a supervisory union
## 16 1-Regular local school district that is NOT a component of a supervisory union
## 17 1-Regular local school district that is NOT a component of a supervisory union
## 18 1-Regular local school district that is NOT a component of a supervisory union
## 19 1-Regular local school district that is NOT a component of a supervisory union
## 20 1-Regular local school district that is NOT a component of a supervisory union
## 21 1-Regular local school district that is NOT a component of a supervisory union
## 22 1-Regular local school district that is NOT a component of a supervisory union
## 23 1-Regular local school district that is NOT a component of a supervisory union
## 24 1-Regular local school district that is NOT a component of a supervisory union
## 25 1-Regular local school district that is NOT a component of a supervisory union
## 26 1-Regular local school district that is NOT a component of a supervisory union
## 27 1-Regular local school district that is NOT a component of a supervisory union
## 28 1-Regular local school district that is NOT a component of a supervisory union
## 29 1-Regular local school district that is NOT a component of a supervisory union
## 30 1-Regular local school district that is NOT a component of a supervisory union
## 31 1-Regular local school district that is NOT a component of a supervisory union
## 32 1-Regular local school district that is NOT a component of a supervisory union
## 33 1-Regular local school district that is NOT a component of a supervisory union
## 34 1-Regular local school district that is NOT a component of a supervisory union
## 35 1-Regular local school district that is NOT a component of a supervisory union
## 36 1-Regular local school district that is NOT a component of a supervisory union
## 37 1-Regular local school district that is NOT a component of a supervisory union
## 38 1-Regular local school district that is NOT a component of a supervisory union
## 39 1-Regular local school district that is NOT a component of a supervisory union
## 40 1-Regular local school district that is NOT a component of a supervisory union
## 41 1-Regular local school district that is NOT a component of a supervisory union
##                   School.Type Members Male Female FTE.Equivalent
## 1            1-Regular school       0    0      0           <NA>
## 2            1-Regular school     793  470    323             39
## 3            1-Regular school       1    1      0           <NA>
## 4            1-Regular school     223  128     95          14.91
## 5            1-Regular school       0    0      0           <NA>
## 6            1-Regular school      14    8      6            0.5
## 7            1-Regular school      50   27     23           7.72
## 8  2-Special education school       0    0      0           <NA>
## 9            1-Regular school     226  119    107          13.93
## 10 2-Special education school       0    0      0           <NA>
## 11           1-Regular school     547  285    262             23
## 12           1-Regular school    <NA>  n/a    n/a           <NA>
## 13           1-Regular school     n/a  n/a    n/a              0
## 14           1-Regular school     319  162    157          17.26
## 15           1-Regular school    1001  528    473           57.8
## 16           1-Regular school      75   42     33              6
## 17 4-Alternative/other school       0    0      0           <NA>
## 18           1-Regular school       0    0      0           <NA>
## 19           1-Regular school     189   97     92            9.3
## 20           1-Regular school    1013  491    522             54
## 21           1-Regular school     646  318    328             42
## 22 4-Alternative/other school     n/a  n/a    n/a              0
## 23           1-Regular school     504  264    240             35
## 24 2-Special education school     101   60     41              6
## 25 4-Alternative/other school      24   13     11              1
## 26 4-Alternative/other school     n/a  n/a    n/a           <NA>
## 27           1-Regular school     338  174    164          22.67
## 28           1-Regular school      31   21     10           6.55
## 29 4-Alternative/other school     141   97     44            5.6
## 30 2-Special education school       7    4      3           <NA>
## 31           1-Regular school     307  165    142             15
## 32 4-Alternative/other school       8    8      0           <NA>
## 33           1-Regular school     244  133    111          22.92
## 34           1-Regular school      21   13      8              8
## 35           1-Regular school     636  345    291             42
## 36           1-Regular school       3    2      1              1
## 37           1-Regular school      87   42     45              5
## 38           1-Regular school    1014  527    487          53.35
## 39           1-Regular school     n/a  n/a    n/a           <NA>
## 40           1-Regular school     751  410    341             45
## 41           1-Regular school     627  348    279           <NA>
##    Pupil.Teacher.Ratio
## 1                  n/a
## 2                20.33
## 3                  n/a
## 4                14.96
## 5                  n/a
## 6                   28
## 7                 6.48
## 8                  n/a
## 9                16.22
## 10                 n/a
## 11               23.78
## 12                 n/a
## 13                 n/a
## 14               18.48
## 15               17.32
## 16                12.5
## 17                 n/a
## 18                 n/a
## 19               20.32
## 20               18.76
## 21               15.38
## 22                 n/a
## 23                14.4
## 24               16.83
## 25                  24
## 26                 n/a
## 27               14.91
## 28                4.73
## 29               25.18
## 30                 n/a
## 31               20.47
## 32                 n/a
## 33               10.65
## 34                2.63
## 35               15.14
## 36                   3
## 37                17.4
## 38               19.01
## 39                 n/a
## 40               16.69
## 41                 n/a

Some values are missing in the reopened schools.

#Do we have any information for school that is "New" 
public_school %>% filter(Updated.Status == "3-New")
##                State.Name ST
## 1                  KANSAS KS
## 2            PENNSYLVANIA PA
## 3                   TEXAS TX
## 4              NEW JERSEY NJ
## 5                COLORADO CO
## 6                MICHIGAN MI
## 7              NEW JERSEY NJ
## 8                MICHIGAN MI
## 9              CALIFORNIA CA
## 10          MASSACHUSETTS MA
## 11             CALIFORNIA CA
## 12           RHODE ISLAND RI
## 13               ARKANSAS AR
## 14               OKLAHOMA OK
## 15         NORTH CAROLINA NC
## 16                 ALASKA AK
## 17                ALABAMA AL
## 18                  TEXAS TX
## 19               COLORADO CO
## 20           PENNSYLVANIA PA
## 21             CALIFORNIA CA
## 22              WISCONSIN WI
## 23                GEORGIA GA
## 24             CALIFORNIA CA
## 25             NEW JERSEY NJ
## 26                  TEXAS TX
## 27             CALIFORNIA CA
## 28             CALIFORNIA CA
## 29                ARIZONA AZ
## 30                ARIZONA AZ
## 31                ARIZONA AZ
## 32                  TEXAS TX
## 33              WISCONSIN WI
## 34             CALIFORNIA CA
## 35             CALIFORNIA CA
## 36               ILLINOIS IL
## 37             CALIFORNIA CA
## 38              WISCONSIN WI
## 39                ARIZONA AZ
## 40              LOUISIANA LA
## 41             WASHINGTON WA
## 42                  TEXAS TX
## 43                FLORIDA FL
## 44         NORTH CAROLINA NC
## 45               KENTUCKY KY
## 46               NEBRASKA NE
## 47               NEBRASKA NE
## 48                ARIZONA AZ
## 49                ARIZONA AZ
## 50                FLORIDA FL
## 51                INDIANA IN
## 52               ILLINOIS IL
## 53                FLORIDA FL
## 54                GEORGIA GA
## 55                ALABAMA AL
## 56               VIRGINIA VA
## 57            MISSISSIPPI MS
## 58                   OHIO OH
## 59                   OHIO OH
## 60             WASHINGTON WA
## 61                ARIZONA AZ
## 62                ARIZONA AZ
## 63                ARIZONA AZ
## 64                  TEXAS TX
## 65                   UTAH UT
## 66               COLORADO CO
## 67             CALIFORNIA CA
## 68               NEBRASKA NE
## 69                MONTANA MT
## 70               NEBRASKA NE
## 71              WISCONSIN WI
## 72             WASHINGTON WA
## 73             NEW JERSEY NJ
## 74                FLORIDA FL
## 75              MINNESOTA MN
## 76                 NEVADA NV
## 77            MISSISSIPPI MS
## 78                   UTAH UT
## 79             CALIFORNIA CA
## 80                ARIZONA AZ
## 81               KENTUCKY KY
## 82               VIRGINIA VA
## 83              TENNESSEE TN
## 84                FLORIDA FL
## 85                FLORIDA FL
## 86                   UTAH UT
## 87                 ALASKA AK
## 88           SOUTH DAKOTA SD
## 89               NEBRASKA NE
## 90               NEBRASKA NE
## 91               NEBRASKA NE
## 92               NEBRASKA NE
## 93               NEBRASKA NE
## 94               NEBRASKA NE
## 95             CALIFORNIA CA
## 96                  TEXAS TX
## 97               VIRGINIA VA
## 98                  TEXAS TX
## 99               DELAWARE DE
## 100        SOUTH CAROLINA SC
## 101                 TEXAS TX
## 102              OKLAHOMA OK
## 103              OKLAHOMA OK
## 104               FLORIDA FL
## 105               FLORIDA FL
## 106               FLORIDA FL
## 107               FLORIDA FL
## 108                KANSAS KS
## 109              NEW YORK NY
## 110              NEW YORK NY
## 111              NEW YORK NY
## 112               GEORGIA GA
## 113          NORTH DAKOTA ND
## 114                 TEXAS TX
## 115                 TEXAS TX
## 116                 MAINE ME
## 117              ARKANSAS AR
## 118                 TEXAS TX
## 119          PENNSYLVANIA PA
## 120              MISSOURI MO
## 121         MASSACHUSETTS MA
## 122            CALIFORNIA CA
## 123            CALIFORNIA CA
## 124            CALIFORNIA CA
## 125            CALIFORNIA CA
## 126        SOUTH CAROLINA SC
## 127              VIRGINIA VA
## 128                  OHIO OH
## 129               ARIZONA AZ
## 130               ARIZONA AZ
## 131                  UTAH UT
## 132              ARKANSAS AR
## 133              MICHIGAN MI
## 134              MICHIGAN MI
## 135                  IOWA IA
## 136                 TEXAS TX
## 137                 MAINE ME
## 138                 MAINE ME
## 139              OKLAHOMA OK
## 140              MICHIGAN MI
## 141        SOUTH CAROLINA SC
## 142            CALIFORNIA CA
## 143                  OHIO OH
## 144             MINNESOTA MN
## 145                OREGON OR
## 146                 TEXAS TX
## 147        NORTH CAROLINA NC
## 148               FLORIDA FL
## 149               ARIZONA AZ
## 150        SOUTH CAROLINA SC
## 151              VIRGINIA VA
## 152            WASHINGTON WA
## 153                  UTAH UT
## 154            WASHINGTON WA
## 155                 TEXAS TX
## 156              ARKANSAS AR
## 157              MICHIGAN MI
## 158                KANSAS KS
## 159            CALIFORNIA CA
## 160         WEST VIRGINIA WV
## 161               ARIZONA AZ
## 162               FLORIDA FL
## 163        NORTH CAROLINA NC
## 164                  OHIO OH
## 165                OREGON OR
## 166               INDIANA IN
## 167                  OHIO OH
## 168                 TEXAS TX
## 169                 TEXAS TX
## 170            CALIFORNIA CA
## 171               FLORIDA FL
## 172              NEBRASKA NE
## 173           MISSISSIPPI MS
## 174           MISSISSIPPI MS
## 175              OKLAHOMA OK
## 176              MICHIGAN MI
## 177            CALIFORNIA CA
## 178            CALIFORNIA CA
## 179               GEORGIA GA
## 180        NORTH CAROLINA NC
## 181          PENNSYLVANIA PA
## 182          PENNSYLVANIA PA
## 183              VIRGINIA VA
## 184                 TEXAS TX
## 185            NEW JERSEY NJ
## 186            NEW JERSEY NJ
## 187             LOUISIANA LA
## 188               FLORIDA FL
## 189              COLORADO CO
## 190              COLORADO CO
## 191              COLORADO CO
## 192            WASHINGTON WA
## 193              MICHIGAN MI
## 194            CALIFORNIA CA
## 195            CALIFORNIA CA
## 196               INDIANA IN
## 197              MICHIGAN MI
## 198                 TEXAS TX
## 199            CALIFORNIA CA
## 200        NORTH CAROLINA NC
## 201                NEVADA NV
## 202                NEVADA NV
## 203                NEVADA NV
## 204                NEVADA NV
## 205                NEVADA NV
## 206              MICHIGAN MI
## 207                 MAINE ME
## 208                 MAINE ME
## 209            CALIFORNIA CA
## 210              MICHIGAN MI
## 211              NEW YORK NY
## 212            CALIFORNIA CA
## 213            CALIFORNIA CA
## 214              VIRGINIA VA
## 215            NEW MEXICO NM
## 216            WASHINGTON WA
## 217              ARKANSAS AR
## 218            CALIFORNIA CA
## 219            CALIFORNIA CA
## 220            CALIFORNIA CA
## 221              MISSOURI MO
## 222                  OHIO OH
## 223         WEST VIRGINIA WV
## 224               ARIZONA AZ
## 225               FLORIDA FL
## 226               FLORIDA FL
## 227           MISSISSIPPI MS
## 228              VIRGINIA VA
## 229             WISCONSIN WI
## 230                  UTAH UT
## 231              OKLAHOMA OK
## 232                  OHIO OH
## 233            WASHINGTON WA
## 234            WASHINGTON WA
## 235            NEW MEXICO NM
## 236                 TEXAS TX
## 237                 TEXAS TX
## 238              DELAWARE DE
## 239            CALIFORNIA CA
## 240              COLORADO CO
## 241               GEORGIA GA
## 242                ALASKA AK
## 243            CALIFORNIA CA
## 244              MICHIGAN MI
## 245                NEVADA NV
## 246                NEVADA NV
## 247                NEVADA NV
## 248                OREGON OR
## 249              MICHIGAN MI
## 250          NORTH DAKOTA ND
## 251            CALIFORNIA CA
## 252              ILLINOIS IL
## 253                NEVADA NV
## 254              MICHIGAN MI
## 255               FLORIDA FL
## 256          PENNSYLVANIA PA
## 257                NEVADA NV
## 258                 TEXAS TX
## 259                 TEXAS TX
## 260              MISSOURI MO
## 261               GEORGIA GA
## 262                NEVADA NV
## 263                NEVADA NV
## 264                NEVADA NV
## 265                NEVADA NV
## 266                NEVADA NV
## 267              NEBRASKA NE
## 268             MINNESOTA MN
## 269              NEBRASKA NE
## 270              OKLAHOMA OK
## 271              OKLAHOMA OK
## 272              OKLAHOMA OK
## 273              OKLAHOMA OK
## 274              OKLAHOMA OK
## 275                 TEXAS TX
## 276                NEVADA NV
## 277         MASSACHUSETTS MA
## 278               FLORIDA FL
## 279              MICHIGAN MI
## 280                 TEXAS TX
## 281              ILLINOIS IL
## 282              MISSOURI MO
## 283              COLORADO CO
## 284            NEW JERSEY NJ
## 285              KENTUCKY KY
## 286               FLORIDA FL
## 287              MISSOURI MO
## 288              COLORADO CO
## 289              MISSOURI MO
## 290              MISSOURI MO
## 291             MINNESOTA MN
## 292                 TEXAS TX
## 293                  OHIO OH
## 294              MICHIGAN MI
## 295            CALIFORNIA CA
## 296            CALIFORNIA CA
## 297             MINNESOTA MN
## 298              MICHIGAN MI
## 299              MICHIGAN MI
## 300             MINNESOTA MN
## 301              ILLINOIS IL
## 302          PENNSYLVANIA PA
## 303             LOUISIANA LA
## 304               ALABAMA AL
## 305               WYOMING WY
## 306               FLORIDA FL
## 307                 TEXAS TX
## 308          PENNSYLVANIA PA
## 309              MICHIGAN MI
## 310             MINNESOTA MN
## 311            CALIFORNIA CA
## 312        NORTH CAROLINA NC
## 313          PENNSYLVANIA PA
## 314              NEW YORK NY
## 315            CALIFORNIA CA
## 316            CALIFORNIA CA
## 317            CALIFORNIA CA
## 318             LOUISIANA LA
## 319                 TEXAS TX
## 320                 TEXAS TX
## 321            CALIFORNIA CA
## 322             LOUISIANA LA
## 323        NORTH CAROLINA NC
## 324              OKLAHOMA OK
## 325              NEBRASKA NE
## 326              OKLAHOMA OK
## 327              NEW YORK NY
## 328        NORTH CAROLINA NC
## 329             MINNESOTA MN
## 330            CALIFORNIA CA
## 331              OKLAHOMA OK
## 332              OKLAHOMA OK
## 333              OKLAHOMA OK
## 334              OKLAHOMA OK
## 335              OKLAHOMA OK
## 336              OKLAHOMA OK
## 337            CALIFORNIA CA
## 338          PENNSYLVANIA PA
## 339               FLORIDA FL
## 340               ARIZONA AZ
## 341                  OHIO OH
## 342                 TEXAS TX
## 343               ARIZONA AZ
## 344               ARIZONA AZ
## 345               INDIANA IN
## 346               INDIANA IN
## 347              NEW YORK NY
## 348             LOUISIANA LA
## 349             MINNESOTA MN
## 350                KANSAS KS
## 351                  OHIO OH
## 352               ARIZONA AZ
## 353            CALIFORNIA CA
## 354          SOUTH DAKOTA SD
## 355              MICHIGAN MI
## 356                  OHIO OH
## 357              ILLINOIS IL
## 358             MINNESOTA MN
## 359             MINNESOTA MN
## 360                 TEXAS TX
## 361              KENTUCKY KY
## 362                KANSAS KS
## 363              NEW YORK NY
## 364            CALIFORNIA CA
## 365              ILLINOIS IL
## 366          PENNSYLVANIA PA
## 367              COLORADO CO
## 368              KENTUCKY KY
## 369                KANSAS KS
## 370             MINNESOTA MN
## 371                 TEXAS TX
## 372                OREGON OR
## 373              MICHIGAN MI
## 374                NEVADA NV
## 375                  OHIO OH
## 376            CALIFORNIA CA
## 377                  OHIO OH
## 378              MICHIGAN MI
## 379        NORTH CAROLINA NC
## 380            CALIFORNIA CA
## 381                KANSAS KS
## 382             TENNESSEE TN
## 383                 TEXAS TX
## 384                 TEXAS TX
## 385               GEORGIA GA
## 386               GEORGIA GA
## 387               ALABAMA AL
## 388           MISSISSIPPI MS
## 389          PENNSYLVANIA PA
## 390                 TEXAS TX
## 391                 TEXAS TX
## 392                 TEXAS TX
## 393               FLORIDA FL
## 394            CALIFORNIA CA
## 395             MINNESOTA MN
## 396               FLORIDA FL
## 397                  OHIO OH
## 398            CALIFORNIA CA
## 399            NEW JERSEY NJ
## 400            CALIFORNIA CA
## 401                  UTAH UT
## 402                 TEXAS TX
## 403                 TEXAS TX
## 404                 TEXAS TX
## 405          PENNSYLVANIA PA
## 406              VIRGINIA VA
## 407              COLORADO CO
## 408          PENNSYLVANIA PA
## 409                  UTAH UT
## 410        SOUTH CAROLINA SC
## 411              MARYLAND MD
## 412        SOUTH CAROLINA SC
## 413            CALIFORNIA CA
## 414            CALIFORNIA CA
## 415            CALIFORNIA CA
## 416            CALIFORNIA CA
## 417        NORTH CAROLINA NC
## 418                 TEXAS TX
## 419              ARKANSAS AR
## 420              ARKANSAS AR
## 421                 MAINE ME
## 422              COLORADO CO
## 423              ILLINOIS IL
## 424                 TEXAS TX
## 425                 TEXAS TX
## 426                 TEXAS TX
## 427                 TEXAS TX
## 428                 TEXAS TX
## 429                 TEXAS TX
## 430        NORTH CAROLINA NC
## 431            CALIFORNIA CA
## 432            NEW JERSEY NJ
## 433              NEBRASKA NE
## 434              MISSOURI MO
## 435              MICHIGAN MI
## 436               INDIANA IN
## 437              NEW YORK NY
## 438            CALIFORNIA CA
## 439                 TEXAS TX
## 440               FLORIDA FL
## 441                  IOWA IA
## 442                 TEXAS TX
## 443               ARIZONA AZ
## 444               FLORIDA FL
## 445                 TEXAS TX
## 446                 TEXAS TX
## 447         MASSACHUSETTS MA
## 448                 TEXAS TX
## 449              MICHIGAN MI
## 450            CALIFORNIA CA
## 451            CALIFORNIA CA
## 452        NORTH CAROLINA NC
## 453           MISSISSIPPI MS
## 454             WISCONSIN WI
## 455                  OHIO OH
## 456            NEW JERSEY NJ
## 457               INDIANA IN
## 458                 TEXAS TX
## 459                 TEXAS TX
## 460                 TEXAS TX
## 461                 TEXAS TX
## 462                 TEXAS TX
## 463                 TEXAS TX
## 464                 TEXAS TX
## 465                 TEXAS TX
## 466                 TEXAS TX
## 467                 TEXAS TX
## 468               INDIANA IN
## 469            CALIFORNIA CA
## 470              ILLINOIS IL
## 471                 TEXAS TX
## 472                 TEXAS TX
## 473                 TEXAS TX
## 474                 TEXAS TX
## 475                 TEXAS TX
## 476                 TEXAS TX
## 477                 TEXAS TX
## 478                 TEXAS TX
## 479                 TEXAS TX
## 480                 TEXAS TX
## 481               ARIZONA AZ
## 482               INDIANA IN
## 483               INDIANA IN
## 484              COLORADO CO
## 485          PENNSYLVANIA PA
## 486             WISCONSIN WI
## 487              COLORADO CO
## 488             MINNESOTA MN
## 489               GEORGIA GA
## 490          PENNSYLVANIA PA
## 491              COLORADO CO
## 492              NEW YORK NY
## 493            NEW JERSEY NJ
## 494             LOUISIANA LA
## 495              ILLINOIS IL
## 496              ARKANSAS AR
## 497               INDIANA IN
## 498              ILLINOIS IL
## 499        NORTH CAROLINA NC
## 500                 TEXAS TX
## 501              ARKANSAS AR
## 502        SOUTH CAROLINA SC
## 503          PENNSYLVANIA PA
## 504              MICHIGAN MI
## 505                 TEXAS TX
## 506                 TEXAS TX
## 507                NEVADA NV
## 508                KANSAS KS
## 509               ALABAMA AL
## 510             LOUISIANA LA
## 511          PENNSYLVANIA PA
## 512               FLORIDA FL
## 513              MICHIGAN MI
## 514              MISSOURI MO
## 515               ALABAMA AL
## 516                 TEXAS TX
## 517                 TEXAS TX
## 518                 TEXAS TX
## 519            WASHINGTON WA
## 520            CALIFORNIA CA
## 521            CALIFORNIA CA
## 522                  OHIO OH
## 523            CALIFORNIA CA
## 524               GEORGIA GA
## 525              ILLINOIS IL
## 526                NEVADA NV
## 527            CALIFORNIA CA
## 528                 TEXAS TX
## 529                 TEXAS TX
## 530              NEW YORK NY
## 531                 TEXAS TX
## 532              OKLAHOMA OK
## 533               INDIANA IN
## 534          SOUTH DAKOTA SD
## 535             MINNESOTA MN
## 536             TENNESSEE TN
## 537                 TEXAS TX
## 538                HAWAII HI
## 539                HAWAII HI
## 540                 TEXAS TX
## 541            CALIFORNIA CA
## 542                 TEXAS TX
## 543                 TEXAS TX
## 544               ARIZONA AZ
## 545             WISCONSIN WI
## 546              MICHIGAN MI
## 547                  OHIO OH
## 548               FLORIDA FL
## 549               FLORIDA FL
## 550               GEORGIA GA
## 551            CALIFORNIA CA
## 552            CALIFORNIA CA
## 553             TENNESSEE TN
## 554                 TEXAS TX
## 555                 TEXAS TX
## 556              OKLAHOMA OK
## 557                 TEXAS TX
## 558              MISSOURI MO
## 559            CALIFORNIA CA
## 560                  OHIO OH
## 561              KENTUCKY KY
## 562              MICHIGAN MI
## 563              MICHIGAN MI
## 564                 TEXAS TX
## 565              MICHIGAN MI
## 566              COLORADO CO
## 567                 TEXAS TX
## 568             MINNESOTA MN
## 569             TENNESSEE TN
## 570                 TEXAS TX
## 571             MINNESOTA MN
## 572            CALIFORNIA CA
## 573               GEORGIA GA
## 574               GEORGIA GA
## 575            CALIFORNIA CA
## 576            CALIFORNIA CA
## 577            NEW JERSEY NJ
## 578              MISSOURI MO
## 579                NEVADA NV
## 580                  UTAH UT
## 581                  UTAH UT
## 582         NEW HAMPSHIRE NH
## 583                  OHIO OH
## 584            CALIFORNIA CA
## 585             WISCONSIN WI
## 586          PENNSYLVANIA PA
## 587               FLORIDA FL
## 588              NEW YORK NY
## 589        SOUTH CAROLINA SC
## 590             TENNESSEE TN
## 591                NEVADA NV
## 592               ARIZONA AZ
## 593               ARIZONA AZ
## 594               ARIZONA AZ
## 595            CALIFORNIA CA
## 596                 TEXAS TX
## 597            WASHINGTON WA
## 598               INDIANA IN
## 599              NEW YORK NY
## 600         MASSACHUSETTS MA
## 601            WASHINGTON WA
## 602                  IOWA IA
## 603                  OHIO OH
## 604                 MAINE ME
## 605               ALABAMA AL
## 606            CALIFORNIA CA
## 607                 TEXAS TX
## 608            CALIFORNIA CA
## 609                 TEXAS TX
## 610             MINNESOTA MN
## 611             LOUISIANA LA
## 612                  UTAH UT
## 613                NEVADA NV
## 614                 TEXAS TX
## 615                 TEXAS TX
## 616            CALIFORNIA CA
## 617                  IOWA IA
## 618              DELAWARE DE
## 619           MISSISSIPPI MS
## 620                 TEXAS TX
## 621          PENNSYLVANIA PA
## 622                  UTAH UT
## 623          PENNSYLVANIA PA
## 624                 TEXAS TX
## 625            NEW JERSEY NJ
## 626        NORTH CAROLINA NC
## 627             MINNESOTA MN
## 628                 TEXAS TX
## 629              KENTUCKY KY
## 630              KENTUCKY KY
## 631             TENNESSEE TN
## 632               ARIZONA AZ
## 633                 TEXAS TX
## 634            CALIFORNIA CA
## 635              NEW YORK NY
## 636            WASHINGTON WA
## 637               FLORIDA FL
## 638                NEVADA NV
## 639                NEVADA NV
## 640               FLORIDA FL
## 641         MASSACHUSETTS MA
## 642            CALIFORNIA CA
## 643               WYOMING WY
## 644                KANSAS KS
## 645              COLORADO CO
## 646            WASHINGTON WA
## 647                 TEXAS TX
## 648        SOUTH CAROLINA SC
## 649             TENNESSEE TN
## 650        NORTH CAROLINA NC
## 651            NEW JERSEY NJ
## 652            NEW JERSEY NJ
## 653            NEW JERSEY NJ
## 654                OREGON OR
## 655        SOUTH CAROLINA SC
## 656        SOUTH CAROLINA SC
## 657                  OHIO OH
## 658              MICHIGAN MI
## 659              MICHIGAN MI
## 660              MICHIGAN MI
## 661                 TEXAS TX
## 662               GEORGIA GA
## 663               GEORGIA GA
## 664            CALIFORNIA CA
## 665            NEW MEXICO NM
## 666               INDIANA IN
## 667                 MAINE ME
## 668            NEW MEXICO NM
## 669                 TEXAS TX
## 670                NEVADA NV
## 671            CALIFORNIA CA
## 672          PENNSYLVANIA PA
## 673                 MAINE ME
## 674              MARYLAND MD
## 675                  OHIO OH
## 676                 TEXAS TX
## 677        NORTH CAROLINA NC
## 678        NORTH CAROLINA NC
## 679          PENNSYLVANIA PA
## 680               FLORIDA FL
## 681              COLORADO CO
## 682              NEBRASKA NE
## 683              MISSOURI MO
## 684                 MAINE ME
## 685                 TEXAS TX
## 686                OREGON OR
## 687        NORTH CAROLINA NC
## 688            CALIFORNIA CA
## 689              NEW YORK NY
## 690              NEW YORK NY
## 691               INDIANA IN
## 692            WASHINGTON WA
## 693                 TEXAS TX
## 694               GEORGIA GA
## 695            CALIFORNIA CA
## 696          PENNSYLVANIA PA
## 697         MASSACHUSETTS MA
## 698            CALIFORNIA CA
## 699            CALIFORNIA CA
## 700          PENNSYLVANIA PA
## 701                NEVADA NV
## 702                NEVADA NV
## 703              ILLINOIS IL
## 704                 TEXAS TX
## 705                 TEXAS TX
## 706             WISCONSIN WI
## 707              NEW YORK NY
## 708              NEW YORK NY
## 709                 TEXAS TX
## 710             LOUISIANA LA
## 711             WISCONSIN WI
## 712            WASHINGTON WA
## 713                 IDAHO ID
## 714              ARKANSAS AR
## 715              ILLINOIS IL
## 716        NORTH CAROLINA NC
## 717              ILLINOIS IL
## 718              ILLINOIS IL
## 719             WISCONSIN WI
## 720              ILLINOIS IL
## 721               ARIZONA AZ
## 722              OKLAHOMA OK
## 723                 IDAHO ID
## 724               WYOMING WY
## 725              COLORADO CO
## 726                 TEXAS TX
## 727        NORTH CAROLINA NC
## 728                 TEXAS TX
## 729        NORTH CAROLINA NC
## 730            CALIFORNIA CA
## 731            NEW JERSEY NJ
## 732               FLORIDA FL
## 733                 TEXAS TX
## 734              ARKANSAS AR
## 735             WISCONSIN WI
## 736               FLORIDA FL
## 737               FLORIDA FL
## 738                KANSAS KS
## 739            CALIFORNIA CA
## 740                  UTAH UT
## 741         MASSACHUSETTS MA
## 742                  OHIO OH
## 743              OKLAHOMA OK
## 744              OKLAHOMA OK
## 745        NORTH CAROLINA NC
## 746            WASHINGTON WA
## 747            CALIFORNIA CA
## 748              NEBRASKA NE
## 749            CALIFORNIA CA
## 750              NEBRASKA NE
## 751                  OHIO OH
## 752            CALIFORNIA CA
## 753              ARKANSAS AR
## 754               INDIANA IN
## 755            CALIFORNIA CA
## 756            CALIFORNIA CA
## 757               FLORIDA FL
## 758            WASHINGTON WA
## 759              COLORADO CO
## 760               FLORIDA FL
## 761            CALIFORNIA CA
## 762              COLORADO CO
## 763            WASHINGTON WA
## 764                 TEXAS TX
## 765            WASHINGTON WA
## 766               FLORIDA FL
## 767            CALIFORNIA CA
## 768            WASHINGTON WA
## 769             WISCONSIN WI
## 770                 IDAHO ID
## 771            NEW JERSEY NJ
## 772          SOUTH DAKOTA SD
## 773              OKLAHOMA OK
## 774              ILLINOIS IL
## 775               ARIZONA AZ
## 776               ARIZONA AZ
## 777        NORTH CAROLINA NC
## 778          SOUTH DAKOTA SD
## 779               GEORGIA GA
## 780                  OHIO OH
## 781        SOUTH CAROLINA SC
## 782            CALIFORNIA CA
## 783              VIRGINIA VA
## 784            CALIFORNIA CA
## 785               ARIZONA AZ
## 786          PENNSYLVANIA PA
## 787                  OHIO OH
## 788               FLORIDA FL
## 789              KENTUCKY KY
## 790               ARIZONA AZ
## 791               ARIZONA AZ
## 792               ARIZONA AZ
## 793              KENTUCKY KY
## 794        NORTH CAROLINA NC
## 795                NEVADA NV
## 796                NEVADA NV
## 797                NEVADA NV
## 798               FLORIDA FL
## 799               FLORIDA FL
## 800               ARIZONA AZ
## 801                 MAINE ME
## 802                 MAINE ME
## 803               FLORIDA FL
## 804        SOUTH CAROLINA SC
## 805              ILLINOIS IL
## 806                 TEXAS TX
## 807             TENNESSEE TN
## 808             MINNESOTA MN
## 809                 TEXAS TX
## 810                 TEXAS TX
## 811                 TEXAS TX
## 812             MINNESOTA MN
## 813              MARYLAND MD
## 814              NEW YORK NY
## 815              NEW YORK NY
## 816              NEW YORK NY
## 817              NEW YORK NY
## 818                ALASKA AK
## 819            CALIFORNIA CA
## 820              COLORADO CO
## 821              KENTUCKY KY
## 822               INDIANA IN
## 823                NEVADA NV
## 824                NEVADA NV
## 825             MINNESOTA MN
## 826             WISCONSIN WI
## 827               GEORGIA GA
## 828            WASHINGTON WA
## 829             LOUISIANA LA
## 830                 TEXAS TX
## 831                  OHIO OH
## 832            CALIFORNIA CA
## 833            CALIFORNIA CA
## 834              NEBRASKA NE
## 835              MISSOURI MO
## 836               ARIZONA AZ
## 837                  OHIO OH
## 838                  UTAH UT
## 839            CALIFORNIA CA
## 840              MICHIGAN MI
## 841               ALABAMA AL
## 842              VIRGINIA VA
## 843               FLORIDA FL
## 844              COLORADO CO
## 845        NORTH CAROLINA NC
## 846         MASSACHUSETTS MA
## 847               GEORGIA GA
## 848              COLORADO CO
## 849                  OHIO OH
## 850                  OHIO OH
## 851            CALIFORNIA CA
## 852            CALIFORNIA CA
## 853                 IDAHO ID
## 854                  OHIO OH
## 855              MICHIGAN MI
## 856            WASHINGTON WA
## 857            CALIFORNIA CA
## 858                  OHIO OH
## 859                  OHIO OH
## 860        SOUTH CAROLINA SC
## 861        NORTH CAROLINA NC
## 862              ILLINOIS IL
## 863             WISCONSIN WI
## 864              ARKANSAS AR
## 865              NEW YORK NY
## 866               INDIANA IN
## 867              MICHIGAN MI
## 868              COLORADO CO
## 869             WISCONSIN WI
## 870              MICHIGAN MI
## 871            WASHINGTON WA
## 872                 TEXAS TX
## 873          PENNSYLVANIA PA
## 874              ILLINOIS IL
## 875               GEORGIA GA
## 876             TENNESSEE TN
## 877             TENNESSEE TN
## 878                  OHIO OH
## 879                 TEXAS TX
## 880        NORTH CAROLINA NC
## 881                OREGON OR
## 882              COLORADO CO
## 883            CALIFORNIA CA
## 884                 TEXAS TX
## 885               FLORIDA FL
## 886                 TEXAS TX
## 887               ALABAMA AL
## 888            WASHINGTON WA
## 889               GEORGIA GA
## 890                 TEXAS TX
## 891            CALIFORNIA CA
## 892            CALIFORNIA CA
## 893            CALIFORNIA CA
## 894            CALIFORNIA CA
## 895            CALIFORNIA CA
## 896              OKLAHOMA OK
## 897              OKLAHOMA OK
## 898            CALIFORNIA CA
## 899            CALIFORNIA CA
## 900            NEW JERSEY NJ
## 901                OREGON OR
## 902               GEORGIA GA
## 903              MICHIGAN MI
## 904            CALIFORNIA CA
## 905               GEORGIA GA
## 906                 TEXAS TX
## 907            CALIFORNIA CA
## 908              ILLINOIS IL
## 909        NORTH CAROLINA NC
## 910        NORTH CAROLINA NC
## 911              ILLINOIS IL
## 912               FLORIDA FL
## 913               GEORGIA GA
## 914              MISSOURI MO
## 915              ILLINOIS IL
## 916            CALIFORNIA CA
## 917                KANSAS KS
## 918                 TEXAS TX
## 919         MASSACHUSETTS MA
## 920                NEVADA NV
## 921            CALIFORNIA CA
## 922                 TEXAS TX
## 923              MISSOURI MO
## 924            CALIFORNIA CA
## 925              MARYLAND MD
## 926                  UTAH UT
## 927                  UTAH UT
## 928            NEW JERSEY NJ
## 929              VIRGINIA VA
## 930                 IDAHO ID
## 931                 TEXAS TX
## 932        SOUTH CAROLINA SC
## 933                NEVADA NV
## 934                NEVADA NV
## 935                NEVADA NV
## 936                NEVADA NV
## 937             WISCONSIN WI
## 938              NEW YORK NY
## 939                  OHIO OH
## 940              KENTUCKY KY
## 941                 IDAHO ID
## 942               WYOMING WY
## 943             LOUISIANA LA
## 944             TENNESSEE TN
## 945                  OHIO OH
## 946                  OHIO OH
## 947              ARKANSAS AR
## 948            CALIFORNIA CA
## 949              MISSOURI MO
## 950            CALIFORNIA CA
## 951            CALIFORNIA CA
## 952                  OHIO OH
## 953               FLORIDA FL
## 954               FLORIDA FL
## 955             TENNESSEE TN
## 956         MASSACHUSETTS MA
## 957               FLORIDA FL
## 958                  UTAH UT
## 959             LOUISIANA LA
## 960        SOUTH CAROLINA SC
## 961              ARKANSAS AR
## 962              MARYLAND MD
## 963             MINNESOTA MN
## 964               ARIZONA AZ
## 965               ARIZONA AZ
## 966               ARIZONA AZ
## 967                 TEXAS TX
## 968            CALIFORNIA CA
## 969              MISSOURI MO
## 970          PENNSYLVANIA PA
## 971                 TEXAS TX
## 972            NEW MEXICO NM
## 973            WASHINGTON WA
## 974          SOUTH DAKOTA SD
## 975                KANSAS KS
## 976              ILLINOIS IL
## 977              NEW YORK NY
## 978              NEW YORK NY
## 979                 TEXAS TX
## 980            CALIFORNIA CA
## 981            WASHINGTON WA
## 982                  OHIO OH
## 983                KANSAS KS
## 984               GEORGIA GA
## 985  DISTRICT OF COLUMBIA DC
## 986            WASHINGTON WA
## 987            CALIFORNIA CA
## 988            CALIFORNIA CA
## 989        NORTH CAROLINA NC
## 990               ARIZONA AZ
## 991            WASHINGTON WA
## 992            WASHINGTON WA
## 993              MICHIGAN MI
## 994               FLORIDA FL
## 995                 TEXAS TX
## 996                 MAINE ME
## 997            CALIFORNIA CA
## 998              MICHIGAN MI
## 999              MICHIGAN MI
## 1000              GEORGIA GA
## 1001           CALIFORNIA CA
## 1002       SOUTH CAROLINA SC
## 1003              GEORGIA GA
## 1004             MISSOURI MO
## 1005             COLORADO CO
## 1006               OREGON OR
## 1007                 UTAH UT
## 1008             KENTUCKY KY
## 1009              FLORIDA FL
## 1010             VIRGINIA VA
## 1011             ARKANSAS AR
## 1012       NORTH CAROLINA NC
## 1013                TEXAS TX
## 1014             COLORADO CO
## 1015                TEXAS TX
## 1016            LOUISIANA LA
## 1017                TEXAS TX
## 1018          MISSISSIPPI MS
## 1019             COLORADO CO
## 1020             MISSOURI MO
## 1021              WYOMING WY
## 1022             OKLAHOMA OK
## 1023              FLORIDA FL
## 1024                 UTAH UT
## 1025         SOUTH DAKOTA SD
## 1026                TEXAS TX
## 1027                TEXAS TX
## 1028            WISCONSIN WI
## 1029                 OHIO OH
## 1030                IDAHO ID
## 1031                 UTAH UT
## 1032                TEXAS TX
## 1033           CALIFORNIA CA
## 1034             OKLAHOMA OK
## 1035             OKLAHOMA OK
## 1036                TEXAS TX
## 1037             MICHIGAN MI
## 1038            WISCONSIN WI
## 1039         PENNSYLVANIA PA
## 1040             OKLAHOMA OK
## 1041                IDAHO ID
## 1042         PENNSYLVANIA PA
## 1043                TEXAS TX
## 1044             KENTUCKY KY
## 1045                 OHIO OH
## 1046       NORTH CAROLINA NC
## 1047           CALIFORNIA CA
## 1048           CALIFORNIA CA
## 1049           CALIFORNIA CA
## 1050           CALIFORNIA CA
## 1051           CALIFORNIA CA
## 1052                TEXAS TX
## 1053                TEXAS TX
## 1054                TEXAS TX
## 1055                MAINE ME
## 1056       NORTH CAROLINA NC
## 1057             ILLINOIS IL
## 1058                 UTAH UT
## 1059           CALIFORNIA CA
## 1060                 IOWA IA
## 1061       NORTH CAROLINA NC
## 1062         PENNSYLVANIA PA
## 1063             COLORADO CO
## 1064                TEXAS TX
## 1065                TEXAS TX
## 1066              ARIZONA AZ
## 1067            WISCONSIN WI
## 1068              ARIZONA AZ
## 1069                TEXAS TX
## 1070                 OHIO OH
## 1071            MINNESOTA MN
## 1072                TEXAS TX
## 1073             MISSOURI MO
## 1074                IDAHO ID
## 1075                TEXAS TX
## 1076             VIRGINIA VA
## 1077              FLORIDA FL
## 1078       NORTH CAROLINA NC
## 1079           NEW JERSEY NJ
## 1080              FLORIDA FL
## 1081         NORTH DAKOTA ND
## 1082           CALIFORNIA CA
## 1083         PENNSYLVANIA PA
## 1084                 IOWA IA
## 1085             KENTUCKY KY
## 1086             ILLINOIS IL
## 1087                TEXAS TX
## 1088           CALIFORNIA CA
## 1089           CALIFORNIA CA
## 1090              FLORIDA FL
## 1091             KENTUCKY KY
## 1092              WYOMING WY
## 1093           WASHINGTON WA
## 1094           WASHINGTON WA
## 1095           WASHINGTON WA
## 1096             ARKANSAS AR
## 1097         PENNSYLVANIA PA
## 1098                TEXAS TX
## 1099             COLORADO CO
## 1100                 OHIO OH
## 1101             NEW YORK NY
## 1102              VERMONT VT
## 1103             MICHIGAN MI
## 1104             NEW YORK NY
## 1105                 OHIO OH
## 1106              GEORGIA GA
## 1107              FLORIDA FL
## 1108             ILLINOIS IL
## 1109           CALIFORNIA CA
## 1110           CALIFORNIA CA
## 1111             ILLINOIS IL
## 1112               KANSAS KS
## 1113           CALIFORNIA CA
## 1114            WISCONSIN WI
## 1115              ALABAMA AL
## 1116           CALIFORNIA CA
## 1117             OKLAHOMA OK
## 1118         RHODE ISLAND RI
## 1119         RHODE ISLAND RI
## 1120             COLORADO CO
## 1121             ILLINOIS IL
## 1122                TEXAS TX
## 1123                TEXAS TX
## 1124           CALIFORNIA CA
##                                                       School.Name   NCES.SchID
## 1                                                       500 Reach 200795000000
## 2                                                6th Grade Center 421989000000
## 3                                             A+ SECONDARY SCHOOL 480020000000
## 4                                       Academy for Biotechnology 341072000000
## 5                                    ACADEMY OF ADVANCED LEARNING  80234006736
## 6                             Academy of The Americas High School 260110000000
## 7                                Achieve Community Charter School 340079000000
## 8                                         Achievement High School 263021000000
## 9                               Adelante Dual Language Academy II  60231014147
## 10                          Advanced Community Experience Program 250708000000
## 11                                      Advanced Learning Academy  63531014192
## 12                                   AF Providence Mayoral Middle 440002000000
## 13                   AGEE LIERLY LIFE PREPARATION SERVICES SCHOOL  50612001644
## 14                                                       AGRA JHS 400255000000
## 15                          Agriculture and Science Early College 370231000000
## 16                                   Alaska Middle College School  20018000763
## 17                                       Alexandria Middle School  10054002429
## 18                                               ALICE W DOUSE EL 482566000000
## 19                                                         ALLIES  80387006725
## 20                                           Alloway Creek El Sch 421398000000
## 21                                             Alma Fuerte Public  69107814146
## 22                                         Almond-Bancroft Middle 550024000000
## 23                                                  Alpha Academy 130441000000
## 24                                     Alta Vista Innovation High  60001514154
## 25                                   Alternative School at Levitt 341800000000
## 26                                  ALVIN V ANDERSON RISE ACADEMY 484347000000
## 27                Ambassador Phillip V. Sanchez II Public Charter  63168014206
## 28                                      America's  Finest Charter  63432014198
## 29                           American Leadership Academy  Gilbert  40011203573
## 30                            American Leadership Academy  Higley  40011203576
## 31                       American Leadership Academy Signal Butte  40011203570
## 32                                       ANDERSON ACCELERATED H S 481020000000
## 33                                          Andrew Douglas School 550960000000
## 34                           Animo City of Champions Charter High  69107814151
## 35                                            Apple Pie Preschool  60753014185
## 36                                    Arcola Bridges/Beacons RSSP 170018000000
## 37                                          Arete Charter Academy  63093014123
## 38                                                  Argyle Middle 550045000000
## 39              Arizona Agribusiness & Equine Center  Inc. - Mesa  40096903543
## 40                                              Meraux Elementary 220141000000
## 41                                           Arlington Open Doors 530024000000
## 42                          ARLINGTON PARK EARLY CHILDHOOD CENTER 481623000000
## 43                                     ARTS ACADEMY OF EXCELLENCE 120039000000
## 44                                              Asheville Primary 370027000000
## 45                                                     New School 210303000000
## 46                                  ASPEN CREEK ELEMENTARY SCHOOL 317122000000
## 47                                      ASPEN CREEK MIDDLE SCHOOL 317122000000
## 48                                ASU Preparatory Academy Digital  40096503556
## 49                                  ASU Preparatory Academy Tempe  40097103567
## 50                                  AVANT GRADE ACADEMY WESTCHASE 120087000000
## 51                                 Avondale Meadows Middle School 180018000000
## 52                                         B H R A Cooperative HS 170143000000
## 53                                    BABCOCK NEIGHBORHOOD SCHOOL 120024000000
## 54                                   Baker County Learning Center 130018000000
## 55                                  Baldwin County Virtual School  10027002443
## 56                                    Baldwin Intermediate School 510236000000
## 57                              BALDWYN CAREER ADVANCEMENT CENTER 280054000000
## 58                                            Barberton Preschool 390435000000
## 59                  Bard High Early College Cleveland East Campus 390438000000
## 60                                  Barker Creek Community School 530108000000
## 61                                           BASIS Peoria Primary  40096303558
## 62                                          BASIS Phoenix Primary  40096703560
## 63                                    BASIS Phoenix South Primary  40096103550
## 64                   BASIS SAN ANTONIO PRI- MEDICAL CENTER CAMPUS 480144000000
## 65                                                 Bastian School 490042000000
## 66                      BATTLE MOUNTAIN EARLY COLLEGE HIGH SCHOOL  80354006707
## 67                                                Bayside Academy  63492014143
## 68                                   BEATRICE COMMUNITY PRESCHOOL 310360000000
## 69                                       Ben Steele Middle School 300387000000
## 70                                       BENNINGTON MIDDLE SCHOOL 310399000000
## 71                                                  Benton Middle 550111000000
## 72                             Bethel Elementary Learning Academy 530048000000
## 73                          Betty Maddalena Early Learning Center 341761000000
## 74                                       BEXLEY ELEMENTARY SCHOOL 120153000000
## 75                                        Big Picture Twin Cities 270042000000
## 76               Billy and Rosemary Vassiliadis Elementary School 320006000000
## 77                                        BILOXI UPPER ELEMENTARY 280063000000
## 78                                                    Blind South 490007000000
## 79                                               Blue Oak Academy  69104514157
## 80                                  Blue Ridge High School Online  40658003564
## 81                                    Bluegrass Challenge Academy 210171000000
## 82                                           Bluestone Elementary 510186000000
## 83                                         Bluff City High School 470016000000
## 84                                             BONIFAY K-8 SCHOOL 120090000000
## 85                                     BONITA SPRINGS HIGH SCHOOL 120108000000
## 86                                             Bonneville Academy 490020000000
## 87                                      Boreal Sun Charter School  20060000761
## 88                                     Boulder Colony School - 06 463444000000
## 89                                 BOYD COUNTY ELEMENTARY (BUTTE) 310019000000
## 90                                 BOYD COUNTY ELEMENTARY (LYNCH) 310019000000
## 91                                BOYD COUNTY HIGH SCHOOL (LYNCH) 310019000000
## 92                              BOYD COUNTY HIGH SCHOOL (SPENCER) 310019000000
## 93                              BOYD COUNTY MIDDLE SCHOOL (LYNCH) 310019000000
## 94                            BOYD COUNTY MIDDLE SCHOOL (SPENCER) 310019000000
## 95                               Boys Academic Leadership Academy  62271014106
## 96                                                     BRADLEY EL 481500000000
## 97                                       Brambleton Middle School 510225000000
## 98                                        BRAMLETTE STEAM ACADEMY 482811000000
## 99                                                 Brandyine SITE 100124000000
## 100                                       Brashier Middle College 450390000000
## 101                       BRENHAM EARLY CHILDHOOD LEARNING CENTER 481128000000
## 102                                  BRIDGE CREEK EARLY CHILDHOOD 400540000000
## 103                                              BRIDGE CREEK IES 400540000000
## 104                             BRIDGEPREP ACADEMY BROWARD COUNTY 120018000000
## 105                               BRIDGEPREP ACADEMY DUVAL COUNTY 120048000000
## 106                              BRIDGEPREP ACADEMY OF PALM BEACH 120150000000
## 107                               BRIDGEPREP ACADEMY OF RIVERVIEW 120087000000
## 108                                       Bridges/Wyandot Academy 200795000000
## 109             BRILLA COLLEGE PREPARATORY CHARTER SCHOOL VERITAS 360117000000
## 110                         BRONX CHARTER SCHOOL FOR EXCELLENCE 3 360116000000
## 111              BROOKLYN EMERGING LEADERS ACADEMY CHARTER SCHOOL 360116000000
## 112                           Brooks County Early Learning Center 130054000000
## 113                               BROOKS HARBOR ELEMENTARY SCHOOL 381941000000
## 114                                           BROOKWOOD FOREST EL 483240000000
## 115                           BROWNSVILLE LEARNING ACADEMY MIDDLE 481168000000
## 116                                  Brownville Elementary School 231158000000
## 117                                       BRUNO-PYATT K-12 SCHOOL  50007601645
## 118                                                     BRYANT EL 482517000000
## 119                                         Building 21 Allentown 420228000000
## 120                                        BUTLER EARLY CHILDHOOD 290636000000
## 121                                   Caleb Dustin Hunking School 250597000000
## 122                          California Academy of Sports Science  61071014197
## 123                   California Academy of Sports Science Fresno  63168014207
## 124            California School of the Arts - San Gabriel Valley  61152014083
## 125                                    California Steam Sonoma II  61632014078
## 126                                              Camp Road Middle 450144000000
## 127                                                 Campus at Lee 510180000000
## 128                              Campus International High School 390438000000
## 129                                      Canyon Rose Academy-East  40063303536
## 130                                       Canyon View High School  40045003559
## 131                                   Canyons Virtual High School 490014000000
## 132                         CAPITOL CITY LIGHTHOUSE UPPER ACADEMY  50041301615
## 133                      Capestone Academy Charter SchoolMayfield 260101000000
## 134                       CapstoneWayne Co Juvenile Detention Fac 260101000000
## 135                                          Cardinal Junior High 190624000000
## 136                                       CAREER EDUCATION CENTER 484578000000
## 137                                           Caribou High School 231479000000
## 138                                         Caribou Middle School 231479000000
## 139                                    CARLTON LANDING ACADEMY HS 400080000000
## 140                                   Carman Park Early Childhood 268040000000
## 141                                      Carolina Park Elementary 450144000000
## 142                                                 Carson School  62121014174
## 143                                           Carthage Elementary 390438000000
## 144                                      Carver Elementary School 270819000000
## 145                                    Cascade Opportunity Center 410278000000
## 146                                                 CAST TECH H S 483873000000
## 147                                              Catamount School 370042000000
## 148                                              CATAPULT ACADEMY 120030000000
## 149                CAVIAT - Flagstaff Arts and Leadership Academy  40034703568
## 150                                              Cayce Elementary 450273000000
## 151                                                   CCPS Online 510084000000
## 152                                  Cedar Park Elementary School 530771000000
## 153                                            Cedar Ridge School 490012000000
## 154                                        Cedar River Elementary 530876000000
## 155                                                    CELINA PRI 481329000000
## 156                                 CENTERPOINT ELEMENTARY SCHOOL  50669001652
## 157                                       Central Park Elementary 262382000000
## 158                                         Central State Academy 200999000000
## 159         Century High School An Integrated Global Studies Acad  63363014155
## 160                                      CEREDO-KENOVA ELEMENTARY 540150000000
## 161                                              Champion San Tan  40019103557
## 162              CHAMPIONSHIP ACADEMY OF DISTINCTION WEST BROWARD 120018000000
## 163                               Charlotte Teacher Early College 370297000000
## 164                                            Chillicothe School 390437000000
## 165                             Chinese Language Immersion School 410474000000
## 166                               Circle City Prep Charter School 180018000000
## 167                              Citizens Leadership Academy East 390159000000
## 168                                                   CITYLAB H S 481623000000
## 169                                                     CLARK INT 481500000000
## 170                                           Clarksville Charter  60627014165
## 171                              CLEARVIEW ADULT EDUCATION CENTER 120156000000
## 172                                      CLEARWATER MIDDLE SCHOOL 310012000000
## 173                                 CLEVELAND CENTRAL HIGH SCHOOL 280075000000
## 174                               CLEVELAND CENTRAL MIDDLE SCHOOL 280075000000
## 175                                               CLINTON WEST ES 403024000000
## 176                                          Clio Learning Center 261011000000
## 177                             CNUSD Hybrid School of Innovation  60985014184
## 178                                       Coastal Academy Charter  62825014145
## 179           Coastal Plains Charter High School - Candler Campus 130025000000
## 180                                   Coastal Preparatory Academy 370041000000
## 181                             Coatesville Area SD Cyber Academy 420624000000
## 182                                   Coatesville Intermediate HS 420624000000
## 183                                         CodeRVA Regional High 510026000000
## 184                                    COIT/FRANKFORD ROAD NEW EL 483510000000
## 185            College Achieve Greater Asbury Park Charter School 340079000000
## 186                       College Achieve Paterson Charter School 340079000000
## 187                                            Collegiate Academy 220029000000
## 188                                       COLLIER CHARTER ACADEMY 120033000000
## 189                                COLORADO EARLY COLLEGES AURORA  80002006710
## 190                            COLORADO HIGH SCHOOL CHARTER - GES  80336006735
## 191                                     COLORADO MILITARY ACADEMY  80002006708
## 192                        Columbia River Gorge Elementary School 530954000000
## 193                                              Columbia Step Up 260699000000
## 194     Community Collaborative Virtual - Keppel Partnership Acad  61944014092
## 195               Community Collaborative Virtual - Sage Oak Chtr  61686014107
## 196                                    COMPASS Alternative School 180015000000
## 197                                       Compass Learning Center 263372000000
## 198                                          COMPASS ROSE ACADEMY 480146000000
## 199                          Connecting Waters Charter - East Bay  69105114091
## 200                                           Connections Academy 370472000000
## 201                                   Coral Academy Middle School 320048000000
## 202           Coral Academy of Science Las Vegas Centennial Hills 320000000000
## 203                 Coral Academy of Science Las Vegas Nellis AFB 320000000000
## 204                    Coral Academy of Science Las Vegas Tamarus 320000000000
## 205                   Coral Academy of Science Las Vegas Windmill 320000000000
## 206                         Cornerstone JeffersonDouglass Academy 260110000000
## 207                                     Cornville Downtown Campus 231481000000
## 208                              Cornville Early Childhood Campus 231481000000
## 209                      Coronado Unified Special Education Pre-K  60987014121
## 210                                         Correctional Services 260282000000
## 211                                   CORTLAND JUNIOR HIGH SCHOOL 360846000000
## 212                                 Cotati-Rohnert Park Preschool  60994014180
## 213                                          Cottonwood Preschool  60999014148
## 214                            Covington-Harper Elementary School 510313000000
## 215                                                 COYOTE WILLOW 350006000000
## 216                                               CRCC-Open Doors 530573000000
## 217                                       CREEKSIDE MIDDLE SCHOOL  50306001648
## 218                             Crescent Valley Public Charter II  63804014209
## 219                                        Crescent View South II  64221014204
## 220                                                 Crete Academy  62271014100
## 221                                        CROSSROADS HIGH SCHOOL 290060000000
## 222                                               Cruiser Academy 390470000000
## 223                                           CRUM PRE K-8 SCHOOL 540150000000
## 224                                        CVIT - Ray High School  40031603563
## 225                            CYPRESS CREEK HIGH ADULT EDUCATION 120153000000
## 226                              CYPRESS CREEK MIDDLE/HIGH SCHOOL 120153000000
## 227                                         D.M. SMITH ELEMENTARY 280075000000
## 228                             Daniel Morgan Intermediate School 510405000000
## 229                               Daniel Webster Secondary School 550960000000
## 230                                         Daniels Canyon School 490111000000
## 231                                                   DAVIDSON ES 400080000000
## 232                        Davis Aerospace & Maritime High School 390438000000
## 233                                             DB Youth Services 530038000000
## 234                                     Decatur Elementary School 530771000000
## 235                                          DEL NORTE ELEMENTARY 350111000000
## 236                                     DEL RIO EARLY COLLEGE H S 483890000000
## 237                                              DEL VALLE MIDDLE 484668000000
## 238                                       Delmar Middle Level ILC 100027000000
## 239                                     Delta Charter Online No.2  62703014183
## 240                                             GW CAREER ACADEMY  80336006731
## 241                                       Delta Innovative School 130054000000
## 242                             Delta Junction Junior High School  20010000764
## 243                                          Delta Keys Charter 2  62703014175
## 244                            Delta Mills Early Childhood Center 261641000000
## 245                           Democracy Prep at Agassi Elementary 320002000000
## 246                                 Democracy Prep at Agassi High 320002000000
## 247                               Democracy Prep at Agassi Middle 320002000000
## 248                                         Desert Sky Montessori 410198000000
## 249                                Detroit Collegiate High School 260111000000
## 250                                       DICKINSON MIDDLE SCHOOL 380004000000
## 251                            Diego Hills Central Public Charter  61071014199
## 252                                      Dimmick Comm Cons SD 175 170143000000
## 253                           Discovery Charter School Mesa Vista 320000000000
## 254                                      Distinctive College Prep 260112000000
## 255                                   DIXIE TEEN PARENT PRESCHOOL 120045000000
## 256                                                Doe Run El Sch 421455000000
## 257                          Don and Dee Snyder Elementary School 320006000000
## 258                                                NEW CONROE J H 481500000000
## 259                                            DONALD LEONETTI EL 481965000000
## 260                                         DONIPHAN INTERMEDIATE 291092000000
## 261                                     Dooly County Prep Academy 130180000000
## 262                                          Doral Academy Cactus 320000000000
## 263                                       Doral Academy Fire Mesa 320000000000
## 264                                 Doral Academy Northern Nevada 320000000000
## 265                                          Doral Academy Saddle 320000000000
## 266                                     Doral Academy West Pebble 320000000000
## 267                                          DORCHESTER PRESCHOOL 316984000000
## 268                               Dorothy Dodds Elementary School 272142000000
## 269                       DOUGLAS CO WEST ALTERNATIVE HIGH SCHOOL 310017000000
## 270                                       DOVE SCIENCE ACADEMY ES 400080000000
## 271                                       DOVE SCIENCE ACADEMY HS 400080000000
## 272                                       DOVE SCIENCE ACADEMY MS 400080000000
## 273                                 DOVE SCIENCE ACADEMY TULSA HS 400075000000
## 274                                DOVE SCIENCE ACADEMY TULSA JHS 400075000000
## 275                                              DR BRUCE WOOD EL 484245000000
## 276                       Dr. Beverly S. Mathis Elementary School 320006000000
## 277                                 Lowell Day School on Broadway 250702000000
## 278                           DR. TONI BILBAO PREPARATORY ACADEMY 120039000000
## 279                                 Drager Early Education Center 260195000000
## 280                                   DRANE EARLY LEARNING CENTER 481533000000
## 281                                                 DREAM Academy 170855000000
## 282                                     DRESSEL ELEMENTARY SCHOOL 291869000000
## 283                          DSST: CONSERVATORY GREEN HIGH SCHOOL  80336006730
## 284                                          Dual Language School 341293000000
## 285                                 Duff-Allen Central Elementary 210195000000
## 286                               DUVAL CHARTER SCHOOL AT COASTAL 120048000000
## 287                                            EAGLE GRAVOIS PARK 290061000000
## 288                        EAGLE VALLEY EARLY COLLEGE HIGH SCHOOL  80354006709
## 289                                        EARLY CHILDHOOD CENTER 291365000000
## 290                                        EARLY CHILDHOOD CENTER 290837000000
## 291                                        Early Childhood Center 273009000000
## 292                                        EARLY CHILDHOOD CENTER 482967000000
## 293                                      Early Childhood Center 2 390442000000
## 294                                         ECSE Center at Campus 261644000000
## 295                                     Early Childhood Education  69102314210
## 296              Early Childhood Education Center - Carver Campus  61488014187
## 297                           Early Childhood Special Education S 271242000000
## 298                                          Early School Program 263066000000
## 299                           East Jordan Alternative High School 261256000000
## 300                                   East Lake Elementary School 273239000000
## 301                                  East Moline Education Center 171317000000
## 302                                                       East MS 420930000000
## 303                                    East Ouchita Middle School 220120000000
## 304                                           East Samford School  10021002440
## 305                                          East Side Elementary 560624000000
## 306                               EARLY CHILDHOOD LEARNING CENTER 120087000000
## 307                            EAST TEXAS MONTESSORI PREP ACADEMY 482811000000
## 308                             Easton Arts Academy Elementary CS 420090000000
## 309                                 Eastpointe Alternative Center 261245000000
## 310                                     Eastview Education Center 272139000000
## 311                                           Eastwood Elementary  68450014114
## 312                               East Carolina Laboratory School 370042000000
## 313                                Edgar Fahs Smith STEAM Academy 422682000000
## 314                   EDMUND J O'NEAL MIDDLE SCHOOL OF EXCELLENCE 360246000000
## 315           Ednovate - USC College Prep Pico-Un Westlake Campus  62271014104
## 316                         Ednovate - USC Esperanza College Prep  62271014117
## 317                    Educational Options Center State Preschool  63315014166
## 318                  Edward J Sam Accelerated School of Lafayette 220087000000
## 319                                                        EL #29 482391000000
## 320                                                        EL #30 482391000000
## 321                                             El Nido Preschool  61215014152
## 322                                   Elan Academy Charter School 220117000000
## 323                       Elizabeth City Pasquotank Early College 370354000000
## 324                                                   ELK CITY ES 401074000000
## 325                            ELKHORN ARBOR VIEW EARLY ED CENTER 317011000000
## 326                                                ELLEN OCHOA ES 403060000000
## 327                         ELMWOOD VILLAGE CHARTER SCHOOL HERTEL 360116000000
## 328                                               Emereau: Bladen 370041000000
## 329                                                 Emily Program 273378000000
## 330                                                       Empower  60681014179
## 331                                   EPIC BLENDED CHARTER OKC ES 400080000000
## 332                                   EPIC BLENDED CHARTER OKC HS 400080000000
## 333                                   EPIC BLENDED CHARTER OKC MS 400080000000
## 334                                 EPIC BLENDED CHARTER TULSA ES 400080000000
## 335                                 EPIC BLENDED CHARTER TULSA HS 400080000000
## 336                                 EPIC BLENDED CHARTER TULSA MS 400080000000
## 337                                             Equitas Academy 4  62271013970
## 338                                                       Erie HS 420930000000
## 339                 ESE HOSPITAL HOMEBOUND INSTRUCTIONAL SERVICES 120150000000
## 340                                                Esperanza Prep  40386003552
## 341                                     Euclid Preparatory School 390159000000
## 342                                                  EVADALE DAEP 481875000000
## 343                                     EVIT East Apache Junction  40973103549
## 344                                     EVIT North Fountain Hills  40973103544
## 345                                    Excel Center - Clarksville 180018000000
## 346                                        Excel Center - Hammond 180019000000
## 347                          EXPLORATION ELE CS - SCIENCE-TECHNOL 360117000000
## 348                                       Fair Park Middle School 220030000000
## 349                                      FAIR School Pilgrim Lane 273178000000
## 350                                       Fairfax Learning Center 200795000000
## 351                                  Fairfield Compass Elementary 390461000000
## 352                   Faith North Early Childhood Learning Center  40630003554
## 353                                       Falcon Ridge Elementary  61296014111
## 354                                            Falls Academy - 08 463171000000
## 355                                      Farmington STEAM Academy 261407000000
## 356                                 Ferguson Hall Freshman School 390472000000
## 357                                      Fieldcrest Middle School 171510000000
## 358                                          Fillmore Central ALP 270010000000
## 359                                                   FIT Academy 270043000000
## 360                                                     FLORES EL 484372000000
## 361                                     Floyd Central High School 210195000000
## 362                                 Fort Larned Elementary School 200837000000
## 363                      FORTE PREPARATORY ACADEMY CHARTER SCHOOL 360116000000
## 364                                                       Fortune  69102714070
## 365                              Foundations College Prep Charter 170993000000
## 366                                        Francis McClure El Sch 421494000000
## 367                             FRED TJARDES SCHOOL OF INNOVATION  80441006719
## 368                                Frederick Douglass High School 210186000000
## 369                                Fredonia Early Learning Center 200627000000
## 370                                           Freedom Academy ALC 270042000000
## 371                                                    FREEDOM EL 484365000000
## 372                                      Frontier Charter Academy 410002000000
## 373                    Frontier International Academy  Elementary 260030000000
## 374                                     Futuro Academy Elementary 320002000000
## 375                                      G. Tyree Learning School 390438000000
## 376                                           Gabriella Charter 2  62271014109
## 377                                Gahanna- Jefferson  Clark Hall 390470000000
## 378                                     Garfield Community School 262184000000
## 379                                        Gaston Virtual Academy 370162000000
## 380                                                       Gateway  60243014097
## 381                                            Gateway to College 200795000000
## 382                                            Gateway University 470015000000
## 383                        GENE BURTON COLLEGE AND CAREER ACADEMY 483765000000
## 384                                       GENERAL TOMMY FRANKS EL 483057000000
## 385                           Genesis Innovation Academy for Boys 130025000000
## 386                          Genesis Innovation Academy for Girls 130024000000
## 387                                     Genesis Innovative School  10087002442
## 388                                            Alternative School 280156000000
## 389                                     George Jr Republic El Sch 421122000000
## 390                                          GEORGE WAGNER MIDDLE 482060000000
## 391                                          GILBERT WILLIE SR EL 484245000000
## 392                    GILBREATH-REED CAREER AND TECHNICAL CENTER 482034000000
## 393              GILCHRIST VIRTUAL INSTRUCTION (COURSE OFFERINGS) 120063000000
## 394                                   Gilroy Special Ed Preschool  61518014178
## 395                           Glacial Ridge Transitional Skills P 270004000000
## 396        GLADES VIRTUAL INSTRUCTION PROGRAM (DISTRICT PROVIDED) 120066000000
## 397                    Glenview Center for Childcare and Learning 390435000000
## 398                                       Global Learning Charter  64116014140
## 399                                 GLOUCESTER CITY MIDDLE SCHOOL 340600000000
## 400                                 Gold Ridge Educational Center  69104614139
## 401                                          Golden Fields School 490042000000
## 402                              GOLDEN RULE SCHOOLS INC - WILMER 480024000000
## 403                               GONZALES EARLY CHILDHOOD CAMPUS 483873000000
## 404                                   GOODWATER MONTESSORI SCHOOL 480146000000
## 405                                  Gordon Early Literacy Center 420624000000
## 406                 Governor's STEM Academy at Osburn High School 510236000000
## 407                                         GREAT WORK MONTESSORI  80480006723
## 408                                              West Side El Sch 421095000000
## 409                                      Green Canyon High School 490012000000
## 410                          GREEN Charter School of the Midlands 450390000000
## 411                                   Greenwood Elementary School 240057000000
## 412                             Greer Middle College Charter High 450390000000
## 413                                      Grimmway Academy Shafter  62145014186
## 414                                           Grossmont Secondary  60144514169
## 415                                                 Growth Public  63384014124
## 416                                           Guadalupe Preschool  61626014201
## 417                                          GW Carver Elementary 370243000000
## 418                                                        H S #7 482391000000
## 419                                 HAAS HALL ACADEMY AT THE LANE  50007801639
## 420                                HAAS HALL ACADEMY JONES CENTER  50007801640
## 421                              Hall-Dale Middle and High School 231478000000
## 422                                        HANOVER ONLINE ACADEMY  80450006720
## 423                                 Harlem HS -  9th Grade Campus 171824000000
## 424                        HARMONY SCHOOL OF ENRICHMENT - HOUSTON 480027000000
## 425                         HARMONY SCHOOL OF EXCELLENCE - LAREDO 480027000000
## 426                    HARMONY SCHOOL OF INNOVATION - BROWNSVILLE 480027000000
## 427                           HARMONY SCHOOL OF INNOVATION - WACO 480029000000
## 428                          HARMONY SCIENCE ACADEMY - CEDAR PARK 480024000000
## 429                               HARMONY SCIENCE ACADEMY - PLANO 480029000000
## 430                                  Harnett Early College (HCEC) 370201000000
## 431                                                        Harper  62724014084
## 432                                               Harrison School 340258000000
## 433                                         HARVARD MIDDLE SCHOOL 317155000000
## 434                                          Hawthorn High School 290061000000
## 435                                         Hazel Park ESL 9 Mile 261803000000
## 436                                    Heavilin Elementary School 181197000000
## 437                      HEBREW LANGUAGE ACADEMY CHARTER SCHOOL 2 360117000000
## 438                                              Hemet Elementary  61692014164
## 439                         HEMPSTEAD ALTERNATIVE LEARNING CENTER 482292000000
## 440          HENDRY VIRTUAL INSTRUCTION PROGRAM DISTRICT PROVIDED 120078000000
## 441                                           Heritage Elementary 190852000000
## 442                                   HIDALGO EARLY START ACADEMY 482310000000
## 443                                                 Highland Prep  40096603572
## 444                                      HIGHLANDS VIRTUAL SCHOOL 120084000000
## 445                                             HILL COUNTY JJAEP 481548000000
## 446                                             HOLLIS T DIETZ EL 481551000000
## 447                                   Hoosac Valley Middle School 250178000000
## 448                                                     HOOVER EL 481611000000
## 449                                         Hope Academic Academy 261293000000
## 450                         HOPE Infant-Toddler Special Education  69103014068
## 451                                    Horace Mann UCLA Community  62271014112
## 452                                      Hortons Creek Elementary 370472000000
## 453                                    HOUSTON ALTERNATIVE SCHOOL 280201000000
## 454                                                     Hudson 4K 550669000000
## 455                              Hull Prairie Intermediate School 390456000000
## 456                                    Hunterdon County Academies 340005000000
## 457                            HW Longfellow Med/STEM Magnet Midl 180477000000
## 458                                     IDEA BRACKENRIDGE ACADEMY 480021000000
## 459                         IDEA BRACKENRIDGE COLLEGE PREPARATORY 480021000000
## 460                                    IDEA EWING HALSELL ACADEMY 480021000000
## 461                        IDEA EWING HALSELL COLLEGE PREPARATORY 480021000000
## 462                                            IDEA NAJIM ACADEMY 480021000000
## 463                                IDEA NAJIM COLLEGE PREPARATORY 480021000000
## 464                                  IDEA RIO GRANDE CITY ACADEMY 480021000000
## 465                      IDEA RIO GRANDE CITY COLLEGE PREPARATORY 480021000000
## 466                                       IDEA TRES LAGOS ACADEMY 480021000000
## 467                           IDEA TRES LAGOS COLLEGE PREPARATORY 480021000000
## 468                                    Ignite Achievement Academy 180019000000
## 469                                                  iLEAD Online  60000114203
## 470                                     Illinois Park Elem School 171371000000
## 471                                  ILTEXAS - EAST FORT WORTH EL 480144000000
## 472                              ILTEXAS - EAST FORT WORTH MIDDLE 480144000000
## 473                            ILTEXAS - HOUSTON WINDMILL LAKE EL 480144000000
## 474                       ILTEXAS - HOUSTON WINDMILL LAKES MIDDLE 480144000000
## 475                                   ILTEXAS - KATY/WESTPARK H S 480144000000
## 476                                        ILTEXAS - LANCASTER EL 480144000000
## 477                                    ILTEXAS - LANCASTER MIDDLE 480144000000
## 478                                          ILTEXAS - SAGINAW EL 480144000000
## 479                                      ILTEXAS - SAGINAW MIDDLE 480144000000
## 480                           IM TERRELL ACADEMY FOR STEM AND VPA 481970000000
## 481                   Indian Oasis Intermediate Elementary School  40395003566
## 482                            Indiana Connections Career Academy 180019000000
## 483                              Indiana Virtual Pathways Academy 180019000000
## 484                                        INFINITY MIDDLE SCHOOL  80291006728
## 485                                           Insight PA Cyber CS 420090000000
## 486                              Insight School of Wisconsin High 550891000000
## 487                                            INSPIRE ELEMENTARY  80336006733
## 488                                          Intensive DCD  - SNW 270041000000
## 489                               International Academy of Smyrna 130025000000
## 490                                             Iron Forge El Sch 422205000000
## 491                                               IRWIN PRESCHOOL  80480006726
## 492           KNOWLEDGE AND POWER PREPARATORY ACADEMY - KAPPA VII 360008000000
## 493                                                 Isaiah Haines 341281000000
## 494                                          Istrouma High School 220054000000
## 495                                           IVC Learning Center 171997000000
## 496                                     IZARD CENTER FOR LEARNING  51341001651
## 497                               J & R Phalen Leadership Academy 180019000000
## 498                                           J Giles Elem School 172865000000
## 499                             J T Williams Secondary Montessori 370297000000
## 500                                                   J W LONG EL 484245000000
## 501                                   J.F. WAHL ELEMENTARY SCHOOL  50768001637
## 502                                      Jackson Creek Elementary 450339000000
## 503                                Jackson Early Childhood Center 420228000000
## 504                                              Jackson Pathways 261962000000
## 505                                              JAMES C NEILL EL 481965000000
## 506                                            JAMES PATTERSON EL 481965000000
## 507                        Jan Jones Blackhurst Elementary School 320006000000
## 508                                            Jardine Elementary 201226000000
## 509                                     Jasper Junior High School  10189002434
## 510                                                JCFA Lafayette 220030000000
## 511                                                  Jeannette HS 421233000000
## 512               JEFFERSON COUNTY HIGH A SOMERSET CHARTER SCHOOL 120099000000
## 513                 Jefferson International Academy  Intermediate 260107000000
## 514                                     JEFFERSON R-VII PRESCHOOL 291623000000
## 515                                   Jemison Intermediate School  10066002437
## 516                                              JENNY PRESTON EL 480789000000
## 517                             JHW INSPIRE ACADEMY - BELL COUNTY 480005000000
## 518                                JHW INSPIRE ACADEMY - CROCKETT 480005000000
## 519                                           JJ Smith Elementary 530000000000
## 520                          John Adams Academy - El Dorado Hills  69100614072
## 521                                  John Adams Academy - Lincoln  64214014071
## 522                           John Adams College & Career Academy 390438000000
## 523                    John Adams Early Childhood Learning Center  61111014129
## 524                                   John Lewis Invictus Academy 130012000000
## 525                             John Schroder Early Childhood Ctr 172346000000
## 526                                Josh Stevens Elementary School 320006000000
## 527                                 Juan Bautista de Anza Charter  60570014156
## 528                                    JUBILEE LEADERSHIP ACADEMY 480018000000
## 529                                            JUDITH L HARLOW EL 480834000000
## 530                                     JUDITH S KAYE HIGH SCHOOL 360008000000
## 531                                          JUDSON STEAM ACADEMY 482811000000
## 532                                JUSTICE AW SEEWORTH ACADEMY HS 400077000000
## 533                                      Juvenile Services Center 180765000000
## 534                                     Kadoka Middle School - 03 468044000000
## 535                                    Kaleidoscope Middle School 270036000000
## 536                                Kaleidoscope School of Memphis 470015000000
## 537                                                   KALLISON EL 483312000000
## 538                                              Kamalani Academy 150003000000
## 539                     Kapolei Charter School by Goodwill Hawaii 150003000000
## 540                              KATHERINE G JOHNSON STEM ACADEMY 482172000000
## 541                                     New Middle School Pathway  62271014113
## 542                                   KATHLEEN JOERGER LINDSEY EL 482658000000
## 543                                                     KEENAN EL 483126000000
## 544                                                         KELLY  40064003569
## 545                                           Kenosha Pike School 550732000000
## 546                             Kenowa Hills Pathways High School 262028000000
## 547                                          Kids Care Elementary 390159000000
## 548                    KIDS COMMUNITY COLLEGE CHARTER HIGH SCHOOL 120087000000
## 549        KIDS COMMUNITY COLLEGE SOUTHEAST MIDDLE CHARTER SCHOOL 120087000000
## 550                                          Kindezi Old 4th Ward 130012000000
## 551                                       Kings Valley Academy II  61989014205
## 552                                          KIPP Corazon Academy  62271014108
## 553                        KIPP Nashville College Prep Elementary 470318000000
## 554                                             KIPP NEXUS MIDDLE 480005000000
## 555                                                KIPP NEXUS PRI 480005000000
## 556                                 KIPP OKC SOUTH COMMUNITY PREP 400077000000
## 557                                    KIPP PLEASANT GROVE MIDDLE 480026000000
## 558                                           KIPP ST. LOUIS HIGH 290059000000
## 559                                   KIPP Valiant Community Prep  63186014087
## 560                                               Kirkmere School 390452000000
## 561                                          Knox Inspire Academy 210315000000
## 562                                     KRESA Head Start new LIfe 268060000000
## 563                                    KRESA Head Start West Main 268060000000
## 564                                                      LAGOS EL 482889000000
## 565                                  Lake City Alternative School 262061000000
## 566                                     LAKE COUNTY EARLY COLLEGE  80519006729
## 567                                                LAKE CREEK H S 483126000000
## 568                                    Lakeland Elementary School 274272000000
## 569                            Lakeland Middle Preparatory School 470015000000
## 570                                                 LAKES ACADEMY 480140000000
## 571                                              Lakeside Academy 270042000000
## 572                            Lakeside Early Advantage Preschool  62079014081
## 573                                              Lakeview Academy 130021000000
## 574                                              Lakeview Primary 130021000000
## 575                                    LAs Promise Charter High 1  69107814144
## 576                                           Lawrence Elementary  62211014134
## 577                                           LEAD Charter School 340079000000
## 578                                        LEAD INNOVATION STUDIO 292355000000
## 579                                  Leadership Academy of Nevada 320000000000
## 580                                    Leadership Academy of Utah 490020000000
## 581                           Leadership Learning Academy - Ogden 490016000000
## 582                                           LEAF Charter School 330331000000
## 583                                Leap Academy at North Fairmont 390438000000
## 584                                    Learning Latitudes Charter  61071014103
## 585                                           Lee Learning Center 550960000000
## 586                                             Leechburg Area MS 421347000000
## 587                                        LEGACY ACADEMY CHARTER 120015000000
## 588                     LEGACY COLLEGE PREPARATORY CHARTER SCHOOL 360116000000
## 589                                          Legacy Early College 450390000000
## 590                                Legacy Leadership Academy Inc. 470015000000
## 591                        Legacy Traditional School North Valley 320000000000
## 592                Leman Academy of Excellence-Oro Valley Arizona  40094403504
## 593                      Leman Academy of Excellence-Sierra Vista  40094403542
## 594                                         Leman Virtual Academy  40094403547
## 595                       Lemoore Online College Preparatory High  62140014163
## 596                                              LEO ADAMS MIDDLE 483318000000
## 597                                     Leona Libby Middle School 530732000000
## 598                                 Lewis Cass Junior High School 181068000000
## 599           LEWIS J BENNETT HIGH SCHOOL OF INNOVATIVE TECHNOLGY 360585000000
## 600                               Libertas Academy Charter School 250059000000
## 601                               Liberty Creek Elementary School 530111000000
## 602                                           Liberty High School 191470000000
## 603                                           Liberty High School 390160000000
## 604                                    Limestone Community School 231479000000
## 605                        Limestone County Virtual School Center  10210002436
## 606                                     Lincoln Unified Preschool  62169014125
## 607                                                 LINDA LYON EL 483765000000
## 608                                  Linda Mar Educational Center  62046014110
## 609                           LITTLE EAGLES EARLY LEARNING CENTER 481686000000
## 610                              Little Mountain Elementary - SNW 270041000000
## 611                                          Live Oak Junior High 220102000000
## 612                                  Logan Early Childhood Center 490051000000
## 613           Lomie G. Heard Elementary School  A Marzano Academy 320006000000
## 614                                    LONE STAR LANGUAGE ACADEMY 480145000000
## 615                                    LONG EARLY LEARNING CENTER 480744000000
## 616                              Long Valley Charter - Susanville  63183014096
## 617                                         Longfellow Elementary 191869000000
## 618                                  Love Creek Elementary School 100017000000
## 619                                        LOWNDES CO VOC COMPLEX 280273000000
## 620                                               LUCKEY RANCH EL 483006000000
## 621                                             Mahanoy Area JSHS 421443000000
## 622                                        Majestic Fields School 490114000000
## 623                                                Manavon El Sch 421905000000
## 624                                   MANOR NEW TECHNOLOGY MIDDLE 482889000000
## 625                                  Marcus Newcomb Middle School 341281000000
## 626                                                 Marie G Davis 370297000000
## 627                                  Marine Area Community School 270044000000
## 628                                     MARION ALTERNATIVE CENTER 482910000000
## 629                                  Marion County Knight Academy 210378000000
## 630                                   Marion County Middle School 210378000000
## 631                                    Marion Virtual High School 470264000000
## 632                                 Marionneaux Elementary School  40138003575
## 633                              MARK TWAIN DUAL LANGUAGE ACADEMY 483873000000
## 634                    Mary Bird Early Childhood Education Center  61336014130
## 635                              MARY K VOLLMER ELEMENTARY SCHOOL 362517000000
## 636                               Marysville Getchell High School 530486000000
## 637                               MATER ACADEMY BAY MIDDLE SCHOOL 120039000000
## 638                                         Mater Academy Bonanza 320000000000
## 639                                 Mater Academy Northern Nevada 320000000000
## 640                                           MATER PALMS ACADEMY 120147000000
## 641                              Mattapan Early Elementary School 250279000000
## 642                           Maywood Center for Enriched Studies  62271014102
## 643                                            Meadowlark Academy 568026000000
## 644                                  Meadowlark Elementary School 200873000000
## 645                                             MEADOWLARK SCHOOL  80249006716
## 646                                           Meany Middle School 530771000000
## 647                                MEDINA VALLEY LOMA ALTA MIDDLE 483006000000
## 648                                         Mellichamp Elementary 450321000000
## 649                       Memphis School of Excellence Elementary 470015000000
## 650                                  Merancas Middle College High 370297000000
## 651          Mercer County Technical School Culinary Arts Academy 340995000000
## 652        Mercer County Technical School Health Sciences Academy 340995000000
## 653                   Mercer County Technical School STEM Academy 340995000000
## 654                                  Meridian Creek Middle School 411317000000
## 655                                   Mevers School of Excellence 450390000000
## 656                            Meyers Center for Special Children 450390000000
## 657                                                  Miami School 390441000000
## 658                            Michigan International Prep School 260111000000
## 659           Michigan Mathematics and Science Academy MiddleHigh 260097000000
## 660                                        Michigan Online School 260111000000
## 661                                                    MIDDLE #10 482391000000
## 662                                          Midway Hills Academy 130021000000
## 663                                          Midway Hills Primary 130021000000
## 664                  Mike Choate Early Childhood Education Center  61350014137
## 665                                                MILAGRO MIDDLE 350237000000
## 666                                     Milan Intermediate School 180663000000
## 667                                        Milo Elementary School 231158000000
## 668                             MIMBRES VALLEY ALTERNATIVE SCHOOL 350069000000
## 669                                        MISSION EARLY LEARNING 483104000000
## 670                                           Mission High School 320006000000
## 671                                    Mitchell Child Development  63531014142
## 672                                                    Mohawk JHS 421554000000
## 673                                           Molly Ockett School 231477000000
## 674                                  Monarch Academy Annapolis ES 240006000000
## 675                                     Monroe Junior High School 390009000000
## 676                                            MONTA JANE AKIN EL 482703000000
## 677                                   Montford North Star Academy 370027000000
## 678                               Montgomery County Early College 370306000000
## 679                                                Montour El Sch 421572000000
## 680                                 MONTURA EARLY LEARNING CENTER 120078000000
## 681                       MONUMENT VIEW MONTESSORI CHARTER SCHOOL  80002006706
## 682                                           MOORE MIDDLE SCHOOL 317284000000
## 683                                             MOSAIC ELEMENTARY 292067000000
## 684                                             Moscow Elementary 231065000000
## 685                                                       MOTT EL 483483000000
## 686                                      Mountainside High School 410192000000
## 687                                       Movement Charter School 370041000000
## 688                                               MPUSD Preschool  62553014161
## 689                                                        MS 297 360008000000
## 690                                                        IS 338 360015000000
## 691                              Mt Vernon Early Learning Academy 180726000000
## 692                      Mukilteo Reengagement Academy Open Doors 530543000000
## 693                                KOZMETSKY AT RATHGEBER VILLAGE 480007000000
## 694                                            Mundy Mill Academy 130231000000
## 695                                   Muraoka (Saburo) Elementary  60861014127
## 696                                                   Muse El Sch 420489000000
## 697                                 Nantucket Intermediate School 250825000000
## 698                            National School District Preschool  62667014173
## 699                           National University Academy Sparrow  62025014132
## 700                                           Neil A Armstrong MS 420423000000
## 701                             Nevada State High School Downtown 320000000000
## 702                            Nevada State High School Summerlin 320000000000
## 703                                       New Directions - Geneva 170019000000
## 704                                                        NEW EL 484365000000
## 705                                              NEW PRE-K CENTER 482889000000
## 706                New Richmond Early Childhood Special Education 551062000000
## 707         NEW VISIONS CHARTER HIGH SCHOOL FOR THE HUMANITIES IV 360116000000
## 708               NEW YORK CENTER FOR AUTISM CHARTER SCHOOL BRONX 360116000000
## 709                       NEWMAN INTERNATIONAL ACADEMY AT PIONEER 480142000000
## 710                                                   Noble Minds 220028000000
## 711                                 Norris Academy Virtual School 551071000000
## 712                                       North Creek High School 530591000000
## 713                                       NORTH GEM MIDDLE SCHOOL 160243000000
## 714                        NORTH LITTLE ROCK CENTER OF EXCELLENCE  51068001641
## 715                                       North Mac Middle School 170140000000
## 716                         North Wake College and Career Academy 370472000000
## 717                                        Northeast Academy East 170019000000
## 718                                       Northeast Academy North 170019000000
## 719                          Northeast Wisconsin Learning Academy 551092000000
## 720                              Northfield Community Nursery Sch 173840000000
## 721                                              Northwest Campus  40061503545
## 722                                                  NORTHWEST ES 401572000000
## 723                                  NORTHWEST EXPEDITION ACADEMY 160078000000
## 724                            Northwest Wyoming Treatment Center 568026000000
## 725                                           NUCLA MIDDLE SCHOOL  80585006727
## 726                                                     O'DELL EL 481329000000
## 727                                                Oak Grove High 370114000000
## 728                                                 OAK HILLS J H 483126000000
## 729                                           Oakboro Choice STEM 370432000000
## 730         Oakland SOL (School of Language) Dual Language Middle  62805014086
## 731                                  Ocean Academy Charter School 340079000000
## 732                           OCPS ACADEMIC CENTER FOR EXCELLENCE 120144000000
## 733                                                       ODEM EL 483336000000
## 734                                                  ODEN SCHOOLS  50007301642
## 735                                         D C Everest Multi-Age 551317000000
## 736                        OKEECHOBEE VIRTUAL INSTRUCTION PROGRAM 120141000000
## 737                           OKEECHOBEE YOUTH DEVELOPMENT CENTER 120201000000
## 738                                       Olathe West High School 201014000000
## 739                                                  Old Gallinas  63509014208
## 740                                               Old Mill School 490105000000
## 741                  Old Sturbridge Academy Charter Public School 250059000000
## 742                                  Olentangy Shanahan Preschool 390468000000
## 743                                           OLUSTEE-ELDORADO ES 400080000000
## 744                                           OLUSTEE-ELDORADO HS 400080000000
## 745                                          Onslow Early College 370345000000
## 746                       Open Doors - Youth Reengagement Program 530001000000
## 747                                           Opportunity Charter  69105114090
## 748                                       OPS VIRTUAL HIGH SCHOOL 317482000000
## 749                                       Options for Youth-Acton  60000114202
## 750                                         ORCHARD MIDDLE SCHOOL 310012000000
## 751                                          Orchard Park Academy 390160000000
## 752                                      Orchard Ranch Elementary  63360014181
## 753                                 OSAGE CREEK ELEMENTARY SCHOOL  50306001649
## 754                                         Otwell Miller Academy 180019000000
## 755                                            Oxford Day Academy  69103314082
## 756                                          PACE Academy Charter  61281014194
## 757                                         PACE CENTER FOR GIRLS 120081000000
## 758                              Pacific Crest Innovation Academy 530504000000
## 759                                       PAGOSA PEAK OPEN SCHOOL  80219006717
## 760                                    PALM BAY ELEMENTARY SCHOOL 120009000000
## 761                            Paradise Unified Special Education  62982014190
## 762                                       PARAGON LEARNING CENTER  80612006713
## 763                                   Parent Community Connection 530285000000
## 764                                         PARKLAND PRE K CENTER 484668000000
## 765                                   Pasco Early Learning Center 530657000000
## 766                                             PASCO MYCROSCHOOL 120153000000
## 767                                                    Paso Verde  60003614188
## 768                                Pathfinder Kindergarten Center 530543000000
## 769                                                 Pathways High 550008000000
## 770                                  PATHWAYS IN EDUCATION: NAMPA 160018000000
## 771                              Patricia M. Noonan School PS #26 340783000000
## 772                                        Patriot Elementary -06 461941000000
## 773                                                  PAWHUSKA JHS 402358000000
## 774                                                  PAWS Academy 170019000000
## 775                                   PCJTED- Nogales High School  40075203540
## 776                                   PCJTED- Pierson High School  40075203537
## 777                                          Peak Charter Academy 370040000000
## 778                            Pease Creek Colony Elementary - 06 463954000000
## 779    Perry Career Academy - Eula Wilburn Ponds Perry Center for 130123000000
## 780                                          Perrysburg Preschool 390456000000
## 781                                           Philip Simmons High 450117000000
## 782                                                       Phoenix  69104714073
## 783                                                Phoenix Center 510084000000
## 784                                       Phoenix Charter Academy  64242014159
## 785                      Phoenix Union-Wilson College Preparatory  40633003555
## 786                               Phoenixville Early Learning Ctr 421905000000
## 787                               Pickerington Alternative School 390469000000
## 788                           PICOLATA CROSSING ELEMENTARY SCHOOL 120174000000
## 789                                     Pike County Day Treatment 210480000000
## 790                                   Pima County at Walden Grove  40075203539
## 791                                              Pima County JTED  40075203538
## 792                            Pima County JTED at Amphi Land Lab  40075203541
## 793                                   Pine Knot Elementary School 210399000000
## 794                                     Pine Springs Prep Academy 370042000000
## 795                                   Pinecrest Academy Inspirada 320000000000
## 796                           Pinecrest Academy of Nevada Horizon 320000000000
## 797                                     Pinecrest Academy St Rose 320000000000
## 798                                       PINECREST LAKES ACADEMY 120105000000
## 799                                    PINELLAS VIRTUAL FRANCHISE 120156000000
## 800                                        Pinnacle Online - WMCB  40032103565
## 801                              Piscataquis Community Elementary 231173000000
## 802                        Piscataquis Community Secondary School 231173000000
## 803                            PLATO ACADEMY TAMPA CHARTER SCHOOL 120087000000
## 804                                         Pleasant Knoll Middle 450390000000
## 805                                 Pleasant Valley Middle School 173195000000
## 806                                                     POMONA EL 480809000000
## 807                          Nexus STEM Academy Elementary School 470015000000
## 808                              Prairie View Elementary & Middle 271137000000
## 809                                   PRE-K PARTNERSHIP CHILDCARE 480735000000
## 810                               PRE/K FOR SA - EAST CENTRAL ISD 481785000000
## 811                                PREMIER H S SAN ANTONIO - WEST 480021000000
## 812                                             Primary DCD - SNW 270041000000
## 813                               Princess Anne Elementary School 240057000000
## 814                                                        PS 376 360010000000
## 815                                                        PS 377 360012000000
## 816                                                        PS 583 360009000000
## 817                                                        PS 889 360015000000
## 818                                    PSD Correspondence Program  20067000762
## 819                         PUC International Preparatory Academy  62271014063
## 820             PUEBLO SCH. FOR ARTS & SCIENCES AT FULTON HEIGHTS  80612006711
## 821                                        Purchase Youth Village 210381000000
## 822                            Purdue Polytechnic High School Ind 180018000000
## 823                                         Quest Academy Bridger 320000000000
## 824                                  Quest Academy West Alexander 320000000000
## 825                                              R.I.S.E. Program 279135000000
## 826                              Racine Alternative Learning 6-12 551236000000
## 827                           Rainey McCullers School of the Arts 130387000000
## 828                             Rainier Valley Leadership Academy 530034000000
## 829                                     Ralph J Bunche Elementary 220084000000
## 830                                              RANCHO SIENNA EL 482742000000
## 831                                      Ranger High Tech Academy 390445000000
## 832                           Ravenswood Child Development Center  63186014093
## 833                               Ravenswood Comprehensive Middle  63186014095
## 834                                     RAYMOND CENTRAL PRESCHOOL 310495000000
## 835                                 RAYMORE-PECULIAR SOUTH MIDDLE 292373000000
## 836                               RCB College Preparatory Academy  40097003546
## 837                                      Reach Center Summit Lake 390435000000
## 838                            Real Salt Lake Academy High School 490020000000
## 839                                    Redding Collegiate Academy  61281014193
## 840                                            Redwood Elementary 261788000000
## 841                                    Reeltown Elementary School  10321002433
## 842                                   Regional/Alternative Center 510366000000
## 843                     RENAISSANCE CHARTER SCHOOL AT BOGGY CREEK 120147000000
## 844                                  RENAISSANCE SECONDARY SCHOOL  80345006714
## 845                                Renaissance West STEAM Academy 370297000000
## 846                                Resiliency Preparatory Academy 250483000000
## 847                                Resurgence Hall Charter School 130025000000
## 848                                     REUNION ELEMENTARY SCHOOL  80258006718
## 849                             Rhodes College and Career Academy 390438000000
## 850                       Rhodes Schools of Environmental Studies 390438000000
## 851                                      Richard Crane Elementary  60994014195
## 852                                      Richard D. Browning High  62250014120
## 853                       RICHARD MCKENNA CHARTER SCHOOL - ONSITE 160001000000
## 854                                Richmond Heights Middle School 390466000000
## 855                                     Ridgemoor Park Montessori 261644000000
## 856                                          Risdon Middle School 530723000000
## 857                                                     RISE High  60142814167
## 858                                      Rising Stars Academy OTR 390438000000
## 859                                  Rising Stars Academy on Vine 390438000000
## 860                                            Rivelon Elementary 450321000000
## 861                                             River Bend Middle 370472000000
## 862                              River Trails Lrning Ctr Parkview 173387000000
## 863                            River Valley Early Learning Center 551425000000
## 864                                  RIVER VALLEY VIRTUAL ACADEMY  51341001650
## 865                                 RIVERSIDE ACADEMY HIGH SCHOOL 360585000000
## 866                                         Riverside High School 180019000000
## 867                                      Riverview GSRP Preschool 262991000000
## 868                                              RIVERVIEW SCHOOL  80426006715
## 869                                              Riverview School 551578000000
## 870                                     Riverview Virtual Academy 262991000000
## 871                              Robert Eagle Staff Middle School 530771000000
## 872                                       LAUGHLIN EL STEM MAGNET 483890000000
## 873                                           Roberto Clemente CS 420007000000
## 874                                          Rochelle Focus House 173429000000
## 875                                   Rockdale Open Campus School 130441000000
## 876                            Rocketship Partners Community Prep 470015000000
## 877                                      Rocky Fork Middle School 470369000000
## 878            Rocky River Early Childhood Center at Beach School 390447000000
## 879                                              RODRIGUEZ MIDDLE 481674000000
## 880                                        Rogers Lane Elementary 370472000000
## 881                                                   Rose School 411071000000
## 882                           ROSE STEIN INTERNATIONAL ELEMENTARY  80480006724
## 883                                           Ross Valley Charter  60144414064
## 884                                            ROUGHRIDER ACADEMY 481332000000
## 885                                        ROWLETT MIDDLE ACADEMY 120123000000
## 886                                            ROY J SMITH MIDDLE 482566000000
## 887                          Russellville City Career Tech Center  10291002435
## 888                                         Sage Hills Open Doors 530261000000
## 889       SAIL Charter Academy - School for Arts-Infused Learning 130025000000
## 890                   SAM HOUSTON STATE UNIVERSITY CHARTER SCHOOL 480145000000
## 891           San Benito County Regional Special Education Center  69102814074
## 892                                 San Lorenzo Unified Preschool  63471014128
## 893                                        San Salvador Preschool  60939014182
## 894                         Santa Barbara Unified Early Childhood  60141414138
## 895                  Santa Cruz County Career Advancement Charter  69103614200
## 896                                SANTA FE SOUTH EARLY CHILDHOOD 400080000000
## 897                                       SANTA FE SOUTH SPERO ES 400080000000
## 898                                 Santa Monica-Malibu Preschool  63570014126
## 899                                              Santa Rita Pre-K  63579014170
## 900                                       Sara M. Gilmore Academy 341638000000
## 901                                        Sato Elementary School 410192000000
## 902                Savannah Classical Academy Charter High School 130102000000
## 903                                   Schofield Elementary School 261446000000
## 904                                  Scholarship Prep - Oceanside  69103014079
## 905                   School of Humanities at Juliette Gordon Low 130102000000
## 906                   SCHOOL OF SCIENCE AND TECHNOLOGY EXCELLENCE 480026000000
## 907                           School of Universal Learning (SOUL)  69103014069
## 908                               Schuyler Industry Middle School 170033000000
## 909                                                 SCORE Academy 370472000000
## 910                                                      SEA-Tech 370333000000
## 911                                                   SEAPCO RISE 170023000000
## 912                                    SEASIDE CHARTER K-8 SCHOOL 120048000000
## 913                                                 Second Chance 130207000000
## 914                                 SENECA EARLY CHILDHOOD SCHOOL 292790000000
## 915                                          Serena Middle School 171588000000
## 916                                                         Sespe  61380014162
## 917                                  Seymour Rogers Middle School 200873000000
## 918                                                        NEW EL 484071000000
## 919                                 Sharon Early Childhood Center 251062000000
## 920                             Shelley Berkley Elementary School 320006000000
## 921                                   Sherman Thomas STEM Academy  62334014101
## 922                                      SHIRLEY DILL BROTHERS EL 480809000000
## 923                                   SHULL EARLY LEARNING CENTER 292373000000
## 924                                Sierra Early Education Program  69105214150
## 925                                           Silver Creek Middle 240048000000
## 926                                         Silver Summit Academy 490099000000
## 927                                          Silver Summit School 490099000000
## 928                                           Simon Youth Academy 341804000000
## 929                                         Skyline Middle School 510387000000
## 930                                             SKYWAY ELEMENTARY 160060000000
## 931                                               SLATON ISD DAEP 484044000000
## 932                                               Socastee Middle 450249000000
## 933                                Somerset Academy Lone Mountain 320000000000
## 934                                        Somerset Academy Losee 320000000000
## 935                              Somerset Academy North Las Vegas 320000000000
## 936                                    Somerset Academy Stephanie 320000000000
## 937                                     South Accelerated Academy 550960000000
## 938                       SOUTH BRONX CLASSICAL CHARTER SCHOOL IV 360116000000
## 939                            South Columbus Preparatory Academy 390160000000
## 940                                 South Floyd Elementary School 210195000000
## 941                                     SOUTH HILLS MIDDLE SCHOOL 160324000000
## 942                                         South Side Elementary 560624000000
## 943                                         Southside High School 220087000000
## 944                           Southwest Early College High School 470015000000
## 945                       Southwest Licking Early Learning Center 390480000000
## 946                             Southwest Ohio Preparatory School 390159000000
## 947                                   SOUTHWOOD ELEMENTARY SCHOOL  50002601647
## 948              Space Aeronautics Gateway to Exploration Academy  62958014085
## 949                                      MARSHALL EARLY CHILDHOOD 292041000000
## 950                                  Special Education Pre-School  63667014088
## 951                                   Special Education Preschool  60861014135
## 952                                               Spencer Academy 390438000000
## 953  SPORTS LEADERSHIP AND MANAGEMENT (SLAM) MIDDLE SCHOOL - NORT 120039000000
## 954              SPORTS LEADERSHIP AND MANAGEMENT ACADEMY (TAMPA) 120087000000
## 955                                  Springdale Elementary School 470455000000
## 956                                Springfield Vocational Academy 251113000000
## 957                                    ST JOHNS CLASSICAL ACADEMY 120030000000
## 958                                            St. George Academy 490019000000
## 959                              St. Helena Early Learning Center 220147000000
## 960                                        St. James Intermediate 450249000000
## 961                                           ST. JOE K-12 SCHOOL  50007601643
## 962                         St. Mary's County Evening High School 240060000000
## 963                                         STARRS ONLINE ACADEMY 270009000000
## 964                                STEDY- Arizona Western College  40092003571
## 965                                         STEDY- Central Campus  40092003577
## 966                                    STEDY- Desert View Academy  40092003574
## 967                                     STEELE MONTESSORI ACADEMY 483873000000
## 968                                               Stellar Charter  63204014118
## 969                                        STONE CREEK ELEMENTARY 293165000000
## 970                                             Strong Vincent MS 420930000000
## 971                                        STUART CAREER TECH H S 482115000000
## 972                                  STUDENT ATHLETE HEADQUARTERS 350018000000
## 973                            Student Success Open Doors Academy 530459000000
## 974                              Sturgis Intermediate School - 06 466993000000
## 975                                 Sublette K-12 Virtual Academy 201209000000
## 976                                           Success Academy 4-5 170019000000
## 977                       SUCCESS ACADEMY CHARTER SCHOOL-HARLEM 6 360116000000
## 978                   SUCCESS ACADEMY CHARTER SCHOOL-HUDSON YARDS 360117000000
## 979                                        NEW OAK RIDGE PK-6 242 481500000000
## 980                   Sulphur Springs Special Education Consortia  63822014133
## 981                                   Summit Public School: Atlas 530034000000
## 982                                      Summit Station Preschool 390480000000
## 983                                   Sunflower Elementary School 200002000000
## 984                            Susie King Taylor Community School 130102000000
## 985                                       Sustainable Futures PCS 110011000000
## 986                                SVI 1418 Re-Engagement Program 530771000000
## 987                                         SVUSD Virtual Academy  63386014116
## 988                                          Sweetwater Secondary  60144714089
## 989                                            Swift Creek Middle 370237000000
## 990                                         Synergy Public School  40096403553
## 991                                              TAFA at Saghalie 530282000000
## 992                                             Tahoma Elementary 530876000000
## 993                                               Tau Beta School 261752000000
## 994                              TAYLOR COUNTY ACCELERATED SCHOOL 120186000000
## 995                         TCCSE EARLY COLLEGE H S AT TIMBERVIEW 482892000000
## 996                                            Teague Park School 231479000000
## 997                                          Team Charter Academy  63801014076
## 998                                    Tecumseh East STEAM Center 263372000000
## 999                                    Tecumseh West STEAM Center 263372000000
## 1000                Telfair Alternative Preparation School (TAPS) 130483000000
## 1001                               Temecula International Academy  69102614131
## 1002                                              Ten Oaks Middle 450249000000
## 1003                      Terrell Regional Youth Detention Center 130003000000
## 1004                                    THE ARCH COMMUNITY SCHOOL 290061000000
## 1005                                    THE BOYS SCHOOL OF DENVER  80336006734
## 1006                                     The Cannon Beach Academy 411110000000
## 1007           The Center for Creativity Innovation and Discovery 490019000000
## 1008                                          The Central Academy 210271000000
## 1009                        THE COLLABORATORY PREPARATORY ACADEMY 120087000000
## 1010                     The College and Career Academy at Pruden 510371000000
## 1011                                             THE EXCEL CENTER  50042001638
## 1012                       The Innovation Academy at South Campus 370237000000
## 1013                                     THE JOE BARNHART ACADEMY 480972000000
## 1014                                           THE JUNIPER SCHOOL  80348006712
## 1015                                       THE LEADERSHIP ACADEMY 480003000000
## 1016                                The NET 2 Charter High School 220029000000
## 1017                                 THE VARNETT SCHOOL SOUTHEAST 480007000000
## 1018                                    THREADGILL PRIMARY SCHOOL 280165000000
## 1019                               THREE CREEKS ELEMENTARY SCHOOL  80480006722
## 1020                                       THREE TRAILS PRESCHOOL 292607000000
## 1021                                    Thunder Basin High School 560147000000
## 1022                                              TIMBER RIDGE ES 400549000000
## 1023                                        TIMBER SPRINGS MIDDLE 120144000000
## 1024                                     Timpanogos Middle School 490111000000
## 1025                   Todd County Achievement Middle School - 18 467209000000
## 1026                                  TOM AND NITA NICHOLS MIDDLE 482493000000
## 1027                                         TOMBALL STAR ACADEMY 484296000000
## 1028                Tomorrow River Virtual Charter School (TRVCS) 550033000000
## 1029                              TPS Mosaic Ministries Preschool 390449000000
## 1030                           TREASURE VALLEY LEADERSHIP ACADEMY 160234000000
## 1031                                      Treeside Charter School 490019000000
## 1032                                TRINITY ENVIRONMENTAL ACADEMY 480145000000
## 1033                                               Triton Academy  69104714080
## 1034                                  TULSA SCHL ARTS SCIENCES HS 400077000000
## 1035                                  TULSA SCHL ARTS SCIENCES MS 400077000000
## 1036                               TURNER PREKINDERGARTEN ACADEMY 484473000000
## 1037                             Turning Point Academy at Fleming 260110000000
## 1038                                           Turtle Lake Middle 551506000000
## 1039                                           Tussey Mountain MS 422397000000
## 1040                                TUTTLE EARLY CHILDHOOD CENTER 403042000000
## 1041                               TWIN FALLS VIRTUAL SCHOOLHOUSE 160324000000
## 1042                                           Twin Rivers El Sch 421494000000
## 1043                                  TYLER ISD EARLY COLLEGE H S 484347000000
## 1044                         Union County Preschool and Headstart 210564000000
## 1045                              United Preparatory Academy East 390159000000
## 1046                                      Unity Classical Charter 370041000000
## 1047                                    Unity Middle College High  69102414191
## 1048                                                     UnSchool  63462014105
## 1049                              Uplift California North Charter  60573014149
## 1050                              Uplift California Santa Barbara  60000914141
## 1051                              Uplift California South Charter  60573014153
## 1052                                             UPLIFT GRAND H S 480003000000
## 1053                                 UPLIFT WHITE ROCK HILLS PREP 480003000000
## 1054                                    UPLIFT PINNACLE SECONDARY 480003000000
## 1055              Upper Kennebec Valley Middle/Senior High School 231065000000
## 1056                                    UpROAR Leadership Academy 370042000000
## 1057                                         Urbana Gerber School 173996000000
## 1058                        Utah Military Academy - Camp Williams 490018000000
## 1059                                        Valiant Santa Barbara  60000914212
## 1060                                      Van Meter Middle School 192901000000
## 1061                                Vaughan Academy of Technology 370297000000
## 1062                                Vaux HS: A Big Picture School 421899000000
## 1063                                      VEGA COLLEGIATE ACADEMY  80234006732
## 1064                                                     VEGA J H 484398000000
## 1065                                                 VERAMENDI EL 483237000000
## 1066                                   Victory Collegiate Academy  40096803562
## 1067                                  Vincent Accelerated Academy 550960000000
## 1068                                Vista College Prep - Maryvale  40088703561
## 1069                                           VISTA RIDGE MIDDLE 482526000000
## 1070                                         Volney Rogers School 390452000000
## 1071                             Voluntary Prekindergarten School 271242000000
## 1072                                                VOSS FARMS EL 483237000000
## 1073                                            WABASH ELEMENTARY 293165000000
## 1074                                               WAKAPA ACADEMY 160048000000
## 1075                                                     WALSH EL 480778000000
## 1076                                  Warren County Middle School 510387000000
## 1077                                WARREN HOPE DAWSON ELEMENTARY 120087000000
## 1078                                Washington Early College High 370480000000
## 1079                                            Washington School 341020000000
## 1080                                      WATERSET CHARTER SCHOOL 120087000000
## 1081                                   WATFORD CITY MIDDLE SCHOOL 381254000000
## 1082                                                   Wawona K-8  61455014077
## 1083                                           Waynesboro Area MS 422511000000
## 1084                                         WC Daycare Preschool 193063000000
## 1085                                                WC Tel Center 210576000000
## 1086                                 WCSEA Black Patridge Pub Day 174307000000
## 1087                                                     WELLS EL 481611000000
## 1088                                   West County Charter Middle  60267014122
## 1089                                         West County Mandarin  63255014119
## 1090                                   WEST GADSDEN MIDDLE SCHOOL 120060000000
## 1091                                 West Perry Elementary School 210477000000
## 1092                                         West Side Elementary 560624000000
## 1093                              WEST VALLEY VIRTUAL ACADEMY 7-8 530972000000
## 1094                             WEST VALLEY VIRTUAL ACADEMY 9-12 530972000000
## 1095                              WEST VALLEY VIRTUAL ACADEMY K-6 530972000000
## 1096                                    WESTERN GROVE K-12 SCHOOL  50007601646
## 1097                                 Westinghouse Arts Academy CS 420090000000
## 1098                                                    MIDDLE #9 482391000000
## 1099             WESTMINSTER PUBLIC SCHOOLS EARLY LEARNING CENTER  80723006721
## 1100                                   Westwood Elementary School 390450000000
## 1101                          WHIN MUSIC COMMUNITY CHARTER SCHOOL 360116000000
## 1102                             Whiting Sudbury Learning Academy 500039000000
## 1103                                 William A Pearson Elementary 263225000000
## 1104                                WILLIAM FLOYD LEARNING CENTER 361869000000
## 1105                                                Wilson School 390452000000
## 1106                                     Winder Elementary School 130029000000
## 1107                                       WINDERMERE HIGH SCHOOL 120144000000
## 1108                                  Winnetka Covenant Preschool 170003000000
## 1109                                            WISH Academy High  62271014098
## 1110                                               WISH Community  62271014196
## 1111                            Wm Nashold Early Childhood Center 173451000000
## 1112                               Wolf Springs Elementary School 201200000000
## 1113                  Wonderful College Prep Academy - Lost Hills  69101214168
## 1114                               Wonewoc-Center Virtual Academy 551713000000
## 1115                                   Woodland Elementary School  10282002438
## 1116                                         Downey Community Day  61146014075
## 1117                                     WOODWARD MS NORTH CAMPUS 403318000000
## 1118                               Woonsocket Middle @ Villa Nova 440120000000
## 1119                                  Woonsocket Middle at Hamlet 440120000000
## 1120                                  WYATT ACADEMY MIDDLE SCHOOL  80336006737
## 1121                                              YCCS-Virtual HS 170993000000
## 1122                                         YES PREP - NORTHLINE 480021000000
## 1123           YOUNG WOMEN'S STEAM RESEARCH & PREPARATORY ACADEMY 481830000000
## 1124                        Yuba City Special Education Preschool  64347014094
##                                                       Agency_Name
## 1                                                     Kansas City
## 2                                         Quakertown Community SD
## 3                                                      A+ ACADEMY
## 4                        Morris County Vocational School District
## 5     Aurora Joint District No. 28 of the counties of Adams and A
## 6                       Detroit Public Schools Community District
## 7                                Achieve Community Charter School
## 8                                     Roseville Community Schools
## 9                                      Alum Rock Union Elementary
## 10                                                      Lunenburg
## 11                                              Santa Ana Unified
## 12                                 Achievement First Rhode Island
## 13                                   FAYETTEVILLE SCHOOL DISTRICT
## 14                                                           AGRA
## 15                                    Iredell-Statesville Schools
## 16                                      Anchorage School District
## 17                                                 Calhoun County
## 18                                                    KILLEEN ISD
## 19     Falcon School District No. 49 in the county of El Paso and
## 20                                            Littlestown Area SD
## 21                         Los Angeles County Office of Education
## 22                                Almond-Bancroft School District
## 23                                                Rockdale County
## 24                                         Lucerne Valley Unified
## 25                             WILLINGBORO PUBLIC SCHOOL DISTRICT
## 26                                                      TYLER ISD
## 27                                         Raisin City Elementary
## 28                                              San Diego Unified
## 29                              American Leadership Academy  Inc.
## 30                              American Leadership Academy  Inc.
## 31                              American Leadership Academy  Inc.
## 32                                                 BIG SPRING ISD
## 33                                      Milwaukee School District
## 34                         Los Angeles County Office of Education
## 35                                                 Carmel Unified
## 36                              Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 37                                Pleasant Ridge Union Elementary
## 38                                         Argyle School District
## 39                    Arizona Agribusiness & Equine Center Inc. 6
## 40                                             St. Bernard Parish
## 41                                      Arlington School District
## 42                                                     DALLAS ISD
## 43                                                           DADE
## 44                                         Asheville City Schools
## 45                                               Jessamine County
## 46                                          GRETNA PUBLIC SCHOOLS
## 47                                          GRETNA PUBLIC SCHOOLS
## 48                                ASU Preparatory Academy Digital
## 49                                  ASU Preparatory Academy Tempe
## 50                                                   HILLSBOROUGH
## 51                                 Avondale Meadows Middle School
## 52                                         B H R A Cooperative HS
## 53                                                      CHARLOTTE
## 54                                                   Baker County
## 55                                                 Baldwin County
## 56                                        MANASSAS CITY PBLC SCHS
## 57                                        BALDWYN SCHOOL DISTRICT
## 58                                                 Barberton City
## 59                                            Cleveland Municipal
## 60                                 Central Kitsap School District
## 61                                           BASIS School Inc. 19
## 62                                           BASIS School Inc. 21
## 63                                           BASIS School Inc. 20
## 64                                                    BASIS TEXAS
## 65                                                Jordan District
## 66                         Eagle County School District No. Re 50
## 67                                          San Mateo-Foster City
## 68                                        BEATRICE PUBLIC SCHOOLS
## 69                                                  Billings Elem
## 70                                      BENNINGTON PUBLIC SCHOOLS
## 71                                         Benton School District
## 72                                         Bethel School District
## 73                                     West Orange Public Schools
## 74                                                          PASCO
## 75                                        Big Picture Twin Cities
## 76                                   CLARK COUNTY SCHOOL DISTRICT
## 77                                      BILOXI PUBLIC SCHOOL DIST
## 78                                  Utah Schools for Deaf & Blind
## 79                              Tulare County Office of Education
## 80                      Blue Ridge Unified School District No. 32
## 81                                           Eminence Independent
## 82                                    HARRISONBURG CITY PBLC SCHS
## 83                             Tennessee State Board of Education
## 84                                                         HOLMES
## 85                                                            LEE
## 86                                             Bonneville Academy
## 87                   Fairbanks North Star Borough School District
## 88                           Edmunds Central School District 22-5
## 89                                            BOYD COUNTY SCHOOLS
## 90                                            BOYD COUNTY SCHOOLS
## 91                                            BOYD COUNTY SCHOOLS
## 92                                            BOYD COUNTY SCHOOLS
## 93                                            BOYD COUNTY SCHOOLS
## 94                                            BOYD COUNTY SCHOOLS
## 95                                            Los Angeles Unified
## 96                                                     CONROE ISD
## 97                                           LOUDOUN CO PBLC SCHS
## 98                                                   LONGVIEW ISD
## 99                                     Brandywine School District
## 100                             SC Public Charter School District
## 101                                                   BRENHAM ISD
## 102                                                  BRIDGE CREEK
## 103                                                  BRIDGE CREEK
## 104                                                       BROWARD
## 105                                                         DUVAL
## 106                                                    PALM BEACH
## 107                                                  HILLSBOROUGH
## 108                                                   Kansas City
## 109             BRILLA COLLEGE PREPARATORY CHARTER SCHOOL VERITAS
## 110                         BRONX CHARTER SCHOOL FOR EXCELLENCE 3
## 111              BROOKLYN EMERGING LEADERS ACADEMY CHARTER SCHOOL
## 112                                                 Brooks County
## 113                                                  WEST FARGO 6
## 114                                                 NEW CANEY ISD
## 115                                               BROWNSVILLE ISD
## 116                                                RSU 41/MSAD 41
## 117                                OZARK MOUNTAIN SCHOOL DISTRICT
## 118                                                      KATY ISD
## 119                                             Allentown City SD
## 120                                                    BUTLER R-V
## 121                                                     Haverhill
## 122                                             Dehesa Elementary
## 123                                        Raisin City Elementary
## 124                                                Duarte Unified
## 125                                        Guerneville Elementary
## 126                                                 Charleston 01
## 127                                        HAMPTON CITY PBLC SCHS
## 128                                           Cleveland Municipal
## 129                                     Canyon Rose Academy  Inc.
## 130                          Agua Fria Union High School District
## 131                                              Canyons District
## 132                               CAPITOL CITY LIGHTHOUSE ACADEMY
## 133                         Capstone Academy Charter School (SDA)
## 134                         Capstone Academy Charter School (SDA)
## 135                                 Cardinal Comm School District
## 136                                             WICHITA FALLS ISD
## 137                                                        RSU 39
## 138                                                        RSU 39
## 139                                       CARLTON LANDING ACADEMY
## 140                                                   Genesee ISD
## 141                                                 Charleston 01
## 142                                           Lawndale Elementary
## 143                                               Cincinnati City
## 144                           EASTERN CARVER COUNTY PUBLIC SCHOOL
## 145                                                  Cascade SD 5
## 146                                               SAN ANTONIO ISD
## 147                                              Catamount School
## 148                                                          CLAY
## 149     Coconino Association for Vocation Industry and Technology
## 150                                                  Lexington 02
## 151                                     CHESTERFIELD CO PBLC SCHS
## 152                                        Seattle Public Schools
## 153                                                Cache District
## 154                                        Tahoma School District
## 155                                                    CELINA ISD
## 156                                   CENTERPOINT SCHOOL DISTRICT
## 157                                        Midland Public Schools
## 158                                                     Nickerson
## 159                                    Roseville Joint Union High
## 160                                          WAYNE COUNTY SCHOOLS
## 161                           Fit Kids  Inc. dba Champion Schools
## 162                                                       BROWARD
## 163                                 Charlotte-Mecklenburg Schools
## 164                                              Chillicothe City
## 165                                                  Eugene SD 4J
## 166                               Circle City Prep Charter School
## 167                              Citizens Leadership Academy East
## 168                                                    DALLAS ISD
## 169                                                    CONROE ISD
## 170                                      Buckeye Union Elementary
## 171                                                      PINELLAS
## 172                                   NEBRASKA UNIFIED DISTRICT 1
## 173                                         CLEVELAND SCHOOL DIST
## 174                                         CLEVELAND SCHOOL DIST
## 175                                                         TULSA
## 176                                     Clio Area School District
## 177                                          Corona-Norco Unified
## 178                                             Oceanside Unified
## 179   State Charter Schools- Coastal Plains Charter High School -
## 180                                   Coastal Preparatory Academy
## 181                                           Coatesville Area SD
## 182                                           Coatesville Area SD
## 183                                                 CODE RVA HIGH
## 184                                                     PLANO ISD
## 185            College Achieve Greater Asbury Park Charter School
## 186                       College Achieve Paterson Charter School
## 187                                            Collegiate Academy
## 188                                                       COLLIER
## 189                                State Charter School Institute
## 190  School District No. 1 in the county of Denver and State of C
## 191                                State Charter School Institute
## 192                                     Washougal School District
## 193                                      Columbia School District
## 194                                       Keppel Union Elementary
## 195                                          Helendale Elementary
## 196                                Anderson Community School Corp
## 197                                       Tecumseh Public Schools
## 198                                          COMPASS ROSE ACADEMY
## 199                            Alameda County Office of Education
## 200                                           Wake County Schools
## 201                                 WASHOE COUNTY SCHOOL DISTRICT
## 202                               STATE-SPONSORED CHARTER SCHOOLS
## 203                               STATE-SPONSORED CHARTER SCHOOLS
## 204                               STATE-SPONSORED CHARTER SCHOOLS
## 205                               STATE-SPONSORED CHARTER SCHOOLS
## 206                        Cornerstone Jefferson-Douglass Academy
## 207                             Cornville Regional Charter School
## 208                             Cornville Regional Charter School
## 209                                              Coronado Unified
## 210                                      Ann Arbor Public Schools
## 211                                 CORTLAND CITY SCHOOL DISTRICT
## 212                                   Cotati-Rohnert Park Unified
## 213                                   Cottonwood Union Elementary
## 214                                   PRINCE WILLIAM CO PBLC SCHS
## 215                                    ALBUQUERQUE PUBLIC SCHOOLS
## 216                                North Franklin School District
## 217                                   BENTONVILLE SCHOOL DISTRICT
## 218                                       Stone Corral Elementary
## 219                                           Westside Elementary
## 220                                           Los Angeles Unified
## 221                                    CROSSROADS CHARTER SCHOOLS
## 222                                       Groveport Madison Local
## 223                                          WAYNE COUNTY SCHOOLS
## 224                 Cobre Valley Institute of Technology District
## 225                                                         PASCO
## 226                                                         PASCO
## 227                                         CLEVELAND SCHOOL DIST
## 228                                     WINCHESTER CITY PBLC SCHS
## 229                                     Milwaukee School District
## 230                                              Wasatch District
## 231                                                      DAVIDSON
## 232                                           Cleveland Municipal
## 233                                 Battle Ground School District
## 234                                        Seattle Public Schools
## 235                                   GALLUP-MCKINLEY CTY SCHOOLS
## 236                                       SAN FELIPE-DEL RIO CISD
## 237                                                    YSLETA ISD
## 238                                        Delmar School District
## 239                                      New Jerusalem Elementary
## 240  School District No. 1 in the county of Denver and State of C
## 241                                                 Brooks County
## 242                                  Delta-Greely School District
## 243                                      New Jerusalem Elementary
## 244                                    Grand Ledge Public Schools
## 245                                   ACHIEVEMENT SCHOOL DISTRICT
## 246                                   ACHIEVEMENT SCHOOL DISTRICT
## 247                                   ACHIEVEMENT SCHOOL DISTRICT
## 248                               Bend-LaPine Administrative SD 1
## 249                                Detroit Collegiate High School
## 250                                                   DICKINSON 1
## 251                                             Dehesa Elementary
## 252                                     Dimmick Comm Cons SD #175
## 253                               STATE-SPONSORED CHARTER SCHOOLS
## 254                                     Distinctive College Prep.
## 255                                                         DIXIE
## 256                                            Manheim Central SD
## 257                                  CLARK COUNTY SCHOOL DISTRICT
## 258                                                    CONROE ISD
## 259                                                 FORT BEND ISD
## 260                                                  DONIPHAN R-I
## 261                                                  Dooly County
## 262                               STATE-SPONSORED CHARTER SCHOOLS
## 263                               STATE-SPONSORED CHARTER SCHOOLS
## 264                               STATE-SPONSORED CHARTER SCHOOLS
## 265                               STATE-SPONSORED CHARTER SCHOOLS
## 266                               STATE-SPONSORED CHARTER SCHOOLS
## 267                                      DORCHESTER PUBLIC SCHOOL
## 268                               MOORHEAD PUBLIC SCHOOL DISTRICT
## 269                                DOUGLAS CO WEST COMMUNITY SCHS
## 270                                DOVE SCIENCE ACADEMY (CHARTER)
## 271                                DOVE SCIENCE ACADEMY (CHARTER)
## 272                                DOVE SCIENCE ACADEMY (CHARTER)
## 273                                         DOVE SCHOOLS OF TULSA
## 274                                         DOVE SCHOOLS OF TULSA
## 275                                                   TERRELL ISD
## 276                                  CLARK COUNTY SCHOOL DISTRICT
## 277                                                        Lowell
## 278                                                          DADE
## 279                         Adrian School District of the City of
## 280                                                 CORSICANA ISD
## 281                                                      CUSD 300
## 282                                             LINDBERGH SCHOOLS
## 283  School District No. 1 in the county of Denver and State of C
## 284                            Perth Amboy Public School District
## 285                                                  Floyd County
## 286                                                         DUVAL
## 287                                   EAGLE COLLEGE PREP ENDEAVOR
## 288                        Eagle County School District No. Re 50
## 289                                                   HANNIBAL 60
## 290                                              FT. ZUMWALT R-II
## 291                                PROCTOR PUBLIC SCHOOL DISTRICT
## 292                                                   MCALLEN ISD
## 293                                                Lancaster City
## 294                                   Grand Rapids Public Schools
## 295                             Nevada County Office of Education
## 296                                          Garden Grove Unified
## 297                                FRIDLEY PUBLIC SCHOOL DISTRICT
## 298                                           Saline Area Schools
## 299                                    East Jordan Public Schools
## 300                                  ROSEMOUNT-APPLE VALLEY-EAGAN
## 301                                             East Moline SD 37
## 302                                                  Erie City SD
## 303                                               Ouachita Parish
## 304                                                   Auburn City
## 305                            Washakie County School District #1
## 306                                                  HILLSBOROUGH
## 307                                                  LONGVIEW ISD
## 308                             Easton Arts Academy Elementary CS
## 309                                   East Detroit Public Schools
## 310                             MONTICELLO PUBLIC SCHOOL DISTRICT
## 311                                                Irvine Unified
## 312                               East Carolina Laboratory School
## 313                                                  York City SD
## 314                                   ALBANY CITY SCHOOL DISTRICT
## 315                                           Los Angeles Unified
## 316                                           Los Angeles Unified
## 317                                             Riverside Unified
## 318                                              Lafayette Parish
## 319                                                    HUMBLE ISD
## 320                                                    HUMBLE ISD
## 321                                            El Nido Elementary
## 322                                                Orleans Parish
## 323                      Elizabeth City-Pasquotank Public Schools
## 324                                                      ELK CITY
## 325                                        ELKHORN PUBLIC SCHOOLS
## 326                                                         UNION
## 327                         ELMWOOD VILLAGE CHARTER SCHOOL HERTEL
## 328                                               Emereau: Bladen
## 329                            ST. LOUIS PARK PUBLIC SCHOOL DIST.
## 330                                            Cajon Valley Union
## 331                                 EPIC BLENDED LEARNING CHARTER
## 332                                 EPIC BLENDED LEARNING CHARTER
## 333                                 EPIC BLENDED LEARNING CHARTER
## 334                                 EPIC BLENDED LEARNING CHARTER
## 335                                 EPIC BLENDED LEARNING CHARTER
## 336                                 EPIC BLENDED LEARNING CHARTER
## 337                                           Los Angeles Unified
## 338                                                  Erie City SD
## 339                                                    PALM BEACH
## 340                             Maricopa County Regional District
## 341                                     Euclid Preparatory School
## 342                                                   EVADALE ISD
## 343                           East Valley Institute of Technology
## 344                           East Valley Institute of Technology
## 345                                    Excel Center - Clarksville
## 346                                        Excel Center - Hammond
## 347                          EXPLORATION ELE CS - SCIENCE-TECHNOL
## 348                                                  Caddo Parish
## 349                            ROBBINSDALE PUBLIC SCHOOL DISTRICT
## 350                                                   Kansas City
## 351                                                Fairfield City
## 352                                   Phoenix Elementary District
## 353                                           Etiwanda Elementary
## 354                             West Central School District 49-7
## 355                             Farmington Public School District
## 356                                              Beavercreek City
## 357                                             Fieldcrest CUSD 6
## 358                                              FILLMORE CENTRAL
## 359                                                   FIT Academy
## 360                                                   UVALDE CISD
## 361                                                  Floyd County
## 362                                                     Ft Larned
## 363                      FORTE PREPARATORY ACADEMY CHARTER SCHOOL
## 364                         Sacramento County Office of Education
## 365                                        City of Chicago SD 299
## 366                                            McKeesport Area SD
## 367    GreeleySchool District No. 6 in the county of Weld and Sta
## 368                                                Fayette County
## 369                                                      Fredonia
## 370                              Southwest Metro Intermediate 288
## 371                                                    UNITED ISD
## 372                                                  Gervais SD 1
## 373                                Frontier International Academy
## 374                                   ACHIEVEMENT SCHOOL DISTRICT
## 375                                 Columbus City School District
## 376                                           Los Angeles Unified
## 377                                        Gahanna-Jefferson City
## 378                        Livonia Public Schools School District
## 379                                         Gaston County Schools
## 380                                                Alvord Unified
## 381                                                   Kansas City
## 382                                                 Shelby County
## 383                                                  ROCKWALL ISD
## 384                                                   MIDLAND ISD
## 385  State Charter Schools II- Genesis Innovation Academy for Boy
## 386  State Charter Schools II- Genesis Innovation Academy for Gir
## 387                                                Conecuh County
## 388                                         GEORGE CO SCHOOL DIST
## 389                                            Grove City Area SD
## 390                                                GEORGETOWN ISD
## 391                                                   TERRELL ISD
## 392                                                   GARLAND ISD
## 393                                                     GILCHRIST
## 394                                                Gilroy Unified
## 395                                LAKE AGASSIZ SPECIAL ED. COOP.
## 396                                                        GLADES
## 397                                              Bay Village City
## 398                                               Visalia Unified
## 399                        GLOUCESTER CITY PUBLIC SCHOOL DISTRICT
## 400                     Tuolumne County Superintendent of Schools
## 401                                               Jordan District
## 402                                    GOLDEN RULE CHARTER SCHOOL
## 403                                               SAN ANTONIO ISD
## 404                                   GOODWATER MONTESSORI SCHOOL
## 405                                           Coatesville Area SD
## 406                                       MANASSAS CITY PBLC SCHS
## 407                      Jefferson County School District No. R-1
## 408                                          Greater Johnstown SD
## 409                                                Cache District
## 410                             SC Public Charter School District
## 411                                Somerset County Public Schools
## 412                             SC Public Charter School District
## 413                                     Richland Union Elementary
## 414                                     SBE - Grossmont Secondary
## 415                                       Sacramento City Unified
## 416                                    Guadalupe Union Elementary
## 417                                       Kannapolis City Schools
## 418                                                    HUMBLE ISD
## 419                                             HAAS HALL ACADEMY
## 420                                             HAAS HALL ACADEMY
## 421                                                        RSU 02
## 422    Hanover School District No. 28 in the county of El Paso an
## 423                                                 Harlem UD 122
## 424                                  HARMONY SCHOOL OF EXCELLENCE
## 425                            HARMONY SCIENCE ACAD (SAN ANTONIO)
## 426                            HARMONY SCIENCE ACAD (SAN ANTONIO)
## 427                                   HARMONY SCIENCE ACAD (WACO)
## 428                              HARMONY SCIENCE ACADEMY (AUSTIN)
## 429                                   HARMONY SCIENCE ACAD (WACO)
## 430                                        Harnett County Schools
## 431                                          Newport-Mesa Unified
## 432                        CALDWELL-WEST CALDWELL SCHOOL DISTRICT
## 433                                        HARVARD PUBLIC SCHOOLS
## 434                                HAWTHORN LEADERSHIP SCHL GIRLS
## 435                     Hazel Park School District of the City of
## 436                                  Valparaiso Community Schools
## 437                      HEBREW LANGUAGE ACADEMY CHARTER SCHOOL 2
## 438                                                 Hemet Unified
## 439                                                 HEMPSTEAD ISD
## 440                                                        HENDRY
## 441                     Dallas Center-Grimes Comm School District
## 442                                                   HIDALGO ISD
## 443                                                 Highland Prep
## 444                                                     HIGHLANDS
## 445                                                 COVINGTON ISD
## 446                                                  CRANDALL ISD
## 447                                                Adams-Cheshire
## 448                                         CYPRESS-FAIRBANKS ISD
## 449                                         Ecorse Public Schools
## 450                          San Diego County Office of Education
## 451                                           Los Angeles Unified
## 452                                           Wake County Schools
## 453                                          HOUSTON  SCHOOL DIST
## 454                                        Hudson School District
## 455                                   Perrysburg Exempted Village
## 456                   Hunterdon County Vocational School District
## 457                                   Indianapolis Public Schools
## 458                                           IDEA PUBLIC SCHOOLS
## 459                                           IDEA PUBLIC SCHOOLS
## 460                                           IDEA PUBLIC SCHOOLS
## 461                                           IDEA PUBLIC SCHOOLS
## 462                                           IDEA PUBLIC SCHOOLS
## 463                                           IDEA PUBLIC SCHOOLS
## 464                                           IDEA PUBLIC SCHOOLS
## 465                                           IDEA PUBLIC SCHOOLS
## 466                                           IDEA PUBLIC SCHOOLS
## 467                                           IDEA PUBLIC SCHOOLS
## 468                                    Ignite Achievement Academy
## 469                                      Acton-Agua Dulce Unified
## 470                                                       SD U-46
## 471                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 472                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 473                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 474                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 475                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 476                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 477                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 478                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 479                       INTERNATIONAL LEADERSHIP OF TEXAS (ILT)
## 480                                                FORT WORTH ISD
## 481                       Baboquivari Unified School District #40
## 482                            Indiana Connections Career Academy
## 483                              Indiana Virtual Pathways Academy
## 484    Cherry Creek School District No. 5 in the county of Arapah
## 485                                           Insight PA Cyber CS
## 486                                     McFarland School District
## 487  School District No. 1 in the county of Denver and State of C
## 488                           SHERBURNE AND NORTHERN WRIGHT SPECI
## 489     State Charter Schools II- International Academy of Smyrna
## 490                                            South Middleton SD
## 491                      Jefferson County School District No. R-1
## 492                         NEW YORK CITY GEOGRAPHIC DISTRICT # 7
## 493                            Pemberton Township School District
## 494                                       East Baton Rouge Parish
## 495                                     Il Valley Central USD 321
## 496                                     VAN BUREN SCHOOL DISTRICT
## 497                               J & R Phalen Leadership Academy
## 498                                                Norridge SD 80
## 499                                 Charlotte-Mecklenburg Schools
## 500                                                   TERRELL ISD
## 501                                 HELENA/ W.HELENA SCHOOL DIST.
## 502                                                   Richland 02
## 503                                             Allentown City SD
## 504                                        Jackson Public Schools
## 505                                                 FORT BEND ISD
## 506                                                 FORT BEND ISD
## 507                                  CLARK COUNTY SCHOOL DISTRICT
## 508                                         Topeka Public Schools
## 509                                                   Jasper City
## 510                                                JCFA Lafayette
## 511                                             Jeannette City SD
## 512                                                     JEFFERSON
## 513                               Jefferson International Academy
## 514                                           JEFFERSON CO. R-VII
## 515                                                Chilton County
## 516                                                     ALLEN ISD
## 517                                             INSPIRE ACADEMIES
## 518                                             INSPIRE ACADEMIES
## 519                                      Enumclaw School District
## 520                          El Dorado County Office of Education
## 521                                        Western Placer Unified
## 522                                           Cleveland Municipal
## 523                                          Desert Sands Unified
## 524                                        Atlanta Public Schools
## 525                                                 Lombard SD 44
## 526                                  CLARK COUNTY SCHOOL DISTRICT
## 527                                       Borrego Springs Unified
## 528                                             JUBILEE ACADEMIES
## 529                                                      ANNA ISD
## 530                         NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 531                                                  LONGVIEW ISD
## 532                                    SEEWORTH ACADEMY (CHARTER)
## 533                                           Noblesville Schools
## 534                              Kadoka Area School District 35-2
## 535                                   KALEIDOSCOPE CHARTER SCHOOL
## 536                                                 Shelby County
## 537                                                 NORTHSIDE ISD
## 538                                Hawaii Department of Education
## 539                                Hawaii Department of Education
## 540                                                GREENVILLE ISD
## 541                                           Los Angeles Unified
## 542                                                    LAMAR CISD
## 543                                                MONTGOMERY ISD
## 544  Edkey  Inc. - Sequoia School for the Deaf and Hard of Hearin
## 545                                       Kenosha School District
## 546                                   Kenowa Hills Public Schools
## 547                                          Kids Care Elementary
## 548                                                  HILLSBOROUGH
## 549                                                  HILLSBOROUGH
## 550                                        Atlanta Public Schools
## 551                                   Kit Carson Union Elementary
## 552                                           Los Angeles Unified
## 553                                               Davidson County
## 554                                              KIPP INC CHARTER
## 555                                              KIPP INC CHARTER
## 556                                     KIPP REACH COLL (CHARTER)
## 557                                        KIPP DALLAS-FORT WORTH
## 558                                  KIPP ST LOUIS PUBLIC SCHOOLS
## 559                                    Ravenswood City Elementary
## 560                                               Youngstown City
## 561                                                   Knox County
## 562                                                Kalamazoo RESA
## 563                                                Kalamazoo RESA
## 564                                                     MANOR ISD
## 565                                Lake City Area School District
## 566                           Lake County School District No. R-1
## 567                                                MONTGOMERY ISD
## 568                                WILLMAR PUBLIC SCHOOL DISTRICT
## 569                                                      Lakeland
## 570                                   MEADOWLAND CHARTER DISTRICT
## 571                              Southwest Metro Intermediate 288
## 572                                     Lakeside Union Elementary
## 573                                                Baldwin County
## 574                                                Baldwin County
## 575                        Los Angeles County Office of Education
## 576                                Livermore Valley Joint Unified
## 577                                           LEAD Charter School
## 578                                                     PARK HILL
## 579                               STATE-SPONSORED CHARTER SCHOOLS
## 580                                    Leadership Academy of Utah
## 581                                   Leadership Learning Academy
## 582                                           LEAF Charter School
## 583                                               Cincinnati City
## 584                                             Dehesa Elementary
## 585                                     Milwaukee School District
## 586                                             Leechburg Area SD
## 587                                                       BREVARD
## 588                     LEGACY COLLEGE PREPARATORY CHARTER SCHOOL
## 589                             SC Public Charter School District
## 590                                                 Shelby County
## 591                               STATE-SPONSORED CHARTER SCHOOLS
## 592                             Leman Academy of Excellence  Inc.
## 593                             Leman Academy of Excellence  Inc.
## 594                             Leman Academy of Excellence  Inc.
## 595                                            Lemoore Union High
## 596                                                 NORTHWEST ISD
## 597                                      Richland School District
## 598                                            Lewis Cass Schools
## 599                                  BUFFALO CITY SCHOOL DISTRICT
## 600                    Libertas Academy Charter School (District)
## 601                                Central Valley School District
## 602                                Iowa City Comm School District
## 603                                           Liberty High School
## 604                                                        RSU 39
## 605                                              Limestone County
## 606                                               Lincoln Unified
## 607                                                  ROCKWALL ISD
## 608                                                      Pacifica
## 609                                                    DESOTO ISD
## 610                           SHERBURNE AND NORTHERN WRIGHT SPECI
## 611                                             Livingston Parish
## 612                                           Logan City District
## 613                                  CLARK COUNTY SCHOOL DISTRICT
## 614                                    LONE STAR LANGUAGE ACADEMY
## 615                                                   ABILENE ISD
## 616                                    Ravendale-Termo Elementary
## 617                            Marion Independent School District
## 618                                 Cape Henlopen School District
## 619                                        LOWNDES CO SCHOOL DIST
## 620                                             MEDINA VALLEY ISD
## 621                                               Mahanoy Area SD
## 622                                           Washington District
## 623                                          Phoenixville Area SD
## 624                                                     MANOR ISD
## 625                            Pemberton Township School District
## 626                                 Charlotte-Mecklenburg Schools
## 627                                  Marine Area Community School
## 628                                                    MARION ISD
## 629                                                 Marion County
## 630                                                 Marion County
## 631                                                 Marion County
## 632                                   Buckeye Elementary District
## 633                                               SAN ANTONIO ISD
## 634                                      Fairfield-Suisun Unified
## 635                        RUSH-HENRIETTA CENTRAL SCHOOL DISTRICT
## 636                                    Marysville School District
## 637                                                          DADE
## 638                               STATE-SPONSORED CHARTER SCHOOLS
## 639                               STATE-SPONSORED CHARTER SCHOOLS
## 640                                                       OSCEOLA
## 641                                                        Boston
## 642                                           Los Angeles Unified
## 643                                              Right of Passage
## 644                                                       Liberal
## 645                        Boulder Valley School District No. Re2
## 646                                        Seattle Public Schools
## 647                                             MEDINA VALLEY ISD
## 648                                                 Orangeburg 05
## 649                                                 Shelby County
## 650                                 Charlotte-Mecklenburg Schools
## 651            Area Vocational Technical Schools of Mercer County
## 652            Area Vocational Technical Schools of Mercer County
## 653            Area Vocational Technical Schools of Mercer County
## 654                                   West Linn-Wilsonville SD 3J
## 655                             SC Public Charter School District
## 656                             SC Public Charter School District
## 657                                                 Hamilton City
## 658                            Michigan International Prep School
## 659                      Michigan Mathematics and Science Academy
## 660                                        Michigan Online School
## 661                                                    HUMBLE ISD
## 662                                                Baldwin County
## 663                                                Baldwin County
## 664                                    Fallbrook Union Elementary
## 665                                       SANTA FE PUBLIC SCHOOLS
## 666                                       Milan Community Schools
## 667                                                RSU 41/MSAD 41
## 668                                         DEMING PUBLIC SCHOOLS
## 669                                                  MISSION CISD
## 670                                  CLARK COUNTY SCHOOL DISTRICT
## 671                                             Santa Ana Unified
## 672                                                Mohawk Area SD
## 673                                                RSU 72/MSAD 72
## 674                            Anne Arundel County Public Schools
## 675                                                  Monroe Local
## 676                                                   LEANDER ISD
## 677                                        Asheville City Schools
## 678                                     Montgomery County Schools
## 679                                                    Montour SD
## 680                                                        HENDRY
## 681                                State Charter School Institute
## 682                                        LINCOLN PUBLIC SCHOOLS
## 683                                                MEHLVILLE R-IX
## 684                                                RSU 83/MSAD 13
## 685                                              PFLUGERVILLE ISD
## 686                                              Beaverton SD 48J
## 687                                       Movement Charter School
## 688                                    Monterey Peninsula Unified
## 689                         NEW YORK CITY GEOGRAPHIC DISTRICT # 2
## 690                         NEW YORK CITY GEOGRAPHIC DISTRICT #22
## 691                               Mt Vernon Community School Corp
## 692                                      Mukilteo School District
## 693                 UNIVERSITY OF TEXAS UNIVERSITY CHARTER SCHOOL
## 694                                              Gainesville City
## 695                                        Chula Vista Elementary
## 696                                             Canon-McMillan SD
## 697                                                     Nantucket
## 698                                           National Elementary
## 699                                         La Mesa-Spring Valley
## 700                                           Bristol Township SD
## 701                               STATE-SPONSORED CHARTER SCHOOLS
## 702                               STATE-SPONSORED CHARTER SCHOOLS
## 703                                                      Kane ROE
## 704                                                    UNITED ISD
## 705                                                     MANOR ISD
## 706                                  New Richmond School District
## 707         NEW VISIONS CHARTER HIGH SCHOOL FOR THE HUMANITIES IV
## 708               NEW YORK CENTER FOR AUTISM CHARTER SCHOOL BRONX
## 709                     NEWMAN INTERNATIONAL ACADEMY OF ARLINGTON
## 710                                                   Noble Minds
## 711                                        Norris School District
## 712                                    Northshore School District
## 713                                            NORTH GEM DISTRICT
## 714                                N. LITTLE ROCK SCHOOL DISTRICT
## 715                                             North Mac CUSD 34
## 716                                           Wake County Schools
## 717                                                      Kane ROE
## 718                                                      Kane ROE
## 719                                Oconto Unified School District
## 720                                            Sunset Ridge SD 29
## 721                  West-MEC - Western Maricopa Education Center
## 722                                                         JENKS
## 723                                        COEUR D'ALENE DISTRICT
## 724                            Northwest Wyoming Treatment Center
## 725                             West End School District No. Re-2
## 726                                                    CELINA ISD
## 727                                       Davidson County Schools
## 728                                                MONTGOMERY ISD
## 729                                         Stanly County Schools
## 730                                               Oakland Unified
## 731                                  Ocean Academy Charter School
## 732                                                        ORANGE
## 733                                                ODEM-EDROY ISD
## 734                                OUACHITA RIVER SCHOOL DISTRICT
## 735                              D C Everest Area School District
## 736                                                    OKEECHOBEE
## 737                                                    WASHINGTON
## 738                                                        Olathe
## 739                                    San Rafael City Elementary
## 740                                               Tooele District
## 741       Old Sturbridge Academy Charter Public School (District)
## 742                                               Olentangy Local
## 743                                              OLUSTEE-ELDORADO
## 744                                              OLUSTEE-ELDORADO
## 745                                         Onslow County Schools
## 746                    Northwest Educational Service District 189
## 747                            Alameda County Office of Education
## 748                                          OMAHA PUBLIC SCHOOLS
## 749                                      Acton-Agua Dulce Unified
## 750                                   NEBRASKA UNIFIED DISTRICT 1
## 751                                          Orchard Park Academy
## 752                                     Roseville City Elementary
## 753                                   BENTONVILLE SCHOOL DISTRICT
## 754                                         Otwell Miller Academy
## 755                          San Mateo County Office of Education
## 756                                         Enterprise Elementary
## 757                                                      HERNANDO
## 758                                        Mill A School District
## 759                    Archuleta County School District No. 50 Jt
## 760                                                           BAY
## 761                                              Paradise Unified
## 762     Pueblo School District No. 60 in the county of Pueblo and
## 763                                      Ferndale School District
## 764                                                    YSLETA ISD
## 765                                         Pasco School District
## 766                                                         PASCO
## 767                                               Natomas Unified
## 768                                      Mukilteo School District
## 769                                          Pathways High Agency
## 770                            PATHWAYS IN EDUCATION - NAMPA INC.
## 771                                    Jersey City Public Schools
## 772                                  Douglas School District 51-1
## 773                                                      PAWHUSKA
## 774                                                      Kane ROE
## 775                                              Pima County JTED
## 776                                              Pima County JTED
## 777                                          Peak Charter Academy
## 778                            Andes Central School District 11-1
## 779                                                Clayton County
## 780                                   Perrysburg Exempted Village
## 781                                                   Berkeley 01
## 782                            Ventura County Office of Education
## 783                                     CHESTERFIELD CO PBLC SCHS
## 784                                     Whitmore Union Elementary
## 785                            Phoenix Union High School District
## 786                                          Phoenixville Area SD
## 787                                            Pickerington Local
## 788                                                     ST. JOHNS
## 789                                                   Pike County
## 790                                              Pima County JTED
## 791                                              Pima County JTED
## 792                                              Pima County JTED
## 793                                               McCreary County
## 794                         Pine Springs Preparatory Academy: CFA
## 795                               STATE-SPONSORED CHARTER SCHOOLS
## 796                               STATE-SPONSORED CHARTER SCHOOLS
## 797                               STATE-SPONSORED CHARTER SCHOOLS
## 798                                                          LAKE
## 799                                                      PINELLAS
## 800                                 Pinnacle Education-WMCB  Inc.
## 801                                                RSU 80/MSAD 04
## 802                                                RSU 80/MSAD 04
## 803                                                  HILLSBOROUGH
## 804                                                       York 04
## 805                                         Pleasant Valley SD 62
## 806                                                     ALVIN ISD
## 807                                                 Shelby County
## 808                              ELK RIVER PUBLIC SCHOOL DISTRICT
## 809                                           COLLEGE STATION ISD
## 810                                              EAST CENTRAL ISD
## 811                                          PREMIER HIGH SCHOOLS
## 812                           SHERBURNE AND NORTHERN WRIGHT SPECI
## 813                                Somerset County Public Schools
## 814                         NEW YORK CITY GEOGRAPHIC DISTRICT #26
## 815                         NEW YORK CITY GEOGRAPHIC DISTRICT #27
## 816                         NEW YORK CITY GEOGRAPHIC DISTRICT # 8
## 817                         NEW YORK CITY GEOGRAPHIC DISTRICT #22
## 818                                      Pribilof School District
## 819                                           Los Angeles Unified
## 820     Pueblo School District No. 60 in the county of Pueblo and
## 821                                               Marshall County
## 822                            Purdue Polytechnic High School Ind
## 823                               STATE-SPONSORED CHARTER SCHOOLS
## 824                               STATE-SPONSORED CHARTER SCHOOLS
## 825                                 RIVER BEND EDUCATION DISTRICT
## 826                                Racine Unified School District
## 827                                               Muscogee County
## 828                       Green Dot Public Schools Rainier Valley
## 829                                              Jefferson Parish
## 830                                              LIBERTY HILL ISD
## 831                                         North Ridgeville City
## 832                                    Ravenswood City Elementary
## 833                                    Ravenswood City Elementary
## 834                                RAYMOND CENTRAL PUBLIC SCHOOLS
## 835                                         RAYMORE-PECULIAR R-II
## 836                     AIBT Non-Profit Charter High School  Inc.
## 837                                                    Akron City
## 838                            Real Salt Lake Academy High School
## 839                                         Enterprise Elementary
## 840                                       Hartford Public Schools
## 841                                             Tallapoosa County
## 842                                         STAFFORD CO PBLC SCHS
## 843                                                       OSCEOLA
## 844                       Douglas County School District No. Re 1
## 845                                 Charlotte-Mecklenburg Schools
## 846                                                    Fall River
## 847      State Charter Schools II- Resurgence Hall Charter School
## 848                                           School District 27J
## 849                                           Cleveland Municipal
## 850                                           Cleveland Municipal
## 851                                   Cotati-Rohnert Park Unified
## 852                                            Long Beach Unified
## 853                                IDAHO VIRTUAL HIGH SCHOOL INC.
## 854                                        Richmond Heights Local
## 855                                   Grand Rapids Public Schools
## 856                                        Renton School District
## 857                                              Wiseburn Unified
## 858                                               Cincinnati City
## 859                                               Cincinnati City
## 860                                                 Orangeburg 05
## 861                                           Wake County Schools
## 862                                            River Trails SD 26
## 863                                  River Valley School District
## 864                                     VAN BUREN SCHOOL DISTRICT
## 865                                  BUFFALO CITY SCHOOL DISTRICT
## 866                                         Riverside High School
## 867                           Riverview Community School District
## 868                         Roaring Fork School District No. Re-1
## 869                                      Waukesha School District
## 870                           Riverview Community School District
## 871                                        Seattle Public Schools
## 872                                       SAN FELIPE-DEL RIO CISD
## 873                                           Roberto Clemente CS
## 874                                          Rochelle Twp HSD 212
## 875                                               Rockdale County
## 876                                   Achievement School District
## 877                                             Rutherford County
## 878                                              Rocky River City
## 879                                                    DENTON ISD
## 880                                           Wake County Schools
## 881                                           Douglas County SD 4
## 882                      Jefferson County School District No. R-1
## 883                                  SBE - Ross Valley Elementary
## 884                                                    CENTER ISD
## 885                                                       MANATEE
## 886                                                   KILLEEN ISD
## 887                                             Russellville City
## 888                                       Ephrata School District
## 889   State Charter Schools II- SAIL Charter Academy - School for
## 890                   SAM HOUSTON STATE UNIVERSITY CHARTER SCHOOL
## 891                         San Benito County Office of Education
## 892                                           San Lorenzo Unified
## 893                                          Colton Joint Unified
## 894                                         Santa Barbara Unified
## 895                         Santa Cruz County Office of Education
## 896                                      SANTA FE SOUTH (CHARTER)
## 897                                      SANTA FE SOUTH (CHARTER)
## 898                                   Santa Monica-Malibu Unified
## 899                                   Santa Rita Union Elementary
## 900                                    Union City School District
## 901                                              Beaverton SD 48J
## 902                                       Savannah-Chatham County
## 903                                     Fitzgerald Public Schools
## 904                          San Diego County Office of Education
## 905                                       Savannah-Chatham County
## 906                              SCHOOL OF SCIENCE AND TECHNOLOGY
## 907                          San Diego County Office of Education
## 908                                      Schuyler-Industry CUSD 5
## 909                                           Wake County Schools
## 910                                    New Hanover County Schools
## 911                              Spec Educ Assoc of Peoria County
## 912                                                         DUVAL
## 913                                                  Evans County
## 914                                                  SENECA R-VII
## 915                                                 Serena CUSD 2
## 916                                              Fillmore Unified
## 917                                                       Liberal
## 918                                                   SOCORRO ISD
## 919                                                        Sharon
## 920                                  CLARK COUNTY SCHOOL DISTRICT
## 921                                                Madera Unified
## 922                                                     ALVIN ISD
## 923                                         RAYMORE-PECULIAR R-II
## 924                               Mono County Office of Education
## 925                              Montgomery County Public Schools
## 926                                         South Summit District
## 927                                         South Summit District
## 928             Union County Vocational-Technical School District
## 929                                           WARREN CO PBLC SCHS
## 930                                      VALLIVUE SCHOOL DISTRICT
## 931                                                    SLATON ISD
## 932                                                      Horry 01
## 933                               STATE-SPONSORED CHARTER SCHOOLS
## 934                               STATE-SPONSORED CHARTER SCHOOLS
## 935                               STATE-SPONSORED CHARTER SCHOOLS
## 936                               STATE-SPONSORED CHARTER SCHOOLS
## 937                                     Milwaukee School District
## 938                       SOUTH BRONX CLASSICAL CHARTER SCHOOL IV
## 939                            South Columbus Preparatory Academy
## 940                                                  Floyd County
## 941                                           TWIN FALLS DISTRICT
## 942                            Washakie County School District #1
## 943                                              Lafayette Parish
## 944                                                 Shelby County
## 945                                       Southwest Licking Local
## 946                             Southwest Ohio Preparatory School
## 947                                    PINE BLUFF SCHOOL DISTRICT
## 948                                           Palmdale Elementary
## 949                                                      MARSHALL
## 950                                             Shoreline Unified
## 951                                        Chula Vista Elementary
## 952                                               Cincinnati City
## 953                                                          DADE
## 954                                                  HILLSBOROUGH
## 955                                                 Wilson County
## 956                                                   Springfield
## 957                                                          CLAY
## 958                                            St. George Academy
## 959                                             St. Helena Parish
## 960                                                      Horry 01
## 961                                OZARK MOUNTAIN SCHOOL DISTRICT
## 962                              St. Mary's County Public Schools
## 963                             Region 6 and 8-SW/WC Service Coop
## 964        Southwest Technical Education District of Yuma (STEDY)
## 965        Southwest Technical Education District of Yuma (STEDY)
## 966        Southwest Technical Education District of Yuma (STEDY)
## 967                                               SAN ANTONIO ISD
## 968                                            Redding Elementary
## 969                                               WENTZVILLE R-IV
## 970                                                  Erie City SD
## 971                                              GOOSE CREEK CISD
## 972                                  STUDENT ATHLETE HEADQUARTERS
## 973                                          Lyle School District
## 974                                    Meade School District 46-1
## 975                                                      Sublette
## 976                                                      Kane ROE
## 977                       SUCCESS ACADEMY CHARTER SCHOOL-HARLEM 6
## 978                   SUCCESS ACADEMY CHARTER SCHOOL-HUDSON YARDS
## 979                                                    CONROE ISD
## 980                                         Sulphur Springs Union
## 981                                   Summit Public School: Atlas
## 982                                         Licking Heights Local
## 983                                                        Ottawa
## 984                                       Savannah-Chatham County
## 985                                       Sustainable Futures PCS
## 986                                        Seattle Public Schools
## 987                                     Saddleback Valley Unified
## 988                                    SBE - Sweetwater Secondary
## 989                                Johnston County Public Schools
## 990                                   Synergy Public School  Inc.
## 991                                   Federal Way School District
## 992                                        Tahoma School District
## 993                      Hamtramck School District of the City of
## 994                                                        TAYLOR
## 995                                                 MANSFIELD ISD
## 996                                                        RSU 39
## 997                                              Stockton Unified
## 998                                       Tecumseh Public Schools
## 999                                       Tecumseh Public Schools
## 1000                                               Telfair County
## 1001                         Riverside County Office of Education
## 1002                                                     Horry 01
## 1003                               Department of Juvenile Justice
## 1004                                    THE ARCH COMMUNITY SCHOOL
## 1005 School District No. 1 in the county of Denver and State of C
## 1006                                                Seaside SD 10
## 1007           The Center for Creativity Innovation and Discovery
## 1008                                             Henderson County
## 1009                                                 HILLSBOROUGH
## 1010                                       SUFFOLK CITY PBLC SCHS
## 1011                                             THE EXCEL CENTER
## 1012                               Johnston County Public Schools
## 1013                                                 BEEVILLE ISD
## 1014                              Durango School District No. 9-R
## 1015                                           CUMBERLAND ACADEMY
## 1016                                         The NET2 High School
## 1017                                    THE VARNETT PUBLIC SCHOOL
## 1018                             GREENWOOD PUBLIC SCHOOL DISTRICT
## 1019                     Jefferson County School District No. R-1
## 1020                                                  RAYTOWN C-2
## 1021                           Campbell County School District #1
## 1022                                                 BROKEN ARROW
## 1023                                                       ORANGE
## 1024                                             Wasatch District
## 1025                             Todd County School District 66-1
## 1026                                                   JOSHUA ISD
## 1027                                                  TOMBALL ISD
## 1028                               Tomorrow River School District
## 1029                                                  Toledo City
## 1030                                        NAMPA SCHOOL DISTRICT
## 1031                                      Treeside Charter School
## 1032                                TRINITY ENVIRONMENTAL ACADEMY
## 1033                           Ventura County Office of Education
## 1034                                      SCHL ARTS/SCI (CHARTER)
## 1035                                      SCHL ARTS/SCI (CHARTER)
## 1036                                               WAXAHACHIE ISD
## 1037                    Detroit Public Schools Community District
## 1038                                  Turtle Lake School District
## 1039                                           Tussey Mountain SD
## 1040                                                       TUTTLE
## 1041                                          TWIN FALLS DISTRICT
## 1042                                           McKeesport Area SD
## 1043                                                    TYLER ISD
## 1044                                                 Union County
## 1045                              United Preparatory Academy East
## 1046                               Unity Classical Charter School
## 1047                        Orange County Department of Education
## 1048                                             San Juan Unified
## 1049                                     Bradley Union Elementary
## 1050                                         Cuyama Joint Unified
## 1051                                     Bradley Union Elementary
## 1052                                             UPLIFT EDUCATION
## 1053                                             UPLIFT EDUCATION
## 1054                                             UPLIFT EDUCATION
## 1055                                               RSU 83/MSAD 13
## 1056                                    UpROAR Leadership Academy
## 1057                                                Urbana SD 116
## 1058                                        Utah Military Academy
## 1059                                         Cuyama Joint Unified
## 1060                               Van Meter Comm School District
## 1061                                Charlotte-Mecklenburg Schools
## 1062                                         Philadelphia City SD
## 1063  Aurora Joint District No. 28 of the counties of Adams and A
## 1064                                                     VEGA ISD
## 1065                                            NEW BRAUNFELS ISD
## 1066                       Victory Collegiate Academy Corporation
## 1067                                    Milwaukee School District
## 1068                              Vista College Preparatory  Inc.
## 1069                                                   KELLER ISD
## 1070                                              Youngstown City
## 1071                               FRIDLEY PUBLIC SCHOOL DISTRICT
## 1072                                            NEW BRAUNFELS ISD
## 1073                                              WENTZVILLE R-IV
## 1074                                          BUHL JOINT DISTRICT
## 1075                                                    ALEDO ISD
## 1076                                          WARREN CO PBLC SCHS
## 1077                                                 HILLSBOROUGH
## 1078                                    Washington County Schools
## 1079                            Millburn Township School District
## 1080                                                 HILLSBOROUGH
## 1081                                                MCKENZIE CO 1
## 1082                                               Fresno Unified
## 1083                                           Waynesboro Area SD
## 1084                            Webster City Comm School District
## 1085                                            Washington County
## 1086                               Woodford County Spec Educ Assn
## 1087                                        CYPRESS-FAIRBANKS ISD
## 1088                                West Sonoma County Union High
## 1089                                    West Contra Costa Unified
## 1090                                                      GADSDEN
## 1091                                                 Perry County
## 1092                           Washakie County School District #1
## 1093                         West Valley School District (Yakima)
## 1094                         West Valley School District (Yakima)
## 1095                         West Valley School District (Yakima)
## 1096                               OZARK MOUNTAIN SCHOOL DISTRICT
## 1097                                 Westinghouse Arts Academy CS
## 1098                                                   HUMBLE ISD
## 1099                                   Westminster Public Schools
## 1100                                    Warrensville Heights City
## 1101                          WHIN MUSIC COMMUNITY CHARTER SCHOOL
## 1102                         Otter Valley Unified School District
## 1103                                 South Lyon Community Schools
## 1104                     WILLIAM FLOYD UNION FREE SCHOOL DISTRICT
## 1105                                              Youngstown City
## 1106                                                Barrow County
## 1107                                                       ORANGE
## 1108                               Northern Suburban Spec Ed Dist
## 1109                                          Los Angeles Unified
## 1110                                          Los Angeles Unified
## 1111                                              Rockford SD 205
## 1112                                                  Blue Valley
## 1113                              Kern County Office of Education
## 1114                         Wonewoc-Union Center School District
## 1115                                              Randolph County
## 1116                                               Downey Unified
## 1117                                                     WOODWARD
## 1118                                                   Woonsocket
## 1119                                                   Woonsocket
## 1120 School District No. 1 in the county of Denver and State of C
## 1121                                       City of Chicago SD 299
## 1122                                  YES PREP PUBLIC SCHOOLS INC
## 1123                                                  EL PASO ISD
## 1124                                            Yuba City Unified
##                          County_Name COUNTY.ID Urban.centric.Locale Latitude
## 1                   Wyandotte County     20209    12-City: Mid-size 39.12919
## 2                       Bucks County     42017     21-Suburb: Large 40.43365
## 3                      Dallas County     48113       11-City: Large 32.70704
## 4                      Morris County     34027     21-Suburb: Large 40.89553
## 5                    Arapahoe County      8005       11-City: Large 39.72345
## 6                       Wayne County     26163       11-City: Large 42.32094
## 7                       Essex County     34013       11-City: Large 40.70625
## 8                      Macomb County     26099     21-Suburb: Large 42.52028
## 9                 Santa Clara County      6085       11-City: Large 37.34446
## 10                  Worcester County     25027  22-Suburb: Mid-size 42.59724
## 11                     Orange County      6059       11-City: Large 33.74529
## 12                 Providence County     44007    12-City: Mid-size 41.81740
## 13                 Washington County      5143       13-City: Small 36.05670
## 14                    Lincoln County     40081    42-Rural: Distant 35.89619
## 15                    Iredell County     37097    42-Rural: Distant 35.93041
## 16            Anchorage Municipality      2020      31-Town: Fringe 61.31891
## 17                    Calhoun County      1015     41-Rural: Fringe 33.77425
## 18                       Bell County     48027     41-Rural: Fringe 31.02982
## 19                    El Paso County      8041       11-City: Large 38.90601
## 20                      Adams County     42001      31-Town: Fringe 39.75266
## 21                Los Angeles County      6037     21-Suburb: Large 34.19798
## 22                    Portage County     55097     43-Rural: Remote 44.26052
## 23                   Rockdale County     13247     21-Suburb: Large 33.67133
## 24             San Bernardino County      6071     21-Suburb: Large 34.46878
## 25                 Burlington County     34005     21-Suburb: Large 40.02862
## 26                      Smith County     48423    12-City: Mid-size 32.33563
## 27                     Fresno County      6019       11-City: Large 36.72732
## 28                  San Diego County      6073       11-City: Large 32.71302
## 29                   Maricopa County      4013     21-Suburb: Large 33.33115
## 30                   Maricopa County      4013     41-Rural: Fringe 33.28021
## 31                   Maricopa County      4013     21-Suburb: Large 33.24441
## 32                     Howard County     48227     32-Town: Distant 32.23412
## 33                  Milwaukee County     55079       11-City: Large 43.08411
## 34                Los Angeles County      6037     21-Suburb: Large 33.95240
## 35                   Monterey County      6053    42-Rural: Distant 36.27501
## 36                    Douglas County     17041     32-Town: Distant 39.68161
## 37                     Nevada County      6057     41-Rural: Fringe 39.05110
## 38                  Lafayette County     55065    42-Rural: Distant 42.70735
## 39                   Maricopa County      4013       11-City: Large 33.39090
## 40                St. Bernard Parish     22087     21-Suburb: Large 29.95845
## 41                  Snohomish County     53061  22-Suburb: Mid-size 48.15591
## 42                     Dallas County     48113       11-City: Large 32.81488
## 43                 Miami-Dade County     12086     21-Suburb: Large 25.90195
## 44                   Buncombe County     37021       13-City: Small 35.57828
## 45                  Jessamine County     21113     41-Rural: Fringe 37.94680
## 46                      Sarpy County     31153     41-Rural: Fringe 41.15531
## 47                      Sarpy County     31153     41-Rural: Fringe 41.15383
## 48                   Maricopa County      4013    12-City: Mid-size 33.42297
## 49                   Maricopa County      4013    12-City: Mid-size 33.36534
## 50               Hillsborough County     12057     21-Suburb: Large 28.07777
## 51                     Marion County     18097       11-City: Large 39.85009
## 52                  Vermilion County     17183     41-Rural: Fringe 40.26311
## 53                  Charlotte County     12015     41-Rural: Fringe 26.78319
## 54                      Baker County     13007    42-Rural: Distant 31.31173
## 55                    Baldwin County      1003       13-City: Small 30.52204
## 56                     Manassas city     51683     21-Suburb: Large 38.74906
## 57                   Prentiss County     28117    42-Rural: Distant 34.51556
## 58                     Summit County     39153     21-Suburb: Large 41.02278
## 59                   Cuyahoga County     39035       11-City: Large 41.45471
## 60                     Kitsap County     53035  22-Suburb: Mid-size 47.62234
## 61                   Maricopa County      4013     21-Suburb: Large 33.71948
## 62                   Maricopa County      4013       11-City: Large 33.59378
## 63                   Maricopa County      4013       11-City: Large 33.39484
## 64                      Bexar County     48029       11-City: Large 29.52054
## 65                  Salt Lake County     49035     21-Suburb: Large 40.52708
## 66                      Eagle County      8037      33-Town: Remote 39.64605
## 67                  San Mateo County      6081     21-Suburb: Large 37.56681
## 68                       Gage County     31067     32-Town: Distant 40.26370
## 69                Yellowstone County     30111    12-City: Mid-size 45.78367
## 70                    Douglas County     31055     41-Rural: Fringe 41.36379
## 71                  Lafayette County     55065    42-Rural: Distant 42.56780
## 72                     Pierce County     53053     21-Suburb: Large 47.10886
## 73                      Essex County     34013     21-Suburb: Large 40.76846
## 74                      Pasco County     12101     41-Rural: Fringe 28.21801
## 75                   Hennepin County     27053     21-Suburb: Large 45.06321
## 76                      Clark County     32003     41-Rural: Fringe 36.17705
## 77                   Harrison County     28047       13-City: Small 30.39712
## 78                       Utah County     49049       13-City: Small 40.28918
## 79                     Tulare County      6107     41-Rural: Fringe 36.29910
## 80                     Navajo County      4017      33-Town: Remote 34.14950
## 81                      Meade County     21163       13-City: Small 37.90017
## 82                 Harrisonburg city     51660       13-City: Small 38.44585
## 83                     Shelby County     47157       11-City: Large 35.03612
## 84                     Holmes County     12059     32-Town: Distant 30.78481
## 85                        Lee County     12071     21-Suburb: Large 26.42298
## 86                     Tooele County     49045     41-Rural: Fringe 40.63792
## 87      Fairbanks North Star Borough      2090       13-City: Small 64.82480
## 88                    Edmunds County     46045     43-Rural: Remote 45.57951
## 89                       Boyd County     31015     43-Rural: Remote 42.91062
## 90                       Boyd County     31015     43-Rural: Remote 42.82969
## 91                       Boyd County     31015     43-Rural: Remote 42.82969
## 92                       Boyd County     31015     43-Rural: Remote 42.87562
## 93                       Boyd County     31015     43-Rural: Remote 42.82969
## 94                       Boyd County     31015     43-Rural: Remote 42.87562
## 95                Los Angeles County      6037     21-Suburb: Large 33.93590
## 96                 Montgomery County     48339     41-Rural: Fringe 30.13408
## 97                    Loudoun County     51107     41-Rural: Fringe 38.97971
## 98                      Gregg County     48183       13-City: Small 32.51291
## 99                 New Castle County     10003     21-Suburb: Large 39.80259
## 100                Greenville County     45045  22-Suburb: Mid-size 34.70964
## 101                Washington County     48477     32-Town: Distant 30.16719
## 102                     Grady County     40051     41-Rural: Fringe 35.23321
## 103                     Grady County     40051     41-Rural: Fringe 35.23321
## 104                   Broward County     12011     21-Suburb: Large 26.19987
## 105                     Duval County     12031       11-City: Large 30.31195
## 106                Palm Beach County     12099     41-Rural: Fringe 26.46491
## 107              Hillsborough County     12057     21-Suburb: Large 27.89100
## 108                 Wyandotte County     20209    12-City: Mid-size 39.14023
## 109                     Bronx County     36005       11-City: Large 40.81539
## 110                     Bronx County     36005       11-City: Large 40.88813
## 111                     Kings County     36047       11-City: Large 40.69147
## 112                    Brooks County     13027     41-Rural: Fringe 30.79999
## 113                      Cass County     38017  22-Suburb: Mid-size 46.84478
## 114                Montgomery County     48339     21-Suburb: Large 30.07805
## 115                   Cameron County     48061    12-City: Mid-size 25.95988
## 116               Piscataquis County     23021     43-Rural: Remote 45.32249
## 117                    Marion County      5089     43-Rural: Remote 36.18092
## 118                    Waller County     48473     41-Rural: Fringe 29.76765
## 119                    Lehigh County     42077    12-City: Mid-size 40.59889
## 120                     Bates County     29013     32-Town: Distant 38.25145
## 121                     Essex County     25009     21-Suburb: Large 42.76102
## 122            San Bernardino County      6071    12-City: Mid-size 34.06903
## 123            San Bernardino County      6071    12-City: Mid-size 34.06903
## 124               Los Angeles County      6037     21-Suburb: Large 34.13690
## 125                    Sonoma County      6097      31-Town: Fringe 38.51002
## 126                Charleston County     45019    12-City: Mid-size 32.73307
## 127                     Hampton city     51650    12-City: Mid-size 37.01993
## 128                  Cuyahoga County     39035       11-City: Large 41.50403
## 129                      Pima County      4019       11-City: Large 32.25991
## 130                  Maricopa County      4013     41-Rural: Fringe 33.52439
## 131                 Salt Lake County     49035     21-Suburb: Large 40.58145
## 132                   Pulaski County      5119       13-City: Small 34.79131
## 133                     Wayne County     26163       11-City: Large 42.42264
## 134                     Wayne County     26163       11-City: Large 42.33700
## 135                   Wapello County     19179    42-Rural: Distant 40.96131
## 136                   Wichita County     48485     41-Rural: Fringe 33.86930
## 137                 Aroostook County     23003      33-Town: Remote 46.86345
## 138                 Aroostook County     23003      33-Town: Remote 46.86201
## 139                 Pittsburg County     40121     43-Rural: Remote 35.20327
## 140                   Genesee County     26049     21-Suburb: Large 42.97813
## 141                Charleston County     45019     41-Rural: Fringe 32.88982
## 142               Los Angeles County      6037     21-Suburb: Large 33.89777
## 143                  Hamilton County     39061       11-City: Large 39.19789
## 144                    Carver County     27019     41-Rural: Fringe 44.77071
## 145                    Marion County     41047     41-Rural: Fringe 44.78866
## 146                     Bexar County     48029       11-City: Large 29.43240
## 147                   Jackson County     37099     41-Rural: Fringe 35.35398
## 148                      Clay County     12019     21-Suburb: Large 30.17017
## 149                  Coconino County      4005       13-City: Small 35.23808
## 150                 Lexington County     45063     21-Suburb: Large 33.95229
## 151              Chesterfield County     51041     21-Suburb: Large 37.40698
## 152                      King County     53033       11-City: Large 47.72581
## 153                     Cache County     49005     41-Rural: Fringe 41.80091
## 154                      King County     53033     21-Suburb: Large 47.39870
## 155                    Collin County     48085  22-Suburb: Mid-size 33.32660
## 156                      Pike County      5109    42-Rural: Distant 34.29204
## 157                   Midland County     26111       13-City: Small 43.61877
## 158                      Reno County     20155    42-Rural: Distant 38.14332
## 159                    Placer County      6061    12-City: Mid-size 38.72348
## 160                     Wayne County     54099  22-Suburb: Mid-size 38.40011
## 161                     Pinal County      4021     21-Suburb: Large 33.16248
## 162                   Broward County     12011     21-Suburb: Large 26.16399
## 163               Mecklenburg County     37119       11-City: Large 35.30616
## 164                      Ross County     39141     32-Town: Distant 39.32852
## 165                      Lane County     41039    12-City: Mid-size 44.01623
## 166                    Marion County     18097       11-City: Large 39.83002
## 167                  Cuyahoga County     39035       11-City: Large 41.53647
## 168                    Dallas County     48113       11-City: Large 32.77531
## 169                Montgomery County     48339     41-Rural: Fringe 30.10659
## 170                 El Dorado County      6017     21-Suburb: Large 38.65863
## 171                  Pinellas County     12103       11-City: Large 27.80719
## 172                  Antelope County     31003     43-Rural: Remote 42.17050
## 173                   Bolivar County     28011      33-Town: Remote 33.74891
## 174                   Bolivar County     28011      33-Town: Remote 33.73909
## 175                     Tulsa County     40143       11-City: Large 36.10327
## 176                   Genesee County     26049     21-Suburb: Large 43.18103
## 177                 Riverside County      6065     21-Suburb: Large 33.91729
## 178                 San Diego County      6073     21-Suburb: Large 33.20733
## 179                   Candler County     13043      33-Town: Remote 32.39482
## 180               New Hanover County     37129  22-Suburb: Mid-size 34.31254
## 181                   Chester County     42029     21-Suburb: Large 39.98446
## 182                   Chester County     42029     21-Suburb: Large 39.99235
## 183                    Richmond city     51760    12-City: Mid-size 37.56809
## 184                    Collin County     48085       11-City: Large 33.10000
## 185                  Monmouth County     34025     21-Suburb: Large 40.21884
## 186                   Passaic County     34031     21-Suburb: Large 40.91507
## 187          East Baton Rouge Parish     22033    12-City: Mid-size 30.46509
## 188                   Collier County     12021     41-Rural: Fringe 26.27669
## 189                  Arapahoe County      8005       11-City: Large 39.72127
## 190                    Denver County      8031       11-City: Large 39.78448
## 191                   El Paso County      8041     21-Suburb: Large 38.83746
## 192                     Clark County     53011     41-Rural: Fringe 45.57609
## 193                   Jackson County     26075     41-Rural: Fringe 42.12615
## 194                 San Diego County      6073     21-Suburb: Large 33.10466
## 195                 San Diego County      6073     21-Suburb: Large 33.10466
## 196                   Madison County     18095       13-City: Small 40.09606
## 197                   Lenawee County     26091     32-Town: Distant 42.00797
## 198                     Bexar County     48029       11-City: Large 29.34448
## 199                Stanislaus County      6099      31-Town: Fringe 37.63946
## 200                      Wake County     37183     21-Suburb: Large 35.76669
## 201                    Washoe County     32031    12-City: Mid-size 39.53821
## 202                     Clark County     32003       11-City: Large 36.28355
## 203                     Clark County     32003     21-Suburb: Large 36.23469
## 204                     Clark County     32003    12-City: Mid-size 36.04133
## 205                     Clark County     32003       11-City: Large 36.04239
## 206                     Wayne County     26163       11-City: Large 42.42742
## 207                  Somerset County     23025      33-Town: Remote 44.76561
## 208                  Somerset County     23025      33-Town: Remote 44.75951
## 209                 San Diego County      6073     21-Suburb: Large 32.69649
## 210                 Washtenaw County     26161     21-Suburb: Large 42.25529
## 211                  Cortland County     36023     32-Town: Distant 42.58855
## 212                    Sonoma County      6097     21-Suburb: Large 38.33870
## 213                    Shasta County      6089      31-Town: Fringe 40.39077
## 214            Prince William County     51153     21-Suburb: Large 38.57091
## 215                Bernalillo County     35001     21-Suburb: Large 35.20414
## 216                  Franklin County     53021     32-Town: Distant 46.68091
## 217                    Benton County      5007       13-City: Small 36.34197
## 218                    Tulare County      6107    12-City: Mid-size 36.33033
## 219                    Fresno County      6019       11-City: Large 36.80934
## 220               Los Angeles County      6037       11-City: Large 33.99597
## 221                   Jackson County     29095       11-City: Large 39.10314
## 222                  Franklin County     39049     21-Suburb: Large 39.88225
## 223                     Wayne County     54099     43-Rural: Remote 37.90649
## 224                     Pinal County      4021     43-Rural: Remote 33.06486
## 225                     Pasco County     12101     41-Rural: Fringe 28.28209
## 226                     Pasco County     12101     41-Rural: Fringe 28.28206
## 227                   Bolivar County     28011      33-Town: Remote 33.73922
## 228                  Winchester city     51840       13-City: Small 39.17923
## 229                 Milwaukee County     55079       11-City: Large 43.14224
## 230                   Wasatch County     49051     32-Town: Distant 40.47749
## 231                   Tillman County     40141    42-Rural: Distant 34.23785
## 232                  Cuyahoga County     39035       11-City: Large 41.50721
## 233                     Clark County     53011     41-Rural: Fringe 45.73155
## 234                      King County     53033       11-City: Large 47.68557
## 235                  McKinley County     35031      33-Town: Remote 35.53132
## 236                 Val Verde County     48465      33-Town: Remote 29.38446
## 237                   El Paso County     48141       11-City: Large 31.76257
## 238                    Sussex County     10005     23-Suburb: Small 38.45874
## 239               San Joaquin County      6077     21-Suburb: Large 37.80895
## 240                    Denver County      8031       11-City: Large 39.70490
## 241                    Brooks County     13027     41-Rural: Fringe 30.79963
## 242  Southeast Fairbanks Census Area      2240     43-Rural: Remote 64.04214
## 243               San Joaquin County      6077     21-Suburb: Large 37.80895
## 244                     Eaton County     26045     21-Suburb: Large 42.76535
## 245                     Clark County     32003       11-City: Large 36.19506
## 246                     Clark County     32003       11-City: Large 36.19506
## 247                     Clark County     32003       11-City: Large 36.19506
## 248                 Deschutes County     41017       13-City: Small 44.08436
## 249                     Wayne County     26163       11-City: Large 42.35645
## 250                     Stark County     38089     41-Rural: Fringe 46.90416
## 251                 San Diego County      6073       11-City: Large 32.76064
## 252                   LaSalle County     17099     41-Rural: Fringe 41.41226
## 253                     Clark County     32003    12-City: Mid-size 36.09099
## 254                     Wayne County     26163     21-Suburb: Large 42.42806
## 255                     Dixie County     12029      33-Town: Remote 29.63756
## 256                 Lancaster County     42071     21-Suburb: Large 40.17468
## 257                     Clark County     32003     21-Suburb: Large 36.02874
## 258                Montgomery County     48339       13-City: Small 30.32058
## 259                 Fort Bend County     48157     41-Rural: Fringe 29.47072
## 260                    Ripley County     29181     43-Rural: Remote 36.62440
## 261                     Dooly County     13093     32-Town: Distant 32.10429
## 262                     Clark County     32003     41-Rural: Fringe 35.99719
## 263                     Clark County     32003       11-City: Large 36.20702
## 264                    Washoe County     32031     21-Suburb: Large 39.39053
## 265                     Clark County     32003     21-Suburb: Large 36.11616
## 266                     Clark County     32003     21-Suburb: Large 36.02623
## 267                    Saline County     31151    42-Rural: Distant 40.64937
## 268                      Clay County     27027     41-Rural: Fringe 46.85623
## 269                   Douglas County     31055     21-Suburb: Large 41.29052
## 270                  Oklahoma County     40109       11-City: Large 35.52071
## 271                  Oklahoma County     40109       11-City: Large 35.49373
## 272                  Oklahoma County     40109       11-City: Large 35.49373
## 273                     Tulsa County     40143       11-City: Large 36.15570
## 274                     Tulsa County     40143       11-City: Large 36.15570
## 275                   Kaufman County     48257     32-Town: Distant 32.75665
## 276                     Clark County     32003     21-Suburb: Large 36.04550
## 277                     Essex County     25009     21-Suburb: Large 42.73907
## 278                Miami-Dade County     12086     21-Suburb: Large 25.85429
## 279                   Lenawee County     26091     32-Town: Distant 41.89640
## 280                   Navarro County     48349     32-Town: Distant 32.08431
## 281                      Kane County     17089     21-Suburb: Large 42.13588
## 282                 St. Louis County     29189     21-Suburb: Large 38.53136
## 283                    Denver County      8031       11-City: Large 39.77595
## 284                 Middlesex County     34023     21-Suburb: Large 40.52985
## 285                     Floyd County     21071    42-Rural: Distant 37.50719
## 286                     Duval County     12031       11-City: Large 30.28489
## 287                   St. Louis city     29510       11-City: Large 38.58896
## 288                     Eagle County      8037      33-Town: Remote 39.64323
## 289                    Marion County     29127      33-Town: Remote 39.72275
## 290               St. Charles County     29183     21-Suburb: Large 38.80182
## 291                 St. Louis County     27137  22-Suburb: Mid-size 46.74385
## 292                   Hidalgo County     48215    12-City: Mid-size 26.22365
## 293                 Fairfield County     39045     32-Town: Distant 39.72290
## 294                      Kent County     26081    12-City: Mid-size 42.94985
## 295                    Nevada County      6057     32-Town: Distant 39.23606
## 296                    Orange County      6059     21-Suburb: Large 33.80043
## 297                     Anoka County     27003     21-Suburb: Large 45.07819
## 298                 Washtenaw County     26161     21-Suburb: Large 42.18119
## 299                Charlevoix County     26029    42-Rural: Distant 45.15594
## 300                    Dakota County     27037     21-Suburb: Large 44.71600
## 301               Rock Island County     17161     21-Suburb: Large 41.49591
## 302                      Erie County     42049       13-City: Small 42.13738
## 303                  Ouachita Parish     22073     41-Rural: Fringe 32.58602
## 304                       Lee County      1081       13-City: Small 32.59824
## 305                  Washakie County     56043      33-Town: Remote 44.01878
## 306              Hillsborough County     12057       11-City: Large 27.98488
## 307                     Gregg County     48183       13-City: Small 32.50027
## 308               Northampton County     42095     21-Suburb: Large 40.69215
## 309                    Macomb County     26099     21-Suburb: Large 42.46357
## 310                    Wright County     27171      31-Town: Fringe 45.28682
## 311                    Orange County      6059       11-City: Large 33.71498
## 312                      Pitt County     37147       13-City: Small 35.59871
## 313                      York County     42133       13-City: Small 39.96370
## 314                    Albany County     36001       13-City: Small 42.66131
## 315               Los Angeles County      6037       11-City: Large 34.06216
## 316               Los Angeles County      6037     21-Suburb: Large 34.03948
## 317                 Riverside County      6065       11-City: Large 33.94046
## 318                 Lafayette Parish     22055    12-City: Mid-size 30.21925
## 319                    Harris County     48201     21-Suburb: Large 30.00798
## 320                    Harris County     48201     21-Suburb: Large 30.00798
## 321                    Merced County      6047    42-Rural: Distant 37.13441
## 322                   Orleans Parish     22071       11-City: Large 29.93947
## 323                Pasquotank County     37139     32-Town: Distant 36.32490
## 324                   Beckham County     40009     41-Rural: Fringe 35.41816
## 325                   Douglas County     31055     41-Rural: Fringe 41.30506
## 326                     Tulsa County     40143       11-City: Large 36.11724
## 327                      Erie County     36029       11-City: Large 42.94528
## 328                    Bladen County     37017     41-Rural: Fringe 34.60218
## 329                  Hennepin County     27053     21-Suburb: Large 44.96411
## 330                 San Diego County      6073     21-Suburb: Large 32.79611
## 331                  Oklahoma County     40109       11-City: Large 35.59516
## 332                  Oklahoma County     40109       11-City: Large 35.59516
## 333                  Oklahoma County     40109       11-City: Large 35.59516
## 334                  Oklahoma County     40109       11-City: Large 35.59516
## 335                  Oklahoma County     40109       11-City: Large 35.59516
## 336                  Oklahoma County     40109       11-City: Large 35.59516
## 337               Los Angeles County      6037       11-City: Large 34.04484
## 338                      Erie County     42049       13-City: Small 42.10194
## 339                Palm Beach County     12099     21-Suburb: Large 26.69906
## 340                  Maricopa County      4013    12-City: Mid-size 33.41578
## 341                  Cuyahoga County     39035     21-Suburb: Large 41.57597
## 342                    Jasper County     48241    42-Rural: Distant 30.34756
## 343                     Pinal County      4021     21-Suburb: Large 33.39155
## 344                  Maricopa County      4013     21-Suburb: Large 33.61909
## 345                     Clark County     18019     21-Suburb: Large 38.31299
## 346                      Lake County     18089     21-Suburb: Large 41.58706
## 347                    Monroe County     36055    12-City: Mid-size 43.18407
## 348                     Caddo Parish     22017    12-City: Mid-size 32.48002
## 349                  Hennepin County     27053       13-City: Small 45.02478
## 350                 Wyandotte County     20209    12-City: Mid-size 39.14033
## 351                    Butler County     39017     21-Suburb: Large 39.33515
## 352                  Maricopa County      4013       11-City: Large 33.44903
## 353            San Bernardino County      6071     21-Suburb: Large 34.15506
## 354                 Minnehaha County     46099     41-Rural: Fringe 43.56136
## 355                   Oakland County     26125       13-City: Small 42.49956
## 356                    Greene County     39057     21-Suburb: Large 39.72330
## 357                  Marshall County     17123    42-Rural: Distant 41.05774
## 358                  Fillmore County     27045     43-Rural: Remote 43.55272
## 359                    Dakota County     27037     21-Suburb: Large 44.73451
## 360                    Uvalde County     48463      33-Town: Remote 29.22189
## 361                     Floyd County     21071    42-Rural: Distant 37.49982
## 362                    Pawnee County     20145     41-Rural: Fringe 38.19789
## 363                    Queens County     36081       11-City: Large 40.75928
## 364                Sacramento County      6067     21-Suburb: Large 38.50230
## 365                      Cook County     17031       11-City: Large 41.69430
## 366                 Allegheny County     42003     21-Suburb: Large 40.35033
## 367                      Weld County      8123    12-City: Mid-size 40.42764
## 368                   Fayette County     21067       11-City: Large 38.04006
## 369                    Wilson County     20205    42-Rural: Distant 37.53159
## 370                     Scott County     27139     21-Suburb: Large 44.79266
## 371                      Webb County     48479     41-Rural: Fringe 27.48186
## 372                    Marion County     41047      31-Town: Fringe 45.10534
## 373                    Macomb County     26099    12-City: Mid-size 42.50208
## 374                     Clark County     32003       11-City: Large 36.18117
## 375                  Franklin County     39049       11-City: Large 39.98720
## 376               Los Angeles County      6037       11-City: Large 34.01295
## 377                  Franklin County     39049     21-Suburb: Large 40.01961
## 378                     Wayne County     26163       13-City: Small 42.36285
## 379                    Gaston County     37071       13-City: Small 35.25385
## 380                 Riverside County      6065       11-City: Large 33.90675
## 381                 Wyandotte County     20209    12-City: Mid-size 39.11233
## 382                    Shelby County     47157     21-Suburb: Large 35.20416
## 383                  Rockwall County     48397     41-Rural: Fringe 32.93548
## 384                   Midland County     48329    12-City: Mid-size 32.01404
## 385                    Fulton County     13121       11-City: Large 33.71553
## 386                    Fulton County     13121       11-City: Large 33.71553
## 387                   Conecuh County      1035     41-Rural: Fringe 31.43599
## 388                    George County     28039     32-Town: Distant 30.92047
## 389                    Mercer County     42085     32-Town: Distant 41.17214
## 390                Williamson County     48491     41-Rural: Fringe 30.62095
## 391                   Kaufman County     48257     32-Town: Distant 32.72063
## 392                    Dallas County     48113     21-Suburb: Large 32.95950
## 393                 Gilchrist County     12041     41-Rural: Fringe 29.61880
## 394               Santa Clara County      6085     23-Suburb: Small 37.01618
## 395                      Clay County     27027    42-Rural: Distant 46.88316
## 396                    Glades County     12043     32-Town: Distant 26.83075
## 397                  Cuyahoga County     39035     21-Suburb: Large 41.48437
## 398                    Tulare County      6107    12-City: Mid-size 36.35356
## 399                    Camden County     34007     21-Suburb: Large 39.88409
## 400                  Tuolumne County      6109     41-Rural: Fringe 37.96996
## 401                 Salt Lake County     49035     41-Rural: Fringe 40.56498
## 402                    Dallas County     48113     21-Suburb: Large 32.59646
## 403                     Bexar County     48029       11-City: Large 29.45414
## 404                Williamson County     48491     21-Suburb: Large 30.66925
## 405                   Chester County     42029     21-Suburb: Large 39.98240
## 406                    Manassas city     51683     21-Suburb: Large 38.74729
## 407                 Jefferson County      8059    12-City: Mid-size 39.70510
## 408                   Cambria County     42021     23-Suburb: Small 40.32938
## 409                     Cache County     49005     23-Suburb: Small 41.78580
## 410                  Richland County     45079     21-Suburb: Large 34.10344
## 411                  Somerset County     24039      31-Town: Fringe 38.19375
## 412                Greenville County     45045     21-Suburb: Large 34.96391
## 413                      Kern County      6029      31-Town: Fringe 35.49090
## 414                 San Diego County      6073     21-Suburb: Large 32.80701
## 415                Sacramento County      6067     21-Suburb: Large 38.56241
## 416             Santa Barbara County      6083      31-Town: Fringe 34.95808
## 417                  Cabarrus County     37025  22-Suburb: Mid-size 35.49334
## 418                    Harris County     48201     21-Suburb: Large 30.00798
## 419                    Benton County      5007       13-City: Small 36.33129
## 420                Washington County      5143       13-City: Small 36.18689
## 421                  Kennebec County     23011     41-Rural: Fringe 44.26691
## 422                   El Paso County      8041    42-Rural: Distant 38.58530
## 423                 Winnebago County     17201     21-Suburb: Large 42.33345
## 424                    Harris County     48201       11-City: Large 29.93668
## 425                      Webb County     48479       11-City: Large 27.53653
## 426                   Cameron County     48061    12-City: Mid-size 25.95917
## 427                  McLennan County     48309  22-Suburb: Mid-size 31.52702
## 428                    Travis County     48453     21-Suburb: Large 30.45961
## 429                    Collin County     48085       11-City: Large 33.00939
## 430                   Harnett County     37085     32-Town: Distant 35.30977
## 431                    Orange County      6059    12-City: Mid-size 33.63220
## 432                     Essex County     34013     21-Suburb: Large 40.84987
## 433                      Clay County     31035    42-Rural: Distant 40.62221
## 434                   St. Louis city     29510       11-City: Large 38.66602
## 435                   Oakland County     26125     21-Suburb: Large 42.46147
## 436                    Porter County     18127     41-Rural: Fringe 41.44630
## 437                     Kings County     36047       11-City: Large 40.60075
## 438                 Riverside County      6065  22-Suburb: Mid-size 33.74521
## 439                    Waller County     48473     32-Town: Distant 30.09768
## 440                    Hendry County     12051     32-Town: Distant 26.76140
## 441                      Polk County     19153     21-Suburb: Large 41.70214
## 442                   Hidalgo County     48215     21-Suburb: Large 26.09887
## 443                  Maricopa County      4013     21-Suburb: Large 33.61351
## 444                 Highlands County     12055     41-Rural: Fringe 27.50228
## 445                      Hill County     48217     32-Town: Distant 32.00724
## 446                   Kaufman County     48257     41-Rural: Fringe 32.68240
## 447                 Berkshire County     25003     41-Rural: Fringe 42.59537
## 448                    Harris County     48201     21-Suburb: Large 29.86926
## 449                     Wayne County     26163     21-Suburb: Large 42.25090
## 450                 San Diego County      6073       11-City: Large 32.76959
## 451               Los Angeles County      6037       11-City: Large 33.97659
## 452                      Wake County     37183     21-Suburb: Large 35.84197
## 453                 Chickasaw County     28017      33-Town: Remote 33.88869
## 454                 St. Croix County     55109     21-Suburb: Large 45.06124
## 455                      Wood County     39173     21-Suburb: Large 41.52099
## 456                 Hunterdon County     34019     21-Suburb: Large 40.62813
## 457                    Marion County     18097       11-City: Large 39.75916
## 458                     Bexar County     48029       11-City: Large 29.35368
## 459                     Bexar County     48029       11-City: Large 29.35368
## 460                     Bexar County     48029       11-City: Large 29.34436
## 461                     Bexar County     48029       11-City: Large 29.34436
## 462                     Bexar County     48029       11-City: Large 29.41522
## 463                     Bexar County     48029       11-City: Large 29.41522
## 464                     Starr County     48427     41-Rural: Fringe 26.40420
## 465                     Starr County     48427     41-Rural: Fringe 26.40420
## 466                   Hidalgo County     48215     41-Rural: Fringe 26.34364
## 467                   Hidalgo County     48215     41-Rural: Fringe 26.34364
## 468                    Marion County     18097       11-City: Large 39.80348
## 469               Los Angeles County      6037     41-Rural: Fringe 34.49284
## 470                      Kane County     17089    12-City: Mid-size 42.04988
## 471                   Tarrant County     48439       11-City: Large 32.76741
## 472                   Tarrant County     48439       11-City: Large 32.76741
## 473                    Harris County     48201       11-City: Large 29.62554
## 474                    Harris County     48201       11-City: Large 29.62554
## 475                 Fort Bend County     48157     21-Suburb: Large 29.68194
## 476                    Dallas County     48113     21-Suburb: Large 32.60333
## 477                    Dallas County     48113     21-Suburb: Large 32.60333
## 478                   Tarrant County     48439     21-Suburb: Large 32.86570
## 479                   Tarrant County     48439     21-Suburb: Large 32.86570
## 480                   Tarrant County     48439       11-City: Large 32.74967
## 481                      Pima County      4019     43-Rural: Remote 31.91637
## 482                    Marion County     18097       11-City: Large 39.87492
## 483                  Hamilton County     18057       13-City: Small 39.92796
## 484                  Arapahoe County      8005     21-Suburb: Large 39.63349
## 485                   Chester County     42029     21-Suburb: Large 40.05655
## 486                      Dane County     55025     21-Suburb: Large 43.01481
## 487                    Denver County      8031     41-Rural: Fringe 39.79723
## 488                    Wright County     27171      31-Town: Fringe 45.30052
## 489                      Cobb County     13067     21-Suburb: Large 33.89978
## 490                Cumberland County     42041     21-Suburb: Large 40.15186
## 491                 Jefferson County      8059     21-Suburb: Large 39.68937
## 492                     Bronx County     36005       11-City: Large 40.81497
## 493                Burlington County     34005      31-Town: Fringe 39.97625
## 494          East Baton Rouge Parish     22033    12-City: Mid-size 30.47772
## 495                    Peoria County     17143     21-Suburb: Large 40.91813
## 496                  Crawford County      5033  22-Suburb: Mid-size 35.44246
## 497                    Marion County     18097       11-City: Large 39.83625
## 498                      Cook County     17031     21-Suburb: Large 41.95754
## 499               Mecklenburg County     37119       11-City: Large 35.26758
## 500                   Kaufman County     48257     32-Town: Distant 32.75806
## 501                  Phillips County      5107     41-Rural: Fringe 34.53386
## 502                  Richland County     45079     21-Suburb: Large 34.06512
## 503                    Lehigh County     42077    12-City: Mid-size 40.60549
## 504                   Jackson County     26075       13-City: Small 42.25066
## 505                 Fort Bend County     48157     21-Suburb: Large 29.64981
## 506                 Fort Bend County     48157     21-Suburb: Large 29.68514
## 507                     Clark County     32003     21-Suburb: Large 35.98692
## 508                   Shawnee County     20177    12-City: Mid-size 39.00899
## 509                    Walker County      1127     32-Town: Distant 33.83423
## 510                 Lafayette Parish     22055    12-City: Mid-size 30.22085
## 511              Westmoreland County     42129     21-Suburb: Large 40.31493
## 512                 Jefferson County     12065    42-Rural: Distant 30.49084
## 513                   Oakland County     26125       13-City: Small 42.61601
## 514                 Jefferson County     29099     41-Rural: Fringe 38.15566
## 515                   Chilton County      1021    42-Rural: Distant 32.98446
## 516                    Collin County     48085     21-Suburb: Large 33.14094
## 517                      Bell County     48027    12-City: Mid-size 31.11439
## 518                   Houston County     48225      33-Town: Remote 31.29838
## 519                      King County     53033     21-Suburb: Large 47.20664
## 520                 El Dorado County      6017     21-Suburb: Large 38.64766
## 521                    Placer County      6061     21-Suburb: Large 38.88161
## 522                  Cuyahoga County     39035       11-City: Large 41.45471
## 523                 Riverside County      6065     21-Suburb: Large 33.68007
## 524                    Fulton County     13121       11-City: Large 33.77462
## 525                    DuPage County     17043     21-Suburb: Large 41.85361
## 526                     Clark County     32003     41-Rural: Fringe 36.08458
## 527                 San Diego County      6073    42-Rural: Distant 33.25550
## 528                   Cameron County     48061    12-City: Mid-size 25.94002
## 529                    Collin County     48085     41-Rural: Fringe 33.32688
## 530                  New York County     36061       11-City: Large 40.78394
## 531                     Gregg County     48183     41-Rural: Fringe 32.58534
## 532                  Oklahoma County     40109     41-Rural: Fringe 35.59702
## 533                  Hamilton County     18057     21-Suburb: Large 40.05175
## 534                   Jackson County     46071     43-Rural: Remote 43.83719
## 535                    Wright County     27171     41-Rural: Fringe 45.25997
## 536                    Shelby County     47157       11-City: Large 35.14667
## 537                     Bexar County     48029     41-Rural: Fringe 29.52152
## 538                  Honolulu County     15003     21-Suburb: Large 21.50179
## 539                  Honolulu County     15003     41-Rural: Fringe 21.31852
## 540                      Hunt County     48231     41-Rural: Fringe 33.07969
## 541               Los Angeles County      6037       11-City: Large 33.95795
## 542                 Fort Bend County     48157     41-Rural: Fringe 29.75513
## 543                Montgomery County     48339     41-Rural: Fringe 30.32975
## 544                  Maricopa County      4013       11-City: Large 33.43182
## 545                   Kenosha County     55059  22-Suburb: Mid-size 42.58909
## 546                      Kent County     26081     21-Suburb: Large 43.03310
## 547                  Franklin County     39049       11-City: Large 40.03771
## 548              Hillsborough County     12057     21-Suburb: Large 27.88213
## 549              Hillsborough County     12057     21-Suburb: Large 27.83005
## 550                    Fulton County     13121       11-City: Large 33.76820
## 551                     Kings County      6031       13-City: Small 36.32632
## 552               Los Angeles County      6037     21-Suburb: Large 33.96095
## 553                  Davidson County     47037     41-Rural: Fringe 36.23859
## 554                    Harris County     48201       11-City: Large 29.82941
## 555                    Harris County     48201       11-City: Large 29.82941
## 556                  Oklahoma County     40109       11-City: Large 35.42100
## 557                    Dallas County     48113       11-City: Large 32.75019
## 558                   St. Louis city     29510       11-City: Large 38.63584
## 559                 San Mateo County      6081     21-Suburb: Large 37.46177
## 560                  Mahoning County     39099       13-City: Small 41.06775
## 561                      Knox County     21121      33-Town: Remote 36.86575
## 562                 Kalamazoo County     26077       13-City: Small 42.32469
## 563                 Kalamazoo County     26077  22-Suburb: Mid-size 42.29061
## 564                    Travis County     48453     41-Rural: Fringe 30.33105
## 565                 Missaukee County     26113    42-Rural: Distant 44.33742
## 566                      Lake County      8065      33-Town: Remote 39.24395
## 567                Montgomery County     48339     41-Rural: Fringe 30.34887
## 568                 Kandiyohi County     27067      33-Town: Remote 45.11323
## 569                    Shelby County     47157     41-Rural: Fringe 35.26324
## 570                     Bexar County     48029     41-Rural: Fringe 29.22207
## 571                    Wright County     27171     41-Rural: Fringe 45.15272
## 572                 San Diego County      6073     21-Suburb: Large 32.85385
## 573                   Baldwin County     13009     32-Town: Distant 33.09040
## 574                   Baldwin County     13009     32-Town: Distant 33.08025
## 575               Los Angeles County      6037       11-City: Large 33.99531
## 576                   Alameda County      6001     23-Suburb: Small 37.69007
## 577                     Essex County     34013       11-City: Large 40.73837
## 578                    Platte County     29165       11-City: Large 39.27720
## 579                     Clark County     32003       11-City: Large 36.27451
## 580                     Davis County     49011       13-City: Small 41.09564
## 581                     Weber County     49057       13-City: Small 41.25826
## 582                  Cheshire County     33005    42-Rural: Distant 43.07512
## 583                  Hamilton County     39061       11-City: Large 39.13929
## 584                 San Diego County      6073     21-Suburb: Large 32.79768
## 585                 Milwaukee County     55079       11-City: Large 43.06190
## 586                 Armstrong County     42005     21-Suburb: Large 40.62799
## 587                   Brevard County     12009     21-Suburb: Large 28.48025
## 588                     Bronx County     36005       11-City: Large 40.81313
## 589                Greenville County     45045     21-Suburb: Large 34.85912
## 590                    Shelby County     47157       11-City: Large 35.21679
## 591                     Clark County     32003     21-Suburb: Large 36.25133
## 592                      Pima County      4019     21-Suburb: Large 32.42604
## 593                   Cochise County      4003       13-City: Small 31.55157
## 594                      Pima County      4019     21-Suburb: Large 32.34772
## 595                     Kings County      6031     41-Rural: Fringe 36.29243
## 596                   Tarrant County     48439     41-Rural: Fringe 32.94091
## 597                    Benton County     53005  22-Suburb: Mid-size 46.27314
## 598                      Cass County     18017    42-Rural: Distant 40.66287
## 599                      Erie County     36029       11-City: Large 42.94489
## 600                   Hampden County     25013    12-City: Mid-size 42.10510
## 601                   Spokane County     53063     21-Suburb: Large 47.66566
## 602                   Johnson County     19103     41-Rural: Fringe 41.73550
## 603                Montgomery County     39113    12-City: Mid-size 39.76633
## 604                 Aroostook County     23003    42-Rural: Distant 46.90675
## 605                 Limestone County      1083      31-Town: Fringe 34.77693
## 606               San Joaquin County      6077     21-Suburb: Large 38.02373
## 607                  Rockwall County     48397     41-Rural: Fringe 32.81358
## 608                 San Mateo County      6081     21-Suburb: Large 37.58543
## 609                    Dallas County     48113     21-Suburb: Large 32.58922
## 610                    Wright County     27171      31-Town: Fringe 45.28643
## 611                Livingston Parish     22063     21-Suburb: Large 30.57668
## 612                     Cache County     49005       13-City: Small 41.72457
## 613                     Clark County     32003     21-Suburb: Large 36.19132
## 614                    Collin County     48085       11-City: Large 33.06933
## 615                    Taylor County     48441    12-City: Mid-size 32.47756
## 616                    Lassen County      6035      33-Town: Remote 40.41895
## 617                      Linn County     19113  22-Suburb: Mid-size 42.03558
## 618                    Sussex County     10005     41-Rural: Fringe 38.71642
## 619                   Lowndes County     28087      33-Town: Remote 33.51636
## 620                     Bexar County     48029     41-Rural: Fringe 29.36365
## 621                Schuylkill County     42107     32-Town: Distant 40.80979
## 622                Washington County     49053     23-Suburb: Small 37.08983
## 623                   Chester County     42029     21-Suburb: Large 40.11815
## 624                    Travis County     48453     41-Rural: Fringe 30.34366
## 625                Burlington County     34005     41-Rural: Fringe 39.98283
## 626               Mecklenburg County     37119       11-City: Large 35.20214
## 627                Washington County     27163    42-Rural: Distant 45.16561
## 628                  Gonzales County     48177     43-Rural: Remote 29.26741
## 629                    Marion County     21155     41-Rural: Fringe 37.57823
## 630                    Marion County     21155    42-Rural: Distant 37.58797
## 631                    Marion County     47115     32-Town: Distant 35.07589
## 632                  Maricopa County      4013      31-Town: Fringe 33.39842
## 633                     Bexar County     48029       11-City: Large 29.45721
## 634                    Solano County      6095    12-City: Mid-size 38.26590
## 635                    Monroe County     36055     41-Rural: Fringe 43.03686
## 636                 Snohomish County     53061  22-Suburb: Mid-size 48.07524
## 637                Miami-Dade County     12086     21-Suburb: Large 25.56138
## 638                     Clark County     32003       11-City: Large 36.17451
## 639                    Washoe County     32031    12-City: Mid-size 39.53800
## 640                   Osceola County     12097     41-Rural: Fringe 28.28725
## 641                   Suffolk County     25025       11-City: Large 42.27600
## 642               Los Angeles County      6037     21-Suburb: Large 33.98770
## 643                   Laramie County     56021     41-Rural: Fringe 41.16046
## 644                    Seward County     20175     41-Rural: Fringe 37.05159
## 645                   Boulder County      8013     23-Suburb: Small 40.03341
## 646                      King County     53033       11-City: Large 47.62159
## 647                    Medina County     48325     41-Rural: Fringe 29.42657
## 648                Orangeburg County     45075     32-Town: Distant 33.47292
## 649                    Shelby County     47157       11-City: Large 35.02707
## 650               Mecklenburg County     37119     21-Suburb: Large 35.39181
## 651                    Mercer County     34021     21-Suburb: Large 40.28745
## 652                    Mercer County     34021     21-Suburb: Large 40.24960
## 653                    Mercer County     34021     41-Rural: Fringe 40.25155
## 654                 Clackamas County     41005     21-Suburb: Large 45.31511
## 655                  Berkeley County     45015     21-Suburb: Large 33.01426
## 656                Greenville County     45045       13-City: Small 34.88309
## 657                    Butler County     39017     21-Suburb: Large 39.40201
## 658                   Clinton County     26037    42-Rural: Distant 43.04594
## 659                    Macomb County     26099    12-City: Mid-size 42.49412
## 660                 Van Buren County     26159    42-Rural: Distant 42.35931
## 661                    Harris County     48201     21-Suburb: Large 30.00798
## 662                   Baldwin County     13009     41-Rural: Fringe 33.01871
## 663                   Baldwin County     13009     41-Rural: Fringe 33.07994
## 664                 San Diego County      6073     21-Suburb: Large 33.37728
## 665                  Santa Fe County     35049       13-City: Small 35.64662
## 666                    Ripley County     18137    42-Rural: Distant 39.12869
## 667               Piscataquis County     23021    42-Rural: Distant 45.25022
## 668                      Luna County     35029      33-Town: Remote 32.25667
## 669                   Hidalgo County     48215       13-City: Small 26.21800
## 670                     Clark County     32003       11-City: Large 36.17985
## 671                    Orange County      6059       11-City: Large 33.72067
## 672                  Lawrence County     42073     41-Rural: Fringe 40.97963
## 673                    Oxford County     23017    42-Rural: Distant 44.02198
## 674              Anne Arundel County     24003     21-Suburb: Large 38.98386
## 675                    Butler County     39017     21-Suburb: Large 39.44766
## 676                Williamson County     48491     41-Rural: Fringe 30.56151
## 677                  Buncombe County     37021       13-City: Small 35.59800
## 678                Montgomery County     37123     41-Rural: Fringe 35.36695
## 679                 Allegheny County     42003     21-Suburb: Large 40.46545
## 680                    Hendry County     12051     43-Rural: Remote 26.64194
## 681                      Mesa County      8077  22-Suburb: Mid-size 39.15915
## 682                 Lancaster County     31109     41-Rural: Fringe 40.72487
## 683                 St. Louis County     29189     21-Suburb: Large 38.51661
## 684                  Somerset County     23025     43-Rural: Remote 45.07211
## 685                    Travis County     48453     41-Rural: Fringe 30.46442
## 686                Washington County     41067     41-Rural: Fringe 45.42732
## 687               Mecklenburg County     37119       11-City: Large 35.23708
## 688                  Monterey County      6053  22-Suburb: Mid-size 36.60713
## 689                  New York County     36061       11-City: Large 40.73612
## 690                     Kings County     36047       11-City: Large 40.64470
## 691                   Hancock County     18059     41-Rural: Fringe 39.90242
## 692                 Snohomish County     53061    12-City: Mid-size 47.91165
## 693                    Travis County     48453       11-City: Large 30.29596
## 694                      Hall County     13139       13-City: Small 34.24800
## 695                 San Diego County      6073     41-Rural: Fringe 32.61465
## 696                Washington County     42125     41-Rural: Fringe 40.29233
## 697                 Nantucket County     25019     32-Town: Distant 41.26988
## 698                 San Diego County      6073     21-Suburb: Large 32.66946
## 699                 San Diego County      6073     21-Suburb: Large 32.75561
## 700                     Bucks County     42017     21-Suburb: Large 40.16572
## 701                     Clark County     32003       11-City: Large 36.16790
## 702                     Clark County     32003       11-City: Large 36.16195
## 703                      Kane County     17089     21-Suburb: Large 41.89360
## 704                      Webb County     48479       11-City: Large 27.42873
## 705                    Travis County     48453     21-Suburb: Large 30.34109
## 706                 St. Croix County     55109     32-Town: Distant 45.11329
## 707                    Queens County     36081       11-City: Large 40.58615
## 708                     Bronx County     36005       11-City: Large 40.82209
## 709                   Tarrant County     48439       11-City: Large 32.71003
## 710                   Orleans Parish     22071       11-City: Large 29.92581
## 711                  Waukesha County     55133     41-Rural: Fringe 42.85487
## 712                 Snohomish County     53061     21-Suburb: Large 47.82446
## 713                   Caribou County     16029     43-Rural: Remote 42.71754
## 714                   Pulaski County      5119       13-City: Small 34.77634
## 715                  Macoupin County     17117    42-Rural: Distant 39.45105
## 716                      Wake County     37183     21-Suburb: Large 35.97657
## 717                      Kane County     17089     21-Suburb: Large 41.91066
## 718                      Kane County     17089     21-Suburb: Large 41.91066
## 719                    Oconto County     55083     32-Town: Distant 44.89091
## 720                      Cook County     17031     21-Suburb: Large 42.10247
## 721                  Maricopa County      4013     21-Suburb: Large 33.51517
## 722                     Tulsa County     40143     41-Rural: Fringe 36.05248
## 723                  Kootenai County     16055     23-Suburb: Small 47.75950
## 724                      Park County     56029      33-Town: Remote 44.76513
## 725                  Montrose County      8085     43-Rural: Remote 38.27079
## 726                    Collin County     48085     41-Rural: Fringe 33.28522
## 727                  Davidson County     37057     41-Rural: Fringe 35.94413
## 728                Montgomery County     48339     41-Rural: Fringe 30.32744
## 729                    Stanly County     37167    42-Rural: Distant 35.23367
## 730                   Alameda County      6001       11-City: Large 37.75908
## 731                     Ocean County     34029       13-City: Small 40.09381
## 732                    Orange County     12095       11-City: Large 28.54798
## 733              San Patricio County     48409      31-Town: Fringe 27.95069
## 734                Montgomery County      5097     43-Rural: Remote 34.62010
## 735                  Marathon County     55073     23-Suburb: Small 44.91450
## 736                Okeechobee County     12093     32-Town: Distant 27.23653
## 737                Okeechobee County     12093     41-Rural: Fringe 27.30736
## 738                   Johnson County     20091     21-Suburb: Large 38.88517
## 739                     Marin County      6041     21-Suburb: Large 38.00476
## 740                    Tooele County     49045     32-Town: Distant 40.65043
## 741                 Worcester County     25027     41-Rural: Fringe 42.10858
## 742                  Delaware County     39041     21-Suburb: Large 40.21265
## 743                   Jackson County     40065    42-Rural: Distant 34.54693
## 744                   Jackson County     40065    42-Rural: Distant 34.54693
## 745                    Onslow County     37133       13-City: Small 34.77240
## 746                    Skagit County     53057      31-Town: Fringe 48.50946
## 747                   Alameda County      6001       11-City: Large 37.78348
## 748                   Douglas County     31055       11-City: Large 41.26740
## 749            San Bernardino County      6071     21-Suburb: Large 34.06346
## 750                  Antelope County     31003     43-Rural: Remote 42.33794
## 751                  Cuyahoga County     39035       11-City: Large 41.46145
## 752                    Placer County      6061     41-Rural: Fringe 38.78724
## 753                    Benton County      5007       13-City: Small 36.34197
## 754                      Pike County     18125    42-Rural: Distant 38.44402
## 755                 San Mateo County      6081     21-Suburb: Large 37.46575
## 756                    Shasta County      6089       13-City: Small 40.56055
## 757                  Hernando County     12053  22-Suburb: Mid-size 28.47913
## 758                  Skamania County     53059    42-Rural: Distant 45.75708
## 759                 Archuleta County      8007     41-Rural: Fringe 37.26196
## 760                       Bay County     12005       13-City: Small 30.16911
## 761                     Butte County      6007      31-Town: Fringe 39.77860
## 762                    Pueblo County      8101    12-City: Mid-size 38.23390
## 763                   Whatcom County     53073  22-Suburb: Mid-size 48.86004
## 764                   El Paso County     48141       11-City: Large 31.90270
## 765                  Franklin County     53021  22-Suburb: Mid-size 46.23978
## 766                     Pasco County     12101     21-Suburb: Large 28.21144
## 767                Sacramento County      6067       11-City: Large 38.65521
## 768                 Snohomish County     53061     21-Suburb: Large 47.89462
## 769                 Milwaukee County     55079       11-City: Large 43.05300
## 770                    Canyon County     16027  22-Suburb: Mid-size 43.56769
## 771                    Hudson County     34017       11-City: Large 40.73909
## 772                Pennington County     46103      31-Town: Fringe 44.13717
## 773                     Osage County     40113     32-Town: Distant 36.67392
## 774                      Kane County     17089     21-Suburb: Large 41.83035
## 775                Santa Cruz County      4023      33-Town: Remote 31.36714
## 776                Santa Cruz County      4023      33-Town: Remote 31.34061
## 777                      Wake County     37183     21-Suburb: Large 35.74786
## 778               Charles Mix County     46023     43-Rural: Remote 43.19193
## 779                   Clayton County     13063     21-Suburb: Large 33.52444
## 780                     Lucas County     39095     21-Suburb: Large 41.56055
## 781                  Berkeley County     45015     41-Rural: Fringe 32.91703
## 782                   Ventura County      6111       13-City: Small 34.20761
## 783              Chesterfield County     51041     21-Suburb: Large 37.38791
## 784                    Shasta County      6089       13-City: Small 40.57578
## 785                  Maricopa County      4013       11-City: Large 33.45462
## 786                   Chester County     42029     21-Suburb: Large 40.11890
## 787                 Fairfield County     39045     21-Suburb: Large 39.90772
## 788                 St. Johns County     12109     41-Rural: Fringe 29.92204
## 789                      Pike County     21195      33-Town: Remote 37.53782
## 790                      Pima County      4019     41-Rural: Fringe 31.97065
## 791                      Pima County      4019     21-Suburb: Large 32.31279
## 792                      Pima County      4019       11-City: Large 32.28586
## 793                  McCreary County     21147    42-Rural: Distant 36.66184
## 794                      Wake County     37183     21-Suburb: Large 35.67859
## 795                     Clark County     32003     41-Rural: Fringe 35.93060
## 796                     Clark County     32003       11-City: Large 36.01722
## 797                     Clark County     32003       11-City: Large 35.99869
## 798                      Lake County     12069     21-Suburb: Large 28.56939
## 799                  Pinellas County     12103     21-Suburb: Large 27.90316
## 800                  Maricopa County      4013    12-City: Mid-size 33.39325
## 801               Piscataquis County     23021     43-Rural: Remote 45.17435
## 802               Piscataquis County     23021     43-Rural: Remote 45.17219
## 803              Hillsborough County     12057     21-Suburb: Large 28.08611
## 804                      York County     45091     21-Suburb: Large 35.05087
## 805                    Peoria County     17143    12-City: Mid-size 40.72814
## 806                  Brazoria County     48039     41-Rural: Fringe 29.52934
## 807                    Shelby County     47157     21-Suburb: Large 35.02183
## 808                    Wright County     27171     41-Rural: Fringe 45.26881
## 809                    Brazos County     48041    12-City: Mid-size 30.59275
## 810                     Bexar County     48029       11-City: Large 29.35615
## 811                     Bexar County     48029       11-City: Large 29.47009
## 812                    Wright County     27171      31-Town: Fringe 45.28682
## 813                  Somerset County     24039      31-Town: Fringe 38.19901
## 814                    Queens County     36081       11-City: Large 40.75516
## 815                    Queens County     36081       11-City: Large 40.66791
## 816                     Bronx County     36005       11-City: Large 40.82704
## 817                     Kings County     36047       11-City: Large 40.64478
## 818       Aleutians West Census Area      2016     43-Rural: Remote 56.60256
## 819               Los Angeles County      6037       11-City: Large 34.13905
## 820                    Pueblo County      8101  22-Suburb: Mid-size 38.23885
## 821                  Marshall County     21157      33-Town: Remote 36.86474
## 822                    Marion County     18097       11-City: Large 39.75933
## 823                     Clark County     32003       11-City: Large 36.16216
## 824                     Clark County     32003       11-City: Large 36.23281
## 825                     Brown County     27015     32-Town: Distant 44.29980
## 826                    Racine County     55101       13-City: Small 42.75768
## 827                  Muscogee County     13215    12-City: Mid-size 32.47526
## 828                      King County     53033       11-City: Large 47.53634
## 829                 Jefferson Parish     22051    12-City: Mid-size 29.97571
## 830                Williamson County     48491     41-Rural: Fringe 30.63221
## 831                    Lorain County     39093     21-Suburb: Large 41.40861
## 832                 San Mateo County      6081     21-Suburb: Large 37.46107
## 833                 San Mateo County      6081     21-Suburb: Large 37.47336
## 834                 Lancaster County     31109    42-Rural: Distant 41.02332
## 835                      Cass County     29037     21-Suburb: Large 38.74836
## 836                  Maricopa County      4013     21-Suburb: Large 33.59555
## 837                    Summit County     39153    12-City: Mid-size 41.05862
## 838                 Salt Lake County     49035     41-Rural: Fringe 40.48317
## 839                    Shasta County      6089       13-City: Small 40.56055
## 840                 Van Buren County     26159      31-Town: Fringe 42.20277
## 841                Tallapoosa County      1123    42-Rural: Distant 32.60246
## 842                  Stafford County     51179  22-Suburb: Mid-size 38.33303
## 843                   Osceola County     12097     21-Suburb: Large 28.34606
## 844                   Douglas County      8035     21-Suburb: Large 39.40110
## 845               Mecklenburg County     37119       11-City: Large 35.20766
## 846                   Bristol County     25005     21-Suburb: Large 41.70592
## 847                    Fulton County     13121     21-Suburb: Large 33.66064
## 848                     Adams County      8001     41-Rural: Fringe 39.89719
## 849                  Cuyahoga County     39035       11-City: Large 41.43019
## 850                  Cuyahoga County     39035       11-City: Large 41.43019
## 851                    Sonoma County      6097     21-Suburb: Large 38.34119
## 852               Los Angeles County      6037       11-City: Large 33.79629
## 853                    Elmore County     16039     32-Town: Distant 43.12534
## 854                  Cuyahoga County     39035     21-Suburb: Large 41.55550
## 855                      Kent County     26081    12-City: Mid-size 42.92522
## 856                      King County     53033     21-Suburb: Large 47.54095
## 857               Los Angeles County      6037     21-Suburb: Large 33.90800
## 858                  Hamilton County     39061       11-City: Large 39.10871
## 859                  Hamilton County     39061       11-City: Large 39.12027
## 860                Orangeburg County     45075     32-Town: Distant 33.47590
## 861                      Wake County     37183       11-City: Large 35.86192
## 862                      Cook County     17031     21-Suburb: Large 42.08113
## 863                      Sauk County     55111    42-Rural: Distant 43.27552
## 864                  Crawford County      5033  22-Suburb: Mid-size 35.45982
## 865                      Erie County     36029       11-City: Large 42.94636
## 866                    Marion County     18097       11-City: Large 39.81022
## 867                     Wayne County     26163     21-Suburb: Large 42.16625
## 868                  Garfield County      8045     41-Rural: Fringe 39.48416
## 869                  Waukesha County     55133       13-City: Small 43.02154
## 870                     Wayne County     26163     21-Suburb: Large 42.17687
## 871                      King County     53033       11-City: Large 47.69510
## 872                 Val Verde County     48465      33-Town: Remote 29.38512
## 873                    Lehigh County     42077    12-City: Mid-size 40.60121
## 874                      Ogle County     17141     41-Rural: Fringe 41.97494
## 875                  Rockdale County     13247     21-Suburb: Large 33.66830
## 876                  Davidson County     47037       11-City: Large 36.17506
## 877                Rutherford County     47149     21-Suburb: Large 35.96126
## 878                  Cuyahoga County     39035     21-Suburb: Large 41.47814
## 879                    Denton County     48121     41-Rural: Fringe 33.19420
## 880                      Wake County     37183       11-City: Large 35.77694
## 881                   Douglas County     41019      33-Town: Remote 43.20166
## 882                 Jefferson County      8059    12-City: Mid-size 39.71578
## 883                     Marin County      6041     21-Suburb: Large 38.00343
## 884                    Shelby County     48419      33-Town: Remote 31.80386
## 885                   Manatee County     12081     21-Suburb: Large 27.47438
## 886                      Bell County     48027     41-Rural: Fringe 31.07561
## 887                  Franklin County      1059     32-Town: Distant 34.52507
## 888                     Grant County     53025     41-Rural: Fringe 47.31671
## 889                  Columbia County     13073     21-Suburb: Large 33.55503
## 890                    Harris County     48201     21-Suburb: Large 30.04409
## 891                San Benito County      6069     32-Town: Distant 36.84637
## 892                   Alameda County      6001     21-Suburb: Large 37.66894
## 893            San Bernardino County      6071     21-Suburb: Large 34.05522
## 894             Santa Barbara County      6083       13-City: Small 34.42531
## 895                Santa Cruz County      6087     23-Suburb: Small 36.93832
## 896                  Oklahoma County     40109       11-City: Large 35.42034
## 897                  Oklahoma County     40109       11-City: Large 35.41659
## 898               Los Angeles County      6037       13-City: Small 34.02230
## 899                  Monterey County      6053  22-Suburb: Mid-size 36.73393
## 900                    Hudson County     34017     21-Suburb: Large 40.76521
## 901                Washington County     41067     41-Rural: Fringe 45.57557
## 902                   Chatham County     13051    12-City: Mid-size 32.05938
## 903                    Macomb County     26099    12-City: Mid-size 42.45288
## 904                 San Diego County      6073     21-Suburb: Large 33.23241
## 905                   Chatham County     13051    12-City: Mid-size 32.02557
## 906                    Harris County     48201       11-City: Large 29.93862
## 907                 San Diego County      6073     21-Suburb: Large 32.99483
## 908                  Schuyler County     17169      33-Town: Remote 40.12814
## 909                      Wake County     37183     21-Suburb: Large 35.75475
## 910               New Hanover County     37129  22-Suburb: Mid-size 34.32281
## 911                    Peoria County     17143     21-Suburb: Large 40.63758
## 912                     Duval County     12031       11-City: Large 30.22121
## 913                     Evans County     13109     32-Town: Distant 32.16339
## 914                    Newton County     29145    42-Rural: Distant 36.86603
## 915                   LaSalle County     17099    42-Rural: Distant 41.48783
## 916                   Ventura County      6111      31-Town: Fringe 34.40111
## 917                    Seward County     20175     41-Rural: Fringe 37.03044
## 918                   El Paso County     48141       11-City: Large 31.69863
## 919                   Norfolk County     25021     21-Suburb: Large 42.10685
## 920                     Clark County     32003     21-Suburb: Large 36.06154
## 921                    Madera County      6039       13-City: Small 36.98380
## 922                  Brazoria County     48039     21-Suburb: Large 29.55666
## 923                      Cass County     29037     21-Suburb: Large 38.74056
## 924                      Mono County      6051      33-Town: Remote 37.64161
## 925                Montgomery County     24031     21-Suburb: Large 39.01603
## 926                    Summit County     49043     41-Rural: Fringe 40.72232
## 927                    Summit County     49043     41-Rural: Fringe 40.72232
## 928                     Union County     34039     21-Suburb: Large 40.66070
## 929                    Warren County     51187      31-Town: Fringe 38.91487
## 930                    Canyon County     16027  22-Suburb: Mid-size 43.65492
## 931                   Lubbock County     48303      31-Town: Fringe 33.43588
## 932                     Horry County     45051  22-Suburb: Mid-size 33.66580
## 933                     Clark County     32003       11-City: Large 36.24297
## 934                     Clark County     32003     21-Suburb: Large 36.24428
## 935                     Clark County     32003     21-Suburb: Large 36.27517
## 936                     Clark County     32003       11-City: Large 36.03244
## 937                 Milwaukee County     55079       11-City: Large 43.01353
## 938                     Bronx County     36005       11-City: Large 40.82952
## 939                  Franklin County     39049       11-City: Large 39.90072
## 940                     Floyd County     21071     43-Rural: Remote 37.38314
## 941                Twin Falls County     16083      33-Town: Remote 42.52252
## 942                  Washakie County     56043      33-Town: Remote 44.01189
## 943                 Lafayette Parish     22055     41-Rural: Fringe 30.08962
## 944                    Shelby County     47157       11-City: Large 35.13706
## 945                   Licking County     39089     21-Suburb: Large 39.95605
## 946                  Hamilton County     39061       11-City: Large 39.19470
## 947                 Jefferson County      5069       13-City: Small 34.18641
## 948               Los Angeles County      6037     21-Suburb: Large 34.57347
## 949                    Saline County     29195     41-Rural: Fringe 39.13506
## 950                     Marin County      6041    42-Rural: Distant 38.24594
## 951                 San Diego County      6073     21-Suburb: Large 32.63168
## 952                  Hamilton County     39061       11-City: Large 39.12992
## 953                Miami-Dade County     12086     21-Suburb: Large 25.92873
## 954              Hillsborough County     12057     21-Suburb: Large 28.06839
## 955                    Wilson County     47189     21-Suburb: Large 36.17046
## 956                   Hampden County     25013    12-City: Mid-size 42.12024
## 957                      Clay County     12019     21-Suburb: Large 30.06558
## 958                Washington County     49053     41-Rural: Fringe 37.08807
## 959                St. Helena Parish     22091    42-Rural: Distant 30.82964
## 960                     Horry County     45051  22-Suburb: Mid-size 33.64033
## 961                    Searcy County      5129     43-Rural: Remote 36.02846
## 962                St. Mary's County     24037     23-Suburb: Small 38.24057
## 963                Cottonwood County     27033      33-Town: Remote 43.86695
## 964                      Yuma County      4027       13-City: Small 32.68956
## 965                      Yuma County      4027       13-City: Small 32.72291
## 966                      Yuma County      4027       13-City: Small 32.69764
## 967                     Bexar County     48029       11-City: Large 29.38758
## 968                    Shasta County      6089       13-City: Small 40.53090
## 969               St. Charles County     29183     21-Suburb: Large 38.78609
## 970                      Erie County     42049       13-City: Small 42.11737
## 971                    Harris County     48201       13-City: Small 29.75627
## 972                Bernalillo County     35001       11-City: Large 35.07871
## 973                 Klickitat County     53039    42-Rural: Distant 45.69428
## 974                     Meade County     46093     32-Town: Distant 44.41133
## 975                   Haskell County     20081     43-Rural: Remote 37.47758
## 976                   McHenry County     17111     21-Suburb: Large 42.16185
## 977                  New York County     36061       11-City: Large 40.81621
## 978                  New York County     36061       11-City: Large 40.75901
## 979                Montgomery County     48339       13-City: Small 30.32058
## 980               Los Angeles County      6037     21-Suburb: Large 34.40792
## 981                      King County     53033       11-City: Large 47.51701
## 982                   Licking County     39089     21-Suburb: Large 39.99430
## 983                  Franklin County     20059     41-Rural: Fringe 38.58556
## 984                   Chatham County     13051    12-City: Mid-size 32.05995
## 985             District of Columbia     11001       11-City: Large 38.92618
## 986                      King County     53033       11-City: Large 47.59976
## 987                    Orange County      6059     21-Suburb: Large 33.65780
## 988                 San Diego County      6073     21-Suburb: Large 32.64867
## 989                  Johnston County     37101     41-Rural: Fringe 35.57517
## 990                  Maricopa County      4013       11-City: Large 33.52331
## 991                      King County     53033     21-Suburb: Large 47.29758
## 992                      King County     53033     21-Suburb: Large 47.40730
## 993                     Wayne County     26163     21-Suburb: Large 42.39327
## 994                    Taylor County     12123      33-Town: Remote 30.12109
## 995                   Tarrant County     48439       11-City: Large 32.62194
## 996                 Aroostook County     23003      33-Town: Remote 46.86509
## 997               San Joaquin County      6077       11-City: Large 37.95325
## 998                   Lenawee County     26091     32-Town: Distant 42.01008
## 999                   Lenawee County     26091     32-Town: Distant 42.00743
## 1000                  Telfair County     13271      33-Town: Remote 32.06773
## 1001                Riverside County      6065    12-City: Mid-size 33.52695
## 1002                    Horry County     45051  22-Suburb: Mid-size 33.75660
## 1003                  Terrell County     13273     41-Rural: Fringe 31.75427
## 1004                  St. Louis city     29510       11-City: Large 38.65949
## 1005                   Denver County      8031       11-City: Large 39.75218
## 1006                  Clatsop County     41007    42-Rural: Distant 45.86760
## 1007                    Cache County     49005     23-Suburb: Small 41.71420
## 1008                Henderson County     21101  22-Suburb: Mid-size 37.83451
## 1009             Hillsborough County     12057     21-Suburb: Large 27.98520
## 1010                    Suffolk city     51800     41-Rural: Fringe 36.78467
## 1011                  Pulaski County      5119    12-City: Mid-size 34.68375
## 1012                 Johnston County     37101      31-Town: Fringe 35.50210
## 1013                      Bee County     48025     32-Town: Distant 28.39985
## 1014                 La Plata County      8067     32-Town: Distant 37.27646
## 1015                    Smith County     48423    12-City: Mid-size 32.27561
## 1016                  Orleans Parish     22071       11-City: Large 30.02750
## 1017                   Harris County     48201       11-City: Large 29.62569
## 1018                  Leflore County     28083      33-Town: Remote 33.51680
## 1019                Jefferson County      8059     41-Rural: Fringe 39.86629
## 1020                  Jackson County     29095     21-Suburb: Large 38.99548
## 1021                 Campbell County     56005      33-Town: Remote 44.25911
## 1022                  Wagoner County     40145     21-Suburb: Large 36.06689
## 1023                   Orange County     12095     21-Suburb: Large 28.53405
## 1024                  Wasatch County     49051     32-Town: Distant 40.49688
## 1025                     Todd County     46121     43-Rural: Remote 43.30054
## 1026                  Johnson County     48251     21-Suburb: Large 32.48085
## 1027                   Harris County     48201     21-Suburb: Large 30.11119
## 1028                  Portage County     55097    42-Rural: Distant 44.54261
## 1029                    Lucas County     39095       11-City: Large 41.62795
## 1030                   Canyon County     16027  22-Suburb: Mid-size 43.58277
## 1031                     Utah County     49049    12-City: Mid-size 40.20958
## 1032                   Dallas County     48113       11-City: Large 32.67988
## 1033                  Ventura County      6111       13-City: Small 34.22469
## 1034                    Tulsa County     40143       11-City: Large 36.15862
## 1035                    Tulsa County     40143       11-City: Large 36.15862
## 1036                    Ellis County     48139     21-Suburb: Large 32.38161
## 1037                    Wayne County     26163       11-City: Large 42.43030
## 1038                   Barron County     55005     43-Rural: Remote 45.39810
## 1039                  Bedford County     42009    42-Rural: Distant 40.22176
## 1040                    Grady County     40051    42-Rural: Distant 35.28638
## 1041               Twin Falls County     16083      33-Town: Remote 42.55674
## 1042                Allegheny County     42003     21-Suburb: Large 40.34494
## 1043                    Smith County     48423    12-City: Mid-size 32.33563
## 1044                    Union County     21225    42-Rural: Distant 37.62930
## 1045                 Franklin County     39049       11-City: Large 39.95692
## 1046              Mecklenburg County     37119       11-City: Large 35.14281
## 1047                   Orange County      6059    12-City: Mid-size 33.77445
## 1048               Sacramento County      6067     21-Suburb: Large 38.64592
## 1049           San Bernardino County      6071    12-City: Mid-size 34.06903
## 1050            Santa Barbara County      6083     43-Rural: Remote 34.93224
## 1051                 Monterey County      6053    42-Rural: Distant 35.86298
## 1052                   Dallas County     48113     21-Suburb: Large 32.74731
## 1053                   Dallas County     48113       11-City: Large 32.79552
## 1054                   Dallas County     48113       11-City: Large 32.66483
## 1055                 Somerset County     23025     43-Rural: Remote 45.05858
## 1056              Mecklenburg County     37119       11-City: Large 35.26116
## 1057                Champaign County     17019       13-City: Small 40.12558
## 1058                     Utah County     49049     21-Suburb: Large 40.36156
## 1059           San Bernardino County      6071    12-City: Mid-size 34.06903
## 1060                   Dallas County     19049     41-Rural: Fringe 41.52897
## 1061              Mecklenburg County     37119       11-City: Large 35.28561
## 1062             Philadelphia County     42101       11-City: Large 39.97628
## 1063                 Arapahoe County      8005       11-City: Large 39.73732
## 1064                   Oldham County     48359     43-Rural: Remote 35.25026
## 1065                    Comal County     48091     41-Rural: Fringe 29.72939
## 1066                 Maricopa County      4013       11-City: Large 33.49065
## 1067                Milwaukee County     55079       11-City: Large 43.15494
## 1068                 Maricopa County      4013       11-City: Large 33.46648
## 1069                  Tarrant County     48439       11-City: Large 32.89052
## 1070                 Mahoning County     39099       13-City: Small 41.07677
## 1071                    Anoka County     27003     21-Suburb: Large 45.07819
## 1072                Guadalupe County     48187       13-City: Small 29.65607
## 1073              St. Charles County     29183     21-Suburb: Large 38.82339
## 1074               Twin Falls County     16083     41-Rural: Fringe 42.60745
## 1075                   Parker County     48367     41-Rural: Fringe 32.73644
## 1076                   Warren County     51187      31-Town: Fringe 38.92598
## 1077             Hillsborough County     12057     41-Rural: Fringe 27.80492
## 1078               Washington County     37187    42-Rural: Distant 35.87878
## 1079                    Essex County     34013     21-Suburb: Large 40.71949
## 1080             Hillsborough County     12057     41-Rural: Fringe 27.77663
## 1081                 McKenzie County     38053     43-Rural: Remote 47.80016
## 1082                   Fresno County      6019     21-Suburb: Large 36.79943
## 1083                 Franklin County     42055      31-Town: Fringe 39.74697
## 1084                 Hamilton County     19079     32-Town: Distant 42.46272
## 1085               Washington County     21229    42-Rural: Distant 37.69058
## 1086                 Woodford County     17203     21-Suburb: Large 40.76744
## 1087                   Harris County     48201     41-Rural: Fringe 29.92921
## 1088                   Sonoma County      6097     41-Rural: Fringe 38.47415
## 1089             Contra Costa County      6013     21-Suburb: Large 37.94772
## 1090                  Gadsden County     12039    42-Rural: Distant 30.56656
## 1091                    Perry County     21193     41-Rural: Fringe 37.27545
## 1092                 Washakie County     56043      33-Town: Remote 44.00889
## 1093                   Yakima County     53077     41-Rural: Fringe 46.57298
## 1094                   Yakima County     53077     41-Rural: Fringe 46.57298
## 1095                   Yakima County     53077     41-Rural: Fringe 46.57298
## 1096                   Newton County      5101    42-Rural: Distant 36.09873
## 1097                Allegheny County     42003     21-Suburb: Large 40.39150
## 1098                   Harris County     48201     21-Suburb: Large 30.00798
## 1099                    Adams County      8001     21-Suburb: Large 39.82568
## 1100                 Cuyahoga County     39035     21-Suburb: Large 41.44122
## 1101                 New York County     36061       11-City: Large 40.83670
## 1102                  Addison County     50001    42-Rural: Distant 43.85822
## 1103                  Oakland County     26125  22-Suburb: Mid-size 42.47741
## 1104                  Suffolk County     36103     21-Suburb: Large 40.78706
## 1105                 Mahoning County     39099       13-City: Small 41.07175
## 1106                   Barrow County     13013      31-Town: Fringe 34.00311
## 1107                   Orange County     12095     21-Suburb: Large 28.48257
## 1108                     Cook County     17031     21-Suburb: Large 42.08555
## 1109              Los Angeles County      6037       11-City: Large 33.95771
## 1110              Los Angeles County      6037       11-City: Large 33.96773
## 1111                Winnebago County     17201    12-City: Mid-size 42.22580
## 1112                  Johnson County     20091     41-Rural: Fringe 38.80620
## 1113                     Kern County      6029    42-Rural: Distant 35.61592
## 1114                   Juneau County     55057     43-Rural: Remote 43.66253
## 1115                 Randolph County      1111     43-Rural: Remote 33.37405
## 1116              Los Angeles County      6037     21-Suburb: Large 33.91957
## 1117                 Woodward County     40153      33-Town: Remote 36.43228
## 1118               Providence County     44007     21-Suburb: Large 42.00523
## 1119               Providence County     44007     21-Suburb: Large 42.00350
## 1120                   Denver County      8031       11-City: Large 39.76756
## 1121                     Cook County     17031       11-City: Large 41.87707
## 1122                   Harris County     48201       11-City: Large 29.85181
## 1123                  El Paso County     48141       11-City: Large 31.78062
## 1124                   Sutter County      6101       13-City: Small 39.12403
##       Longitude
## 1     -94.75772
## 2     -75.34616
## 3     -96.65075
## 4     -74.42661
## 5    -104.82116
## 6     -83.07626
## 7     -74.20641
## 8     -82.93720
## 9    -121.83974
## 10    -71.72181
## 11   -117.86364
## 12    -71.45620
## 13    -94.19275
## 14    -96.87003
## 15    -80.86774
## 16   -149.57291
## 17    -85.88663
## 18    -97.74564
## 19   -104.71237
## 20    -77.08661
## 21   -118.14855
## 22    -89.41327
## 23    -84.02165
## 24   -117.29296
## 25    -74.89538
## 26    -95.33270
## 27   -119.80374
## 28   -117.09864
## 29   -111.72330
## 30   -111.80120
## 31   -111.60121
## 32   -101.50585
## 33    -87.93290
## 34   -118.32482
## 35   -121.81372
## 36    -88.28442
## 37   -121.07028
## 38    -89.86814
## 39   -111.87350
## 40    -89.95774
## 41   -122.16688
## 42    -96.85180
## 43    -80.25144
## 44    -82.58158
## 45    -84.53272
## 46    -96.20769
## 47    -96.20410
## 48   -111.92099
## 49   -111.95047
## 50    -82.57770
## 51    -86.12609
## 52    -87.61735
## 53    -81.74641
## 54    -84.34423
## 55    -87.90130
## 56    -77.46860
## 57    -88.63160
## 58    -81.61281
## 59    -81.60094
## 60   -122.63144
## 61   -112.27009
## 62   -112.01429
## 63   -112.09997
## 64    -98.59017
## 65   -112.02690
## 66   -106.58804
## 67   -122.29484
## 68    -96.77062
## 69   -108.66036
## 70    -96.17653
## 71    -90.38423
## 72   -122.35607
## 73    -74.29500
## 74    -82.52254
## 75    -93.32594
## 76   -115.35965
## 77    -88.92013
## 78   -111.68731
## 79   -119.24180
## 80   -109.96661
## 81    -85.98204
## 82    -78.90572
## 83    -89.83828
## 84    -85.69922
## 85    -81.80108
## 86   -112.32326
## 87   -147.73166
## 88    -99.47122
## 89    -98.84548
## 90    -98.47119
## 91    -98.47119
## 92    -98.70061
## 93    -98.47119
## 94    -98.70061
## 95   -118.30263
## 96    -95.37654
## 97    -77.55195
## 98    -94.74080
## 99    -75.46527
## 100   -82.31015
## 101   -96.38836
## 102   -97.72002
## 103   -97.72002
## 104   -80.25002
## 105   -81.59333
## 106   -80.19697
## 107   -82.33664
## 108   -94.63359
## 109   -73.91995
## 110   -73.86352
## 111   -73.93225
## 112   -83.57760
## 113   -96.91347
## 114   -95.26805
## 115   -97.44986
## 116   -69.04213
## 117   -92.84978
## 118   -95.88395
## 119   -75.46708
## 120   -94.33683
## 121   -71.08667
## 122  -117.54899
## 123  -117.54899
## 124  -117.96898
## 125  -122.99891
## 126   -79.96163
## 127   -76.39451
## 128   -81.66655
## 129  -110.80018
## 130  -112.46546
## 131  -111.88081
## 132   -92.29175
## 133   -82.96409
## 134   -83.04078
## 135   -92.23746
## 136   -98.47813
## 137   -68.03367
## 138   -68.00611
## 139   -95.54489
## 140   -83.69993
## 141   -79.76241
## 142  -118.33482
## 143   -84.48022
## 144   -93.64477
## 145  -122.87529
## 146   -98.49473
## 147   -83.19822
## 148   -81.74604
## 149  -111.66877
## 150   -81.05024
## 151   -77.66050
## 152  -122.28753
## 153  -111.82520
## 154  -122.05116
## 155   -96.77893
## 156   -93.51454
## 157   -84.23324
## 158   -98.08674
## 159  -121.29318
## 160   -82.56816
## 161  -111.54810
## 162   -80.24151
## 163   -80.73457
## 164   -83.00432
## 165  -123.11149
## 166   -86.02822
## 167   -81.59728
## 168   -96.79338
## 169   -95.35611
## 170  -121.00720
## 171   -82.69133
## 172   -98.19354
## 173   -90.72499
## 174   -90.71251
## 175   -96.01811
## 176   -83.73335
## 177  -117.56444
## 178  -117.29282
## 179   -82.06677
## 180   -77.76749
## 181   -75.80668
## 182   -75.79584
## 183   -77.45502
## 184   -96.76825
## 185   -74.00706
## 186   -74.17808
## 187   -91.11699
## 188   -81.62427
## 189  -104.82311
## 190  -104.96288
## 191  -104.69838
## 192  -122.31009
## 193   -84.33630
## 194  -117.21870
## 195  -117.21870
## 196   -85.71568
## 197   -83.94148
## 198   -98.44645
## 199  -120.76276
## 200   -78.74195
## 201  -119.79657
## 202  -115.26870
## 203  -115.05793
## 204  -115.13238
## 205  -115.08098
## 206   -83.03027
## 207   -69.71864
## 208   -69.70925
## 209  -117.18717
## 210   -83.67885
## 211   -76.17455
## 212  -122.69983
## 213  -122.31591
## 214   -77.28747
## 215  -106.73482
## 216  -118.85099
## 217   -94.24275
## 218  -119.29173
## 219  -119.87025
## 220  -118.33134
## 221   -94.58271
## 222   -82.88994
## 223   -82.44805
## 224  -110.91220
## 225   -82.33825
## 226   -82.33827
## 227   -90.70917
## 228   -78.15002
## 229   -87.97682
## 230  -111.40353
## 231   -99.07835
## 232   -81.68670
## 233  -122.56042
## 234  -122.28282
## 235  -108.75203
## 236  -100.91505
## 237  -106.35734
## 238   -75.56691
## 239  -121.29493
## 240  -104.91349
## 241   -83.57634
## 242  -145.71450
## 243  -121.29493
## 244   -84.64668
## 245  -115.15699
## 246  -115.15699
## 247  -115.15699
## 248  -121.30345
## 249   -83.02581
## 250  -102.82772
## 251  -117.06663
## 252   -89.10808
## 253  -115.08935
## 254   -82.92436
## 255   -83.13263
## 256   -76.37216
## 257  -115.28666
## 258   -95.48605
## 259   -95.50815
## 260   -90.81985
## 261   -83.80099
## 262  -115.28977
## 263  -115.25708
## 264  -119.77370
## 265  -115.30197
## 266  -115.23269
## 267   -97.11961
## 268   -96.70662
## 269   -96.29041
## 270   -97.50484
## 271   -97.52817
## 272   -97.52817
## 273   -95.88725
## 274   -95.88725
## 275   -96.28576
## 276  -115.19832
## 277   -71.19638
## 278   -80.38241
## 279   -84.03281
## 280   -96.48820
## 281   -88.26804
## 282   -90.34852
## 283  -104.85291
## 284   -74.31752
## 285   -82.81600
## 286   -81.48024
## 287   -90.22826
## 288  -106.94771
## 289   -91.41736
## 290   -90.65972
## 291   -92.23680
## 292   -98.24176
## 293   -82.55618
## 294   -85.63641
## 295  -121.04738
## 296  -117.99807
## 297   -93.25690
## 298   -83.78651
## 299   -85.11142
## 300   -93.15869
## 301   -90.42584
## 302   -80.06150
## 303   -91.99541
## 304   -85.47661
## 305  -107.94745
## 306   -82.42203
## 307   -94.70776
## 308   -75.21170
## 309   -82.96258
## 310   -93.77211
## 311  -117.75064
## 312   -77.38491
## 313   -76.75427
## 314   -73.75727
## 315  -118.28230
## 316  -118.17185
## 317  -117.38013
## 318   -92.00074
## 319   -95.26295
## 320   -95.26295
## 321  -120.48877
## 322   -90.04718
## 323   -76.22025
## 324   -99.43923
## 325   -96.23785
## 326   -95.84459
## 327   -78.88412
## 328   -78.57655
## 329   -93.34753
## 330  -116.95382
## 331   -97.59427
## 332   -97.59427
## 333   -97.59427
## 334   -97.59427
## 335   -97.59427
## 336   -97.59427
## 337  -118.27844
## 338   -80.08198
## 339   -80.09178
## 340  -111.90211
## 341   -81.52113
## 342   -94.07859
## 343  -111.56250
## 344  -111.70876
## 345   -85.76221
## 346   -87.44466
## 347   -77.63256
## 348   -93.79151
## 349   -93.40882
## 350   -94.63265
## 351   -84.51486
## 352  -112.06157
## 353  -117.46736
## 354   -96.89956
## 355   -83.37213
## 356   -84.03367
## 357   -89.05142
## 358   -92.01081
## 359   -93.21184
## 360   -99.79242
## 361   -82.80430
## 362   -99.09740
## 363   -73.86156
## 364  -121.42951
## 365   -87.65302
## 366   -79.80835
## 367  -104.68979
## 368   -84.43579
## 369   -95.82598
## 370   -93.47200
## 371   -99.41176
## 372  -122.89707
## 373   -83.00186
## 374  -115.08079
## 375   -82.98252
## 376  -118.26850
## 377   -82.86794
## 378   -83.39522
## 379   -81.18803
## 380  -117.49933
## 381   -94.65030
## 382   -89.85786
## 383   -96.44527
## 384  -102.07196
## 385   -84.35471
## 386   -84.35471
## 387   -86.95078
## 388   -88.59618
## 389   -80.11206
## 390   -97.64065
## 391   -96.28591
## 392   -96.63608
## 393   -82.82120
## 394  -121.56173
## 395   -96.31986
## 396   -81.10344
## 397   -81.93741
## 398  -119.30263
## 399   -75.11350
## 400  -120.36598
## 401  -112.01479
## 402   -96.68082
## 403   -98.48552
## 404   -97.65417
## 405   -75.81848
## 406   -77.46764
## 407  -105.05472
## 408   -78.95246
## 409  -111.82877
## 410   -81.18218
## 411   -75.69528
## 412   -82.29876
## 413  -119.28648
## 414  -116.96308
## 415  -121.35272
## 416  -120.57634
## 417   -80.61748
## 418   -95.26295
## 419   -94.11724
## 420   -94.11948
## 421   -69.79990
## 422  -104.46541
## 423   -89.04470
## 424   -95.46747
## 425   -99.49861
## 426   -97.46952
## 427   -97.14706
## 428   -97.83225
## 429   -96.77763
## 430   -78.60031
## 431  -117.90909
## 432   -74.28557
## 433   -98.09086
## 434   -90.25999
## 435   -83.10882
## 436   -87.07631
## 437   -73.98622
## 438  -116.96480
## 439   -96.07325
## 440   -81.43790
## 441   -93.78983
## 442   -98.25762
## 443  -112.39578
## 444   -81.41887
## 445   -97.13756
## 446   -96.45903
## 447   -73.11750
## 448   -95.70516
## 449   -83.15080
## 450  -117.17983
## 451  -118.31225
## 452   -78.90648
## 453   -88.99554
## 454   -92.78642
## 455   -83.67363
## 456   -74.88361
## 457   -86.13682
## 458   -98.60692
## 459   -98.60692
## 460   -98.53998
## 461   -98.53998
## 462   -98.40440
## 463   -98.40440
## 464   -98.85589
## 465   -98.85589
## 466   -98.25647
## 467   -98.25647
## 468   -86.17931
## 469  -118.19598
## 470   -88.31064
## 471   -97.22862
## 472   -97.22862
## 473   -95.24151
## 474   -95.24151
## 475   -95.73051
## 476   -96.80042
## 477   -96.80042
## 478   -97.38963
## 479   -97.38963
## 480   -97.31450
## 481  -111.86091
## 482   -86.27489
## 483   -86.15072
## 484  -104.74768
## 485   -75.67204
## 486   -89.30031
## 487  -104.88320
## 488   -93.78243
## 489   -84.54278
## 490   -77.13188
## 491  -105.12375
## 492   -73.91229
## 493   -74.58850
## 494   -91.15225
## 495   -89.48533
## 496   -94.33432
## 497   -85.99250
## 498   -87.81580
## 499   -80.84174
## 500   -96.27482
## 501   -90.61939
## 502   -80.94928
## 503   -75.49129
## 504   -84.41885
## 505   -95.72126
## 506   -95.70879
## 507  -115.25844
## 508   -95.71115
## 509   -87.25791
## 510   -92.07466
## 511   -79.60815
## 512   -83.88006
## 513   -83.30319
## 514   -90.34270
## 515   -86.72960
## 516   -96.66758
## 517   -97.67527
## 518   -95.47068
## 519  -121.99378
## 520  -121.06970
## 521  -121.26910
## 522   -81.60094
## 523  -116.30070
## 524   -84.44793
## 525   -88.00642
## 526  -114.96126
## 527  -116.37980
## 528   -97.45705
## 529   -96.54483
## 530   -73.94514
## 531   -94.75373
## 532   -97.49465
## 533   -85.99393
## 534  -101.51021
## 535   -93.67086
## 536   -90.05164
## 537   -98.76405
## 538  -158.01556
## 539  -158.09108
## 540   -96.07626
## 541  -118.42732
## 542   -95.87311
## 543   -95.66164
## 544  -112.04935
## 545   -87.85335
## 546   -85.75138
## 547   -82.94596
## 548   -82.32891
## 549   -82.30308
## 550   -84.37456
## 551  -119.64965
## 552  -118.22231
## 553   -86.80405
## 554   -95.45960
## 555   -95.45960
## 556   -97.51971
## 557   -96.65628
## 558   -90.21232
## 559  -122.13059
## 560   -80.70128
## 561   -83.88802
## 562   -85.55617
## 563   -85.65181
## 564   -97.55882
## 565   -85.21138
## 566  -106.30456
## 567   -95.66571
## 568   -95.01921
## 569   -89.74754
## 570   -98.44196
## 571   -93.75506
## 572  -116.94055
## 573   -83.26430
## 574   -83.26867
## 575  -118.30870
## 576  -121.77059
## 577   -74.19367
## 578   -94.67092
## 579  -115.25947
## 580  -111.99405
## 581  -111.94969
## 582   -72.27083
## 583   -84.56194
## 584  -116.95786
## 585   -87.92383
## 586   -79.60386
## 587   -80.78129
## 588   -73.91949
## 589   -82.42638
## 590   -89.88447
## 591  -115.19734
## 592  -110.99588
## 593  -110.28791
## 594  -111.09687
## 595  -119.82236
## 596   -97.38853
## 597  -119.37486
## 598   -86.25146
## 599   -78.83266
## 600   -72.59313
## 601  -117.08414
## 602   -91.56938
## 603   -84.17521
## 604   -67.82892
## 605   -86.96213
## 606  -121.33797
## 607   -96.46590
## 608  -122.49896
## 609   -96.85473
## 610   -93.78375
## 611   -90.95204
## 612  -111.84346
## 613  -115.07733
## 614   -96.81319
## 615   -99.76749
## 616  -120.66218
## 617   -91.58146
## 618   -75.15227
## 619   -88.36691
## 620   -98.73215
## 621   -76.15073
## 622  -113.49790
## 623   -75.52334
## 624   -97.57449
## 625   -74.67843
## 626   -80.87650
## 627   -92.81522
## 628   -97.63663
## 629   -85.23484
## 630   -85.34553
## 631   -85.62544
## 632  -112.57072
## 633   -98.50025
## 634  -122.02926
## 635   -77.67055
## 636  -122.11798
## 637   -80.32912
## 638  -115.07031
## 639  -119.78098
## 640   -81.47179
## 641   -71.10321
## 642  -118.18303
## 643  -104.65203
## 644  -100.91520
## 645  -105.08339
## 646  -122.30530
## 647   -98.81412
## 648   -80.85715
## 649   -89.88040
## 650   -80.84023
## 651   -74.76737
## 652   -74.65556
## 653   -74.64776
## 654  -122.74119
## 655   -80.00027
## 656   -82.37753
## 657   -84.56810
## 658   -84.38882
## 659   -83.08361
## 660   -85.87861
## 661   -95.26295
## 662   -83.22660
## 663   -83.27166
## 664  -117.25399
## 665  -105.95054
## 666   -85.12849
## 667   -68.97949
## 668  -107.76383
## 669   -98.31002
## 670  -115.13706
## 671  -117.90903
## 672   -80.45283
## 673   -70.96612
## 674   -76.53007
## 675   -84.38847
## 676   -97.79021
## 677   -82.56114
## 678   -79.87011
## 679   -80.12081
## 680   -81.11096
## 681  -108.72927
## 682   -96.60406
## 683   -90.31459
## 684   -69.89460
## 685   -97.54730
## 686  -122.85528
## 687   -80.88484
## 688  -121.83439
## 689   -73.99235
## 690   -73.97117
## 691   -85.83918
## 692  -122.24366
## 693   -97.69066
## 694   -83.87299
## 695  -116.99229
## 696   -80.19854
## 697   -70.09880
## 698  -117.07650
## 699  -117.01275
## 700   -74.85492
## 701  -115.12963
## 702  -115.27771
## 703   -88.31739
## 704   -99.45819
## 705   -97.54996
## 706   -92.53270
## 707   -73.82502
## 708   -73.89404
## 709   -97.13353
## 710   -90.01693
## 711   -88.24349
## 712  -122.18243
## 713  -111.88805
## 714   -92.26812
## 715   -89.78125
## 716   -78.54178
## 717   -88.32132
## 718   -88.32132
## 719   -87.87118
## 720   -87.78115
## 721  -112.27170
## 722   -95.99277
## 723  -116.78577
## 724  -108.75119
## 725  -108.54845
## 726   -96.77316
## 727   -80.16394
## 728   -95.66186
## 729   -80.33586
## 730  -122.19075
## 731   -74.22346
## 732   -81.39032
## 733   -97.59001
## 734   -93.78015
## 735   -89.57337
## 736   -80.83155
## 737   -80.82405
## 738   -94.85421
## 739  -122.52162
## 740  -112.30091
## 741   -72.10054
## 742   -83.02261
## 743   -99.41840
## 744   -99.41840
## 745   -77.38400
## 746  -122.60740
## 747  -122.23538
## 748   -95.96069
## 749  -117.42953
## 750   -98.23772
## 751   -81.79554
## 752  -121.39204
## 753   -94.24275
## 754   -87.09228
## 755  -122.13287
## 756  -122.35606
## 757   -82.50975
## 758  -121.64878
## 759  -107.06252
## 760   -85.67493
## 761  -121.58935
## 762  -104.64955
## 763  -122.60060
## 764  -106.40316
## 765  -119.09853
## 766   -82.74143
## 767  -121.54726
## 768  -122.26899
## 769   -87.91525
## 770  -116.56338
## 771   -74.05639
## 772  -103.06332
## 773   -96.33119
## 774   -88.29109
## 775  -110.94916
## 776  -110.94086
## 777   -78.86689
## 778   -98.64484
## 779   -84.35938
## 780   -83.65205
## 781   -79.85087
## 782  -119.07591
## 783   -77.49967
## 784  -122.35469
## 785  -112.01685
## 786   -75.52437
## 787   -82.73369
## 788   -81.49712
## 789   -82.58097
## 790  -110.93301
## 791  -111.02833
## 792  -110.96430
## 793   -84.44029
## 794   -78.83722
## 795  -115.11336
## 796  -114.95450
## 797  -115.13371
## 798   -81.72279
## 799   -82.69938
## 800  -111.97182
## 801   -69.37866
## 802   -69.37820
## 803   -82.52994
## 804   -80.96858
## 805   -89.64544
## 806   -95.40149
## 807   -89.78777
## 808   -93.63925
## 809   -96.32164
## 810   -98.45097
## 811   -98.61375
## 812   -93.77211
## 813   -75.69534
## 814   -73.77061
## 815   -73.83669
## 816   -73.85970
## 817   -73.97108
## 818  -169.54386
## 819  -118.20661
## 820  -104.58461
## 821   -88.36801
## 822   -86.15791
## 823  -115.13333
## 824  -115.25984
## 825   -94.44662
## 826   -87.80569
## 827   -84.94411
## 828  -122.28288
## 829   -90.22690
## 830   -97.81586
## 831   -81.99170
## 832  -122.13336
## 833  -122.14555
## 834   -96.74752
## 835   -94.45437
## 836  -112.21100
## 837   -81.54210
## 838  -111.97790
## 839  -122.35606
## 840   -86.16090
## 841   -85.80487
## 842   -77.47469
## 843   -81.26221
## 844  -104.85640
## 845   -80.92080
## 846   -71.15282
## 847   -84.44641
## 848  -104.78568
## 849   -81.72129
## 850   -81.72129
## 851  -122.69060
## 852  -118.15408
## 853  -115.70284
## 854   -81.49410
## 855   -85.60299
## 856  -122.18438
## 857  -118.37648
## 858   -84.52255
## 859   -84.51694
## 860   -80.90118
## 861   -78.53222
## 862   -87.89738
## 863   -90.05053
## 864   -94.35036
## 865   -78.90540
## 866   -86.20932
## 867   -83.19434
## 868  -107.29821
## 869   -88.22998
## 870   -83.17749
## 871  -122.34049
## 872  -100.92114
## 873   -75.46475
## 874   -89.06388
## 875   -84.02593
## 876   -86.79930
## 877   -86.54820
## 878   -81.84627
## 879   -96.98440
## 880   -78.54723
## 881  -123.34870
## 882  -105.07568
## 883  -122.60671
## 884   -94.20064
## 885   -82.56611
## 886   -97.78538
## 887   -87.73930
## 888  -119.53773
## 889   -82.16781
## 890   -95.38526
## 891  -121.41156
## 892  -122.11482
## 893  -117.33240
## 894  -119.67916
## 895  -121.77169
## 896   -97.55157
## 897   -97.51222
## 898  -118.47899
## 899  -121.64901
## 900   -74.04051
## 901  -122.83786
## 902   -81.08734
## 903   -83.07481
## 904  -117.31731
## 905   -81.08109
## 906   -95.40059
## 907  -117.26514
## 908   -90.56451
## 909   -78.73837
## 910   -77.87896
## 911   -89.67059
## 912   -81.61486
## 913   -81.91641
## 914   -94.59999
## 915   -88.73136
## 916  -118.91679
## 917  -100.91117
## 918  -106.27267
## 919   -71.16599
## 920  -115.30784
## 921  -120.06628
## 922   -95.40811
## 923   -94.45690
## 924  -118.95862
## 925   -77.07501
## 926  -111.48627
## 927  -111.48627
## 928   -74.17234
## 929   -78.19853
## 930  -116.62230
## 931  -101.65873
## 932   -78.97657
## 933  -115.24342
## 934  -115.11501
## 935  -115.14604
## 936  -115.04420
## 937   -87.93120
## 938   -73.90620
## 939   -82.96253
## 940   -82.73466
## 941  -114.47119
## 942  -107.95177
## 943   -91.97127
## 944   -90.03649
## 945   -82.68143
## 946   -84.57160
## 947   -92.02972
## 948  -118.09286
## 949   -93.20991
## 950  -122.90214
## 951  -117.05821
## 952   -84.48548
## 953   -80.16901
## 954   -82.57087
## 955   -86.54812
## 956   -72.54989
## 957   -81.70913
## 958  -113.50279
## 959   -90.69775
## 960   -79.01619
## 961   -92.79848
## 962   -76.49455
## 963   -95.11962
## 964  -114.49620
## 965  -114.61756
## 966  -114.66492
## 967   -98.46193
## 968  -122.37263
## 969   -90.85590
## 970   -80.11340
## 971   -94.96662
## 972  -106.63187
## 973  -121.28041
## 974  -103.51378
## 975  -100.84864
## 976   -88.34122
## 977   -73.95349
## 978   -73.99647
## 979   -95.48605
## 980  -118.46707
## 981  -122.37767
## 982   -82.75272
## 983   -95.28508
## 984   -81.09949
## 985   -77.03574
## 986  -122.30371
## 987  -117.61444
## 988  -117.05332
## 989   -78.47372
## 990  -112.11775
## 991  -122.35499
## 992  -122.01469
## 993   -83.05201
## 994   -83.57724
## 995   -97.07812
## 996   -68.00594
## 997  -121.28347
## 998   -83.93492
## 999   -83.95206
## 1000  -82.91042
## 1001 -117.11255
## 1002  -78.90203
## 1003  -84.43349
## 1004  -90.20605
## 1005 -105.01838
## 1006 -123.95903
## 1007 -111.82170
## 1008  -87.58350
## 1009  -82.38805
## 1010  -76.64457
## 1011  -92.32331
## 1012  -78.34036
## 1013  -97.76130
## 1014 -107.87826
## 1015  -95.33952
## 1016  -90.05126
## 1017  -95.35461
## 1018  -90.16789
## 1019 -105.22141
## 1020  -94.48136
## 1021 -105.51192
## 1022  -95.74725
## 1023  -81.13810
## 1024 -111.39246
## 1025 -100.65935
## 1026  -97.33790
## 1027  -95.62808
## 1028  -89.27564
## 1029  -83.56172
## 1030 -116.54933
## 1031 -111.63369
## 1032  -96.75618
## 1033 -119.02954
## 1034  -96.00555
## 1035  -96.00555
## 1036  -96.83034
## 1037  -82.99529
## 1038  -92.13907
## 1039  -78.23843
## 1040  -97.80737
## 1041 -114.47185
## 1042  -79.85875
## 1043  -95.33270
## 1044  -87.94674
## 1045  -82.95980
## 1046  -80.92256
## 1047 -117.80892
## 1048 -121.26323
## 1049 -117.54899
## 1050 -119.60926
## 1051 -120.80562
## 1052  -97.00100
## 1053  -96.72363
## 1054  -96.82445
## 1055  -69.87267
## 1056  -80.77346
## 1057  -88.20219
## 1058 -111.78283
## 1059 -117.54899
## 1060  -93.95302
## 1061  -80.73388
## 1062  -75.17426
## 1063 -104.85562
## 1064 -102.41883
## 1065  -98.16430
## 1066 -112.19416
## 1067  -88.03119
## 1068 -112.15686
## 1069  -97.31136
## 1070  -80.69996
## 1071  -93.25690
## 1072  -98.12231
## 1073  -90.91310
## 1074 -114.75793
## 1075  -97.57205
## 1076  -78.15265
## 1077  -82.27062
## 1078  -76.61655
## 1079  -74.31016
## 1080  -82.38583
## 1081 -103.24504
## 1082 -119.81155
## 1083  -77.56768
## 1084  -93.83620
## 1085  -85.22049
## 1086  -89.46654
## 1087  -95.75874
## 1088 -122.88816
## 1089 -122.32105
## 1090  -84.73402
## 1091  -83.23056
## 1092 -107.96185
## 1093 -120.63768
## 1094 -120.63768
## 1095 -120.63768
## 1096  -92.95547
## 1097  -79.80853
## 1098  -95.26295
## 1099 -105.00377
## 1100  -81.54569
## 1101  -73.93732
## 1102  -73.20146
## 1103  -83.62079
## 1104  -72.85846
## 1105  -80.64164
## 1106  -83.73647
## 1107  -81.58183
## 1108  -87.75102
## 1109 -118.42894
## 1110 -118.40393
## 1111  -89.05932
## 1112  -94.69439
## 1113 -119.71299
## 1114  -90.22295
## 1115  -85.39313
## 1116 -118.11597
## 1117  -99.39097
## 1118  -71.50269
## 1119  -71.50053
## 1120 -104.96777
## 1121  -87.67410
## 1122  -95.38550
## 1123 -106.47193
## 1124 -121.64583
##                                                  Title.I.School.Status
## 1                                               6-Not a Title I school
## 2                                               6-Not a Title I school
## 3                                          5-Title I schoolwide school
## 4                                               6-Not a Title I school
## 5                                               6-Not a Title I school
## 6                                               6-Not a Title I school
## 7                                 2-Title I targeted assistance school
## 8                                               6-Not a Title I school
## 9                                 2-Title I targeted assistance school
## 10                                              6-Not a Title I school
## 11                                2-Title I targeted assistance school
## 12                     4-Title I schoolwide eligible school-No program
## 13                                              6-Not a Title I school
## 14                     4-Title I schoolwide eligible school-No program
## 15                                              6-Not a Title I school
## 16                                              6-Not a Title I school
## 17                                              6-Not a Title I school
## 18                                         5-Title I schoolwide school
## 19                                              6-Not a Title I school
## 20   3-Title I schoolwide eligible-Title I targeted assistance program
## 21                                2-Title I targeted assistance school
## 22            1-Title I targeted assistance eligible school-No program
## 23                                2-Title I targeted assistance school
## 24                                                                <NA>
## 25                                              6-Not a Title I school
## 26                                              6-Not a Title I school
## 27                                                                <NA>
## 28                                         5-Title I schoolwide school
## 29            1-Title I targeted assistance eligible school-No program
## 30            1-Title I targeted assistance eligible school-No program
## 31                     4-Title I schoolwide eligible school-No program
## 32                                              6-Not a Title I school
## 33                                2-Title I targeted assistance school
## 34                                         5-Title I schoolwide school
## 35                                                                 n/a
## 36                                              6-Not a Title I school
## 37                                              6-Not a Title I school
## 38            1-Title I targeted assistance eligible school-No program
## 39                                              6-Not a Title I school
## 40                                                                <NA>
## 41                                              6-Not a Title I school
## 42                                                                 n/a
## 43                                              6-Not a Title I school
## 44                                              6-Not a Title I school
## 45                                                                 n/a
## 46                                              6-Not a Title I school
## 47                                              6-Not a Title I school
## 48                                              6-Not a Title I school
## 49                                              6-Not a Title I school
## 50                     4-Title I schoolwide eligible school-No program
## 51                                              6-Not a Title I school
## 52                                              6-Not a Title I school
## 53                                              6-Not a Title I school
## 54                                         5-Title I schoolwide school
## 55                                              6-Not a Title I school
## 56                                              6-Not a Title I school
## 57                                                                 n/a
## 58                                              6-Not a Title I school
## 59                                         5-Title I schoolwide school
## 60                                              6-Not a Title I school
## 61                                              6-Not a Title I school
## 62                                                                 n/a
## 63                                              6-Not a Title I school
## 64                                              6-Not a Title I school
## 65                                              6-Not a Title I school
## 66                                              6-Not a Title I school
## 67                                2-Title I targeted assistance school
## 68                                              6-Not a Title I school
## 69                                              6-Not a Title I school
## 70                                              6-Not a Title I school
## 71            1-Title I targeted assistance eligible school-No program
## 72                                              6-Not a Title I school
## 73                                              6-Not a Title I school
## 74                                              6-Not a Title I school
## 75                                         5-Title I schoolwide school
## 76                                              6-Not a Title I school
## 77                                         5-Title I schoolwide school
## 78                                              6-Not a Title I school
## 79                                2-Title I targeted assistance school
## 80                                              6-Not a Title I school
## 81                                                                 n/a
## 82                                         5-Title I schoolwide school
## 83                                              6-Not a Title I school
## 84                                         5-Title I schoolwide school
## 85            1-Title I targeted assistance eligible school-No program
## 86                                              6-Not a Title I school
## 87                                              6-Not a Title I school
## 88                     4-Title I schoolwide eligible school-No program
## 89                                              6-Not a Title I school
## 90                                              6-Not a Title I school
## 91                                              6-Not a Title I school
## 92                                              6-Not a Title I school
## 93                                              6-Not a Title I school
## 94                                              6-Not a Title I school
## 95                                2-Title I targeted assistance school
## 96                                              6-Not a Title I school
## 97                                              6-Not a Title I school
## 98                                         5-Title I schoolwide school
## 99                                                                 n/a
## 100                                             6-Not a Title I school
## 101                                             6-Not a Title I school
## 102                                        5-Title I schoolwide school
## 103                                        5-Title I schoolwide school
## 104                                        5-Title I schoolwide school
## 105                    4-Title I schoolwide eligible school-No program
## 106                    4-Title I schoolwide eligible school-No program
## 107                                        5-Title I schoolwide school
## 108                                             6-Not a Title I school
## 109                                        5-Title I schoolwide school
## 110                                        5-Title I schoolwide school
## 111                                        5-Title I schoolwide school
## 112                                             6-Not a Title I school
## 113                                             6-Not a Title I school
## 114                                                                n/a
## 115                                             6-Not a Title I school
## 116  3-Title I schoolwide eligible-Title I targeted assistance program
## 117                                             6-Not a Title I school
## 118                                             6-Not a Title I school
## 119                                        5-Title I schoolwide school
## 120                                                                n/a
## 121                                             6-Not a Title I school
## 122                                                               <NA>
## 123                                                               <NA>
## 124                                                               <NA>
## 125                                                               <NA>
## 126                                             6-Not a Title I school
## 127                                                                n/a
## 128                                        5-Title I schoolwide school
## 129                                             6-Not a Title I school
## 130                                                                n/a
## 131                                             6-Not a Title I school
## 132                                             6-Not a Title I school
## 133                                        5-Title I schoolwide school
## 134                                        5-Title I schoolwide school
## 135                    4-Title I schoolwide eligible school-No program
## 136                                                                n/a
## 137                    4-Title I schoolwide eligible school-No program
## 138  3-Title I schoolwide eligible-Title I targeted assistance program
## 139                                             6-Not a Title I school
## 140                                                                n/a
## 141                                             6-Not a Title I school
## 142                                                                n/a
## 143                                             6-Not a Title I school
## 144                               2-Title I targeted assistance school
## 145                                             6-Not a Title I school
## 146                                        5-Title I schoolwide school
## 147                                        5-Title I schoolwide school
## 148                                             6-Not a Title I school
## 149                                                                n/a
## 150                                        5-Title I schoolwide school
## 151                                                                n/a
## 152                                             6-Not a Title I school
## 153                                             6-Not a Title I school
## 154                                             6-Not a Title I school
## 155                                        5-Title I schoolwide school
## 156                                             6-Not a Title I school
## 157                                        5-Title I schoolwide school
## 158                                             6-Not a Title I school
## 159                                                               <NA>
## 160                                             6-Not a Title I school
## 161           1-Title I targeted assistance eligible school-No program
## 162                                        5-Title I schoolwide school
## 163                    4-Title I schoolwide eligible school-No program
## 164                                                                n/a
## 165                                             6-Not a Title I school
## 166                                             6-Not a Title I school
## 167                                             6-Not a Title I school
## 168                                        5-Title I schoolwide school
## 169                                                                n/a
## 170                                                               <NA>
## 171                                                                n/a
## 172                                             6-Not a Title I school
## 173                                        5-Title I schoolwide school
## 174                                        5-Title I schoolwide school
## 175                                        5-Title I schoolwide school
## 176                                             6-Not a Title I school
## 177                                             6-Not a Title I school
## 178                                                               <NA>
## 179                                        5-Title I schoolwide school
## 180                                             6-Not a Title I school
## 181                    4-Title I schoolwide eligible school-No program
## 182                    4-Title I schoolwide eligible school-No program
## 183                                                                n/a
## 184                                                                n/a
## 185                               2-Title I targeted assistance school
## 186                               2-Title I targeted assistance school
## 187                                        5-Title I schoolwide school
## 188           1-Title I targeted assistance eligible school-No program
## 189                               2-Title I targeted assistance school
## 190                                             6-Not a Title I school
## 191                               2-Title I targeted assistance school
## 192                                             6-Not a Title I school
## 193                                             6-Not a Title I school
## 194                                                               <NA>
## 195                                                               <NA>
## 196                                             6-Not a Title I school
## 197                               2-Title I targeted assistance school
## 198  3-Title I schoolwide eligible-Title I targeted assistance program
## 199                                                               <NA>
## 200                                             6-Not a Title I school
## 201                                             6-Not a Title I school
## 202                                             6-Not a Title I school
## 203                                             6-Not a Title I school
## 204                                             6-Not a Title I school
## 205                                             6-Not a Title I school
## 206                               2-Title I targeted assistance school
## 207                                             6-Not a Title I school
## 208                                             6-Not a Title I school
## 209                                                                n/a
## 210                                                                n/a
## 211                                        5-Title I schoolwide school
## 212                                                                n/a
## 213                                                                n/a
## 214                                             6-Not a Title I school
## 215                                             6-Not a Title I school
## 216                                             6-Not a Title I school
## 217  3-Title I schoolwide eligible-Title I targeted assistance program
## 218                                                               <NA>
## 219                                                               <NA>
## 220                               2-Title I targeted assistance school
## 221                                                                n/a
## 222                                             6-Not a Title I school
## 223                                        5-Title I schoolwide school
## 224                                                                n/a
## 225                                                                n/a
## 226                                             6-Not a Title I school
## 227                                             6-Not a Title I school
## 228                                             6-Not a Title I school
## 229                                        5-Title I schoolwide school
## 230                                        5-Title I schoolwide school
## 231                                             6-Not a Title I school
## 232                                        5-Title I schoolwide school
## 233                                             6-Not a Title I school
## 234                                             6-Not a Title I school
## 235                                        5-Title I schoolwide school
## 236                                        5-Title I schoolwide school
## 237                                                                n/a
## 238                                             6-Not a Title I school
## 239                                             6-Not a Title I school
## 240                                             6-Not a Title I school
## 241                                        5-Title I schoolwide school
## 242  3-Title I schoolwide eligible-Title I targeted assistance program
## 243                                             6-Not a Title I school
## 244                                                                n/a
## 245                                             6-Not a Title I school
## 246                                             6-Not a Title I school
## 247                                             6-Not a Title I school
## 248                                             6-Not a Title I school
## 249                               2-Title I targeted assistance school
## 250                                        5-Title I schoolwide school
## 251                                                               <NA>
## 252                               2-Title I targeted assistance school
## 253                                             6-Not a Title I school
## 254                               2-Title I targeted assistance school
## 255                                                                n/a
## 256                                        5-Title I schoolwide school
## 257                                             6-Not a Title I school
## 258                                                                n/a
## 259                                             6-Not a Title I school
## 260                                                                n/a
## 261                                             6-Not a Title I school
## 262                                             6-Not a Title I school
## 263                                             6-Not a Title I school
## 264                                             6-Not a Title I school
## 265                                             6-Not a Title I school
## 266                                             6-Not a Title I school
## 267                                             6-Not a Title I school
## 268                                        5-Title I schoolwide school
## 269                                                                n/a
## 270                                             6-Not a Title I school
## 271                                             6-Not a Title I school
## 272                                             6-Not a Title I school
## 273                                             6-Not a Title I school
## 274                                             6-Not a Title I school
## 275                                        5-Title I schoolwide school
## 276                                             6-Not a Title I school
## 277                                        5-Title I schoolwide school
## 278                                             6-Not a Title I school
## 279                                                                n/a
## 280                                        5-Title I schoolwide school
## 281                                             6-Not a Title I school
## 282                                                                n/a
## 283                                             6-Not a Title I school
## 284                                             6-Not a Title I school
## 285                                        5-Title I schoolwide school
## 286           1-Title I targeted assistance eligible school-No program
## 287                                                                n/a
## 288                                             6-Not a Title I school
## 289                                                                n/a
## 290                                                                n/a
## 291                                        5-Title I schoolwide school
## 292                    4-Title I schoolwide eligible school-No program
## 293                                             6-Not a Title I school
## 294                                                                n/a
## 295                                                                n/a
## 296                                                                n/a
## 297                               2-Title I targeted assistance school
## 298                                                                n/a
## 299           1-Title I targeted assistance eligible school-No program
## 300                                        5-Title I schoolwide school
## 301                               2-Title I targeted assistance school
## 302                                        5-Title I schoolwide school
## 303                                                               <NA>
## 304                                             6-Not a Title I school
## 305                                        5-Title I schoolwide school
## 306                                        5-Title I schoolwide school
## 307                    4-Title I schoolwide eligible school-No program
## 308  3-Title I schoolwide eligible-Title I targeted assistance program
## 309                    4-Title I schoolwide eligible school-No program
## 310                               2-Title I targeted assistance school
## 311                                             6-Not a Title I school
## 312                                        5-Title I schoolwide school
## 313                                        5-Title I schoolwide school
## 314                                        5-Title I schoolwide school
## 315                                        5-Title I schoolwide school
## 316                                        5-Title I schoolwide school
## 317                                                                n/a
## 318                                             6-Not a Title I school
## 319                                                                n/a
## 320                                                                n/a
## 321                                                                n/a
## 322                                        5-Title I schoolwide school
## 323                    4-Title I schoolwide eligible school-No program
## 324                                        5-Title I schoolwide school
## 325                                             6-Not a Title I school
## 326                                        5-Title I schoolwide school
## 327                                        5-Title I schoolwide school
## 328                                             6-Not a Title I school
## 329                                                                n/a
## 330                               2-Title I targeted assistance school
## 331                                             6-Not a Title I school
## 332                                             6-Not a Title I school
## 333                                             6-Not a Title I school
## 334                                             6-Not a Title I school
## 335                                             6-Not a Title I school
## 336                                             6-Not a Title I school
## 337                               2-Title I targeted assistance school
## 338  3-Title I schoolwide eligible-Title I targeted assistance program
## 339                                             6-Not a Title I school
## 340                                             6-Not a Title I school
## 341                                             6-Not a Title I school
## 342                                             6-Not a Title I school
## 343                                             6-Not a Title I school
## 344                                             6-Not a Title I school
## 345                                             6-Not a Title I school
## 346                                             6-Not a Title I school
## 347                                        5-Title I schoolwide school
## 348                                                               <NA>
## 349                                        5-Title I schoolwide school
## 350                                             6-Not a Title I school
## 351                                        5-Title I schoolwide school
## 352                                                               <NA>
## 353           1-Title I targeted assistance eligible school-No program
## 354                                                                n/a
## 355                                             6-Not a Title I school
## 356                                             6-Not a Title I school
## 357                    4-Title I schoolwide eligible school-No program
## 358                               2-Title I targeted assistance school
## 359                                        5-Title I schoolwide school
## 360                                        5-Title I schoolwide school
## 361                                        5-Title I schoolwide school
## 362                                        5-Title I schoolwide school
## 363                                        5-Title I schoolwide school
## 364                                        5-Title I schoolwide school
## 365                                             6-Not a Title I school
## 366                                        5-Title I schoolwide school
## 367                                             6-Not a Title I school
## 368                    4-Title I schoolwide eligible school-No program
## 369  3-Title I schoolwide eligible-Title I targeted assistance program
## 370                                             6-Not a Title I school
## 371                                        5-Title I schoolwide school
## 372                                             6-Not a Title I school
## 373                               2-Title I targeted assistance school
## 374                                             6-Not a Title I school
## 375                                                                n/a
## 376                               2-Title I targeted assistance school
## 377                                             6-Not a Title I school
## 378                                                                n/a
## 379                                             6-Not a Title I school
## 380                                                                n/a
## 381                                             6-Not a Title I school
## 382                                             6-Not a Title I school
## 383                                                                n/a
## 384                                             6-Not a Title I school
## 385                               2-Title I targeted assistance school
## 386                               2-Title I targeted assistance school
## 387                                             6-Not a Title I school
## 388                                                                n/a
## 389                                             6-Not a Title I school
## 390                    4-Title I schoolwide eligible school-No program
## 391                                        5-Title I schoolwide school
## 392                                                                n/a
## 393                                                                n/a
## 394                                                                n/a
## 395                                             6-Not a Title I school
## 396                                                                n/a
## 397                                             6-Not a Title I school
## 398                                        5-Title I schoolwide school
## 399                               2-Title I targeted assistance school
## 400                               2-Title I targeted assistance school
## 401                                             6-Not a Title I school
## 402                    4-Title I schoolwide eligible school-No program
## 403                                        5-Title I schoolwide school
## 404                               2-Title I targeted assistance school
## 405                                                                n/a
## 406                                                                n/a
## 407                                             6-Not a Title I school
## 408                                        5-Title I schoolwide school
## 409                                             6-Not a Title I school
## 410                                             6-Not a Title I school
## 411                                        5-Title I schoolwide school
## 412                                             6-Not a Title I school
## 413                               2-Title I targeted assistance school
## 414                                        5-Title I schoolwide school
## 415                                                               <NA>
## 416                                                                n/a
## 417                                        5-Title I schoolwide school
## 418                                                                n/a
## 419                                             6-Not a Title I school
## 420                                             6-Not a Title I school
## 421           1-Title I targeted assistance eligible school-No program
## 422                                             6-Not a Title I school
## 423                                             6-Not a Title I school
## 424                    4-Title I schoolwide eligible school-No program
## 425                    4-Title I schoolwide eligible school-No program
## 426                    4-Title I schoolwide eligible school-No program
## 427                    4-Title I schoolwide eligible school-No program
## 428                    4-Title I schoolwide eligible school-No program
## 429                    4-Title I schoolwide eligible school-No program
## 430                                             6-Not a Title I school
## 431                                                                n/a
## 432                                             6-Not a Title I school
## 433                                             6-Not a Title I school
## 434                                                                n/a
## 435                                                                n/a
## 436                                             6-Not a Title I school
## 437                                        5-Title I schoolwide school
## 438                                        5-Title I schoolwide school
## 439                    4-Title I schoolwide eligible school-No program
## 440                                                                n/a
## 441                                             6-Not a Title I school
## 442                    4-Title I schoolwide eligible school-No program
## 443                                             6-Not a Title I school
## 444                                             6-Not a Title I school
## 445                                                                n/a
## 446                                        5-Title I schoolwide school
## 447                                             6-Not a Title I school
## 448                                        5-Title I schoolwide school
## 449                                                                n/a
## 450                                                                n/a
## 451                               2-Title I targeted assistance school
## 452                                             6-Not a Title I school
## 453                                                                n/a
## 454                                             6-Not a Title I school
## 455                               2-Title I targeted assistance school
## 456                                             6-Not a Title I school
## 457  3-Title I schoolwide eligible-Title I targeted assistance program
## 458                                             6-Not a Title I school
## 459                                             6-Not a Title I school
## 460                                             6-Not a Title I school
## 461                                             6-Not a Title I school
## 462                                             6-Not a Title I school
## 463                                             6-Not a Title I school
## 464                                             6-Not a Title I school
## 465                                             6-Not a Title I school
## 466                                             6-Not a Title I school
## 467                                             6-Not a Title I school
## 468  3-Title I schoolwide eligible-Title I targeted assistance program
## 469                                                               <NA>
## 470                                             6-Not a Title I school
## 471                                        5-Title I schoolwide school
## 472                                        5-Title I schoolwide school
## 473                                        5-Title I schoolwide school
## 474                                        5-Title I schoolwide school
## 475                                        5-Title I schoolwide school
## 476                                        5-Title I schoolwide school
## 477                                        5-Title I schoolwide school
## 478                                        5-Title I schoolwide school
## 479                                        5-Title I schoolwide school
## 480                                                                n/a
## 481                                             6-Not a Title I school
## 482                                             6-Not a Title I school
## 483                                             6-Not a Title I school
## 484                                             6-Not a Title I school
## 485  3-Title I schoolwide eligible-Title I targeted assistance program
## 486                                             6-Not a Title I school
## 487                                             6-Not a Title I school
## 488                                             6-Not a Title I school
## 489                               2-Title I targeted assistance school
## 490                               2-Title I targeted assistance school
## 491                                             6-Not a Title I school
## 492  3-Title I schoolwide eligible-Title I targeted assistance program
## 493                               2-Title I targeted assistance school
## 494                                                               <NA>
## 495                                             6-Not a Title I school
## 496                                             6-Not a Title I school
## 497                               2-Title I targeted assistance school
## 498                                             6-Not a Title I school
## 499                                             6-Not a Title I school
## 500                                        5-Title I schoolwide school
## 501                                             6-Not a Title I school
## 502                                        5-Title I schoolwide school
## 503                                        5-Title I schoolwide school
## 504                                             6-Not a Title I school
## 505                                             6-Not a Title I school
## 506                                             6-Not a Title I school
## 507                                             6-Not a Title I school
## 508                                        5-Title I schoolwide school
## 509                                             6-Not a Title I school
## 510                                        5-Title I schoolwide school
## 511                                        5-Title I schoolwide school
## 512                                        5-Title I schoolwide school
## 513                                        5-Title I schoolwide school
## 514                                                                n/a
## 515                                        5-Title I schoolwide school
## 516                                             6-Not a Title I school
## 517  3-Title I schoolwide eligible-Title I targeted assistance program
## 518                                                                n/a
## 519                                                                n/a
## 520                                                               <NA>
## 521                                                               <NA>
## 522                                        5-Title I schoolwide school
## 523                                                               <NA>
## 524                                        5-Title I schoolwide school
## 525                                                                n/a
## 526                                             6-Not a Title I school
## 527                                                               <NA>
## 528                                             6-Not a Title I school
## 529                                        5-Title I schoolwide school
## 530                                             6-Not a Title I school
## 531                    4-Title I schoolwide eligible school-No program
## 532                                        5-Title I schoolwide school
## 533                                                                n/a
## 534                                        5-Title I schoolwide school
## 535                               2-Title I targeted assistance school
## 536                                        5-Title I schoolwide school
## 537                                             6-Not a Title I school
## 538                                             6-Not a Title I school
## 539                                             6-Not a Title I school
## 540                    4-Title I schoolwide eligible school-No program
## 541                               2-Title I targeted assistance school
## 542                                             6-Not a Title I school
## 543                                             6-Not a Title I school
## 544                                             6-Not a Title I school
## 545                                             6-Not a Title I school
## 546                                             6-Not a Title I school
## 547                                             6-Not a Title I school
## 548                    4-Title I schoolwide eligible school-No program
## 549                    4-Title I schoolwide eligible school-No program
## 550                                        5-Title I schoolwide school
## 551                                                               <NA>
## 552                               2-Title I targeted assistance school
## 553                                        5-Title I schoolwide school
## 554                                             6-Not a Title I school
## 555                                             6-Not a Title I school
## 556                                        5-Title I schoolwide school
## 557                                             6-Not a Title I school
## 558                                                                n/a
## 559                                        5-Title I schoolwide school
## 560                                        5-Title I schoolwide school
## 561                                                                n/a
## 562                                                                n/a
## 563                                                                n/a
## 564                                        5-Title I schoolwide school
## 565                                             6-Not a Title I school
## 566                                             6-Not a Title I school
## 567                                                                n/a
## 568                                        5-Title I schoolwide school
## 569                                        5-Title I schoolwide school
## 570                                        5-Title I schoolwide school
## 571                                             6-Not a Title I school
## 572                                                                n/a
## 573                                        5-Title I schoolwide school
## 574                                        5-Title I schoolwide school
## 575                               2-Title I targeted assistance school
## 576                                             6-Not a Title I school
## 577                               2-Title I targeted assistance school
## 578                                                                n/a
## 579                                             6-Not a Title I school
## 580                                             6-Not a Title I school
## 581                               2-Title I targeted assistance school
## 582           1-Title I targeted assistance eligible school-No program
## 583                                             6-Not a Title I school
## 584                                                               <NA>
## 585           1-Title I targeted assistance eligible school-No program
## 586           1-Title I targeted assistance eligible school-No program
## 587                                             6-Not a Title I school
## 588  3-Title I schoolwide eligible-Title I targeted assistance program
## 589                                        5-Title I schoolwide school
## 590                                        5-Title I schoolwide school
## 591                    4-Title I schoolwide eligible school-No program
## 592                                             6-Not a Title I school
## 593                                             6-Not a Title I school
## 594                                             6-Not a Title I school
## 595                                                               <NA>
## 596                                                                n/a
## 597                                             6-Not a Title I school
## 598                                             6-Not a Title I school
## 599                                        5-Title I schoolwide school
## 600                                        5-Title I schoolwide school
## 601                                             6-Not a Title I school
## 602                                             6-Not a Title I school
## 603                                             6-Not a Title I school
## 604                                        5-Title I schoolwide school
## 605                                             6-Not a Title I school
## 606                                                                n/a
## 607                                             6-Not a Title I school
## 608                                                                n/a
## 609                    4-Title I schoolwide eligible school-No program
## 610                                             6-Not a Title I school
## 611                                                               <NA>
## 612                                             6-Not a Title I school
## 613                                             6-Not a Title I school
## 614                                             6-Not a Title I school
## 615                                        5-Title I schoolwide school
## 616                                                               <NA>
## 617  3-Title I schoolwide eligible-Title I targeted assistance program
## 618                                        5-Title I schoolwide school
## 619                                                                n/a
## 620                                                                n/a
## 621                                        5-Title I schoolwide school
## 622                                             6-Not a Title I school
## 623                                             6-Not a Title I school
## 624                    4-Title I schoolwide eligible school-No program
## 625                               2-Title I targeted assistance school
## 626                                        5-Title I schoolwide school
## 627                                             6-Not a Title I school
## 628                                             6-Not a Title I school
## 629                    4-Title I schoolwide eligible school-No program
## 630                                        5-Title I schoolwide school
## 631                                             6-Not a Title I school
## 632                                             6-Not a Title I school
## 633                                        5-Title I schoolwide school
## 634                                                                n/a
## 635                                             6-Not a Title I school
## 636                                             6-Not a Title I school
## 637                                             6-Not a Title I school
## 638                                             6-Not a Title I school
## 639                                        5-Title I schoolwide school
## 640                                             6-Not a Title I school
## 641                                        5-Title I schoolwide school
## 642                               2-Title I targeted assistance school
## 643                                             6-Not a Title I school
## 644                                        5-Title I schoolwide school
## 645                                             6-Not a Title I school
## 646                                             6-Not a Title I school
## 647                                                                n/a
## 648                                        5-Title I schoolwide school
## 649                                             6-Not a Title I school
## 650                                             6-Not a Title I school
## 651                                             6-Not a Title I school
## 652                                             6-Not a Title I school
## 653                                             6-Not a Title I school
## 654                                             6-Not a Title I school
## 655                                             6-Not a Title I school
## 656                                             6-Not a Title I school
## 657                    4-Title I schoolwide eligible school-No program
## 658                                             6-Not a Title I school
## 659                                        5-Title I schoolwide school
## 660                                                                n/a
## 661                                                                n/a
## 662                                        5-Title I schoolwide school
## 663                                        5-Title I schoolwide school
## 664                                                                n/a
## 665                                        5-Title I schoolwide school
## 666                    4-Title I schoolwide eligible school-No program
## 667  3-Title I schoolwide eligible-Title I targeted assistance program
## 668                                        5-Title I schoolwide school
## 669                    4-Title I schoolwide eligible school-No program
## 670                                             6-Not a Title I school
## 671                                                                n/a
## 672           1-Title I targeted assistance eligible school-No program
## 673  3-Title I schoolwide eligible-Title I targeted assistance program
## 674                    4-Title I schoolwide eligible school-No program
## 675                                             6-Not a Title I school
## 676                                             6-Not a Title I school
## 677                                             6-Not a Title I school
## 678                    4-Title I schoolwide eligible school-No program
## 679                               2-Title I targeted assistance school
## 680                                             6-Not a Title I school
## 681                                             6-Not a Title I school
## 682                                             6-Not a Title I school
## 683                                                                n/a
## 684  3-Title I schoolwide eligible-Title I targeted assistance program
## 685                                             6-Not a Title I school
## 686                                             6-Not a Title I school
## 687                                             6-Not a Title I school
## 688                                                                n/a
## 689                                             6-Not a Title I school
## 690  3-Title I schoolwide eligible-Title I targeted assistance program
## 691                                             6-Not a Title I school
## 692                                             6-Not a Title I school
## 693                                             6-Not a Title I school
## 694                                        5-Title I schoolwide school
## 695                                             6-Not a Title I school
## 696           1-Title I targeted assistance eligible school-No program
## 697                               2-Title I targeted assistance school
## 698                                                                n/a
## 699                                                               <NA>
## 700  3-Title I schoolwide eligible-Title I targeted assistance program
## 701                                             6-Not a Title I school
## 702                                             6-Not a Title I school
## 703                                             6-Not a Title I school
## 704                                                                n/a
## 705                                             6-Not a Title I school
## 706                                             6-Not a Title I school
## 707                                        5-Title I schoolwide school
## 708                                             6-Not a Title I school
## 709                                        5-Title I schoolwide school
## 710                                        5-Title I schoolwide school
## 711                                                                n/a
## 712                                             6-Not a Title I school
## 713                                        5-Title I schoolwide school
## 714                                             6-Not a Title I school
## 715                                        5-Title I schoolwide school
## 716                    4-Title I schoolwide eligible school-No program
## 717                                             6-Not a Title I school
## 718                                                                n/a
## 719                                             6-Not a Title I school
## 720                                                                n/a
## 721                                             6-Not a Title I school
## 722                                        5-Title I schoolwide school
## 723  3-Title I schoolwide eligible-Title I targeted assistance program
## 724                                                                n/a
## 725                                        5-Title I schoolwide school
## 726                                             6-Not a Title I school
## 727                                             6-Not a Title I school
## 728                                             6-Not a Title I school
## 729                    4-Title I schoolwide eligible school-No program
## 730                               2-Title I targeted assistance school
## 731                               2-Title I targeted assistance school
## 732                                        5-Title I schoolwide school
## 733                                        5-Title I schoolwide school
## 734                                             6-Not a Title I school
## 735                                             6-Not a Title I school
## 736                                             6-Not a Title I school
## 737                                             6-Not a Title I school
## 738                                             6-Not a Title I school
## 739                                                                n/a
## 740                                             6-Not a Title I school
## 741                                        5-Title I schoolwide school
## 742                                             6-Not a Title I school
## 743                                        5-Title I schoolwide school
## 744                                             6-Not a Title I school
## 745                                             6-Not a Title I school
## 746                                                                n/a
## 747                                             6-Not a Title I school
## 748                                                                n/a
## 749                                                               <NA>
## 750                                             6-Not a Title I school
## 751                                             6-Not a Title I school
## 752                                             6-Not a Title I school
## 753                    4-Title I schoolwide eligible school-No program
## 754                                             6-Not a Title I school
## 755                                        5-Title I schoolwide school
## 756                               2-Title I targeted assistance school
## 757                                                                n/a
## 758                                             6-Not a Title I school
## 759                               2-Title I targeted assistance school
## 760                                        5-Title I schoolwide school
## 761                                                                n/a
## 762                               2-Title I targeted assistance school
## 763                                                                n/a
## 764                                        5-Title I schoolwide school
## 765                                                                n/a
## 766                                             6-Not a Title I school
## 767                                             6-Not a Title I school
## 768                                             6-Not a Title I school
## 769                                        5-Title I schoolwide school
## 770                                             6-Not a Title I school
## 771                                        5-Title I schoolwide school
## 772  3-Title I schoolwide eligible-Title I targeted assistance program
## 773                    4-Title I schoolwide eligible school-No program
## 774                                                                n/a
## 775                                                                n/a
## 776                                                                n/a
## 777                               2-Title I targeted assistance school
## 778                                        5-Title I schoolwide school
## 779                                        5-Title I schoolwide school
## 780                                                                n/a
## 781                                             6-Not a Title I school
## 782                                             6-Not a Title I school
## 783                                                                n/a
## 784                                                               <NA>
## 785                                             6-Not a Title I school
## 786                               2-Title I targeted assistance school
## 787                                             6-Not a Title I school
## 788                                             6-Not a Title I school
## 789                                             6-Not a Title I school
## 790                                                                n/a
## 791                                             6-Not a Title I school
## 792                                             6-Not a Title I school
## 793                                        5-Title I schoolwide school
## 794                                             6-Not a Title I school
## 795                                             6-Not a Title I school
## 796                                             6-Not a Title I school
## 797                                             6-Not a Title I school
## 798                                             6-Not a Title I school
## 799                                             6-Not a Title I school
## 800                                             6-Not a Title I school
## 801                                        5-Title I schoolwide school
## 802                                        5-Title I schoolwide school
## 803                    4-Title I schoolwide eligible school-No program
## 804                                             6-Not a Title I school
## 805                                             6-Not a Title I school
## 806                    4-Title I schoolwide eligible school-No program
## 807                                             6-Not a Title I school
## 808                               2-Title I targeted assistance school
## 809                                             6-Not a Title I school
## 810                                             6-Not a Title I school
## 811                                             6-Not a Title I school
## 812                                             6-Not a Title I school
## 813                                        5-Title I schoolwide school
## 814  3-Title I schoolwide eligible-Title I targeted assistance program
## 815  3-Title I schoolwide eligible-Title I targeted assistance program
## 816  3-Title I schoolwide eligible-Title I targeted assistance program
## 817  3-Title I schoolwide eligible-Title I targeted assistance program
## 818                                             6-Not a Title I school
## 819                               2-Title I targeted assistance school
## 820                                             6-Not a Title I school
## 821                                             6-Not a Title I school
## 822                               2-Title I targeted assistance school
## 823                                             6-Not a Title I school
## 824                                             6-Not a Title I school
## 825                                             6-Not a Title I school
## 826                               2-Title I targeted assistance school
## 827                                             6-Not a Title I school
## 828                                             6-Not a Title I school
## 829                                        5-Title I schoolwide school
## 830                               2-Title I targeted assistance school
## 831                                             6-Not a Title I school
## 832                                                                n/a
## 833                                        5-Title I schoolwide school
## 834                                             6-Not a Title I school
## 835                                                                n/a
## 836                                             6-Not a Title I school
## 837                                                                n/a
## 838                                             6-Not a Title I school
## 839                               2-Title I targeted assistance school
## 840                                        5-Title I schoolwide school
## 841                                        5-Title I schoolwide school
## 842                                                                n/a
## 843                                             6-Not a Title I school
## 844                                             6-Not a Title I school
## 845                                        5-Title I schoolwide school
## 846                                        5-Title I schoolwide school
## 847                               2-Title I targeted assistance school
## 848                                             6-Not a Title I school
## 849                                        5-Title I schoolwide school
## 850                                        5-Title I schoolwide school
## 851           1-Title I targeted assistance eligible school-No program
## 852                                             6-Not a Title I school
## 853                                             6-Not a Title I school
## 854                                        5-Title I schoolwide school
## 855  3-Title I schoolwide eligible-Title I targeted assistance program
## 856                                             6-Not a Title I school
## 857                               2-Title I targeted assistance school
## 858                                                                n/a
## 859                                             6-Not a Title I school
## 860                                        5-Title I schoolwide school
## 861                    4-Title I schoolwide eligible school-No program
## 862                                             6-Not a Title I school
## 863                                             6-Not a Title I school
## 864                                             6-Not a Title I school
## 865                                        5-Title I schoolwide school
## 866                               2-Title I targeted assistance school
## 867                                                                n/a
## 868                                        5-Title I schoolwide school
## 869                                             6-Not a Title I school
## 870                                             6-Not a Title I school
## 871                                             6-Not a Title I school
## 872                                                                n/a
## 873                                        5-Title I schoolwide school
## 874                                             6-Not a Title I school
## 875                               2-Title I targeted assistance school
## 876                                        5-Title I schoolwide school
## 877                                             6-Not a Title I school
## 878                                             6-Not a Title I school
## 879                                             6-Not a Title I school
## 880                                        5-Title I schoolwide school
## 881                                             6-Not a Title I school
## 882                                        5-Title I schoolwide school
## 883                                                               <NA>
## 884                    4-Title I schoolwide eligible school-No program
## 885                                             6-Not a Title I school
## 886                    4-Title I schoolwide eligible school-No program
## 887                                                                n/a
## 888                                                                n/a
## 889                               2-Title I targeted assistance school
## 890                                             6-Not a Title I school
## 891                                                               <NA>
## 892                                                                n/a
## 893                                                                n/a
## 894                                                                n/a
## 895                                                               <NA>
## 896                                        5-Title I schoolwide school
## 897                                        5-Title I schoolwide school
## 898                                                                n/a
## 899                                                                n/a
## 900                                                                n/a
## 901                                             6-Not a Title I school
## 902                               2-Title I targeted assistance school
## 903                                        5-Title I schoolwide school
## 904                               2-Title I targeted assistance school
## 905                                        5-Title I schoolwide school
## 906                    4-Title I schoolwide eligible school-No program
## 907                                                               <NA>
## 908                                             6-Not a Title I school
## 909                                             6-Not a Title I school
## 910                    4-Title I schoolwide eligible school-No program
## 911                                                                n/a
## 912           1-Title I targeted assistance eligible school-No program
## 913                                             6-Not a Title I school
## 914                                                                n/a
## 915                               2-Title I targeted assistance school
## 916                                                                n/a
## 917                                        5-Title I schoolwide school
## 918                                                                n/a
## 919                                             6-Not a Title I school
## 920                                             6-Not a Title I school
## 921                                                               <NA>
## 922           1-Title I targeted assistance eligible school-No program
## 923                                                                n/a
## 924                                                                n/a
## 925                                             6-Not a Title I school
## 926                                             6-Not a Title I school
## 927                                             6-Not a Title I school
## 928                                                                n/a
## 929                                             6-Not a Title I school
## 930                                        5-Title I schoolwide school
## 931                                             6-Not a Title I school
## 932                                             6-Not a Title I school
## 933                                             6-Not a Title I school
## 934                                             6-Not a Title I school
## 935                                             6-Not a Title I school
## 936                                             6-Not a Title I school
## 937                               2-Title I targeted assistance school
## 938  3-Title I schoolwide eligible-Title I targeted assistance program
## 939                                             6-Not a Title I school
## 940                                        5-Title I schoolwide school
## 941  3-Title I schoolwide eligible-Title I targeted assistance program
## 942                                        5-Title I schoolwide school
## 943                                             6-Not a Title I school
## 944                                        5-Title I schoolwide school
## 945                                             6-Not a Title I school
## 946                                             6-Not a Title I school
## 947                                             6-Not a Title I school
## 948                               2-Title I targeted assistance school
## 949                                                                n/a
## 950                                                                n/a
## 951                                                                n/a
## 952                                             6-Not a Title I school
## 953                                             6-Not a Title I school
## 954                    4-Title I schoolwide eligible school-No program
## 955                                             6-Not a Title I school
## 956                                             6-Not a Title I school
## 957                                             6-Not a Title I school
## 958                               2-Title I targeted assistance school
## 959                                                               <NA>
## 960                                             6-Not a Title I school
## 961                                             6-Not a Title I school
## 962                                                                n/a
## 963                                                                n/a
## 964                                             6-Not a Title I school
## 965                                             6-Not a Title I school
## 966                                                                n/a
## 967                                        5-Title I schoolwide school
## 968                                             6-Not a Title I school
## 969                                                                n/a
## 970                                        5-Title I schoolwide school
## 971                    4-Title I schoolwide eligible school-No program
## 972                                             6-Not a Title I school
## 973                                                                n/a
## 974                                        5-Title I schoolwide school
## 975           1-Title I targeted assistance eligible school-No program
## 976                                             6-Not a Title I school
## 977                                        5-Title I schoolwide school
## 978                                        5-Title I schoolwide school
## 979                                                                n/a
## 980                                                                n/a
## 981                                             6-Not a Title I school
## 982                                                                n/a
## 983                                        5-Title I schoolwide school
## 984                               2-Title I targeted assistance school
## 985  3-Title I schoolwide eligible-Title I targeted assistance program
## 986                                             6-Not a Title I school
## 987                                             6-Not a Title I school
## 988                                        5-Title I schoolwide school
## 989                                             6-Not a Title I school
## 990                                             6-Not a Title I school
## 991                                             6-Not a Title I school
## 992                                             6-Not a Title I school
## 993                                                                n/a
## 994                    4-Title I schoolwide eligible school-No program
## 995                    4-Title I schoolwide eligible school-No program
## 996  3-Title I schoolwide eligible-Title I targeted assistance program
## 997                                        5-Title I schoolwide school
## 998                                             6-Not a Title I school
## 999                                             6-Not a Title I school
## 1000                              2-Title I targeted assistance school
## 1001                                                              <NA>
## 1002                                            6-Not a Title I school
## 1003                                       5-Title I schoolwide school
## 1004                                                               n/a
## 1005                                            6-Not a Title I school
## 1006                                            6-Not a Title I school
## 1007                              2-Title I targeted assistance school
## 1008                                       5-Title I schoolwide school
## 1009                                       5-Title I schoolwide school
## 1010                                                               n/a
## 1011                                                               n/a
## 1012          1-Title I targeted assistance eligible school-No program
## 1013                                            6-Not a Title I school
## 1014                                            6-Not a Title I school
## 1015                                            6-Not a Title I school
## 1016                                       5-Title I schoolwide school
## 1017                                            6-Not a Title I school
## 1018                                       5-Title I schoolwide school
## 1019                                            6-Not a Title I school
## 1020                                                               n/a
## 1021                                            6-Not a Title I school
## 1022                              2-Title I targeted assistance school
## 1023                                            6-Not a Title I school
## 1024                                            6-Not a Title I school
## 1025 3-Title I schoolwide eligible-Title I targeted assistance program
## 1026                                            6-Not a Title I school
## 1027                                            6-Not a Title I school
## 1028                                            6-Not a Title I school
## 1029                                                               n/a
## 1030                   4-Title I schoolwide eligible school-No program
## 1031                              2-Title I targeted assistance school
## 1032                                       5-Title I schoolwide school
## 1033                                            6-Not a Title I school
## 1034                                            6-Not a Title I school
## 1035                                            6-Not a Title I school
## 1036                   4-Title I schoolwide eligible school-No program
## 1037                                            6-Not a Title I school
## 1038          1-Title I targeted assistance eligible school-No program
## 1039                   4-Title I schoolwide eligible school-No program
## 1040          1-Title I targeted assistance eligible school-No program
## 1041                                            6-Not a Title I school
## 1042                                       5-Title I schoolwide school
## 1043                                            6-Not a Title I school
## 1044                                            6-Not a Title I school
## 1045                                            6-Not a Title I school
## 1046                                            6-Not a Title I school
## 1047                                                              <NA>
## 1048                                            6-Not a Title I school
## 1049                                                              <NA>
## 1050                                                              <NA>
## 1051                                                              <NA>
## 1052                                       5-Title I schoolwide school
## 1053                                       5-Title I schoolwide school
## 1054                                       5-Title I schoolwide school
## 1055                                       5-Title I schoolwide school
## 1056                                       5-Title I schoolwide school
## 1057                                                               n/a
## 1058                              2-Title I targeted assistance school
## 1059                                                              <NA>
## 1060                                            6-Not a Title I school
## 1061                   4-Title I schoolwide eligible school-No program
## 1062 3-Title I schoolwide eligible-Title I targeted assistance program
## 1063                                       5-Title I schoolwide school
## 1064                                       5-Title I schoolwide school
## 1065                                            6-Not a Title I school
## 1066                                            6-Not a Title I school
## 1067                              2-Title I targeted assistance school
## 1068 3-Title I schoolwide eligible-Title I targeted assistance program
## 1069                                            6-Not a Title I school
## 1070                                       5-Title I schoolwide school
## 1071                              2-Title I targeted assistance school
## 1072                                            6-Not a Title I school
## 1073                                                               n/a
## 1074                                            6-Not a Title I school
## 1075                                       5-Title I schoolwide school
## 1076                                            6-Not a Title I school
## 1077                   4-Title I schoolwide eligible school-No program
## 1078                                       5-Title I schoolwide school
## 1079                                                               n/a
## 1080                   4-Title I schoolwide eligible school-No program
## 1081                                            6-Not a Title I school
## 1082                                       5-Title I schoolwide school
## 1083                                            6-Not a Title I school
## 1084                                            6-Not a Title I school
## 1085                                                               n/a
## 1086                                            6-Not a Title I school
## 1087                                            6-Not a Title I school
## 1088                              2-Title I targeted assistance school
## 1089                                            6-Not a Title I school
## 1090                                       5-Title I schoolwide school
## 1091                                       5-Title I schoolwide school
## 1092                                       5-Title I schoolwide school
## 1093                                                               n/a
## 1094                                                               n/a
## 1095                                                               n/a
## 1096                                            6-Not a Title I school
## 1097                              2-Title I targeted assistance school
## 1098                                                               n/a
## 1099                                            6-Not a Title I school
## 1100                                       5-Title I schoolwide school
## 1101                                       5-Title I schoolwide school
## 1102                                       5-Title I schoolwide school
## 1103          1-Title I targeted assistance eligible school-No program
## 1104 3-Title I schoolwide eligible-Title I targeted assistance program
## 1105                                       5-Title I schoolwide school
## 1106                                       5-Title I schoolwide school
## 1107                                            6-Not a Title I school
## 1108                                            6-Not a Title I school
## 1109                              2-Title I targeted assistance school
## 1110                              2-Title I targeted assistance school
## 1111                   4-Title I schoolwide eligible school-No program
## 1112                                            6-Not a Title I school
## 1113                              2-Title I targeted assistance school
## 1114          1-Title I targeted assistance eligible school-No program
## 1115                                       5-Title I schoolwide school
## 1116                              2-Title I targeted assistance school
## 1117                              2-Title I targeted assistance school
## 1118                                       5-Title I schoolwide school
## 1119                                       5-Title I schoolwide school
## 1120                                            6-Not a Title I school
## 1121                                                               n/a
## 1122                                       5-Title I schoolwide school
## 1123                                       5-Title I schoolwide school
## 1124                                                               n/a
##      Updated.Status
## 1             3-New
## 2             3-New
## 3             3-New
## 4             3-New
## 5             3-New
## 6             3-New
## 7             3-New
## 8             3-New
## 9             3-New
## 10            3-New
## 11            3-New
## 12            3-New
## 13            3-New
## 14            3-New
## 15            3-New
## 16            3-New
## 17            3-New
## 18            3-New
## 19            3-New
## 20            3-New
## 21            3-New
## 22            3-New
## 23            3-New
## 24            3-New
## 25            3-New
## 26            3-New
## 27            3-New
## 28            3-New
## 29            3-New
## 30            3-New
## 31            3-New
## 32            3-New
## 33            3-New
## 34            3-New
## 35            3-New
## 36            3-New
## 37            3-New
## 38            3-New
## 39            3-New
## 40            3-New
## 41            3-New
## 42            3-New
## 43            3-New
## 44            3-New
## 45            3-New
## 46            3-New
## 47            3-New
## 48            3-New
## 49            3-New
## 50            3-New
## 51            3-New
## 52            3-New
## 53            3-New
## 54            3-New
## 55            3-New
## 56            3-New
## 57            3-New
## 58            3-New
## 59            3-New
## 60            3-New
## 61            3-New
## 62            3-New
## 63            3-New
## 64            3-New
## 65            3-New
## 66            3-New
## 67            3-New
## 68            3-New
## 69            3-New
## 70            3-New
## 71            3-New
## 72            3-New
## 73            3-New
## 74            3-New
## 75            3-New
## 76            3-New
## 77            3-New
## 78            3-New
## 79            3-New
## 80            3-New
## 81            3-New
## 82            3-New
## 83            3-New
## 84            3-New
## 85            3-New
## 86            3-New
## 87            3-New
## 88            3-New
## 89            3-New
## 90            3-New
## 91            3-New
## 92            3-New
## 93            3-New
## 94            3-New
## 95            3-New
## 96            3-New
## 97            3-New
## 98            3-New
## 99            3-New
## 100           3-New
## 101           3-New
## 102           3-New
## 103           3-New
## 104           3-New
## 105           3-New
## 106           3-New
## 107           3-New
## 108           3-New
## 109           3-New
## 110           3-New
## 111           3-New
## 112           3-New
## 113           3-New
## 114           3-New
## 115           3-New
## 116           3-New
## 117           3-New
## 118           3-New
## 119           3-New
## 120           3-New
## 121           3-New
## 122           3-New
## 123           3-New
## 124           3-New
## 125           3-New
## 126           3-New
## 127           3-New
## 128           3-New
## 129           3-New
## 130           3-New
## 131           3-New
## 132           3-New
## 133           3-New
## 134           3-New
## 135           3-New
## 136           3-New
## 137           3-New
## 138           3-New
## 139           3-New
## 140           3-New
## 141           3-New
## 142           3-New
## 143           3-New
## 144           3-New
## 145           3-New
## 146           3-New
## 147           3-New
## 148           3-New
## 149           3-New
## 150           3-New
## 151           3-New
## 152           3-New
## 153           3-New
## 154           3-New
## 155           3-New
## 156           3-New
## 157           3-New
## 158           3-New
## 159           3-New
## 160           3-New
## 161           3-New
## 162           3-New
## 163           3-New
## 164           3-New
## 165           3-New
## 166           3-New
## 167           3-New
## 168           3-New
## 169           3-New
## 170           3-New
## 171           3-New
## 172           3-New
## 173           3-New
## 174           3-New
## 175           3-New
## 176           3-New
## 177           3-New
## 178           3-New
## 179           3-New
## 180           3-New
## 181           3-New
## 182           3-New
## 183           3-New
## 184           3-New
## 185           3-New
## 186           3-New
## 187           3-New
## 188           3-New
## 189           3-New
## 190           3-New
## 191           3-New
## 192           3-New
## 193           3-New
## 194           3-New
## 195           3-New
## 196           3-New
## 197           3-New
## 198           3-New
## 199           3-New
## 200           3-New
## 201           3-New
## 202           3-New
## 203           3-New
## 204           3-New
## 205           3-New
## 206           3-New
## 207           3-New
## 208           3-New
## 209           3-New
## 210           3-New
## 211           3-New
## 212           3-New
## 213           3-New
## 214           3-New
## 215           3-New
## 216           3-New
## 217           3-New
## 218           3-New
## 219           3-New
## 220           3-New
## 221           3-New
## 222           3-New
## 223           3-New
## 224           3-New
## 225           3-New
## 226           3-New
## 227           3-New
## 228           3-New
## 229           3-New
## 230           3-New
## 231           3-New
## 232           3-New
## 233           3-New
## 234           3-New
## 235           3-New
## 236           3-New
## 237           3-New
## 238           3-New
## 239           3-New
## 240           3-New
## 241           3-New
## 242           3-New
## 243           3-New
## 244           3-New
## 245           3-New
## 246           3-New
## 247           3-New
## 248           3-New
## 249           3-New
## 250           3-New
## 251           3-New
## 252           3-New
## 253           3-New
## 254           3-New
## 255           3-New
## 256           3-New
## 257           3-New
## 258           3-New
## 259           3-New
## 260           3-New
## 261           3-New
## 262           3-New
## 263           3-New
## 264           3-New
## 265           3-New
## 266           3-New
## 267           3-New
## 268           3-New
## 269           3-New
## 270           3-New
## 271           3-New
## 272           3-New
## 273           3-New
## 274           3-New
## 275           3-New
## 276           3-New
## 277           3-New
## 278           3-New
## 279           3-New
## 280           3-New
## 281           3-New
## 282           3-New
## 283           3-New
## 284           3-New
## 285           3-New
## 286           3-New
## 287           3-New
## 288           3-New
## 289           3-New
## 290           3-New
## 291           3-New
## 292           3-New
## 293           3-New
## 294           3-New
## 295           3-New
## 296           3-New
## 297           3-New
## 298           3-New
## 299           3-New
## 300           3-New
## 301           3-New
## 302           3-New
## 303           3-New
## 304           3-New
## 305           3-New
## 306           3-New
## 307           3-New
## 308           3-New
## 309           3-New
## 310           3-New
## 311           3-New
## 312           3-New
## 313           3-New
## 314           3-New
## 315           3-New
## 316           3-New
## 317           3-New
## 318           3-New
## 319           3-New
## 320           3-New
## 321           3-New
## 322           3-New
## 323           3-New
## 324           3-New
## 325           3-New
## 326           3-New
## 327           3-New
## 328           3-New
## 329           3-New
## 330           3-New
## 331           3-New
## 332           3-New
## 333           3-New
## 334           3-New
## 335           3-New
## 336           3-New
## 337           3-New
## 338           3-New
## 339           3-New
## 340           3-New
## 341           3-New
## 342           3-New
## 343           3-New
## 344           3-New
## 345           3-New
## 346           3-New
## 347           3-New
## 348           3-New
## 349           3-New
## 350           3-New
## 351           3-New
## 352           3-New
## 353           3-New
## 354           3-New
## 355           3-New
## 356           3-New
## 357           3-New
## 358           3-New
## 359           3-New
## 360           3-New
## 361           3-New
## 362           3-New
## 363           3-New
## 364           3-New
## 365           3-New
## 366           3-New
## 367           3-New
## 368           3-New
## 369           3-New
## 370           3-New
## 371           3-New
## 372           3-New
## 373           3-New
## 374           3-New
## 375           3-New
## 376           3-New
## 377           3-New
## 378           3-New
## 379           3-New
## 380           3-New
## 381           3-New
## 382           3-New
## 383           3-New
## 384           3-New
## 385           3-New
## 386           3-New
## 387           3-New
## 388           3-New
## 389           3-New
## 390           3-New
## 391           3-New
## 392           3-New
## 393           3-New
## 394           3-New
## 395           3-New
## 396           3-New
## 397           3-New
## 398           3-New
## 399           3-New
## 400           3-New
## 401           3-New
## 402           3-New
## 403           3-New
## 404           3-New
## 405           3-New
## 406           3-New
## 407           3-New
## 408           3-New
## 409           3-New
## 410           3-New
## 411           3-New
## 412           3-New
## 413           3-New
## 414           3-New
## 415           3-New
## 416           3-New
## 417           3-New
## 418           3-New
## 419           3-New
## 420           3-New
## 421           3-New
## 422           3-New
## 423           3-New
## 424           3-New
## 425           3-New
## 426           3-New
## 427           3-New
## 428           3-New
## 429           3-New
## 430           3-New
## 431           3-New
## 432           3-New
## 433           3-New
## 434           3-New
## 435           3-New
## 436           3-New
## 437           3-New
## 438           3-New
## 439           3-New
## 440           3-New
## 441           3-New
## 442           3-New
## 443           3-New
## 444           3-New
## 445           3-New
## 446           3-New
## 447           3-New
## 448           3-New
## 449           3-New
## 450           3-New
## 451           3-New
## 452           3-New
## 453           3-New
## 454           3-New
## 455           3-New
## 456           3-New
## 457           3-New
## 458           3-New
## 459           3-New
## 460           3-New
## 461           3-New
## 462           3-New
## 463           3-New
## 464           3-New
## 465           3-New
## 466           3-New
## 467           3-New
## 468           3-New
## 469           3-New
## 470           3-New
## 471           3-New
## 472           3-New
## 473           3-New
## 474           3-New
## 475           3-New
## 476           3-New
## 477           3-New
## 478           3-New
## 479           3-New
## 480           3-New
## 481           3-New
## 482           3-New
## 483           3-New
## 484           3-New
## 485           3-New
## 486           3-New
## 487           3-New
## 488           3-New
## 489           3-New
## 490           3-New
## 491           3-New
## 492           3-New
## 493           3-New
## 494           3-New
## 495           3-New
## 496           3-New
## 497           3-New
## 498           3-New
## 499           3-New
## 500           3-New
## 501           3-New
## 502           3-New
## 503           3-New
## 504           3-New
## 505           3-New
## 506           3-New
## 507           3-New
## 508           3-New
## 509           3-New
## 510           3-New
## 511           3-New
## 512           3-New
## 513           3-New
## 514           3-New
## 515           3-New
## 516           3-New
## 517           3-New
## 518           3-New
## 519           3-New
## 520           3-New
## 521           3-New
## 522           3-New
## 523           3-New
## 524           3-New
## 525           3-New
## 526           3-New
## 527           3-New
## 528           3-New
## 529           3-New
## 530           3-New
## 531           3-New
## 532           3-New
## 533           3-New
## 534           3-New
## 535           3-New
## 536           3-New
## 537           3-New
## 538           3-New
## 539           3-New
## 540           3-New
## 541           3-New
## 542           3-New
## 543           3-New
## 544           3-New
## 545           3-New
## 546           3-New
## 547           3-New
## 548           3-New
## 549           3-New
## 550           3-New
## 551           3-New
## 552           3-New
## 553           3-New
## 554           3-New
## 555           3-New
## 556           3-New
## 557           3-New
## 558           3-New
## 559           3-New
## 560           3-New
## 561           3-New
## 562           3-New
## 563           3-New
## 564           3-New
## 565           3-New
## 566           3-New
## 567           3-New
## 568           3-New
## 569           3-New
## 570           3-New
## 571           3-New
## 572           3-New
## 573           3-New
## 574           3-New
## 575           3-New
## 576           3-New
## 577           3-New
## 578           3-New
## 579           3-New
## 580           3-New
## 581           3-New
## 582           3-New
## 583           3-New
## 584           3-New
## 585           3-New
## 586           3-New
## 587           3-New
## 588           3-New
## 589           3-New
## 590           3-New
## 591           3-New
## 592           3-New
## 593           3-New
## 594           3-New
## 595           3-New
## 596           3-New
## 597           3-New
## 598           3-New
## 599           3-New
## 600           3-New
## 601           3-New
## 602           3-New
## 603           3-New
## 604           3-New
## 605           3-New
## 606           3-New
## 607           3-New
## 608           3-New
## 609           3-New
## 610           3-New
## 611           3-New
## 612           3-New
## 613           3-New
## 614           3-New
## 615           3-New
## 616           3-New
## 617           3-New
## 618           3-New
## 619           3-New
## 620           3-New
## 621           3-New
## 622           3-New
## 623           3-New
## 624           3-New
## 625           3-New
## 626           3-New
## 627           3-New
## 628           3-New
## 629           3-New
## 630           3-New
## 631           3-New
## 632           3-New
## 633           3-New
## 634           3-New
## 635           3-New
## 636           3-New
## 637           3-New
## 638           3-New
## 639           3-New
## 640           3-New
## 641           3-New
## 642           3-New
## 643           3-New
## 644           3-New
## 645           3-New
## 646           3-New
## 647           3-New
## 648           3-New
## 649           3-New
## 650           3-New
## 651           3-New
## 652           3-New
## 653           3-New
## 654           3-New
## 655           3-New
## 656           3-New
## 657           3-New
## 658           3-New
## 659           3-New
## 660           3-New
## 661           3-New
## 662           3-New
## 663           3-New
## 664           3-New
## 665           3-New
## 666           3-New
## 667           3-New
## 668           3-New
## 669           3-New
## 670           3-New
## 671           3-New
## 672           3-New
## 673           3-New
## 674           3-New
## 675           3-New
## 676           3-New
## 677           3-New
## 678           3-New
## 679           3-New
## 680           3-New
## 681           3-New
## 682           3-New
## 683           3-New
## 684           3-New
## 685           3-New
## 686           3-New
## 687           3-New
## 688           3-New
## 689           3-New
## 690           3-New
## 691           3-New
## 692           3-New
## 693           3-New
## 694           3-New
## 695           3-New
## 696           3-New
## 697           3-New
## 698           3-New
## 699           3-New
## 700           3-New
## 701           3-New
## 702           3-New
## 703           3-New
## 704           3-New
## 705           3-New
## 706           3-New
## 707           3-New
## 708           3-New
## 709           3-New
## 710           3-New
## 711           3-New
## 712           3-New
## 713           3-New
## 714           3-New
## 715           3-New
## 716           3-New
## 717           3-New
## 718           3-New
## 719           3-New
## 720           3-New
## 721           3-New
## 722           3-New
## 723           3-New
## 724           3-New
## 725           3-New
## 726           3-New
## 727           3-New
## 728           3-New
## 729           3-New
## 730           3-New
## 731           3-New
## 732           3-New
## 733           3-New
## 734           3-New
## 735           3-New
## 736           3-New
## 737           3-New
## 738           3-New
## 739           3-New
## 740           3-New
## 741           3-New
## 742           3-New
## 743           3-New
## 744           3-New
## 745           3-New
## 746           3-New
## 747           3-New
## 748           3-New
## 749           3-New
## 750           3-New
## 751           3-New
## 752           3-New
## 753           3-New
## 754           3-New
## 755           3-New
## 756           3-New
## 757           3-New
## 758           3-New
## 759           3-New
## 760           3-New
## 761           3-New
## 762           3-New
## 763           3-New
## 764           3-New
## 765           3-New
## 766           3-New
## 767           3-New
## 768           3-New
## 769           3-New
## 770           3-New
## 771           3-New
## 772           3-New
## 773           3-New
## 774           3-New
## 775           3-New
## 776           3-New
## 777           3-New
## 778           3-New
## 779           3-New
## 780           3-New
## 781           3-New
## 782           3-New
## 783           3-New
## 784           3-New
## 785           3-New
## 786           3-New
## 787           3-New
## 788           3-New
## 789           3-New
## 790           3-New
## 791           3-New
## 792           3-New
## 793           3-New
## 794           3-New
## 795           3-New
## 796           3-New
## 797           3-New
## 798           3-New
## 799           3-New
## 800           3-New
## 801           3-New
## 802           3-New
## 803           3-New
## 804           3-New
## 805           3-New
## 806           3-New
## 807           3-New
## 808           3-New
## 809           3-New
## 810           3-New
## 811           3-New
## 812           3-New
## 813           3-New
## 814           3-New
## 815           3-New
## 816           3-New
## 817           3-New
## 818           3-New
## 819           3-New
## 820           3-New
## 821           3-New
## 822           3-New
## 823           3-New
## 824           3-New
## 825           3-New
## 826           3-New
## 827           3-New
## 828           3-New
## 829           3-New
## 830           3-New
## 831           3-New
## 832           3-New
## 833           3-New
## 834           3-New
## 835           3-New
## 836           3-New
## 837           3-New
## 838           3-New
## 839           3-New
## 840           3-New
## 841           3-New
## 842           3-New
## 843           3-New
## 844           3-New
## 845           3-New
## 846           3-New
## 847           3-New
## 848           3-New
## 849           3-New
## 850           3-New
## 851           3-New
## 852           3-New
## 853           3-New
## 854           3-New
## 855           3-New
## 856           3-New
## 857           3-New
## 858           3-New
## 859           3-New
## 860           3-New
## 861           3-New
## 862           3-New
## 863           3-New
## 864           3-New
## 865           3-New
## 866           3-New
## 867           3-New
## 868           3-New
## 869           3-New
## 870           3-New
## 871           3-New
## 872           3-New
## 873           3-New
## 874           3-New
## 875           3-New
## 876           3-New
## 877           3-New
## 878           3-New
## 879           3-New
## 880           3-New
## 881           3-New
## 882           3-New
## 883           3-New
## 884           3-New
## 885           3-New
## 886           3-New
## 887           3-New
## 888           3-New
## 889           3-New
## 890           3-New
## 891           3-New
## 892           3-New
## 893           3-New
## 894           3-New
## 895           3-New
## 896           3-New
## 897           3-New
## 898           3-New
## 899           3-New
## 900           3-New
## 901           3-New
## 902           3-New
## 903           3-New
## 904           3-New
## 905           3-New
## 906           3-New
## 907           3-New
## 908           3-New
## 909           3-New
## 910           3-New
## 911           3-New
## 912           3-New
## 913           3-New
## 914           3-New
## 915           3-New
## 916           3-New
## 917           3-New
## 918           3-New
## 919           3-New
## 920           3-New
## 921           3-New
## 922           3-New
## 923           3-New
## 924           3-New
## 925           3-New
## 926           3-New
## 927           3-New
## 928           3-New
## 929           3-New
## 930           3-New
## 931           3-New
## 932           3-New
## 933           3-New
## 934           3-New
## 935           3-New
## 936           3-New
## 937           3-New
## 938           3-New
## 939           3-New
## 940           3-New
## 941           3-New
## 942           3-New
## 943           3-New
## 944           3-New
## 945           3-New
## 946           3-New
## 947           3-New
## 948           3-New
## 949           3-New
## 950           3-New
## 951           3-New
## 952           3-New
## 953           3-New
## 954           3-New
## 955           3-New
## 956           3-New
## 957           3-New
## 958           3-New
## 959           3-New
## 960           3-New
## 961           3-New
## 962           3-New
## 963           3-New
## 964           3-New
## 965           3-New
## 966           3-New
## 967           3-New
## 968           3-New
## 969           3-New
## 970           3-New
## 971           3-New
## 972           3-New
## 973           3-New
## 974           3-New
## 975           3-New
## 976           3-New
## 977           3-New
## 978           3-New
## 979           3-New
## 980           3-New
## 981           3-New
## 982           3-New
## 983           3-New
## 984           3-New
## 985           3-New
## 986           3-New
## 987           3-New
## 988           3-New
## 989           3-New
## 990           3-New
## 991           3-New
## 992           3-New
## 993           3-New
## 994           3-New
## 995           3-New
## 996           3-New
## 997           3-New
## 998           3-New
## 999           3-New
## 1000          3-New
## 1001          3-New
## 1002          3-New
## 1003          3-New
## 1004          3-New
## 1005          3-New
## 1006          3-New
## 1007          3-New
## 1008          3-New
## 1009          3-New
## 1010          3-New
## 1011          3-New
## 1012          3-New
## 1013          3-New
## 1014          3-New
## 1015          3-New
## 1016          3-New
## 1017          3-New
## 1018          3-New
## 1019          3-New
## 1020          3-New
## 1021          3-New
## 1022          3-New
## 1023          3-New
## 1024          3-New
## 1025          3-New
## 1026          3-New
## 1027          3-New
## 1028          3-New
## 1029          3-New
## 1030          3-New
## 1031          3-New
## 1032          3-New
## 1033          3-New
## 1034          3-New
## 1035          3-New
## 1036          3-New
## 1037          3-New
## 1038          3-New
## 1039          3-New
## 1040          3-New
## 1041          3-New
## 1042          3-New
## 1043          3-New
## 1044          3-New
## 1045          3-New
## 1046          3-New
## 1047          3-New
## 1048          3-New
## 1049          3-New
## 1050          3-New
## 1051          3-New
## 1052          3-New
## 1053          3-New
## 1054          3-New
## 1055          3-New
## 1056          3-New
## 1057          3-New
## 1058          3-New
## 1059          3-New
## 1060          3-New
## 1061          3-New
## 1062          3-New
## 1063          3-New
## 1064          3-New
## 1065          3-New
## 1066          3-New
## 1067          3-New
## 1068          3-New
## 1069          3-New
## 1070          3-New
## 1071          3-New
## 1072          3-New
## 1073          3-New
## 1074          3-New
## 1075          3-New
## 1076          3-New
## 1077          3-New
## 1078          3-New
## 1079          3-New
## 1080          3-New
## 1081          3-New
## 1082          3-New
## 1083          3-New
## 1084          3-New
## 1085          3-New
## 1086          3-New
## 1087          3-New
## 1088          3-New
## 1089          3-New
## 1090          3-New
## 1091          3-New
## 1092          3-New
## 1093          3-New
## 1094          3-New
## 1095          3-New
## 1096          3-New
## 1097          3-New
## 1098          3-New
## 1099          3-New
## 1100          3-New
## 1101          3-New
## 1102          3-New
## 1103          3-New
## 1104          3-New
## 1105          3-New
## 1106          3-New
## 1107          3-New
## 1108          3-New
## 1109          3-New
## 1110          3-New
## 1111          3-New
## 1112          3-New
## 1113          3-New
## 1114          3-New
## 1115          3-New
## 1116          3-New
## 1117          3-New
## 1118          3-New
## 1119          3-New
## 1120          3-New
## 1121          3-New
## 1122          3-New
## 1123          3-New
## 1124          3-New
##                                                                         Agency.Type
## 1    1-Regular local school district that is NOT a component of a supervisory union
## 2    1-Regular local school district that is NOT a component of a supervisory union
## 3                                                    7-Independent Charter District
## 4                                              9-Specialized public school district
## 5    1-Regular local school district that is NOT a component of a supervisory union
## 6    1-Regular local school district that is NOT a component of a supervisory union
## 7                                                    7-Independent Charter District
## 8    1-Regular local school district that is NOT a component of a supervisory union
## 9    1-Regular local school district that is NOT a component of a supervisory union
## 10   1-Regular local school district that is NOT a component of a supervisory union
## 11   1-Regular local school district that is NOT a component of a supervisory union
## 12                                                   7-Independent Charter District
## 13   1-Regular local school district that is NOT a component of a supervisory union
## 14   1-Regular local school district that is NOT a component of a supervisory union
## 15   1-Regular local school district that is NOT a component of a supervisory union
## 16   1-Regular local school district that is NOT a component of a supervisory union
## 17   1-Regular local school district that is NOT a component of a supervisory union
## 18   1-Regular local school district that is NOT a component of a supervisory union
## 19   1-Regular local school district that is NOT a component of a supervisory union
## 20   1-Regular local school district that is NOT a component of a supervisory union
## 21   1-Regular local school district that is NOT a component of a supervisory union
## 22   1-Regular local school district that is NOT a component of a supervisory union
## 23   1-Regular local school district that is NOT a component of a supervisory union
## 24   1-Regular local school district that is NOT a component of a supervisory union
## 25   1-Regular local school district that is NOT a component of a supervisory union
## 26   1-Regular local school district that is NOT a component of a supervisory union
## 27   1-Regular local school district that is NOT a component of a supervisory union
## 28   1-Regular local school district that is NOT a component of a supervisory union
## 29                                                   7-Independent Charter District
## 30                                                   7-Independent Charter District
## 31                                                   7-Independent Charter District
## 32   1-Regular local school district that is NOT a component of a supervisory union
## 33   1-Regular local school district that is NOT a component of a supervisory union
## 34   1-Regular local school district that is NOT a component of a supervisory union
## 35   1-Regular local school district that is NOT a component of a supervisory union
## 36                                       4-Regional Education Service Agency (RESA)
## 37   1-Regular local school district that is NOT a component of a supervisory union
## 38   1-Regular local school district that is NOT a component of a supervisory union
## 39                                                   7-Independent Charter District
## 40   1-Regular local school district that is NOT a component of a supervisory union
## 41   1-Regular local school district that is NOT a component of a supervisory union
## 42   1-Regular local school district that is NOT a component of a supervisory union
## 43   1-Regular local school district that is NOT a component of a supervisory union
## 44   1-Regular local school district that is NOT a component of a supervisory union
## 45   1-Regular local school district that is NOT a component of a supervisory union
## 46   1-Regular local school district that is NOT a component of a supervisory union
## 47   1-Regular local school district that is NOT a component of a supervisory union
## 48                                                   7-Independent Charter District
## 49                                                   7-Independent Charter District
## 50   1-Regular local school district that is NOT a component of a supervisory union
## 51                                                   7-Independent Charter District
## 52   1-Regular local school district that is NOT a component of a supervisory union
## 53   1-Regular local school district that is NOT a component of a supervisory union
## 54   1-Regular local school district that is NOT a component of a supervisory union
## 55   1-Regular local school district that is NOT a component of a supervisory union
## 56   1-Regular local school district that is NOT a component of a supervisory union
## 57   1-Regular local school district that is NOT a component of a supervisory union
## 58   1-Regular local school district that is NOT a component of a supervisory union
## 59   1-Regular local school district that is NOT a component of a supervisory union
## 60   1-Regular local school district that is NOT a component of a supervisory union
## 61                                                   7-Independent Charter District
## 62                                                   7-Independent Charter District
## 63                                                   7-Independent Charter District
## 64                                                   7-Independent Charter District
## 65   1-Regular local school district that is NOT a component of a supervisory union
## 66   1-Regular local school district that is NOT a component of a supervisory union
## 67   1-Regular local school district that is NOT a component of a supervisory union
## 68   1-Regular local school district that is NOT a component of a supervisory union
## 69   1-Regular local school district that is NOT a component of a supervisory union
## 70   1-Regular local school district that is NOT a component of a supervisory union
## 71   1-Regular local school district that is NOT a component of a supervisory union
## 72   1-Regular local school district that is NOT a component of a supervisory union
## 73   1-Regular local school district that is NOT a component of a supervisory union
## 74   1-Regular local school district that is NOT a component of a supervisory union
## 75                                                   7-Independent Charter District
## 76   1-Regular local school district that is NOT a component of a supervisory union
## 77   1-Regular local school district that is NOT a component of a supervisory union
## 78           5-State agency providing elementary and/or secondary level instruction
## 79   1-Regular local school district that is NOT a component of a supervisory union
## 80   1-Regular local school district that is NOT a component of a supervisory union
## 81   1-Regular local school district that is NOT a component of a supervisory union
## 82   1-Regular local school district that is NOT a component of a supervisory union
## 83   1-Regular local school district that is NOT a component of a supervisory union
## 84   1-Regular local school district that is NOT a component of a supervisory union
## 85   1-Regular local school district that is NOT a component of a supervisory union
## 86                                                   7-Independent Charter District
## 87   1-Regular local school district that is NOT a component of a supervisory union
## 88   1-Regular local school district that is NOT a component of a supervisory union
## 89   1-Regular local school district that is NOT a component of a supervisory union
## 90   1-Regular local school district that is NOT a component of a supervisory union
## 91   1-Regular local school district that is NOT a component of a supervisory union
## 92   1-Regular local school district that is NOT a component of a supervisory union
## 93   1-Regular local school district that is NOT a component of a supervisory union
## 94   1-Regular local school district that is NOT a component of a supervisory union
## 95   1-Regular local school district that is NOT a component of a supervisory union
## 96   1-Regular local school district that is NOT a component of a supervisory union
## 97   1-Regular local school district that is NOT a component of a supervisory union
## 98   1-Regular local school district that is NOT a component of a supervisory union
## 99   1-Regular local school district that is NOT a component of a supervisory union
## 100                                                  7-Independent Charter District
## 101  1-Regular local school district that is NOT a component of a supervisory union
## 102  1-Regular local school district that is NOT a component of a supervisory union
## 103  1-Regular local school district that is NOT a component of a supervisory union
## 104  1-Regular local school district that is NOT a component of a supervisory union
## 105  1-Regular local school district that is NOT a component of a supervisory union
## 106  1-Regular local school district that is NOT a component of a supervisory union
## 107  1-Regular local school district that is NOT a component of a supervisory union
## 108  1-Regular local school district that is NOT a component of a supervisory union
## 109                                                  7-Independent Charter District
## 110                                                  7-Independent Charter District
## 111                                                  7-Independent Charter District
## 112  1-Regular local school district that is NOT a component of a supervisory union
## 113  1-Regular local school district that is NOT a component of a supervisory union
## 114  1-Regular local school district that is NOT a component of a supervisory union
## 115  1-Regular local school district that is NOT a component of a supervisory union
## 116  1-Regular local school district that is NOT a component of a supervisory union
## 117  1-Regular local school district that is NOT a component of a supervisory union
## 118  1-Regular local school district that is NOT a component of a supervisory union
## 119  1-Regular local school district that is NOT a component of a supervisory union
## 120  1-Regular local school district that is NOT a component of a supervisory union
## 121  1-Regular local school district that is NOT a component of a supervisory union
## 122  1-Regular local school district that is NOT a component of a supervisory union
## 123  1-Regular local school district that is NOT a component of a supervisory union
## 124  1-Regular local school district that is NOT a component of a supervisory union
## 125  1-Regular local school district that is NOT a component of a supervisory union
## 126  1-Regular local school district that is NOT a component of a supervisory union
## 127  1-Regular local school district that is NOT a component of a supervisory union
## 128  1-Regular local school district that is NOT a component of a supervisory union
## 129                                                  7-Independent Charter District
## 130  1-Regular local school district that is NOT a component of a supervisory union
## 131  1-Regular local school district that is NOT a component of a supervisory union
## 132                                                  7-Independent Charter District
## 133                                                  7-Independent Charter District
## 134                                                  7-Independent Charter District
## 135  1-Regular local school district that is NOT a component of a supervisory union
## 136  1-Regular local school district that is NOT a component of a supervisory union
## 137  1-Regular local school district that is NOT a component of a supervisory union
## 138  1-Regular local school district that is NOT a component of a supervisory union
## 139                                                  7-Independent Charter District
## 140                                      4-Regional Education Service Agency (RESA)
## 141  1-Regular local school district that is NOT a component of a supervisory union
## 142  1-Regular local school district that is NOT a component of a supervisory union
## 143  1-Regular local school district that is NOT a component of a supervisory union
## 144  1-Regular local school district that is NOT a component of a supervisory union
## 145  1-Regular local school district that is NOT a component of a supervisory union
## 146  1-Regular local school district that is NOT a component of a supervisory union
## 147  1-Regular local school district that is NOT a component of a supervisory union
## 148  1-Regular local school district that is NOT a component of a supervisory union
## 149                                            9-Specialized public school district
## 150  1-Regular local school district that is NOT a component of a supervisory union
## 151  1-Regular local school district that is NOT a component of a supervisory union
## 152  1-Regular local school district that is NOT a component of a supervisory union
## 153  1-Regular local school district that is NOT a component of a supervisory union
## 154  1-Regular local school district that is NOT a component of a supervisory union
## 155  1-Regular local school district that is NOT a component of a supervisory union
## 156  1-Regular local school district that is NOT a component of a supervisory union
## 157  1-Regular local school district that is NOT a component of a supervisory union
## 158  1-Regular local school district that is NOT a component of a supervisory union
## 159  1-Regular local school district that is NOT a component of a supervisory union
## 160  1-Regular local school district that is NOT a component of a supervisory union
## 161                                                  7-Independent Charter District
## 162  1-Regular local school district that is NOT a component of a supervisory union
## 163  1-Regular local school district that is NOT a component of a supervisory union
## 164  1-Regular local school district that is NOT a component of a supervisory union
## 165  1-Regular local school district that is NOT a component of a supervisory union
## 166                                                  7-Independent Charter District
## 167                                                  7-Independent Charter District
## 168  1-Regular local school district that is NOT a component of a supervisory union
## 169  1-Regular local school district that is NOT a component of a supervisory union
## 170  1-Regular local school district that is NOT a component of a supervisory union
## 171  1-Regular local school district that is NOT a component of a supervisory union
## 172  1-Regular local school district that is NOT a component of a supervisory union
## 173  1-Regular local school district that is NOT a component of a supervisory union
## 174  1-Regular local school district that is NOT a component of a supervisory union
## 175  1-Regular local school district that is NOT a component of a supervisory union
## 176  1-Regular local school district that is NOT a component of a supervisory union
## 177  1-Regular local school district that is NOT a component of a supervisory union
## 178  1-Regular local school district that is NOT a component of a supervisory union
## 179                                                  7-Independent Charter District
## 180                                                  7-Independent Charter District
## 181  1-Regular local school district that is NOT a component of a supervisory union
## 182  1-Regular local school district that is NOT a component of a supervisory union
## 183                                      4-Regional Education Service Agency (RESA)
## 184  1-Regular local school district that is NOT a component of a supervisory union
## 185                                                  7-Independent Charter District
## 186                                                  7-Independent Charter District
## 187                                                  7-Independent Charter District
## 188  1-Regular local school district that is NOT a component of a supervisory union
## 189                                                  7-Independent Charter District
## 190  1-Regular local school district that is NOT a component of a supervisory union
## 191                                                  7-Independent Charter District
## 192  1-Regular local school district that is NOT a component of a supervisory union
## 193  1-Regular local school district that is NOT a component of a supervisory union
## 194  1-Regular local school district that is NOT a component of a supervisory union
## 195  1-Regular local school district that is NOT a component of a supervisory union
## 196  1-Regular local school district that is NOT a component of a supervisory union
## 197  1-Regular local school district that is NOT a component of a supervisory union
## 198                                                  7-Independent Charter District
## 199  1-Regular local school district that is NOT a component of a supervisory union
## 200  1-Regular local school district that is NOT a component of a supervisory union
## 201  1-Regular local school district that is NOT a component of a supervisory union
## 202                                                  7-Independent Charter District
## 203                                                  7-Independent Charter District
## 204                                                  7-Independent Charter District
## 205                                                  7-Independent Charter District
## 206                                                  7-Independent Charter District
## 207                                                  7-Independent Charter District
## 208                                                  7-Independent Charter District
## 209  1-Regular local school district that is NOT a component of a supervisory union
## 210  1-Regular local school district that is NOT a component of a supervisory union
## 211  1-Regular local school district that is NOT a component of a supervisory union
## 212  1-Regular local school district that is NOT a component of a supervisory union
## 213  1-Regular local school district that is NOT a component of a supervisory union
## 214  1-Regular local school district that is NOT a component of a supervisory union
## 215  1-Regular local school district that is NOT a component of a supervisory union
## 216  1-Regular local school district that is NOT a component of a supervisory union
## 217  1-Regular local school district that is NOT a component of a supervisory union
## 218  1-Regular local school district that is NOT a component of a supervisory union
## 219  1-Regular local school district that is NOT a component of a supervisory union
## 220  1-Regular local school district that is NOT a component of a supervisory union
## 221                                                  7-Independent Charter District
## 222  1-Regular local school district that is NOT a component of a supervisory union
## 223  1-Regular local school district that is NOT a component of a supervisory union
## 224                                            9-Specialized public school district
## 225  1-Regular local school district that is NOT a component of a supervisory union
## 226  1-Regular local school district that is NOT a component of a supervisory union
## 227  1-Regular local school district that is NOT a component of a supervisory union
## 228  1-Regular local school district that is NOT a component of a supervisory union
## 229  1-Regular local school district that is NOT a component of a supervisory union
## 230  1-Regular local school district that is NOT a component of a supervisory union
## 231  1-Regular local school district that is NOT a component of a supervisory union
## 232  1-Regular local school district that is NOT a component of a supervisory union
## 233  1-Regular local school district that is NOT a component of a supervisory union
## 234  1-Regular local school district that is NOT a component of a supervisory union
## 235  1-Regular local school district that is NOT a component of a supervisory union
## 236  1-Regular local school district that is NOT a component of a supervisory union
## 237  1-Regular local school district that is NOT a component of a supervisory union
## 238  1-Regular local school district that is NOT a component of a supervisory union
## 239  1-Regular local school district that is NOT a component of a supervisory union
## 240  1-Regular local school district that is NOT a component of a supervisory union
## 241  1-Regular local school district that is NOT a component of a supervisory union
## 242  1-Regular local school district that is NOT a component of a supervisory union
## 243  1-Regular local school district that is NOT a component of a supervisory union
## 244  1-Regular local school district that is NOT a component of a supervisory union
## 245  1-Regular local school district that is NOT a component of a supervisory union
## 246  1-Regular local school district that is NOT a component of a supervisory union
## 247  1-Regular local school district that is NOT a component of a supervisory union
## 248  1-Regular local school district that is NOT a component of a supervisory union
## 249                                                  7-Independent Charter District
## 250  1-Regular local school district that is NOT a component of a supervisory union
## 251  1-Regular local school district that is NOT a component of a supervisory union
## 252  1-Regular local school district that is NOT a component of a supervisory union
## 253                                                  7-Independent Charter District
## 254                                                  7-Independent Charter District
## 255  1-Regular local school district that is NOT a component of a supervisory union
## 256  1-Regular local school district that is NOT a component of a supervisory union
## 257  1-Regular local school district that is NOT a component of a supervisory union
## 258  1-Regular local school district that is NOT a component of a supervisory union
## 259  1-Regular local school district that is NOT a component of a supervisory union
## 260  1-Regular local school district that is NOT a component of a supervisory union
## 261  1-Regular local school district that is NOT a component of a supervisory union
## 262                                                  7-Independent Charter District
## 263                                                  7-Independent Charter District
## 264                                                  7-Independent Charter District
## 265                                                  7-Independent Charter District
## 266                                                  7-Independent Charter District
## 267  1-Regular local school district that is NOT a component of a supervisory union
## 268  1-Regular local school district that is NOT a component of a supervisory union
## 269  1-Regular local school district that is NOT a component of a supervisory union
## 270                                                  7-Independent Charter District
## 271                                                  7-Independent Charter District
## 272                                                  7-Independent Charter District
## 273                                                  7-Independent Charter District
## 274                                                  7-Independent Charter District
## 275  1-Regular local school district that is NOT a component of a supervisory union
## 276  1-Regular local school district that is NOT a component of a supervisory union
## 277  1-Regular local school district that is NOT a component of a supervisory union
## 278  1-Regular local school district that is NOT a component of a supervisory union
## 279  1-Regular local school district that is NOT a component of a supervisory union
## 280  1-Regular local school district that is NOT a component of a supervisory union
## 281  1-Regular local school district that is NOT a component of a supervisory union
## 282  1-Regular local school district that is NOT a component of a supervisory union
## 283  1-Regular local school district that is NOT a component of a supervisory union
## 284  1-Regular local school district that is NOT a component of a supervisory union
## 285  1-Regular local school district that is NOT a component of a supervisory union
## 286  1-Regular local school district that is NOT a component of a supervisory union
## 287                                                  7-Independent Charter District
## 288  1-Regular local school district that is NOT a component of a supervisory union
## 289  1-Regular local school district that is NOT a component of a supervisory union
## 290  1-Regular local school district that is NOT a component of a supervisory union
## 291  1-Regular local school district that is NOT a component of a supervisory union
## 292  1-Regular local school district that is NOT a component of a supervisory union
## 293  1-Regular local school district that is NOT a component of a supervisory union
## 294  1-Regular local school district that is NOT a component of a supervisory union
## 295  1-Regular local school district that is NOT a component of a supervisory union
## 296  1-Regular local school district that is NOT a component of a supervisory union
## 297  1-Regular local school district that is NOT a component of a supervisory union
## 298  1-Regular local school district that is NOT a component of a supervisory union
## 299  1-Regular local school district that is NOT a component of a supervisory union
## 300  1-Regular local school district that is NOT a component of a supervisory union
## 301  1-Regular local school district that is NOT a component of a supervisory union
## 302  1-Regular local school district that is NOT a component of a supervisory union
## 303  1-Regular local school district that is NOT a component of a supervisory union
## 304  1-Regular local school district that is NOT a component of a supervisory union
## 305  1-Regular local school district that is NOT a component of a supervisory union
## 306  1-Regular local school district that is NOT a component of a supervisory union
## 307  1-Regular local school district that is NOT a component of a supervisory union
## 308                                                  7-Independent Charter District
## 309  1-Regular local school district that is NOT a component of a supervisory union
## 310  1-Regular local school district that is NOT a component of a supervisory union
## 311  1-Regular local school district that is NOT a component of a supervisory union
## 312  1-Regular local school district that is NOT a component of a supervisory union
## 313  1-Regular local school district that is NOT a component of a supervisory union
## 314  1-Regular local school district that is NOT a component of a supervisory union
## 315  1-Regular local school district that is NOT a component of a supervisory union
## 316  1-Regular local school district that is NOT a component of a supervisory union
## 317  1-Regular local school district that is NOT a component of a supervisory union
## 318  1-Regular local school district that is NOT a component of a supervisory union
## 319  1-Regular local school district that is NOT a component of a supervisory union
## 320  1-Regular local school district that is NOT a component of a supervisory union
## 321  1-Regular local school district that is NOT a component of a supervisory union
## 322  1-Regular local school district that is NOT a component of a supervisory union
## 323  1-Regular local school district that is NOT a component of a supervisory union
## 324  1-Regular local school district that is NOT a component of a supervisory union
## 325  1-Regular local school district that is NOT a component of a supervisory union
## 326  1-Regular local school district that is NOT a component of a supervisory union
## 327                                                  7-Independent Charter District
## 328                                                  7-Independent Charter District
## 329  1-Regular local school district that is NOT a component of a supervisory union
## 330  1-Regular local school district that is NOT a component of a supervisory union
## 331                                                  7-Independent Charter District
## 332                                                  7-Independent Charter District
## 333                                                  7-Independent Charter District
## 334                                                  7-Independent Charter District
## 335                                                  7-Independent Charter District
## 336                                                  7-Independent Charter District
## 337  1-Regular local school district that is NOT a component of a supervisory union
## 338  1-Regular local school district that is NOT a component of a supervisory union
## 339  1-Regular local school district that is NOT a component of a supervisory union
## 340  1-Regular local school district that is NOT a component of a supervisory union
## 341                                                  7-Independent Charter District
## 342  1-Regular local school district that is NOT a component of a supervisory union
## 343                                            9-Specialized public school district
## 344                                            9-Specialized public school district
## 345                                                  7-Independent Charter District
## 346                                                  7-Independent Charter District
## 347                                                  7-Independent Charter District
## 348  1-Regular local school district that is NOT a component of a supervisory union
## 349  1-Regular local school district that is NOT a component of a supervisory union
## 350  1-Regular local school district that is NOT a component of a supervisory union
## 351  1-Regular local school district that is NOT a component of a supervisory union
## 352  1-Regular local school district that is NOT a component of a supervisory union
## 353  1-Regular local school district that is NOT a component of a supervisory union
## 354  1-Regular local school district that is NOT a component of a supervisory union
## 355  1-Regular local school district that is NOT a component of a supervisory union
## 356  1-Regular local school district that is NOT a component of a supervisory union
## 357  1-Regular local school district that is NOT a component of a supervisory union
## 358  1-Regular local school district that is NOT a component of a supervisory union
## 359                                                  7-Independent Charter District
## 360  1-Regular local school district that is NOT a component of a supervisory union
## 361  1-Regular local school district that is NOT a component of a supervisory union
## 362  1-Regular local school district that is NOT a component of a supervisory union
## 363                                                  7-Independent Charter District
## 364  1-Regular local school district that is NOT a component of a supervisory union
## 365  1-Regular local school district that is NOT a component of a supervisory union
## 366  1-Regular local school district that is NOT a component of a supervisory union
## 367  1-Regular local school district that is NOT a component of a supervisory union
## 368  1-Regular local school district that is NOT a component of a supervisory union
## 369  1-Regular local school district that is NOT a component of a supervisory union
## 370                                      4-Regional Education Service Agency (RESA)
## 371  1-Regular local school district that is NOT a component of a supervisory union
## 372  1-Regular local school district that is NOT a component of a supervisory union
## 373                                                  7-Independent Charter District
## 374  1-Regular local school district that is NOT a component of a supervisory union
## 375  1-Regular local school district that is NOT a component of a supervisory union
## 376  1-Regular local school district that is NOT a component of a supervisory union
## 377  1-Regular local school district that is NOT a component of a supervisory union
## 378  1-Regular local school district that is NOT a component of a supervisory union
## 379  1-Regular local school district that is NOT a component of a supervisory union
## 380  1-Regular local school district that is NOT a component of a supervisory union
## 381  1-Regular local school district that is NOT a component of a supervisory union
## 382  1-Regular local school district that is NOT a component of a supervisory union
## 383  1-Regular local school district that is NOT a component of a supervisory union
## 384  1-Regular local school district that is NOT a component of a supervisory union
## 385                                                  7-Independent Charter District
## 386                                                  7-Independent Charter District
## 387  1-Regular local school district that is NOT a component of a supervisory union
## 388  1-Regular local school district that is NOT a component of a supervisory union
## 389  1-Regular local school district that is NOT a component of a supervisory union
## 390  1-Regular local school district that is NOT a component of a supervisory union
## 391  1-Regular local school district that is NOT a component of a supervisory union
## 392  1-Regular local school district that is NOT a component of a supervisory union
## 393  1-Regular local school district that is NOT a component of a supervisory union
## 394  1-Regular local school district that is NOT a component of a supervisory union
## 395                                      4-Regional Education Service Agency (RESA)
## 396  1-Regular local school district that is NOT a component of a supervisory union
## 397  1-Regular local school district that is NOT a component of a supervisory union
## 398  1-Regular local school district that is NOT a component of a supervisory union
## 399  1-Regular local school district that is NOT a component of a supervisory union
## 400  1-Regular local school district that is NOT a component of a supervisory union
## 401  1-Regular local school district that is NOT a component of a supervisory union
## 402                                                  7-Independent Charter District
## 403  1-Regular local school district that is NOT a component of a supervisory union
## 404                                                  7-Independent Charter District
## 405  1-Regular local school district that is NOT a component of a supervisory union
## 406  1-Regular local school district that is NOT a component of a supervisory union
## 407  1-Regular local school district that is NOT a component of a supervisory union
## 408  1-Regular local school district that is NOT a component of a supervisory union
## 409  1-Regular local school district that is NOT a component of a supervisory union
## 410                                                  7-Independent Charter District
## 411  1-Regular local school district that is NOT a component of a supervisory union
## 412                                                  7-Independent Charter District
## 413  1-Regular local school district that is NOT a component of a supervisory union
## 414                                                  7-Independent Charter District
## 415  1-Regular local school district that is NOT a component of a supervisory union
## 416  1-Regular local school district that is NOT a component of a supervisory union
## 417  1-Regular local school district that is NOT a component of a supervisory union
## 418  1-Regular local school district that is NOT a component of a supervisory union
## 419                                                  7-Independent Charter District
## 420                                                  7-Independent Charter District
## 421  1-Regular local school district that is NOT a component of a supervisory union
## 422  1-Regular local school district that is NOT a component of a supervisory union
## 423  1-Regular local school district that is NOT a component of a supervisory union
## 424                                                  7-Independent Charter District
## 425                                                  7-Independent Charter District
## 426                                                  7-Independent Charter District
## 427                                                  7-Independent Charter District
## 428                                                  7-Independent Charter District
## 429                                                  7-Independent Charter District
## 430  1-Regular local school district that is NOT a component of a supervisory union
## 431  1-Regular local school district that is NOT a component of a supervisory union
## 432  1-Regular local school district that is NOT a component of a supervisory union
## 433  1-Regular local school district that is NOT a component of a supervisory union
## 434                                                  7-Independent Charter District
## 435  1-Regular local school district that is NOT a component of a supervisory union
## 436  1-Regular local school district that is NOT a component of a supervisory union
## 437                                                  7-Independent Charter District
## 438  1-Regular local school district that is NOT a component of a supervisory union
## 439  1-Regular local school district that is NOT a component of a supervisory union
## 440  1-Regular local school district that is NOT a component of a supervisory union
## 441  1-Regular local school district that is NOT a component of a supervisory union
## 442  1-Regular local school district that is NOT a component of a supervisory union
## 443                                                  7-Independent Charter District
## 444  1-Regular local school district that is NOT a component of a supervisory union
## 445  1-Regular local school district that is NOT a component of a supervisory union
## 446  1-Regular local school district that is NOT a component of a supervisory union
## 447  1-Regular local school district that is NOT a component of a supervisory union
## 448  1-Regular local school district that is NOT a component of a supervisory union
## 449  1-Regular local school district that is NOT a component of a supervisory union
## 450  1-Regular local school district that is NOT a component of a supervisory union
## 451  1-Regular local school district that is NOT a component of a supervisory union
## 452  1-Regular local school district that is NOT a component of a supervisory union
## 453  1-Regular local school district that is NOT a component of a supervisory union
## 454  1-Regular local school district that is NOT a component of a supervisory union
## 455  1-Regular local school district that is NOT a component of a supervisory union
## 456                                            9-Specialized public school district
## 457  1-Regular local school district that is NOT a component of a supervisory union
## 458                                                  7-Independent Charter District
## 459                                                  7-Independent Charter District
## 460                                                  7-Independent Charter District
## 461                                                  7-Independent Charter District
## 462                                                  7-Independent Charter District
## 463                                                  7-Independent Charter District
## 464                                                  7-Independent Charter District
## 465                                                  7-Independent Charter District
## 466                                                  7-Independent Charter District
## 467                                                  7-Independent Charter District
## 468                                                  7-Independent Charter District
## 469  1-Regular local school district that is NOT a component of a supervisory union
## 470  1-Regular local school district that is NOT a component of a supervisory union
## 471                                                  7-Independent Charter District
## 472                                                  7-Independent Charter District
## 473                                                  7-Independent Charter District
## 474                                                  7-Independent Charter District
## 475                                                  7-Independent Charter District
## 476                                                  7-Independent Charter District
## 477                                                  7-Independent Charter District
## 478                                                  7-Independent Charter District
## 479                                                  7-Independent Charter District
## 480  1-Regular local school district that is NOT a component of a supervisory union
## 481  1-Regular local school district that is NOT a component of a supervisory union
## 482                                                  7-Independent Charter District
## 483                                                  7-Independent Charter District
## 484  1-Regular local school district that is NOT a component of a supervisory union
## 485                                                  7-Independent Charter District
## 486  1-Regular local school district that is NOT a component of a supervisory union
## 487  1-Regular local school district that is NOT a component of a supervisory union
## 488                                      4-Regional Education Service Agency (RESA)
## 489                                                  7-Independent Charter District
## 490  1-Regular local school district that is NOT a component of a supervisory union
## 491  1-Regular local school district that is NOT a component of a supervisory union
## 492              2-Local school district that is a component of a supervisory union
## 493  1-Regular local school district that is NOT a component of a supervisory union
## 494  1-Regular local school district that is NOT a component of a supervisory union
## 495  1-Regular local school district that is NOT a component of a supervisory union
## 496  1-Regular local school district that is NOT a component of a supervisory union
## 497                                                  7-Independent Charter District
## 498  1-Regular local school district that is NOT a component of a supervisory union
## 499  1-Regular local school district that is NOT a component of a supervisory union
## 500  1-Regular local school district that is NOT a component of a supervisory union
## 501  1-Regular local school district that is NOT a component of a supervisory union
## 502  1-Regular local school district that is NOT a component of a supervisory union
## 503  1-Regular local school district that is NOT a component of a supervisory union
## 504  1-Regular local school district that is NOT a component of a supervisory union
## 505  1-Regular local school district that is NOT a component of a supervisory union
## 506  1-Regular local school district that is NOT a component of a supervisory union
## 507  1-Regular local school district that is NOT a component of a supervisory union
## 508  1-Regular local school district that is NOT a component of a supervisory union
## 509  1-Regular local school district that is NOT a component of a supervisory union
## 510                                                  7-Independent Charter District
## 511  1-Regular local school district that is NOT a component of a supervisory union
## 512  1-Regular local school district that is NOT a component of a supervisory union
## 513                                                  7-Independent Charter District
## 514  1-Regular local school district that is NOT a component of a supervisory union
## 515  1-Regular local school district that is NOT a component of a supervisory union
## 516  1-Regular local school district that is NOT a component of a supervisory union
## 517                                                  7-Independent Charter District
## 518                                                  7-Independent Charter District
## 519  1-Regular local school district that is NOT a component of a supervisory union
## 520  1-Regular local school district that is NOT a component of a supervisory union
## 521  1-Regular local school district that is NOT a component of a supervisory union
## 522  1-Regular local school district that is NOT a component of a supervisory union
## 523  1-Regular local school district that is NOT a component of a supervisory union
## 524  1-Regular local school district that is NOT a component of a supervisory union
## 525  1-Regular local school district that is NOT a component of a supervisory union
## 526  1-Regular local school district that is NOT a component of a supervisory union
## 527  1-Regular local school district that is NOT a component of a supervisory union
## 528                                                  7-Independent Charter District
## 529  1-Regular local school district that is NOT a component of a supervisory union
## 530              2-Local school district that is a component of a supervisory union
## 531  1-Regular local school district that is NOT a component of a supervisory union
## 532                                                  7-Independent Charter District
## 533  1-Regular local school district that is NOT a component of a supervisory union
## 534  1-Regular local school district that is NOT a component of a supervisory union
## 535                                                  7-Independent Charter District
## 536  1-Regular local school district that is NOT a component of a supervisory union
## 537  1-Regular local school district that is NOT a component of a supervisory union
## 538  1-Regular local school district that is NOT a component of a supervisory union
## 539  1-Regular local school district that is NOT a component of a supervisory union
## 540  1-Regular local school district that is NOT a component of a supervisory union
## 541  1-Regular local school district that is NOT a component of a supervisory union
## 542  1-Regular local school district that is NOT a component of a supervisory union
## 543  1-Regular local school district that is NOT a component of a supervisory union
## 544                                                  7-Independent Charter District
## 545  1-Regular local school district that is NOT a component of a supervisory union
## 546  1-Regular local school district that is NOT a component of a supervisory union
## 547                                                  7-Independent Charter District
## 548  1-Regular local school district that is NOT a component of a supervisory union
## 549  1-Regular local school district that is NOT a component of a supervisory union
## 550  1-Regular local school district that is NOT a component of a supervisory union
## 551  1-Regular local school district that is NOT a component of a supervisory union
## 552  1-Regular local school district that is NOT a component of a supervisory union
## 553  1-Regular local school district that is NOT a component of a supervisory union
## 554                                                  7-Independent Charter District
## 555                                                  7-Independent Charter District
## 556                                                  7-Independent Charter District
## 557                                                  7-Independent Charter District
## 558                                                  7-Independent Charter District
## 559  1-Regular local school district that is NOT a component of a supervisory union
## 560  1-Regular local school district that is NOT a component of a supervisory union
## 561  1-Regular local school district that is NOT a component of a supervisory union
## 562                                      4-Regional Education Service Agency (RESA)
## 563                                      4-Regional Education Service Agency (RESA)
## 564  1-Regular local school district that is NOT a component of a supervisory union
## 565  1-Regular local school district that is NOT a component of a supervisory union
## 566  1-Regular local school district that is NOT a component of a supervisory union
## 567  1-Regular local school district that is NOT a component of a supervisory union
## 568  1-Regular local school district that is NOT a component of a supervisory union
## 569  1-Regular local school district that is NOT a component of a supervisory union
## 570                                                  7-Independent Charter District
## 571                                      4-Regional Education Service Agency (RESA)
## 572  1-Regular local school district that is NOT a component of a supervisory union
## 573  1-Regular local school district that is NOT a component of a supervisory union
## 574  1-Regular local school district that is NOT a component of a supervisory union
## 575  1-Regular local school district that is NOT a component of a supervisory union
## 576  1-Regular local school district that is NOT a component of a supervisory union
## 577                                                  7-Independent Charter District
## 578  1-Regular local school district that is NOT a component of a supervisory union
## 579                                                  7-Independent Charter District
## 580                                                  7-Independent Charter District
## 581                                                  7-Independent Charter District
## 582                                                  7-Independent Charter District
## 583  1-Regular local school district that is NOT a component of a supervisory union
## 584  1-Regular local school district that is NOT a component of a supervisory union
## 585  1-Regular local school district that is NOT a component of a supervisory union
## 586  1-Regular local school district that is NOT a component of a supervisory union
## 587  1-Regular local school district that is NOT a component of a supervisory union
## 588                                                  7-Independent Charter District
## 589                                                  7-Independent Charter District
## 590  1-Regular local school district that is NOT a component of a supervisory union
## 591                                                  7-Independent Charter District
## 592                                                  7-Independent Charter District
## 593                                                  7-Independent Charter District
## 594                                                  7-Independent Charter District
## 595  1-Regular local school district that is NOT a component of a supervisory union
## 596  1-Regular local school district that is NOT a component of a supervisory union
## 597  1-Regular local school district that is NOT a component of a supervisory union
## 598  1-Regular local school district that is NOT a component of a supervisory union
## 599  1-Regular local school district that is NOT a component of a supervisory union
## 600                                                  7-Independent Charter District
## 601  1-Regular local school district that is NOT a component of a supervisory union
## 602  1-Regular local school district that is NOT a component of a supervisory union
## 603                                                  7-Independent Charter District
## 604  1-Regular local school district that is NOT a component of a supervisory union
## 605  1-Regular local school district that is NOT a component of a supervisory union
## 606  1-Regular local school district that is NOT a component of a supervisory union
## 607  1-Regular local school district that is NOT a component of a supervisory union
## 608  1-Regular local school district that is NOT a component of a supervisory union
## 609  1-Regular local school district that is NOT a component of a supervisory union
## 610                                      4-Regional Education Service Agency (RESA)
## 611  1-Regular local school district that is NOT a component of a supervisory union
## 612  1-Regular local school district that is NOT a component of a supervisory union
## 613  1-Regular local school district that is NOT a component of a supervisory union
## 614                                                  7-Independent Charter District
## 615  1-Regular local school district that is NOT a component of a supervisory union
## 616  1-Regular local school district that is NOT a component of a supervisory union
## 617  1-Regular local school district that is NOT a component of a supervisory union
## 618  1-Regular local school district that is NOT a component of a supervisory union
## 619  1-Regular local school district that is NOT a component of a supervisory union
## 620  1-Regular local school district that is NOT a component of a supervisory union
## 621  1-Regular local school district that is NOT a component of a supervisory union
## 622  1-Regular local school district that is NOT a component of a supervisory union
## 623  1-Regular local school district that is NOT a component of a supervisory union
## 624  1-Regular local school district that is NOT a component of a supervisory union
## 625  1-Regular local school district that is NOT a component of a supervisory union
## 626  1-Regular local school district that is NOT a component of a supervisory union
## 627                                                  7-Independent Charter District
## 628  1-Regular local school district that is NOT a component of a supervisory union
## 629  1-Regular local school district that is NOT a component of a supervisory union
## 630  1-Regular local school district that is NOT a component of a supervisory union
## 631  1-Regular local school district that is NOT a component of a supervisory union
## 632  1-Regular local school district that is NOT a component of a supervisory union
## 633  1-Regular local school district that is NOT a component of a supervisory union
## 634  1-Regular local school district that is NOT a component of a supervisory union
## 635  1-Regular local school district that is NOT a component of a supervisory union
## 636  1-Regular local school district that is NOT a component of a supervisory union
## 637  1-Regular local school district that is NOT a component of a supervisory union
## 638                                                  7-Independent Charter District
## 639                                                  7-Independent Charter District
## 640  1-Regular local school district that is NOT a component of a supervisory union
## 641  1-Regular local school district that is NOT a component of a supervisory union
## 642  1-Regular local school district that is NOT a component of a supervisory union
## 643          5-State agency providing elementary and/or secondary level instruction
## 644  1-Regular local school district that is NOT a component of a supervisory union
## 645  1-Regular local school district that is NOT a component of a supervisory union
## 646  1-Regular local school district that is NOT a component of a supervisory union
## 647  1-Regular local school district that is NOT a component of a supervisory union
## 648  1-Regular local school district that is NOT a component of a supervisory union
## 649  1-Regular local school district that is NOT a component of a supervisory union
## 650  1-Regular local school district that is NOT a component of a supervisory union
## 651                                            9-Specialized public school district
## 652                                            9-Specialized public school district
## 653                                            9-Specialized public school district
## 654  1-Regular local school district that is NOT a component of a supervisory union
## 655                                                  7-Independent Charter District
## 656                                                  7-Independent Charter District
## 657  1-Regular local school district that is NOT a component of a supervisory union
## 658                                                  7-Independent Charter District
## 659                                                  7-Independent Charter District
## 660                                                  7-Independent Charter District
## 661  1-Regular local school district that is NOT a component of a supervisory union
## 662  1-Regular local school district that is NOT a component of a supervisory union
## 663  1-Regular local school district that is NOT a component of a supervisory union
## 664  1-Regular local school district that is NOT a component of a supervisory union
## 665  1-Regular local school district that is NOT a component of a supervisory union
## 666  1-Regular local school district that is NOT a component of a supervisory union
## 667  1-Regular local school district that is NOT a component of a supervisory union
## 668  1-Regular local school district that is NOT a component of a supervisory union
## 669  1-Regular local school district that is NOT a component of a supervisory union
## 670  1-Regular local school district that is NOT a component of a supervisory union
## 671  1-Regular local school district that is NOT a component of a supervisory union
## 672  1-Regular local school district that is NOT a component of a supervisory union
## 673  1-Regular local school district that is NOT a component of a supervisory union
## 674  1-Regular local school district that is NOT a component of a supervisory union
## 675  1-Regular local school district that is NOT a component of a supervisory union
## 676  1-Regular local school district that is NOT a component of a supervisory union
## 677  1-Regular local school district that is NOT a component of a supervisory union
## 678  1-Regular local school district that is NOT a component of a supervisory union
## 679  1-Regular local school district that is NOT a component of a supervisory union
## 680  1-Regular local school district that is NOT a component of a supervisory union
## 681                                                  7-Independent Charter District
## 682  1-Regular local school district that is NOT a component of a supervisory union
## 683  1-Regular local school district that is NOT a component of a supervisory union
## 684  1-Regular local school district that is NOT a component of a supervisory union
## 685  1-Regular local school district that is NOT a component of a supervisory union
## 686  1-Regular local school district that is NOT a component of a supervisory union
## 687                                                  7-Independent Charter District
## 688  1-Regular local school district that is NOT a component of a supervisory union
## 689              2-Local school district that is a component of a supervisory union
## 690              2-Local school district that is a component of a supervisory union
## 691  1-Regular local school district that is NOT a component of a supervisory union
## 692  1-Regular local school district that is NOT a component of a supervisory union
## 693                                                  7-Independent Charter District
## 694  1-Regular local school district that is NOT a component of a supervisory union
## 695  1-Regular local school district that is NOT a component of a supervisory union
## 696  1-Regular local school district that is NOT a component of a supervisory union
## 697  1-Regular local school district that is NOT a component of a supervisory union
## 698  1-Regular local school district that is NOT a component of a supervisory union
## 699  1-Regular local school district that is NOT a component of a supervisory union
## 700  1-Regular local school district that is NOT a component of a supervisory union
## 701                                                  7-Independent Charter District
## 702                                                  7-Independent Charter District
## 703                                      4-Regional Education Service Agency (RESA)
## 704  1-Regular local school district that is NOT a component of a supervisory union
## 705  1-Regular local school district that is NOT a component of a supervisory union
## 706  1-Regular local school district that is NOT a component of a supervisory union
## 707                                                  7-Independent Charter District
## 708                                                  7-Independent Charter District
## 709                                                  7-Independent Charter District
## 710                                                  7-Independent Charter District
## 711                                            9-Specialized public school district
## 712  1-Regular local school district that is NOT a component of a supervisory union
## 713  1-Regular local school district that is NOT a component of a supervisory union
## 714  1-Regular local school district that is NOT a component of a supervisory union
## 715  1-Regular local school district that is NOT a component of a supervisory union
## 716  1-Regular local school district that is NOT a component of a supervisory union
## 717                                      4-Regional Education Service Agency (RESA)
## 718                                      4-Regional Education Service Agency (RESA)
## 719  1-Regular local school district that is NOT a component of a supervisory union
## 720  1-Regular local school district that is NOT a component of a supervisory union
## 721                                            9-Specialized public school district
## 722  1-Regular local school district that is NOT a component of a supervisory union
## 723  1-Regular local school district that is NOT a component of a supervisory union
## 724          5-State agency providing elementary and/or secondary level instruction
## 725  1-Regular local school district that is NOT a component of a supervisory union
## 726  1-Regular local school district that is NOT a component of a supervisory union
## 727  1-Regular local school district that is NOT a component of a supervisory union
## 728  1-Regular local school district that is NOT a component of a supervisory union
## 729  1-Regular local school district that is NOT a component of a supervisory union
## 730  1-Regular local school district that is NOT a component of a supervisory union
## 731                                                  7-Independent Charter District
## 732  1-Regular local school district that is NOT a component of a supervisory union
## 733  1-Regular local school district that is NOT a component of a supervisory union
## 734  1-Regular local school district that is NOT a component of a supervisory union
## 735  1-Regular local school district that is NOT a component of a supervisory union
## 736  1-Regular local school district that is NOT a component of a supervisory union
## 737  1-Regular local school district that is NOT a component of a supervisory union
## 738  1-Regular local school district that is NOT a component of a supervisory union
## 739  1-Regular local school district that is NOT a component of a supervisory union
## 740  1-Regular local school district that is NOT a component of a supervisory union
## 741                                                  7-Independent Charter District
## 742  1-Regular local school district that is NOT a component of a supervisory union
## 743  1-Regular local school district that is NOT a component of a supervisory union
## 744  1-Regular local school district that is NOT a component of a supervisory union
## 745  1-Regular local school district that is NOT a component of a supervisory union
## 746                                      4-Regional Education Service Agency (RESA)
## 747  1-Regular local school district that is NOT a component of a supervisory union
## 748  1-Regular local school district that is NOT a component of a supervisory union
## 749  1-Regular local school district that is NOT a component of a supervisory union
## 750  1-Regular local school district that is NOT a component of a supervisory union
## 751                                                  7-Independent Charter District
## 752  1-Regular local school district that is NOT a component of a supervisory union
## 753  1-Regular local school district that is NOT a component of a supervisory union
## 754                                                  7-Independent Charter District
## 755  1-Regular local school district that is NOT a component of a supervisory union
## 756  1-Regular local school district that is NOT a component of a supervisory union
## 757  1-Regular local school district that is NOT a component of a supervisory union
## 758  1-Regular local school district that is NOT a component of a supervisory union
## 759  1-Regular local school district that is NOT a component of a supervisory union
## 760  1-Regular local school district that is NOT a component of a supervisory union
## 761  1-Regular local school district that is NOT a component of a supervisory union
## 762  1-Regular local school district that is NOT a component of a supervisory union
## 763  1-Regular local school district that is NOT a component of a supervisory union
## 764  1-Regular local school district that is NOT a component of a supervisory union
## 765  1-Regular local school district that is NOT a component of a supervisory union
## 766  1-Regular local school district that is NOT a component of a supervisory union
## 767  1-Regular local school district that is NOT a component of a supervisory union
## 768  1-Regular local school district that is NOT a component of a supervisory union
## 769                                                  7-Independent Charter District
## 770                                                  7-Independent Charter District
## 771  1-Regular local school district that is NOT a component of a supervisory union
## 772  1-Regular local school district that is NOT a component of a supervisory union
## 773  1-Regular local school district that is NOT a component of a supervisory union
## 774                                      4-Regional Education Service Agency (RESA)
## 775                                            9-Specialized public school district
## 776                                            9-Specialized public school district
## 777                                                  7-Independent Charter District
## 778  1-Regular local school district that is NOT a component of a supervisory union
## 779  1-Regular local school district that is NOT a component of a supervisory union
## 780  1-Regular local school district that is NOT a component of a supervisory union
## 781  1-Regular local school district that is NOT a component of a supervisory union
## 782  1-Regular local school district that is NOT a component of a supervisory union
## 783  1-Regular local school district that is NOT a component of a supervisory union
## 784  1-Regular local school district that is NOT a component of a supervisory union
## 785  1-Regular local school district that is NOT a component of a supervisory union
## 786  1-Regular local school district that is NOT a component of a supervisory union
## 787  1-Regular local school district that is NOT a component of a supervisory union
## 788  1-Regular local school district that is NOT a component of a supervisory union
## 789  1-Regular local school district that is NOT a component of a supervisory union
## 790                                            9-Specialized public school district
## 791                                            9-Specialized public school district
## 792                                            9-Specialized public school district
## 793  1-Regular local school district that is NOT a component of a supervisory union
## 794                                                  7-Independent Charter District
## 795                                                  7-Independent Charter District
## 796                                                  7-Independent Charter District
## 797                                                  7-Independent Charter District
## 798  1-Regular local school district that is NOT a component of a supervisory union
## 799  1-Regular local school district that is NOT a component of a supervisory union
## 800                                                  7-Independent Charter District
## 801  1-Regular local school district that is NOT a component of a supervisory union
## 802  1-Regular local school district that is NOT a component of a supervisory union
## 803  1-Regular local school district that is NOT a component of a supervisory union
## 804  1-Regular local school district that is NOT a component of a supervisory union
## 805  1-Regular local school district that is NOT a component of a supervisory union
## 806  1-Regular local school district that is NOT a component of a supervisory union
## 807  1-Regular local school district that is NOT a component of a supervisory union
## 808  1-Regular local school district that is NOT a component of a supervisory union
## 809  1-Regular local school district that is NOT a component of a supervisory union
## 810  1-Regular local school district that is NOT a component of a supervisory union
## 811                                                  7-Independent Charter District
## 812                                      4-Regional Education Service Agency (RESA)
## 813  1-Regular local school district that is NOT a component of a supervisory union
## 814              2-Local school district that is a component of a supervisory union
## 815              2-Local school district that is a component of a supervisory union
## 816              2-Local school district that is a component of a supervisory union
## 817              2-Local school district that is a component of a supervisory union
## 818  1-Regular local school district that is NOT a component of a supervisory union
## 819  1-Regular local school district that is NOT a component of a supervisory union
## 820  1-Regular local school district that is NOT a component of a supervisory union
## 821  1-Regular local school district that is NOT a component of a supervisory union
## 822                                                  7-Independent Charter District
## 823                                                  7-Independent Charter District
## 824                                                  7-Independent Charter District
## 825                                      4-Regional Education Service Agency (RESA)
## 826  1-Regular local school district that is NOT a component of a supervisory union
## 827  1-Regular local school district that is NOT a component of a supervisory union
## 828                                                  7-Independent Charter District
## 829  1-Regular local school district that is NOT a component of a supervisory union
## 830  1-Regular local school district that is NOT a component of a supervisory union
## 831  1-Regular local school district that is NOT a component of a supervisory union
## 832  1-Regular local school district that is NOT a component of a supervisory union
## 833  1-Regular local school district that is NOT a component of a supervisory union
## 834  1-Regular local school district that is NOT a component of a supervisory union
## 835  1-Regular local school district that is NOT a component of a supervisory union
## 836                                                  7-Independent Charter District
## 837  1-Regular local school district that is NOT a component of a supervisory union
## 838                                                  7-Independent Charter District
## 839  1-Regular local school district that is NOT a component of a supervisory union
## 840  1-Regular local school district that is NOT a component of a supervisory union
## 841  1-Regular local school district that is NOT a component of a supervisory union
## 842  1-Regular local school district that is NOT a component of a supervisory union
## 843  1-Regular local school district that is NOT a component of a supervisory union
## 844  1-Regular local school district that is NOT a component of a supervisory union
## 845  1-Regular local school district that is NOT a component of a supervisory union
## 846  1-Regular local school district that is NOT a component of a supervisory union
## 847                                                  7-Independent Charter District
## 848  1-Regular local school district that is NOT a component of a supervisory union
## 849  1-Regular local school district that is NOT a component of a supervisory union
## 850  1-Regular local school district that is NOT a component of a supervisory union
## 851  1-Regular local school district that is NOT a component of a supervisory union
## 852  1-Regular local school district that is NOT a component of a supervisory union
## 853                                                  7-Independent Charter District
## 854  1-Regular local school district that is NOT a component of a supervisory union
## 855  1-Regular local school district that is NOT a component of a supervisory union
## 856  1-Regular local school district that is NOT a component of a supervisory union
## 857  1-Regular local school district that is NOT a component of a supervisory union
## 858  1-Regular local school district that is NOT a component of a supervisory union
## 859  1-Regular local school district that is NOT a component of a supervisory union
## 860  1-Regular local school district that is NOT a component of a supervisory union
## 861  1-Regular local school district that is NOT a component of a supervisory union
## 862  1-Regular local school district that is NOT a component of a supervisory union
## 863  1-Regular local school district that is NOT a component of a supervisory union
## 864  1-Regular local school district that is NOT a component of a supervisory union
## 865  1-Regular local school district that is NOT a component of a supervisory union
## 866                                                  7-Independent Charter District
## 867  1-Regular local school district that is NOT a component of a supervisory union
## 868  1-Regular local school district that is NOT a component of a supervisory union
## 869  1-Regular local school district that is NOT a component of a supervisory union
## 870  1-Regular local school district that is NOT a component of a supervisory union
## 871  1-Regular local school district that is NOT a component of a supervisory union
## 872  1-Regular local school district that is NOT a component of a supervisory union
## 873                                                  7-Independent Charter District
## 874  1-Regular local school district that is NOT a component of a supervisory union
## 875  1-Regular local school district that is NOT a component of a supervisory union
## 876  1-Regular local school district that is NOT a component of a supervisory union
## 877  1-Regular local school district that is NOT a component of a supervisory union
## 878  1-Regular local school district that is NOT a component of a supervisory union
## 879  1-Regular local school district that is NOT a component of a supervisory union
## 880  1-Regular local school district that is NOT a component of a supervisory union
## 881  1-Regular local school district that is NOT a component of a supervisory union
## 882  1-Regular local school district that is NOT a component of a supervisory union
## 883                                                  7-Independent Charter District
## 884  1-Regular local school district that is NOT a component of a supervisory union
## 885  1-Regular local school district that is NOT a component of a supervisory union
## 886  1-Regular local school district that is NOT a component of a supervisory union
## 887  1-Regular local school district that is NOT a component of a supervisory union
## 888  1-Regular local school district that is NOT a component of a supervisory union
## 889                                                  7-Independent Charter District
## 890                                                  7-Independent Charter District
## 891  1-Regular local school district that is NOT a component of a supervisory union
## 892  1-Regular local school district that is NOT a component of a supervisory union
## 893  1-Regular local school district that is NOT a component of a supervisory union
## 894  1-Regular local school district that is NOT a component of a supervisory union
## 895  1-Regular local school district that is NOT a component of a supervisory union
## 896                                                  7-Independent Charter District
## 897                                                  7-Independent Charter District
## 898  1-Regular local school district that is NOT a component of a supervisory union
## 899  1-Regular local school district that is NOT a component of a supervisory union
## 900  1-Regular local school district that is NOT a component of a supervisory union
## 901  1-Regular local school district that is NOT a component of a supervisory union
## 902  1-Regular local school district that is NOT a component of a supervisory union
## 903  1-Regular local school district that is NOT a component of a supervisory union
## 904  1-Regular local school district that is NOT a component of a supervisory union
## 905  1-Regular local school district that is NOT a component of a supervisory union
## 906                                                  7-Independent Charter District
## 907  1-Regular local school district that is NOT a component of a supervisory union
## 908  1-Regular local school district that is NOT a component of a supervisory union
## 909  1-Regular local school district that is NOT a component of a supervisory union
## 910  1-Regular local school district that is NOT a component of a supervisory union
## 911                                      4-Regional Education Service Agency (RESA)
## 912  1-Regular local school district that is NOT a component of a supervisory union
## 913  1-Regular local school district that is NOT a component of a supervisory union
## 914  1-Regular local school district that is NOT a component of a supervisory union
## 915  1-Regular local school district that is NOT a component of a supervisory union
## 916  1-Regular local school district that is NOT a component of a supervisory union
## 917  1-Regular local school district that is NOT a component of a supervisory union
## 918  1-Regular local school district that is NOT a component of a supervisory union
## 919  1-Regular local school district that is NOT a component of a supervisory union
## 920  1-Regular local school district that is NOT a component of a supervisory union
## 921  1-Regular local school district that is NOT a component of a supervisory union
## 922  1-Regular local school district that is NOT a component of a supervisory union
## 923  1-Regular local school district that is NOT a component of a supervisory union
## 924  1-Regular local school district that is NOT a component of a supervisory union
## 925  1-Regular local school district that is NOT a component of a supervisory union
## 926  1-Regular local school district that is NOT a component of a supervisory union
## 927  1-Regular local school district that is NOT a component of a supervisory union
## 928                                            9-Specialized public school district
## 929  1-Regular local school district that is NOT a component of a supervisory union
## 930  1-Regular local school district that is NOT a component of a supervisory union
## 931  1-Regular local school district that is NOT a component of a supervisory union
## 932  1-Regular local school district that is NOT a component of a supervisory union
## 933                                                  7-Independent Charter District
## 934                                                  7-Independent Charter District
## 935                                                  7-Independent Charter District
## 936                                                  7-Independent Charter District
## 937  1-Regular local school district that is NOT a component of a supervisory union
## 938                                                  7-Independent Charter District
## 939                                                  7-Independent Charter District
## 940  1-Regular local school district that is NOT a component of a supervisory union
## 941  1-Regular local school district that is NOT a component of a supervisory union
## 942  1-Regular local school district that is NOT a component of a supervisory union
## 943  1-Regular local school district that is NOT a component of a supervisory union
## 944  1-Regular local school district that is NOT a component of a supervisory union
## 945  1-Regular local school district that is NOT a component of a supervisory union
## 946                                                  7-Independent Charter District
## 947  1-Regular local school district that is NOT a component of a supervisory union
## 948  1-Regular local school district that is NOT a component of a supervisory union
## 949  1-Regular local school district that is NOT a component of a supervisory union
## 950  1-Regular local school district that is NOT a component of a supervisory union
## 951  1-Regular local school district that is NOT a component of a supervisory union
## 952  1-Regular local school district that is NOT a component of a supervisory union
## 953  1-Regular local school district that is NOT a component of a supervisory union
## 954  1-Regular local school district that is NOT a component of a supervisory union
## 955  1-Regular local school district that is NOT a component of a supervisory union
## 956  1-Regular local school district that is NOT a component of a supervisory union
## 957  1-Regular local school district that is NOT a component of a supervisory union
## 958                                                  7-Independent Charter District
## 959  1-Regular local school district that is NOT a component of a supervisory union
## 960  1-Regular local school district that is NOT a component of a supervisory union
## 961  1-Regular local school district that is NOT a component of a supervisory union
## 962  1-Regular local school district that is NOT a component of a supervisory union
## 963                                      4-Regional Education Service Agency (RESA)
## 964                                            9-Specialized public school district
## 965                                            9-Specialized public school district
## 966                                            9-Specialized public school district
## 967  1-Regular local school district that is NOT a component of a supervisory union
## 968  1-Regular local school district that is NOT a component of a supervisory union
## 969  1-Regular local school district that is NOT a component of a supervisory union
## 970  1-Regular local school district that is NOT a component of a supervisory union
## 971  1-Regular local school district that is NOT a component of a supervisory union
## 972                                                  7-Independent Charter District
## 973  1-Regular local school district that is NOT a component of a supervisory union
## 974  1-Regular local school district that is NOT a component of a supervisory union
## 975  1-Regular local school district that is NOT a component of a supervisory union
## 976                                      4-Regional Education Service Agency (RESA)
## 977                                                  7-Independent Charter District
## 978                                                  7-Independent Charter District
## 979  1-Regular local school district that is NOT a component of a supervisory union
## 980  1-Regular local school district that is NOT a component of a supervisory union
## 981                                                  7-Independent Charter District
## 982  1-Regular local school district that is NOT a component of a supervisory union
## 983  1-Regular local school district that is NOT a component of a supervisory union
## 984  1-Regular local school district that is NOT a component of a supervisory union
## 985                                                  7-Independent Charter District
## 986  1-Regular local school district that is NOT a component of a supervisory union
## 987  1-Regular local school district that is NOT a component of a supervisory union
## 988                                                  7-Independent Charter District
## 989  1-Regular local school district that is NOT a component of a supervisory union
## 990                                                  7-Independent Charter District
## 991  1-Regular local school district that is NOT a component of a supervisory union
## 992  1-Regular local school district that is NOT a component of a supervisory union
## 993  1-Regular local school district that is NOT a component of a supervisory union
## 994  1-Regular local school district that is NOT a component of a supervisory union
## 995  1-Regular local school district that is NOT a component of a supervisory union
## 996  1-Regular local school district that is NOT a component of a supervisory union
## 997  1-Regular local school district that is NOT a component of a supervisory union
## 998  1-Regular local school district that is NOT a component of a supervisory union
## 999  1-Regular local school district that is NOT a component of a supervisory union
## 1000 1-Regular local school district that is NOT a component of a supervisory union
## 1001 1-Regular local school district that is NOT a component of a supervisory union
## 1002 1-Regular local school district that is NOT a component of a supervisory union
## 1003         5-State agency providing elementary and/or secondary level instruction
## 1004                                                 7-Independent Charter District
## 1005 1-Regular local school district that is NOT a component of a supervisory union
## 1006 1-Regular local school district that is NOT a component of a supervisory union
## 1007                                                 7-Independent Charter District
## 1008 1-Regular local school district that is NOT a component of a supervisory union
## 1009 1-Regular local school district that is NOT a component of a supervisory union
## 1010 1-Regular local school district that is NOT a component of a supervisory union
## 1011                                                 7-Independent Charter District
## 1012 1-Regular local school district that is NOT a component of a supervisory union
## 1013 1-Regular local school district that is NOT a component of a supervisory union
## 1014 1-Regular local school district that is NOT a component of a supervisory union
## 1015                                                 7-Independent Charter District
## 1016                                                 7-Independent Charter District
## 1017                                                 7-Independent Charter District
## 1018 1-Regular local school district that is NOT a component of a supervisory union
## 1019 1-Regular local school district that is NOT a component of a supervisory union
## 1020 1-Regular local school district that is NOT a component of a supervisory union
## 1021 1-Regular local school district that is NOT a component of a supervisory union
## 1022 1-Regular local school district that is NOT a component of a supervisory union
## 1023 1-Regular local school district that is NOT a component of a supervisory union
## 1024 1-Regular local school district that is NOT a component of a supervisory union
## 1025 1-Regular local school district that is NOT a component of a supervisory union
## 1026 1-Regular local school district that is NOT a component of a supervisory union
## 1027 1-Regular local school district that is NOT a component of a supervisory union
## 1028 1-Regular local school district that is NOT a component of a supervisory union
## 1029 1-Regular local school district that is NOT a component of a supervisory union
## 1030 1-Regular local school district that is NOT a component of a supervisory union
## 1031                                                 7-Independent Charter District
## 1032                                                 7-Independent Charter District
## 1033 1-Regular local school district that is NOT a component of a supervisory union
## 1034                                                 7-Independent Charter District
## 1035                                                 7-Independent Charter District
## 1036 1-Regular local school district that is NOT a component of a supervisory union
## 1037 1-Regular local school district that is NOT a component of a supervisory union
## 1038 1-Regular local school district that is NOT a component of a supervisory union
## 1039 1-Regular local school district that is NOT a component of a supervisory union
## 1040 1-Regular local school district that is NOT a component of a supervisory union
## 1041 1-Regular local school district that is NOT a component of a supervisory union
## 1042 1-Regular local school district that is NOT a component of a supervisory union
## 1043 1-Regular local school district that is NOT a component of a supervisory union
## 1044 1-Regular local school district that is NOT a component of a supervisory union
## 1045                                                 7-Independent Charter District
## 1046                                                 7-Independent Charter District
## 1047 1-Regular local school district that is NOT a component of a supervisory union
## 1048 1-Regular local school district that is NOT a component of a supervisory union
## 1049 1-Regular local school district that is NOT a component of a supervisory union
## 1050 1-Regular local school district that is NOT a component of a supervisory union
## 1051 1-Regular local school district that is NOT a component of a supervisory union
## 1052                                                 7-Independent Charter District
## 1053                                                 7-Independent Charter District
## 1054                                                 7-Independent Charter District
## 1055 1-Regular local school district that is NOT a component of a supervisory union
## 1056                                                 7-Independent Charter District
## 1057 1-Regular local school district that is NOT a component of a supervisory union
## 1058                                                 7-Independent Charter District
## 1059 1-Regular local school district that is NOT a component of a supervisory union
## 1060 1-Regular local school district that is NOT a component of a supervisory union
## 1061 1-Regular local school district that is NOT a component of a supervisory union
## 1062 1-Regular local school district that is NOT a component of a supervisory union
## 1063 1-Regular local school district that is NOT a component of a supervisory union
## 1064 1-Regular local school district that is NOT a component of a supervisory union
## 1065 1-Regular local school district that is NOT a component of a supervisory union
## 1066                                                 7-Independent Charter District
## 1067 1-Regular local school district that is NOT a component of a supervisory union
## 1068                                                 7-Independent Charter District
## 1069 1-Regular local school district that is NOT a component of a supervisory union
## 1070 1-Regular local school district that is NOT a component of a supervisory union
## 1071 1-Regular local school district that is NOT a component of a supervisory union
## 1072 1-Regular local school district that is NOT a component of a supervisory union
## 1073 1-Regular local school district that is NOT a component of a supervisory union
## 1074 1-Regular local school district that is NOT a component of a supervisory union
## 1075 1-Regular local school district that is NOT a component of a supervisory union
## 1076 1-Regular local school district that is NOT a component of a supervisory union
## 1077 1-Regular local school district that is NOT a component of a supervisory union
## 1078 1-Regular local school district that is NOT a component of a supervisory union
## 1079 1-Regular local school district that is NOT a component of a supervisory union
## 1080 1-Regular local school district that is NOT a component of a supervisory union
## 1081 1-Regular local school district that is NOT a component of a supervisory union
## 1082 1-Regular local school district that is NOT a component of a supervisory union
## 1083 1-Regular local school district that is NOT a component of a supervisory union
## 1084 1-Regular local school district that is NOT a component of a supervisory union
## 1085 1-Regular local school district that is NOT a component of a supervisory union
## 1086                                     4-Regional Education Service Agency (RESA)
## 1087 1-Regular local school district that is NOT a component of a supervisory union
## 1088 1-Regular local school district that is NOT a component of a supervisory union
## 1089 1-Regular local school district that is NOT a component of a supervisory union
## 1090 1-Regular local school district that is NOT a component of a supervisory union
## 1091 1-Regular local school district that is NOT a component of a supervisory union
## 1092 1-Regular local school district that is NOT a component of a supervisory union
## 1093 1-Regular local school district that is NOT a component of a supervisory union
## 1094 1-Regular local school district that is NOT a component of a supervisory union
## 1095 1-Regular local school district that is NOT a component of a supervisory union
## 1096 1-Regular local school district that is NOT a component of a supervisory union
## 1097                                                 7-Independent Charter District
## 1098 1-Regular local school district that is NOT a component of a supervisory union
## 1099 1-Regular local school district that is NOT a component of a supervisory union
## 1100 1-Regular local school district that is NOT a component of a supervisory union
## 1101                                                 7-Independent Charter District
## 1102             2-Local school district that is a component of a supervisory union
## 1103 1-Regular local school district that is NOT a component of a supervisory union
## 1104 1-Regular local school district that is NOT a component of a supervisory union
## 1105 1-Regular local school district that is NOT a component of a supervisory union
## 1106 1-Regular local school district that is NOT a component of a supervisory union
## 1107 1-Regular local school district that is NOT a component of a supervisory union
## 1108                                     4-Regional Education Service Agency (RESA)
## 1109 1-Regular local school district that is NOT a component of a supervisory union
## 1110 1-Regular local school district that is NOT a component of a supervisory union
## 1111 1-Regular local school district that is NOT a component of a supervisory union
## 1112 1-Regular local school district that is NOT a component of a supervisory union
## 1113 1-Regular local school district that is NOT a component of a supervisory union
## 1114 1-Regular local school district that is NOT a component of a supervisory union
## 1115 1-Regular local school district that is NOT a component of a supervisory union
## 1116 1-Regular local school district that is NOT a component of a supervisory union
## 1117 1-Regular local school district that is NOT a component of a supervisory union
## 1118 1-Regular local school district that is NOT a component of a supervisory union
## 1119 1-Regular local school district that is NOT a component of a supervisory union
## 1120 1-Regular local school district that is NOT a component of a supervisory union
## 1121 1-Regular local school district that is NOT a component of a supervisory union
## 1122                                                 7-Independent Charter District
## 1123 1-Regular local school district that is NOT a component of a supervisory union
## 1124 1-Regular local school district that is NOT a component of a supervisory union
##                     School.Type Members Male Female FTE.Equivalent
## 1              1-Regular school     328  123    205              0
## 2              1-Regular school     425  219    206          28.59
## 3              1-Regular school     554  272    282           37.6
## 4           3-Vocational school      19    9     10           <NA>
## 5              1-Regular school     491  250    241          29.85
## 6              1-Regular school      96   41     55            6.5
## 7              1-Regular school      61   23     38            4.1
## 8    4-Alternative/other school      25   19      6           1.32
## 9    4-Alternative/other school     118   54     64              4
## 10   2-Special education school       9    3      6           <NA>
## 11             1-Regular school     356  177    179             12
## 12             1-Regular school     100   56     44           4.25
## 13             1-Regular school     204  105     99          16.09
## 14             1-Regular school      45   24     21           3.25
## 15             1-Regular school     101   44     57              3
## 16             1-Regular school     152   61     91           2.11
## 17             1-Regular school     583  305    278           27.5
## 18             1-Regular school     866  460    406          54.75
## 19   4-Alternative/other school      84   36     48            8.7
## 20             1-Regular school     828  438    390          53.34
## 21             1-Regular school      73   39     34              4
## 22             1-Regular school      91   53     38           6.85
## 23             1-Regular school      53   38     15             21
## 24             1-Regular school     975  447    528           36.9
## 25   4-Alternative/other school      18   14      4              6
## 26   4-Alternative/other school     167   98     69           8.88
## 27             1-Regular school     190   76    114            7.2
## 28             1-Regular school     461  250    211          24.43
## 29             1-Regular school    1393  691    702           <NA>
## 30             1-Regular school     111   48     63           <NA>
## 31             1-Regular school     124   65     59           <NA>
## 32   4-Alternative/other school      35   14     21              1
## 33             1-Regular school     234  110    124            9.2
## 34             1-Regular school     164   84     80             10
## 35             1-Regular school     n/a  n/a    n/a           <NA>
## 36   4-Alternative/other school       7    4      3           2.12
## 37             1-Regular school      11    8      3              1
## 38             1-Regular school      65   33     32           5.79
## 39             1-Regular school      41   13     28           <NA>
## 40             1-Regular school     530  268    262             32
## 41   4-Alternative/other school      11    8      3              0
## 42             1-Regular school       0    0      0              0
## 43             1-Regular school      41   21     20              6
## 44             1-Regular school     111   59     52            3.1
## 45   4-Alternative/other school       0    0      0              0
## 46             1-Regular school     516  269    247           29.5
## 47             1-Regular school     448  236    212             35
## 48             1-Regular school      38   23     15           <NA>
## 49             1-Regular school      17    8      9           <NA>
## 50             1-Regular school     227  136     91             22
## 51             1-Regular school      91   46     45              8
## 52   4-Alternative/other school     342  170    172           <NA>
## 53             1-Regular school     158   78     80              8
## 54             1-Regular school       2    1      1            0.3
## 55             1-Regular school     310   98    212              4
## 56             1-Regular school     132   69     63           9.38
## 57          3-Vocational school     n/a  n/a    n/a           2.68
## 58             1-Regular school      80   46     34              3
## 59             1-Regular school      60   22     38              3
## 60   4-Alternative/other school     357  167    190          14.59
## 61             1-Regular school     627  323    304           <NA>
## 62             1-Regular school       0    0      0           <NA>
## 63             1-Regular school     201  100    101           <NA>
## 64             1-Regular school     747  382    365           <NA>
## 65             1-Regular school     543  264    279           <NA>
## 66             1-Regular school      18   11      7              1
## 67             1-Regular school     899  479    420          43.51
## 68             1-Regular school     226  120    106              9
## 69             1-Regular school     745  381    364           39.3
## 70             1-Regular school     635  335    300          40.15
## 71             1-Regular school      31   14     17            2.3
## 72             1-Regular school      25   13     12              0
## 73             1-Regular school      84   57     27            8.1
## 74             1-Regular school     689  348    341             46
## 75             1-Regular school      87   39     48           <NA>
## 76             1-Regular school     710  379    331             31
## 77             1-Regular school     938  500    438          50.06
## 78   2-Special education school       1    1      0           <NA>
## 79             1-Regular school     126   63     63              5
## 80             1-Regular school       9    5      4              0
## 81   4-Alternative/other school       0    0      0              1
## 82             1-Regular school     567  288    279          41.98
## 83             1-Regular school     156   78     78              7
## 84             1-Regular school    1316  672    644             85
## 85             1-Regular school     232  128    104             15
## 86             1-Regular school     628  343    285           <NA>
## 87             1-Regular school     179   91     88          10.38
## 88             1-Regular school       7    4      3              1
## 89             1-Regular school     134   66     68           8.27
## 90             1-Regular school      25   14     11            4.5
## 91             1-Regular school       5    3      2           4.53
## 92             1-Regular school      93   49     44           10.6
## 93             1-Regular school      11    3      8           0.62
## 94             1-Regular school      74   37     37           4.91
## 95             1-Regular school      91   91      0            4.5
## 96             1-Regular school     793  413    380             52
## 97             1-Regular school    1119  562    557          81.52
## 98   4-Alternative/other school     453  237    216          29.77
## 99             1-Regular school       0  n/a    n/a              0
## 100            1-Regular school     435  204    231             26
## 101            1-Regular school     266  153    113             13
## 102            1-Regular school     460  247    213          25.75
## 103            1-Regular school     377  199    178          21.75
## 104            1-Regular school     379  167    212             34
## 105            1-Regular school     307  168    139           <NA>
## 106            1-Regular school     188  108     80             16
## 107            1-Regular school     641  333    308             53
## 108            1-Regular school      31   23      8           11.9
## 109            1-Regular school     115   56     59             10
## 110            1-Regular school     148   72     76              8
## 111            1-Regular school      63    0     63             10
## 112            1-Regular school     117   71     46              6
## 113            1-Regular school     247  126    121           18.9
## 114            1-Regular school       0    0      0              0
## 115  4-Alternative/other school     151   87     64          14.39
## 116            1-Regular school      92   51     41            9.7
## 117            1-Regular school     195  107     88          22.07
## 118            1-Regular school     580  314    266          43.55
## 119            1-Regular school     406  206    200             25
## 120            1-Regular school     n/a  n/a    n/a            n/a
## 121            1-Regular school    1027  528    499           <NA>
## 122            1-Regular school     360  182    178              3
## 123            1-Regular school      36   12     24              1
## 124            1-Regular school     406   81    325           16.3
## 125            1-Regular school      16    8      8              3
## 126            1-Regular school     793  398    395           43.9
## 127  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 128            1-Regular school      85   31     54              9
## 129            1-Regular school      39   22     17           <NA>
## 130            1-Regular school       0    0      0           <NA>
## 131            1-Regular school     688  292    396           <NA>
## 132            1-Regular school      15   11      4           1.11
## 133            1-Regular school      30   15     15              0
## 134            1-Regular school      69   52     17              1
## 135            1-Regular school     244  119    125          12.63
## 136            1-Regular school       0    0      0              0
## 137            1-Regular school     508  289    219           18.9
## 138            1-Regular school     413  228    185           31.8
## 139            1-Regular school       7    4      3              1
## 140  2-Special education school       0    0      0              0
## 141            1-Regular school     663  343    320           36.4
## 142            1-Regular school     n/a  n/a    n/a           <NA>
## 143            1-Regular school      59   27     32              3
## 144            1-Regular school     649  321    328          47.27
## 145  4-Alternative/other school      47   33     14              2
## 146            1-Regular school     147  102     45              8
## 147            1-Regular school      57   33     24           5.11
## 148  4-Alternative/other school      72   42     30             20
## 149         3-Vocational school       0    0      0           <NA>
## 150            1-Regular school    1026  564    462             65
## 151            1-Regular school     n/a  n/a    n/a          17.23
## 152            1-Regular school      57   19     38           6.14
## 153            1-Regular school     785  396    389           <NA>
## 154            1-Regular school     597  333    264          32.18
## 155            1-Regular school     223  116    107          14.72
## 156            1-Regular school     480  234    246          32.24
## 157            1-Regular school     812  465    347           40.6
## 158            1-Regular school      26   10     16              0
## 159            1-Regular school      15    9      6           2.99
## 160            1-Regular school     639  320    319           35.7
## 161            1-Regular school     429  236    193           <NA>
## 162            1-Regular school     232  105    127             12
## 163            1-Regular school      49   15     34              3
## 164            1-Regular school     n/a  n/a    n/a              0
## 165            1-Regular school      42   17     25              2
## 166            1-Regular school      83   47     36              4
## 167            1-Regular school      58   34     24            5.1
## 168            1-Regular school      80   51     29           6.29
## 169            1-Regular school       0    0      0              0
## 170            1-Regular school     679  335    344          29.84
## 171            1-Regular school     n/a  n/a    n/a              3
## 172            1-Regular school      23   13     10           2.01
## 173            1-Regular school     924  441    483          49.75
## 174            1-Regular school     479  227    252           38.5
## 175            1-Regular school     483  220    263           29.5
## 176  4-Alternative/other school       2    1      1            1.9
## 177  4-Alternative/other school      72   32     40              3
## 178            1-Regular school    1914  948    966          64.65
## 179            1-Regular school     644  328    316           17.6
## 180            1-Regular school     511  262    249             28
## 181            1-Regular school     149   55     94              0
## 182            1-Regular school     946  511    435           62.8
## 183  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 184            1-Regular school       0    0      0              0
## 185            1-Regular school     168  100     68             12
## 186            1-Regular school     297  147    150             19
## 187            1-Regular school     128   67     61              6
## 188            1-Regular school     495  237    258             35
## 189            1-Regular school     250  113    137             16
## 190            1-Regular school     138  100     38           9.54
## 191            1-Regular school     564  347    217           34.6
## 192            1-Regular school     411  211    200          20.99
## 193  4-Alternative/other school       4    2      2              0
## 194            1-Regular school      99   55     44          19.15
## 195            1-Regular school     232  131    101           48.1
## 196  4-Alternative/other school      77   58     19              8
## 197  2-Special education school    1070  579    491          61.59
## 198            1-Regular school      90   52     38              8
## 199            1-Regular school     106   62     44          27.81
## 200  4-Alternative/other school      10    6      4              6
## 201            1-Regular school     555  286    269           <NA>
## 202            1-Regular school     682  364    318             24
## 203            1-Regular school     722  372    350             20
## 204            1-Regular school     382  182    200             21
## 205            1-Regular school     399  205    194             19
## 206            1-Regular school     537  258    279             16
## 207            1-Regular school      41   20     21            2.6
## 208            1-Regular school      32   11     21              2
## 209            1-Regular school     n/a  n/a    n/a           <NA>
## 210  4-Alternative/other school       0    0      0              0
## 211            1-Regular school     385  195    190          34.02
## 212  2-Special education school     n/a  n/a    n/a           <NA>
## 213            1-Regular school     n/a  n/a    n/a           <NA>
## 214            1-Regular school     559  288    271          32.34
## 215            1-Regular school     164   74     90              9
## 216  4-Alternative/other school      19   15      4              0
## 217            1-Regular school     457  239    218           33.1
## 218            1-Regular school     384  176    208          10.98
## 219            1-Regular school     584  279    305          16.69
## 220            1-Regular school     124   75     49              6
## 221            1-Regular school     n/a  n/a    n/a            n/a
## 222            1-Regular school     136   81     55              0
## 223            1-Regular school     305  149    156           25.8
## 224         3-Vocational school       0    0      0           <NA>
## 225            1-Regular school     n/a  n/a    n/a           <NA>
## 226            1-Regular school    1663  860    803             83
## 227            1-Regular school     361  199    162          20.73
## 228            1-Regular school     672  350    322          50.32
## 229            1-Regular school      87   47     40            6.3
## 230            1-Regular school     625  321    304           <NA>
## 231            1-Regular school      46   24     22           4.12
## 232            1-Regular school      46   30     16              7
## 233            1-Regular school      37   21     16              0
## 234            1-Regular school     242  123    119          13.32
## 235            1-Regular school     472  235    237             35
## 236            1-Regular school     331  130    201          32.84
## 237            1-Regular school       0    0      0              0
## 238  2-Special education school       5    3      2              1
## 239            1-Regular school     116   61     55            4.5
## 240            1-Regular school      75   44     31           6.02
## 241            1-Regular school     105   71     34            4.5
## 242            1-Regular school     148   80     68           11.1
## 243            1-Regular school      63   31     32           2.75
## 244            1-Regular school       0    0      0              3
## 245            1-Regular school     527  260    267             20
## 246            1-Regular school     272  129    143             14
## 247            1-Regular school     315  152    163             16
## 248            1-Regular school     101   48     53              4
## 249            1-Regular school      96   48     48            5.7
## 250            1-Regular school     823  440    383           50.6
## 251            1-Regular school     620  316    304           30.7
## 252            1-Regular school     160   82     78          11.05
## 253            1-Regular school     154   77     77              9
## 254            1-Regular school     254  135    119             11
## 255  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 256            1-Regular school     699  361    338          44.14
## 257            1-Regular school     715  365    350             38
## 258            1-Regular school       0    0      0              0
## 259            1-Regular school     443  250    193          32.92
## 260            1-Regular school     n/a  n/a    n/a            n/a
## 261            1-Regular school       6    3      3           <NA>
## 262            1-Regular school     997  474    523             41
## 263            1-Regular school     985  455    530           38.5
## 264            1-Regular school     161   78     83              7
## 265            1-Regular school     972  464    508             41
## 266            1-Regular school     796  377    419             33
## 267            1-Regular school      30   15     15              1
## 268            1-Regular school     676  371    305             39
## 269  4-Alternative/other school     n/a  n/a    n/a              0
## 270            1-Regular school     320  164    156          15.43
## 271            1-Regular school     241  104    137          13.68
## 272            1-Regular school     243  115    128          10.02
## 273            1-Regular school     352  166    186          19.79
## 274            1-Regular school     267  128    139          13.51
## 275            1-Regular school     620  314    306          39.76
## 276            1-Regular school     875  468    407             42
## 277  2-Special education school      26   19      7           <NA>
## 278            1-Regular school     263  144    119             14
## 279  4-Alternative/other school       0    0      0             26
## 280            1-Regular school     279  153    126           9.23
## 281            1-Regular school      44   28     16              3
## 282            1-Regular school     n/a  n/a    n/a            n/a
## 283            1-Regular school     148   81     67          10.87
## 284            1-Regular school     295  126    169           22.4
## 285            1-Regular school     637  309    328             39
## 286            1-Regular school     551  275    276           <NA>
## 287            1-Regular school     n/a  n/a    n/a            n/a
## 288            1-Regular school      15    6      9           1.01
## 289            1-Regular school     n/a  n/a    n/a            n/a
## 290            1-Regular school     n/a  n/a    n/a            n/a
## 291  2-Special education school      23   15      8           <NA>
## 292            1-Regular school     370  204    166          10.82
## 293            1-Regular school      75   46     29              6
## 294  2-Special education school       0    0      0              9
## 295            1-Regular school     n/a  n/a    n/a           <NA>
## 296            1-Regular school     n/a  n/a    n/a           <NA>
## 297  2-Special education school      28   14     14              1
## 298  2-Special education school       0    0      0            2.5
## 299  4-Alternative/other school      11    7      4              0
## 300            1-Regular school     554  291    263          31.01
## 301            1-Regular school       5    4      1              1
## 302            1-Regular school     706  370    336             54
## 303            1-Regular school     567  288    279          38.25
## 304            1-Regular school     662  339    323             31
## 305            1-Regular school     176  103     73          18.73
## 306            1-Regular school      27   14     13              2
## 307            1-Regular school    1020  543    477          53.29
## 308            1-Regular school     336  127    209           26.5
## 309            1-Regular school     114   70     44           3.31
## 310            1-Regular school     349  184    165           34.1
## 311            1-Regular school     440  223    217             17
## 312            1-Regular school      72   47     25            4.5
## 313            1-Regular school     275  122    153             16
## 314            1-Regular school     473  247    226          40.01
## 315            1-Regular school     106   64     42              4
## 316            1-Regular school      72   33     39              5
## 317            1-Regular school     n/a  n/a    n/a           <NA>
## 318            1-Regular school     181   88     93              8
## 319            1-Regular school       0    0      0              0
## 320            1-Regular school       0    0      0              0
## 321            1-Regular school     n/a  n/a    n/a           <NA>
## 322            1-Regular school      58   36     22           6.25
## 323            1-Regular school      49   15     34            2.5
## 324            1-Regular school     769  406    363          45.16
## 325            1-Regular school      43   29     14              2
## 326            1-Regular school     546  280    266          32.56
## 327            1-Regular school     148   67     81          11.97
## 328            1-Regular school     310  147    163             20
## 329  4-Alternative/other school       0    0      0              0
## 330  2-Special education school      10    7      3              2
## 331            1-Regular school    1224  620    604            147
## 332            1-Regular school    1150  460    690             16
## 333            1-Regular school     595  267    328           <NA>
## 334            1-Regular school     797  416    381            106
## 335            1-Regular school     848  354    494             25
## 336            1-Regular school     485  211    274              1
## 337            1-Regular school      76   48     28              4
## 338            1-Regular school    2402 1298   1104            144
## 339  2-Special education school       2    1      1             30
## 340            1-Regular school      41   22     19              4
## 341            1-Regular school     150   80     70              8
## 342  4-Alternative/other school       3    3      0           2.69
## 343         3-Vocational school       1    1      0              5
## 344         3-Vocational school       2    2      0            3.5
## 345            1-Regular school     195   44    151           11.5
## 346            1-Regular school     100   34     66             12
## 347            1-Regular school     166   86     80             22
## 348            1-Regular school     848  446    402          44.84
## 349            1-Regular school     139   65     74            9.1
## 350            1-Regular school      60   32     28              0
## 351            1-Regular school     782  388    394           34.5
## 352            1-Regular school     101   53     48              0
## 353            1-Regular school     451  236    215           19.1
## 354  4-Alternative/other school       0    0      0           0.13
## 355            1-Regular school     598  296    302          33.08
## 356            1-Regular school     598  305    293          27.88
## 357            1-Regular school     233  120    113          19.16
## 358  4-Alternative/other school      13   12      1           <NA>
## 359            1-Regular school     173   87     86          14.99
## 360            1-Regular school     603  309    294          39.72
## 361            1-Regular school     676  359    317             43
## 362            1-Regular school     441  229    212           34.1
## 363            1-Regular school      89   55     34              7
## 364            1-Regular school    1356  647    709             58
## 365            1-Regular school     227   91    136           13.7
## 366            1-Regular school     706  375    331           49.5
## 367            1-Regular school     119   57     62           7.98
## 368            1-Regular school     965  475    490             52
## 369            1-Regular school      79   36     43              4
## 370  4-Alternative/other school       2    1      1              1
## 371            1-Regular school     608  308    300             39
## 372            1-Regular school     136   71     65            5.9
## 373            1-Regular school      45   23     22           3.75
## 374            1-Regular school     110   54     56              5
## 375            1-Regular school     n/a  n/a    n/a              0
## 376            1-Regular school     126   52     74              6
## 377            1-Regular school     155   92     63              6
## 378  2-Special education school       0    0      0              0
## 379  4-Alternative/other school      26   10     16              0
## 380  2-Special education school       0    0      0           <NA>
## 381            1-Regular school      56   27     29              0
## 382            1-Regular school     116   68     48              6
## 383            1-Regular school       0    0      0              0
## 384            1-Regular school     398  202    196          29.85
## 385            1-Regular school     228  228      0           17.7
## 386            1-Regular school     172    0    172           17.7
## 387            1-Regular school     494  209    285              4
## 388  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 389            1-Regular school       4    4      0           2.18
## 390            1-Regular school     430  230    200          36.14
## 391            1-Regular school     728  354    374          40.79
## 392            1-Regular school       0    0      0          18.87
## 393            1-Regular school       0    0      0           <NA>
## 394            1-Regular school     n/a  n/a    n/a           <NA>
## 395  2-Special education school       9    7      2           1.39
## 396            1-Regular school       0    0      0           <NA>
## 397            1-Regular school      46   30     16              0
## 398            1-Regular school     367  187    180             11
## 399            1-Regular school     750  403    347             59
## 400  4-Alternative/other school       3    3      0              1
## 401            1-Regular school     688  352    336           <NA>
## 402            1-Regular school      11    3      8              1
## 403            1-Regular school      93   43     50              6
## 404            1-Regular school     303  160    143          14.49
## 405            1-Regular school       0    0      0           <NA>
## 406         3-Vocational school     n/a  n/a    n/a           0.96
## 407            1-Regular school     125   73     52           7.57
## 408            1-Regular school    1337  680    657             73
## 409            1-Regular school    1218  616    602           <NA>
## 410            1-Regular school     260  133    127             19
## 411            1-Regular school     492  256    236          36.82
## 412            1-Regular school     430  191    232           23.6
## 413            1-Regular school     444  206    238             15
## 414            1-Regular school     257  119    138             11
## 415            1-Regular school     112   67     45              4
## 416            1-Regular school     n/a  n/a    n/a           <NA>
## 417            1-Regular school     540  254    286           36.5
## 418            1-Regular school       0    0      0              0
## 419            1-Regular school     156   72     84          15.58
## 420            1-Regular school     155   77     78          15.68
## 421            1-Regular school     482  249    233           42.2
## 422            1-Regular school       2    1      1            0.5
## 423            1-Regular school     557  308    249          34.47
## 424            1-Regular school     636  282    354          38.81
## 425            1-Regular school     357  186    171          28.21
## 426            1-Regular school     448  234    214          36.38
## 427            1-Regular school     482  219    263          35.75
## 428            1-Regular school     448  258    190          30.74
## 429            1-Regular school     464  221    243          33.47
## 430            1-Regular school      54   15     39              3
## 431            1-Regular school     n/a  n/a    n/a           <NA>
## 432            1-Regular school      42   33      9           <NA>
## 433            1-Regular school      52   22     30            1.8
## 434            1-Regular school     n/a  n/a    n/a            n/a
## 435  4-Alternative/other school       0    0      0              1
## 436            1-Regular school     506  230    276             26
## 437            1-Regular school     141   71     70              9
## 438            1-Regular school     744  391    353             28
## 439  4-Alternative/other school       4    2      2           <NA>
## 440            1-Regular school       0    0      0           <NA>
## 441            1-Regular school     513  266    247             25
## 442            1-Regular school      35   19     16              1
## 443            1-Regular school      75   49     26           <NA>
## 444            1-Regular school      67   29     38           <NA>
## 445  4-Alternative/other school       0    0      0              0
## 446            1-Regular school     500  256    244          32.41
## 447            1-Regular school     401  206    195           <NA>
## 448            1-Regular school     844  430    414             54
## 449            1-Regular school       0    0      0              0
## 450            1-Regular school     n/a  n/a    n/a           <NA>
## 451            1-Regular school     394  214    180          20.83
## 452            1-Regular school     875  464    411          52.04
## 453  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 454            1-Regular school     300  157    143              2
## 455            1-Regular school     822  397    425             42
## 456         3-Vocational school     133   74     59            1.5
## 457            1-Regular school     318  144    174             26
## 458            1-Regular school     400  200    200          19.96
## 459            1-Regular school     118   56     62           5.61
## 460            1-Regular school     374  175    199          19.18
## 461            1-Regular school     119   51     68            5.4
## 462            1-Regular school     376  178    198          16.55
## 463            1-Regular school     101   47     54           7.48
## 464            1-Regular school     376  186    190          21.17
## 465            1-Regular school     103   53     50           6.66
## 466            1-Regular school     360  184    176          20.45
## 467            1-Regular school     123   62     61           7.91
## 468            1-Regular school     501  269    232          26.73
## 469            1-Regular school      13    6      7           2.23
## 470            1-Regular school     483  294    189           <NA>
## 471            1-Regular school     859  445    414           56.4
## 472            1-Regular school     307  151    156          24.76
## 473            1-Regular school     895  454    441          53.17
## 474            1-Regular school     321  139    182          26.37
## 475            1-Regular school     221  105    116          18.86
## 476            1-Regular school     885  432    453          49.78
## 477            1-Regular school     376  175    201          26.12
## 478            1-Regular school     931  447    484          56.68
## 479            1-Regular school     320  155    165           26.2
## 480            1-Regular school       0    0      0              0
## 481            1-Regular school     226  121    105             15
## 482            1-Regular school      72   36     36              7
## 483            1-Regular school    2958 1190   1768          12.75
## 484            1-Regular school     165   76     89           9.58
## 485            1-Regular school     474  207    267             18
## 486  4-Alternative/other school      49   20     29            7.4
## 487            1-Regular school      91   53     38           6.38
## 488  2-Special education school       1    1      0           <NA>
## 489            1-Regular school     554  268    286             36
## 490            1-Regular school     487  252    235          29.18
## 491            1-Regular school     106   63     43            1.5
## 492            1-Regular school     279  159    120          23.01
## 493            1-Regular school     297  136    161           <NA>
## 494            1-Regular school     507  262    245          29.38
## 495            1-Regular school      17    9      8            1.5
## 496            1-Regular school     108   77     31          16.37
## 497            1-Regular school     119   62     57             13
## 498            1-Regular school     478  252    226          31.35
## 499            1-Regular school     167   89     78          14.84
## 500            1-Regular school     706  360    346          38.99
## 501            1-Regular school     748  380    368          49.32
## 502            1-Regular school     634  317    317             43
## 503            1-Regular school     226  112    114           18.5
## 504  4-Alternative/other school      74   43     31              3
## 505            1-Regular school     671  340    331          43.59
## 506            1-Regular school     598  300    298          38.55
## 507            1-Regular school     659  360    299             35
## 508            1-Regular school     707  356    351           51.1
## 509            1-Regular school     428  223    205          20.84
## 510            1-Regular school      27   13     14              2
## 511            1-Regular school     419  213    206           31.2
## 512            1-Regular school     187  102     85             13
## 513            1-Regular school     180   78    102              8
## 514            1-Regular school     n/a  n/a    n/a            n/a
## 515            1-Regular school     563  295    268           <NA>
## 516            1-Regular school     531  269    262           38.1
## 517  4-Alternative/other school      37   30      7           5.99
## 518  4-Alternative/other school       0    0      0              0
## 519            1-Regular school       0    0      0              0
## 520            1-Regular school     227  125    102              9
## 521            1-Regular school     177   91     86              8
## 522            1-Regular school      97   48     49             10
## 523            1-Regular school       1    0      1           <NA>
## 524            1-Regular school     333  190    143           16.4
## 525            1-Regular school    <NA>  n/a    n/a              1
## 526            1-Regular school     836  427    409             43
## 527            1-Regular school      25   11     14              2
## 528            1-Regular school     218  109    109          12.87
## 529            1-Regular school     509  271    238             31
## 530            1-Regular school      56   36     20              6
## 531  4-Alternative/other school     498  258    240           40.9
## 532            1-Regular school     303  167    136          11.86
## 533  4-Alternative/other school       0    0      0           <NA>
## 534            1-Regular school      36   18     18           1.43
## 535            1-Regular school     101   56     45           <NA>
## 536            1-Regular school      46   18     28              3
## 537            1-Regular school     605  316    289          37.16
## 538            1-Regular school     286  124    162             14
## 539            1-Regular school      49   22     27              3
## 540            1-Regular school     235  121    114          14.54
## 541            1-Regular school     111   67     44              6
## 542            1-Regular school     460  236    224           30.7
## 543            1-Regular school     767  407    360          41.94
## 544            1-Regular school      33   27      6           <NA>
## 545  2-Special education school       3    3      0           <NA>
## 546  4-Alternative/other school      73   44     29              3
## 547            1-Regular school      53   27     26              4
## 548            1-Regular school      83   44     39              6
## 549            1-Regular school     156   71     85             12
## 550            1-Regular school     468  263    205             71
## 551            1-Regular school     692  341    351          24.45
## 552            1-Regular school     221  105    116              9
## 553            1-Regular school     135   74     61            7.7
## 554            1-Regular school     107   51     56           5.72
## 555            1-Regular school      90   49     41            7.2
## 556            1-Regular school      97   43     54            6.5
## 557            1-Regular school     116   70     46              8
## 558            1-Regular school     n/a  n/a    n/a            n/a
## 559            1-Regular school     225  110    115            7.5
## 560            1-Regular school     391  227    164             26
## 561  4-Alternative/other school       0    0      0              0
## 562            1-Regular school       0    0      0              2
## 563            1-Regular school       0    0      0              6
## 564            1-Regular school     391  193    198             28
## 565  4-Alternative/other school       3    1      2            0.3
## 566            1-Regular school       1    1      0              0
## 567            1-Regular school       0    0      0              0
## 568            1-Regular school     552  292    260             34
## 569            1-Regular school     721  379    342           33.8
## 570  4-Alternative/other school      54   54      0           3.95
## 571  4-Alternative/other school      15   15      0              2
## 572            1-Regular school     n/a  n/a    n/a           <NA>
## 573            1-Regular school     783  390    393           41.5
## 574            1-Regular school     924  470    454             45
## 575            1-Regular school      56   30     26            5.1
## 576            1-Regular school     321  182    139             14
## 577            1-Regular school     123   66     57           3.05
## 578  4-Alternative/other school     n/a  n/a    n/a            n/a
## 579            1-Regular school     283  139    144           1.42
## 580            1-Regular school     273  146    127           <NA>
## 581            1-Regular school     302  164    138           <NA>
## 582            1-Regular school      14    5      9              2
## 583            1-Regular school     142   79     63             11
## 584            1-Regular school     627  303    324          29.54
## 585            1-Regular school      77   31     46              5
## 586            1-Regular school     159   75     84           5.25
## 587            1-Regular school     166   85     81             12
## 588            1-Regular school     132   63     69              9
## 589            1-Regular school    1356  672    684           92.4
## 590            1-Regular school      37   17     20              3
## 591            1-Regular school    1258  606    652             51
## 592            1-Regular school     530  264    266           <NA>
## 593            1-Regular school     456  237    219           <NA>
## 594            1-Regular school      21   11     10           <NA>
## 595            1-Regular school      14    7      7           <NA>
## 596            1-Regular school       0    0      0              0
## 597            1-Regular school     680  333    347             31
## 598            1-Regular school     313  161    152          34.13
## 599            1-Regular school     174  120     54          12.01
## 600            1-Regular school      90   49     41           <NA>
## 601            1-Regular school     586  286    300          41.93
## 602            1-Regular school     735  360    375              1
## 603            1-Regular school      68   36     32              4
## 604            1-Regular school     106   58     48           12.3
## 605            1-Regular school     953  402    551              1
## 606            1-Regular school     n/a  n/a    n/a           <NA>
## 607            1-Regular school     437  226    211          28.09
## 608            1-Regular school     n/a  n/a    n/a           <NA>
## 609            1-Regular school      30   17     13           1.68
## 610            1-Regular school       7    6      1              2
## 611            1-Regular school     734  387    347             32
## 612            1-Regular school      35   15     20           <NA>
## 613            1-Regular school     673  341    332             30
## 614            1-Regular school     111   51     60           8.43
## 615            1-Regular school     806  430    376          44.49
## 616            1-Regular school     131   66     65            6.6
## 617            1-Regular school     296  160    136          17.89
## 618            1-Regular school     619  314    305             39
## 619         3-Vocational school     n/a  n/a    n/a           <NA>
## 620            1-Regular school       0    0      0              0
## 621            1-Regular school     456  247    209          40.75
## 622            1-Regular school     660  333    327           <NA>
## 623            1-Regular school     420  208    212          34.06
## 624            1-Regular school     562  289    273           34.2
## 625            1-Regular school     330  174    156           <NA>
## 626            1-Regular school     510  274    236          43.05
## 627            1-Regular school     162   87     75            9.9
## 628  4-Alternative/other school       4    3      1           <NA>
## 629            1-Regular school     502  232    270          27.64
## 630            1-Regular school     481  246    235          29.78
## 631            1-Regular school      11    2      9            0.5
## 632            1-Regular school     702  355    347          32.14
## 633            1-Regular school     172   86     86          13.56
## 634            1-Regular school       0    0      0           <NA>
## 635            1-Regular school     648  338    310          43.99
## 636            1-Regular school    1674  843    831             65
## 637            1-Regular school      93   48     45              2
## 638            1-Regular school     760  369    391             19
## 639            1-Regular school     169   83     86            9.5
## 640            1-Regular school     251  136    115             15
## 641            1-Regular school     290  179    111           <NA>
## 642            1-Regular school    1048  504    544          41.01
## 643  4-Alternative/other school      12    9      3              2
## 644            1-Regular school     391  191    200             31
## 645            1-Regular school     466  247    219          27.07
## 646            1-Regular school     489  264    225             22
## 647            1-Regular school       0    0      0              0
## 648            1-Regular school     319  185    134             21
## 649            1-Regular school      68   43     25              4
## 650            1-Regular school     112   51     61              4
## 651         3-Vocational school      31   14     17           2.85
## 652         3-Vocational school     112   32     80           9.25
## 653         3-Vocational school      75   45     30            6.5
## 654            1-Regular school     346  168    178          18.15
## 655            1-Regular school     641  345    296             34
## 656            1-Regular school      65   36     29           15.6
## 657            1-Regular school      59   20     39              4
## 658            1-Regular school     161   69     92              2
## 659            1-Regular school     397  205    192             30
## 660            1-Regular school       0    0      0              0
## 661            1-Regular school       0    0      0              0
## 662            1-Regular school     606  313    293             35
## 663            1-Regular school     585  298    287           36.5
## 664            1-Regular school     n/a  n/a    n/a           <NA>
## 665            1-Regular school     600  308    292           43.1
## 666            1-Regular school     165   90     75             14
## 667            1-Regular school     147   69     78           13.8
## 668            1-Regular school      96   52     44            3.5
## 669            1-Regular school     428  215    213          10.48
## 670  4-Alternative/other school      15    5     10           <NA>
## 671            1-Regular school     n/a  n/a    n/a           <NA>
## 672            1-Regular school     223  127     96          14.65
## 673            1-Regular school     528  288    240             49
## 674            1-Regular school     562  277    285           36.6
## 675            1-Regular school     446  238    208             23
## 676            1-Regular school     761  390    371          44.66
## 677            1-Regular school      82   45     37           6.23
## 678         3-Vocational school     125   46     79              6
## 679            1-Regular school    1086  529    557           74.3
## 680            1-Regular school      32   18     14              2
## 681            1-Regular school      39   18     21           2.41
## 682            1-Regular school     307  167    140           23.2
## 683            1-Regular school     n/a  n/a    n/a            n/a
## 684            1-Regular school      71   30     41            6.4
## 685            1-Regular school     706  374    332           48.3
## 686            1-Regular school     905  462    443           43.8
## 687            1-Regular school     297  149    148          21.59
## 688            1-Regular school     n/a  n/a    n/a           <NA>
## 689            1-Regular school     193   93    100             13
## 690            1-Regular school     117   62     55           8.01
## 691            1-Regular school     111   59     52              2
## 692  4-Alternative/other school      32   14     18              0
## 693  4-Alternative/other school      21   11     10           1.91
## 694            1-Regular school     448  229    219           29.8
## 695            1-Regular school     537  267    270             25
## 696            1-Regular school     735  373    362           45.1
## 697            1-Regular school     375  198    177           <NA>
## 698            1-Regular school     n/a  n/a    n/a           <NA>
## 699            1-Regular school     257  105    152          10.05
## 700            1-Regular school     819  395    424             54
## 701            1-Regular school      46   19     27           <NA>
## 702            1-Regular school     150   42    108           <NA>
## 703  4-Alternative/other school      13    6      7           <NA>
## 704            1-Regular school       0    0      0              0
## 705            1-Regular school      13    7      6              1
## 706  2-Special education school      21   14      7              2
## 707            1-Regular school      86   47     39              7
## 708  2-Special education school      12   11      1              3
## 709            1-Regular school     190   87    103          14.53
## 710            1-Regular school      34   24     10              2
## 711  4-Alternative/other school       0    0      0            0.5
## 712            1-Regular school    1280  636    644          56.77
## 713            1-Regular school      36   20     16           3.72
## 714            1-Regular school     400  184    216          23.56
## 715            1-Regular school     302  170    132             19
## 716            1-Regular school     125   43     82           9.79
## 717  4-Alternative/other school       1    1    n/a           <NA>
## 718  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 719  4-Alternative/other school      31   26      5            1.5
## 720            1-Regular school    <NA>  n/a    n/a           <NA>
## 721         3-Vocational school       5    1      4              8
## 722            1-Regular school    1015  494    521          62.33
## 723            1-Regular school     272  137    135           12.4
## 724  4-Alternative/other school       0    0      0           2.25
## 725            1-Regular school      36   17     19           1.77
## 726            1-Regular school     401  213    188          29.42
## 727            1-Regular school     490  261    229           32.5
## 728            1-Regular school    1021  523    498          64.95
## 729            1-Regular school     318  165    153           20.1
## 730            1-Regular school      55   25     30              4
## 731            1-Regular school      26   14     12           <NA>
## 732            1-Regular school    1064  550    514             69
## 733            1-Regular school     276  130    146           15.8
## 734            1-Regular school     174   93     81          18.97
## 735            1-Regular school      35   18     17            2.6
## 736            1-Regular school       7    4      3           <NA>
## 737  4-Alternative/other school     152  152      0             10
## 738            1-Regular school     929  486    443           64.7
## 739            1-Regular school     n/a  n/a    n/a           <NA>
## 740            1-Regular school     519  260    259           <NA>
## 741            1-Regular school     160   86     74           <NA>
## 742            1-Regular school     172   86     86              1
## 743            1-Regular school     143   71     72          10.79
## 744            1-Regular school      54   22     32            6.5
## 745            1-Regular school      54   31     23              3
## 746  4-Alternative/other school       0    0      0              0
## 747  4-Alternative/other school      23    7     16              1
## 748  4-Alternative/other school     n/a  n/a    n/a              2
## 749            1-Regular school     394  189    205          21.52
## 750            1-Regular school      18   13      5           2.44
## 751            1-Regular school      61   39     22              6
## 752            1-Regular school     484  254    230             20
## 753            1-Regular school     534  276    258           33.1
## 754            1-Regular school      60   30     30              5
## 755            1-Regular school      48   25     23           4.25
## 756            1-Regular school      83   64     19              3
## 757  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 758            1-Regular school       8    5      3              0
## 759            1-Regular school      69   38     31           7.13
## 760            1-Regular school     302  137    165             21
## 761            1-Regular school     n/a  n/a    n/a           <NA>
## 762            1-Regular school      40   20     20           8.05
## 763  4-Alternative/other school     n/a  n/a    n/a            n/a
## 764            1-Regular school     347  186    161             13
## 765            1-Regular school     n/a  n/a    n/a            n/a
## 766  4-Alternative/other school      40   18     22              5
## 767            1-Regular school     315  155    160             12
## 768            1-Regular school     487  267    220           33.3
## 769            1-Regular school      79   35     44              4
## 770            1-Regular school      74   35     39              5
## 771            1-Regular school     344  192    152             34
## 772            1-Regular school    1000  521    479          63.82
## 773            1-Regular school     112   59     53            3.3
## 774  4-Alternative/other school    <NA>  n/a    n/a           <NA>
## 775         3-Vocational school       0    0      0           <NA>
## 776         3-Vocational school       0    0      0           <NA>
## 777            1-Regular school     600  311    289          36.58
## 778            1-Regular school      26   13     13              2
## 779            1-Regular school     440  244    196             32
## 780            1-Regular school     n/a  n/a    n/a              0
## 781            1-Regular school     217  117    100           21.5
## 782  2-Special education school      89   70     19             14
## 783  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 784            1-Regular school     295  127    168             12
## 785            1-Regular school      68   36     32           6.03
## 786            1-Regular school     659  364    295          38.54
## 787            1-Regular school      78   51     27              0
## 788            1-Regular school     584  302    282           <NA>
## 789  4-Alternative/other school      28   23      5              5
## 790         3-Vocational school       0    0      0           <NA>
## 791         3-Vocational school       9    4      5              0
## 792         3-Vocational school       6    1      5              0
## 793            1-Regular school     921  504    417           58.9
## 794            1-Regular school     509  257    252             28
## 795            1-Regular school    1017  514    503           43.5
## 796            1-Regular school     866  442    424             35
## 797            1-Regular school     982  477    505             48
## 798            1-Regular school     419  218    201             22
## 799            1-Regular school     183   71    112           <NA>
## 800            1-Regular school      22   13      9           <NA>
## 801            1-Regular school     378  169    209             27
## 802            1-Regular school     162   91     71           15.5
## 803            1-Regular school      74   35     39             10
## 804            1-Regular school     839  404    435             52
## 805            1-Regular school     270  131    139             18
## 806            1-Regular school     401  210    191          32.14
## 807            1-Regular school      92   61     31              5
## 808            1-Regular school     635  306    329           37.8
## 809            1-Regular school       3    0      3              3
## 810            1-Regular school      68   41     27           <NA>
## 811  4-Alternative/other school      45   25     20              3
## 812  2-Special education school       9    5      4              1
## 813            1-Regular school     378  197    181          25.19
## 814            1-Regular school      98   49     49             10
## 815            1-Regular school     135   79     56             15
## 816            1-Regular school     100   40     60              6
## 817            1-Regular school      83   45     38              9
## 818            1-Regular school       8    6      2            0.2
## 819            1-Regular school      84   40     44           7.75
## 820            1-Regular school     148   69     79          10.16
## 821  4-Alternative/other school      13    8      5              2
## 822            1-Regular school     151  102     49             11
## 823            1-Regular school     147   70     77              4
## 824            1-Regular school      56   29     27              2
## 825  2-Special education school       7    7      0           1.45
## 826  4-Alternative/other school     199   92    107          30.44
## 827            1-Regular school     310   68    242           17.5
## 828            1-Regular school     102   49     53              8
## 829            1-Regular school     366  181    185          21.64
## 830            1-Regular school     605  298    307          41.41
## 831            1-Regular school      90   54     36              4
## 832            1-Regular school     n/a  n/a    n/a           <NA>
## 833            1-Regular school     273  144    129          10.58
## 834            1-Regular school      31   21     10              1
## 835            1-Regular school     n/a  n/a    n/a            n/a
## 836            1-Regular school       6    3      3           <NA>
## 837            1-Regular school     n/a  n/a    n/a              0
## 838            1-Regular school     163  121     42           <NA>
## 839            1-Regular school     102   57     45              3
## 840            1-Regular school     639  341    298          34.78
## 841            1-Regular school     466  256    210           23.5
## 842  4-Alternative/other school     n/a  n/a    n/a           <NA>
## 843            1-Regular school     305  161    144             26
## 844            1-Regular school     355  219    136          16.18
## 845            1-Regular school     404  213    191          24.94
## 846  4-Alternative/other school     182   92     90           <NA>
## 847            1-Regular school     115   57     58              7
## 848            1-Regular school     505  264    241            7.8
## 849            1-Regular school     134   60     74             10
## 850            1-Regular school     125   55     70             10
## 851            1-Regular school     141   62     79            7.5
## 852            1-Regular school     128   63     65            4.5
## 853            1-Regular school      24    7     17           2.99
## 854            1-Regular school     128   61     67              7
## 855            1-Regular school      69   34     35              2
## 856            1-Regular school     818  413    405             38
## 857            1-Regular school      66   31     35              7
## 858            1-Regular school     n/a  n/a    n/a              0
## 859            1-Regular school      13    7      6           10.5
## 860            1-Regular school     329  176    153             27
## 861            1-Regular school     987  521    466          54.64
## 862            1-Regular school      87   47     40              3
## 863            1-Regular school     122   73     49           8.55
## 864            1-Regular school      34   11     23          22.92
## 865            1-Regular school      97   55     42              1
## 866            1-Regular school     140   53     87          17.56
## 867            1-Regular school       0    0      0              1
## 868            1-Regular school     420  226    194             25
## 869  4-Alternative/other school       3    2      1            3.3
## 870            1-Regular school      36   16     20              0
## 871            1-Regular school     715  378    337          33.19
## 872            1-Regular school       0    0      0              0
## 873            1-Regular school     619  297    322             42
## 874            1-Regular school      10    9      1              5
## 875            1-Regular school     156   90     66            9.2
## 876            1-Regular school      51   28     23            2.3
## 877            1-Regular school     587  312    275           27.2
## 878            1-Regular school      63   34     29            2.5
## 879            1-Regular school     661  338    323          48.18
## 880            1-Regular school     894  468    426           52.5
## 881  4-Alternative/other school      36   17     19              3
## 882            1-Regular school     258  124    134           14.7
## 883            1-Regular school     127   64     63              6
## 884  4-Alternative/other school      61   36     25           2.89
## 885            1-Regular school     297  134    163             14
## 886            1-Regular school    1211  599    612          66.16
## 887         3-Vocational school    <NA>  n/a    n/a           <NA>
## 888  4-Alternative/other school       0    0      0              0
## 889            1-Regular school     430  159    271           27.5
## 890            1-Regular school     140   64     76          12.62
## 891            1-Regular school       1    1    n/a           <NA>
## 892            1-Regular school     n/a  n/a    n/a           <NA>
## 893            1-Regular school     n/a  n/a    n/a           <NA>
## 894            1-Regular school     n/a  n/a    n/a           <NA>
## 895            1-Regular school      48   35     13              3
## 896            1-Regular school     264  128    136          13.49
## 897            1-Regular school     318  173    145             17
## 898            1-Regular school     n/a  n/a    n/a           <NA>
## 899            1-Regular school     n/a  n/a    n/a           <NA>
## 900            1-Regular school       0    0      0           <NA>
## 901            1-Regular school     518  258    260          30.92
## 902            1-Regular school      68   27     41            1.1
## 903            1-Regular school     178   94     84           12.5
## 904            1-Regular school     236  113    123            8.5
## 905            1-Regular school     810  426    384             50
## 906            1-Regular school     195  104     91          14.33
## 907            1-Regular school      41   20     21              4
## 908            1-Regular school     295  148    147          23.34
## 909  4-Alternative/other school     154   95     59             11
## 910         3-Vocational school      44   26     18            5.7
## 911  2-Special education school    <NA>  n/a    n/a           <NA>
## 912            1-Regular school     168   79     89           <NA>
## 913            1-Regular school      13   11      2            0.6
## 914            1-Regular school     n/a  n/a    n/a            n/a
## 915            1-Regular school     189   88    101          15.13
## 916            1-Regular school     n/a  n/a    n/a           <NA>
## 917            1-Regular school     510  281    229             41
## 918            1-Regular school       0    0      0              0
## 919            1-Regular school      50   29     21           <NA>
## 920            1-Regular school     643  360    283             37
## 921            1-Regular school      74   48     26            2.5
## 922            1-Regular school     770  386    384          46.02
## 923            1-Regular school     n/a  n/a    n/a            n/a
## 924            1-Regular school     n/a  n/a    n/a           <NA>
## 925            1-Regular school     549  282    267           35.8
## 926            1-Regular school      63   37     26           <NA>
## 927            1-Regular school      33   20     13           <NA>
## 928            1-Regular school       0    0      0           <NA>
## 929            1-Regular school     650  328    322          48.11
## 930            1-Regular school     601  316    285             29
## 931  4-Alternative/other school       5    4      1           1.48
## 932            1-Regular school     423  205    218             29
## 933            1-Regular school     957  476    481             38
## 934            1-Regular school    1754  903    851             78
## 935            1-Regular school    1158  582    576             47
## 936            1-Regular school     906  468    438             40
## 937  4-Alternative/other school      68   39     29              3
## 938            1-Regular school     128   68     60             11
## 939            1-Regular school      94   51     43              7
## 940            1-Regular school     757  418    339             52
## 941            1-Regular school     636  310    326          34.09
## 942            1-Regular school     165   72     93          16.42
## 943            1-Regular school     677  337    340             28
## 944            1-Regular school     102   56     46              4
## 945            1-Regular school      96   60     36              4
## 946            1-Regular school     233  125    108             10
## 947            1-Regular school     365  196    169          26.12
## 948            1-Regular school    1015  515    500          42.19
## 949            1-Regular school     n/a  n/a    n/a            n/a
## 950            1-Regular school     n/a  n/a    n/a           <NA>
## 951            1-Regular school     n/a  n/a    n/a           <NA>
## 952            1-Regular school     214  106    108            6.5
## 953            1-Regular school     148   68     80           <NA>
## 954            1-Regular school     382  229    153             26
## 955            1-Regular school     593  313    280             18
## 956  2-Special education school      92   56     36           <NA>
## 957            1-Regular school     351  164    187             27
## 958            1-Regular school     202   94    108           <NA>
## 959            1-Regular school     325  156    169          18.88
## 960            1-Regular school     860  427    433             48
## 961            1-Regular school     156   80     76          21.09
## 962  4-Alternative/other school     n/a  n/a    n/a              0
## 963            1-Regular school       0    0      0              0
## 964         3-Vocational school       4    0      4              0
## 965         3-Vocational school       2    2      0           0.25
## 966         3-Vocational school       0    0      0           <NA>
## 967            1-Regular school     105   58     47              9
## 968            1-Regular school     226  101    125          11.46
## 969            1-Regular school     n/a  n/a    n/a            n/a
## 970            1-Regular school     774  416    358             60
## 971            1-Regular school      75   61     14          19.56
## 972            1-Regular school      77   55     22            3.5
## 973  4-Alternative/other school       0    0      0              0
## 974            1-Regular school     137   74     63           8.07
## 975            1-Regular school       9    0      9              0
## 976  4-Alternative/other school      35   18     17           <NA>
## 977            1-Regular school     143   73     70           7.01
## 978            1-Regular school     114   51     63              8
## 979            1-Regular school       0    0      0              0
## 980  2-Special education school       0    0      0           <NA>
## 981            1-Regular school     181   98     83             12
## 982            1-Regular school     n/a  n/a    n/a              0
## 983            1-Regular school     451  227    224           28.2
## 984            1-Regular school     172   91     81           10.5
## 985            1-Regular school      46   26     20              1
## 986  4-Alternative/other school      48   31     17              0
## 987            1-Regular school      24   13     11              1
## 988            1-Regular school     228   94    134           5.99
## 989            1-Regular school     615  327    288             41
## 990            1-Regular school     162   74     88           <NA>
## 991            1-Regular school     695  396    299          46.61
## 992            1-Regular school     680  363    317          34.22
## 993            1-Regular school       0    0      0              0
## 994  4-Alternative/other school      23   17      6              8
## 995            1-Regular school      72   30     42           4.35
## 996            1-Regular school     362  188    174           24.4
## 997            1-Regular school     153   75     78              6
## 998  2-Special education school     190   86    104          13.48
## 999            1-Regular school     244  116    128          10.15
## 1000           1-Regular school      20   15      5           <NA>
## 1001           1-Regular school     120   64     56           <NA>
## 1002           1-Regular school     901  499    402             53
## 1003 2-Special education school       8    7      1           <NA>
## 1004           1-Regular school     n/a  n/a    n/a            n/a
## 1005           1-Regular school      87   87    n/a            5.7
## 1006           1-Regular school      21   11     10           1.41
## 1007           1-Regular school     348  201    147           <NA>
## 1008 4-Alternative/other school     153   86     67           11.4
## 1009           1-Regular school      66   32     34              7
## 1010        3-Vocational school     n/a  n/a    n/a           <NA>
## 1011           1-Regular school       0    0      0           9.16
## 1012           1-Regular school      93   44     49              6
## 1013           1-Regular school      78   33     45            8.5
## 1014           1-Regular school     118   60     58          10.64
## 1015           1-Regular school     127   67     60          15.16
## 1016           1-Regular school     154   78     76          11.55
## 1017           1-Regular school      52   27     25           7.66
## 1018           1-Regular school     300  144    156           17.6
## 1019           1-Regular school     396  203    193          19.49
## 1020           1-Regular school     n/a  n/a    n/a            n/a
## 1021           1-Regular school    1076  617    459          64.25
## 1022           1-Regular school     567  285    282          32.18
## 1023           1-Regular school     902  458    444             50
## 1024           1-Regular school     923  503    420           <NA>
## 1025 4-Alternative/other school      26   14     12            1.4
## 1026           1-Regular school     565  280    285             41
## 1027           1-Regular school     104   41     63           7.01
## 1028           1-Regular school      15    8      7           0.85
## 1029           1-Regular school     n/a  n/a    n/a              0
## 1030           1-Regular school      25   11     14              5
## 1031           1-Regular school     431  225    206           <NA>
## 1032           1-Regular school     149   62     87           2.71
## 1033 2-Special education school      80   69     11             11
## 1034           1-Regular school     300  141    159          23.37
## 1035           1-Regular school     150   69     81            7.5
## 1036           1-Regular school     188  105     83             11
## 1037 2-Special education school      31   26      5              6
## 1038           1-Regular school      89   45     44           7.11
## 1039           1-Regular school     295  147    148          22.61
## 1040           1-Regular school     239  130    109             14
## 1041           1-Regular school      20    5     15           <NA>
## 1042           1-Regular school     776  400    376             56
## 1043           1-Regular school     279   94    185          15.48
## 1044           1-Regular school     117   60     57              1
## 1045           1-Regular school      47   25     22              4
## 1046           1-Regular school     106   55     51            8.5
## 1047           1-Regular school      44   14     30            3.4
## 1048 4-Alternative/other school      82   57     25              4
## 1049           1-Regular school      14    2     12              1
## 1050           1-Regular school     463  267    196              3
## 1051           1-Regular school      46   17     29              1
## 1052           1-Regular school     148   81     67           3.97
## 1053           1-Regular school     315  161    154          14.73
## 1054           1-Regular school     261  118    143          15.37
## 1055           1-Regular school      71   35     36            9.2
## 1056           1-Regular school     181  118     63           7.61
## 1057           1-Regular school     n/a  n/a    n/a           <NA>
## 1058           1-Regular school     255  187     68           <NA>
## 1059           1-Regular school      40   21     19              1
## 1060           1-Regular school     192  109     83           <NA>
## 1061           1-Regular school     392  214    178          23.76
## 1062           1-Regular school     118   57     61           2.42
## 1063           1-Regular school      96   50     46           8.32
## 1064           1-Regular school     114   56     58          11.24
## 1065           1-Regular school     743  388    355           3.55
## 1066           1-Regular school     201  100    101           <NA>
## 1067 4-Alternative/other school      54   34     20              4
## 1068           1-Regular school      42   21     21           <NA>
## 1069           1-Regular school     251  138    113          25.39
## 1070           1-Regular school     284  147    137             26
## 1071           1-Regular school     114   59     55              5
## 1072           1-Regular school     592  286    306           3.93
## 1073           1-Regular school     n/a  n/a    n/a            n/a
## 1074 4-Alternative/other school      19    7     12            0.5
## 1075           1-Regular school     334  180    154          22.85
## 1076           1-Regular school     593  326    267          45.86
## 1077           1-Regular school     503  249    254             38
## 1078           1-Regular school      33    9     24              3
## 1079           1-Regular school       0    0      0            2.4
## 1080           1-Regular school     796  407    389             48
## 1081           1-Regular school     221  116    105          17.21
## 1082           1-Regular school     494  252    242             25
## 1083           1-Regular school    1007  520    487           61.2
## 1084           1-Regular school      15    9      6           0.58
## 1085        3-Vocational school     n/a  n/a    n/a              0
## 1086 2-Special education school      17   14      3              3
## 1087           1-Regular school     549  275    274          31.79
## 1088           1-Regular school      74   41     33            4.5
## 1089           1-Regular school      67   37     30              3
## 1090           1-Regular school     380  204    176             27
## 1091           1-Regular school     844  420    424           44.7
## 1092           1-Regular school     195   90    105           17.8
## 1093           1-Regular school       0    0      0              0
## 1094           1-Regular school       0    0      0              0
## 1095           1-Regular school       0    0      0              0
## 1096           1-Regular school     260  134    126           26.8
## 1097           1-Regular school     111   28     83           7.87
## 1098           1-Regular school       0    0      0              0
## 1099           1-Regular school      33   23     10              0
## 1100           1-Regular school     201  105     96              0
## 1101           1-Regular school      79   41     38            7.5
## 1102           1-Regular school      76   34     42            5.6
## 1103           1-Regular school     580  298    282          28.03
## 1104 2-Special education school      22   21      1              4
## 1105           1-Regular school     296  161    135             18
## 1106           1-Regular school     659  327    332           46.5
## 1107           1-Regular school    2186 1075   1111             95
## 1108 2-Special education school       9    5      4              1
## 1109           1-Regular school      74   45     29           3.35
## 1110           1-Regular school     739  385    354             28
## 1111           1-Regular school     434  235    199           <NA>
## 1112           1-Regular school     338  175    163           27.4
## 1113           1-Regular school     102   61     41              4
## 1114           1-Regular school       1    1      0            1.1
## 1115           1-Regular school     343  153    190           22.5
## 1116 4-Alternative/other school      10    6      4              2
## 1117           1-Regular school     406  203    203             18
## 1118           1-Regular school     619  321    298          49.25
## 1119           1-Regular school     663  349    314             50
## 1120           1-Regular school     151   75     76          11.82
## 1121           1-Regular school    <NA>  n/a    n/a           <NA>
## 1122           1-Regular school     149   73     76           7.69
## 1123           1-Regular school     182    0    182           9.76
## 1124           1-Regular school     n/a  n/a    n/a           <NA>
##      Pupil.Teacher.Ratio
## 1                    n/a
## 2                  14.87
## 3                  14.73
## 4                    n/a
## 5                  16.45
## 6                  14.77
## 7                  14.88
## 8                  18.94
## 9                   29.5
## 10                   n/a
## 11                 29.67
## 12                 23.53
## 13                 12.68
## 14                 13.85
## 15                 33.67
## 16                 72.04
## 17                  21.2
## 18                 15.82
## 19                  9.66
## 20                 15.52
## 21                 18.25
## 22                 13.28
## 23                  2.52
## 24                 26.42
## 25                     3
## 26                 18.81
## 27                 26.39
## 28                 18.87
## 29                   n/a
## 30                   n/a
## 31                   n/a
## 32                    35
## 33                 25.43
## 34                  16.4
## 35                   n/a
## 36                   3.3
## 37                    11
## 38                 11.23
## 39                   n/a
## 40                 16.56
## 41                   n/a
## 42                   n/a
## 43                  6.83
## 44                 35.81
## 45                   n/a
## 46                 17.49
## 47                  12.8
## 48                   n/a
## 49                   n/a
## 50                 10.32
## 51                 11.38
## 52                   n/a
## 53                 19.75
## 54                  6.67
## 55                  77.5
## 56                 14.07
## 57                   n/a
## 58                 26.67
## 59                    20
## 60                 24.47
## 61                   n/a
## 62                   n/a
## 63                   n/a
## 64                   n/a
## 65                   n/a
## 66                    18
## 67                 20.66
## 68                 25.11
## 69                 18.96
## 70                 15.82
## 71                 13.48
## 72                   n/a
## 73                 10.37
## 74                 14.98
## 75                   n/a
## 76                  22.9
## 77                 18.74
## 78                   n/a
## 79                  25.2
## 80                   n/a
## 81                     0
## 82                 13.51
## 83                 22.29
## 84                 15.48
## 85                 15.47
## 86                   n/a
## 87                 17.24
## 88                     7
## 89                  16.2
## 90                  5.56
## 91                   1.1
## 92                  8.77
## 93                 17.74
## 94                 15.07
## 95                 20.22
## 96                 15.25
## 97                 13.73
## 98                 15.22
## 99                   n/a
## 100                16.73
## 101                20.46
## 102                17.86
## 103                17.33
## 104                11.15
## 105                  n/a
## 106                11.75
## 107                12.09
## 108                 2.61
## 109                 11.5
## 110                 18.5
## 111                  6.3
## 112                 19.5
## 113                13.07
## 114                  n/a
## 115                10.49
## 116                 9.48
## 117                 8.84
## 118                13.32
## 119                16.24
## 120                  n/a
## 121                  n/a
## 122                  120
## 123                   36
## 124                24.91
## 125                 5.33
## 126                18.06
## 127                  n/a
## 128                 9.44
## 129                  n/a
## 130                  n/a
## 131                  n/a
## 132                13.51
## 133                  n/a
## 134                   69
## 135                19.32
## 136                  n/a
## 137                26.88
## 138                12.99
## 139                    7
## 140                  n/a
## 141                18.21
## 142                  n/a
## 143                19.67
## 144                13.73
## 145                 23.5
## 146                18.38
## 147                11.15
## 148                  3.6
## 149                  n/a
## 150                15.78
## 151                  n/a
## 152                 9.28
## 153                  n/a
## 154                18.55
## 155                15.15
## 156                14.89
## 157                   20
## 158                  n/a
## 159                 5.02
## 160                 17.9
## 161                  n/a
## 162                19.33
## 163                16.33
## 164                  n/a
## 165                   21
## 166                20.75
## 167                11.37
## 168                12.72
## 169                  n/a
## 170                22.75
## 171                  n/a
## 172                11.44
## 173                18.57
## 174                12.44
## 175                16.37
## 176                 1.05
## 177                   24
## 178                29.61
## 179                36.59
## 180                18.25
## 181                  n/a
## 182                15.06
## 183                  n/a
## 184                  n/a
## 185                   14
## 186                15.63
## 187                21.33
## 188                14.14
## 189                15.63
## 190                14.47
## 191                 16.3
## 192                19.58
## 193                  n/a
## 194                 5.17
## 195                 4.82
## 196                 9.63
## 197                17.37
## 198                11.25
## 199                 3.81
## 200                 1.67
## 201                  n/a
## 202                28.42
## 203                 36.1
## 204                18.19
## 205                   21
## 206                33.56
## 207                15.77
## 208                   16
## 209                  n/a
## 210                  n/a
## 211                11.32
## 212                  n/a
## 213                  n/a
## 214                17.29
## 215                18.22
## 216                  n/a
## 217                13.81
## 218                34.97
## 219                34.99
## 220                20.67
## 221                  n/a
## 222                  n/a
## 223                11.82
## 224                  n/a
## 225                  n/a
## 226                20.04
## 227                17.41
## 228                13.35
## 229                13.81
## 230                  n/a
## 231                11.17
## 232                 6.57
## 233                  n/a
## 234                18.17
## 235                13.49
## 236                10.08
## 237                  n/a
## 238                    5
## 239                25.78
## 240                12.46
## 241                23.33
## 242                13.33
## 243                22.91
## 244                    0
## 245                26.35
## 246                19.43
## 247                19.69
## 248                25.25
## 249                16.84
## 250                16.26
## 251                 20.2
## 252                14.48
## 253                17.11
## 254                23.09
## 255                  n/a
## 256                15.84
## 257                18.82
## 258                  n/a
## 259                13.46
## 260                  n/a
## 261                  n/a
## 262                24.32
## 263                25.58
## 264                   23
## 265                23.71
## 266                24.12
## 267                   30
## 268                17.33
## 269                  n/a
## 270                20.74
## 271                17.62
## 272                24.25
## 273                17.79
## 274                19.76
## 275                15.59
## 276                20.83
## 277                  n/a
## 278                18.79
## 279                    0
## 280                30.23
## 281                14.67
## 282                  n/a
## 283                13.62
## 284                13.17
## 285                16.33
## 286                  n/a
## 287                  n/a
## 288                14.85
## 289                  n/a
## 290                  n/a
## 291                  n/a
## 292                 34.2
## 293                 12.5
## 294                    0
## 295                  n/a
## 296                  n/a
## 297                   28
## 298                    0
## 299                  n/a
## 300                17.87
## 301                    5
## 302                13.07
## 303                14.82
## 304                21.35
## 305                  9.4
## 306                 13.5
## 307                19.14
## 308                12.68
## 309                34.44
## 310                10.23
## 311                25.88
## 312                   16
## 313                17.19
## 314                11.82
## 315                 26.5
## 316                 14.4
## 317                  n/a
## 318                22.63
## 319                  n/a
## 320                  n/a
## 321                  n/a
## 322                 9.28
## 323                 19.6
## 324                17.03
## 325                 21.5
## 326                16.77
## 327                12.36
## 328                 15.5
## 329                  n/a
## 330                    5
## 331                 8.33
## 332                71.88
## 333                  n/a
## 334                 7.52
## 335                33.92
## 336                  485
## 337                   19
## 338                16.68
## 339                 0.07
## 340                10.25
## 341                18.75
## 342                 1.12
## 343                  0.2
## 344                 0.57
## 345                16.96
## 346                 8.33
## 347                 7.55
## 348                18.91
## 349                15.27
## 350                  n/a
## 351                22.67
## 352                  n/a
## 353                23.61
## 354                    0
## 355                18.08
## 356                21.45
## 357                12.16
## 358                  n/a
## 359                11.54
## 360                15.18
## 361                15.72
## 362                12.93
## 363                12.71
## 364                23.38
## 365                16.57
## 366                14.26
## 367                14.91
## 368                18.56
## 369                19.75
## 370                    2
## 371                15.59
## 372                23.05
## 373                   12
## 374                   22
## 375                  n/a
## 376                   21
## 377                25.83
## 378                  n/a
## 379                  n/a
## 380                  n/a
## 381                  n/a
## 382                19.33
## 383                  n/a
## 384                13.33
## 385                12.88
## 386                 9.72
## 387                123.5
## 388                  n/a
## 389                 1.83
## 390                 11.9
## 391                17.85
## 392                    0
## 393                  n/a
## 394                  n/a
## 395                 6.47
## 396                  n/a
## 397                  n/a
## 398                33.36
## 399                12.71
## 400                    3
## 401                  n/a
## 402                   11
## 403                 15.5
## 404                20.91
## 405                  n/a
## 406                  n/a
## 407                16.51
## 408                18.32
## 409                  n/a
## 410                13.68
## 411                13.36
## 412                18.22
## 413                 29.6
## 414                23.36
## 415                   28
## 416                  n/a
## 417                14.79
## 418                  n/a
## 419                10.01
## 420                 9.89
## 421                11.42
## 422                    4
## 423                16.16
## 424                16.39
## 425                12.66
## 426                12.31
## 427                13.48
## 428                14.57
## 429                13.86
## 430                   18
## 431                  n/a
## 432                  n/a
## 433                28.89
## 434                  n/a
## 435                    0
## 436                19.46
## 437                15.67
## 438                26.57
## 439                  n/a
## 440                  n/a
## 441                20.52
## 442                   35
## 443                  n/a
## 444                  n/a
## 445                  n/a
## 446                15.43
## 447                  n/a
## 448                15.63
## 449                  n/a
## 450                  n/a
## 451                18.92
## 452                16.81
## 453                  n/a
## 454                  150
## 455                19.57
## 456                88.67
## 457                12.23
## 458                20.04
## 459                21.03
## 460                 19.5
## 461                22.04
## 462                22.72
## 463                 13.5
## 464                17.76
## 465                15.47
## 466                 17.6
## 467                15.55
## 468                18.74
## 469                 5.83
## 470                  n/a
## 471                15.23
## 472                 12.4
## 473                16.83
## 474                12.17
## 475                11.72
## 476                17.78
## 477                 14.4
## 478                16.43
## 479                12.21
## 480                  n/a
## 481                15.07
## 482                10.29
## 483                  232
## 484                17.22
## 485                26.33
## 486                 6.62
## 487                14.26
## 488                  n/a
## 489                15.39
## 490                16.69
## 491                70.67
## 492                12.13
## 493                  n/a
## 494                17.26
## 495                11.33
## 496                  6.6
## 497                 9.15
## 498                15.25
## 499                11.25
## 500                18.11
## 501                15.17
## 502                14.74
## 503                12.22
## 504                24.67
## 505                15.39
## 506                15.51
## 507                18.83
## 508                13.84
## 509                20.54
## 510                 13.5
## 511                13.43
## 512                14.38
## 513                 22.5
## 514                  n/a
## 515                  n/a
## 516                13.94
## 517                 6.18
## 518                  n/a
## 519                  n/a
## 520                25.22
## 521                22.13
## 522                  9.7
## 523                  n/a
## 524                 20.3
## 525                  n/a
## 526                19.44
## 527                 12.5
## 528                16.94
## 529                16.42
## 530                 9.33
## 531                12.18
## 532                25.55
## 533                  n/a
## 534                25.17
## 535                  n/a
## 536                15.33
## 537                16.28
## 538                20.43
## 539                16.33
## 540                16.16
## 541                 18.5
## 542                14.98
## 543                18.29
## 544                  n/a
## 545                  n/a
## 546                24.33
## 547                13.25
## 548                13.83
## 549                   13
## 550                 6.59
## 551                 28.3
## 552                24.56
## 553                17.53
## 554                18.71
## 555                 12.5
## 556                14.92
## 557                 14.5
## 558                  n/a
## 559                   30
## 560                15.04
## 561                  n/a
## 562                    0
## 563                    0
## 564                13.96
## 565                   10
## 566                  n/a
## 567                  n/a
## 568                16.24
## 569                21.33
## 570                13.67
## 571                  7.5
## 572                  n/a
## 573                18.87
## 574                20.53
## 575                10.98
## 576                22.93
## 577                40.33
## 578                  n/a
## 579                199.3
## 580                  n/a
## 581                  n/a
## 582                    7
## 583                12.91
## 584                21.23
## 585                 15.4
## 586                30.29
## 587                13.83
## 588                14.67
## 589                14.68
## 590                12.33
## 591                24.67
## 592                  n/a
## 593                  n/a
## 594                  n/a
## 595                  n/a
## 596                  n/a
## 597                21.94
## 598                 9.17
## 599                14.49
## 600                  n/a
## 601                13.98
## 602                  735
## 603                   17
## 604                 8.62
## 605                  953
## 606                  n/a
## 607                15.56
## 608                  n/a
## 609                17.86
## 610                  3.5
## 611                22.94
## 612                  n/a
## 613                22.43
## 614                13.17
## 615                18.12
## 616                19.85
## 617                16.55
## 618                15.87
## 619                  n/a
## 620                  n/a
## 621                11.19
## 622                  n/a
## 623                12.33
## 624                16.43
## 625                  n/a
## 626                11.85
## 627                16.36
## 628                  n/a
## 629                18.16
## 630                16.15
## 631                   22
## 632                21.84
## 633                12.68
## 634                  n/a
## 635                14.73
## 636                25.75
## 637                 46.5
## 638                   40
## 639                17.79
## 640                16.73
## 641                  n/a
## 642                25.55
## 643                    6
## 644                12.61
## 645                17.21
## 646                22.23
## 647                  n/a
## 648                15.19
## 649                   17
## 650                   28
## 651                10.88
## 652                12.11
## 653                11.54
## 654                19.06
## 655                18.85
## 656                 4.17
## 657                14.75
## 658                 80.5
## 659                13.23
## 660                  n/a
## 661                  n/a
## 662                17.31
## 663                16.03
## 664                  n/a
## 665                13.92
## 666                11.79
## 667                10.65
## 668                27.43
## 669                40.84
## 670                  n/a
## 671                  n/a
## 672                15.22
## 673                10.78
## 674                15.36
## 675                19.39
## 676                17.04
## 677                13.16
## 678                20.83
## 679                14.62
## 680                   16
## 681                16.18
## 682                13.23
## 683                  n/a
## 684                11.09
## 685                14.62
## 686                20.66
## 687                13.76
## 688                  n/a
## 689                14.85
## 690                14.61
## 691                 55.5
## 692                  n/a
## 693                10.99
## 694                15.03
## 695                21.48
## 696                 16.3
## 697                  n/a
## 698                  n/a
## 699                25.57
## 700                15.17
## 701                  n/a
## 702                  n/a
## 703                  n/a
## 704                  n/a
## 705                   13
## 706                 10.5
## 707                12.29
## 708                    4
## 709                13.08
## 710                   17
## 711                    0
## 712                22.55
## 713                 9.68
## 714                16.98
## 715                15.89
## 716                12.77
## 717                  n/a
## 718                  n/a
## 719                20.67
## 720                  n/a
## 721                 0.63
## 722                16.28
## 723                21.94
## 724                    0
## 725                20.34
## 726                13.63
## 727                15.08
## 728                15.72
## 729                15.82
## 730                13.75
## 731                  n/a
## 732                15.42
## 733                17.47
## 734                 9.17
## 735                13.46
## 736                  n/a
## 737                 15.2
## 738                14.36
## 739                  n/a
## 740                  n/a
## 741                  n/a
## 742                  172
## 743                13.25
## 744                 8.31
## 745                   18
## 746                  n/a
## 747                   23
## 748                  n/a
## 749                18.31
## 750                 7.38
## 751                10.17
## 752                 24.2
## 753                16.13
## 754                   12
## 755                11.29
## 756                27.67
## 757                  n/a
## 758                  n/a
## 759                 9.68
## 760                14.38
## 761                  n/a
## 762                 4.97
## 763                  n/a
## 764                26.69
## 765                  n/a
## 766                    8
## 767                26.25
## 768                14.62
## 769                19.75
## 770                 14.8
## 771                10.12
## 772                15.67
## 773                33.94
## 774                  n/a
## 775                  n/a
## 776                  n/a
## 777                 16.4
## 778                   13
## 779                13.75
## 780                  n/a
## 781                10.09
## 782                 6.36
## 783                  n/a
## 784                24.58
## 785                11.28
## 786                 17.1
## 787                  n/a
## 788                  n/a
## 789                  5.6
## 790                  n/a
## 791                  n/a
## 792                  n/a
## 793                15.64
## 794                18.18
## 795                23.38
## 796                24.74
## 797                20.46
## 798                19.05
## 799                  n/a
## 800                  n/a
## 801                   14
## 802                10.45
## 803                  7.4
## 804                16.13
## 805                   15
## 806                12.48
## 807                 18.4
## 808                 16.8
## 809                    1
## 810                  n/a
## 811                   15
## 812                    9
## 813                15.01
## 814                  9.8
## 815                    9
## 816                16.67
## 817                 9.22
## 818                   40
## 819                10.84
## 820                14.57
## 821                  6.5
## 822                13.73
## 823                36.75
## 824                   28
## 825                 4.83
## 826                 6.54
## 827                17.71
## 828                12.75
## 829                16.91
## 830                14.61
## 831                 22.5
## 832                  n/a
## 833                 25.8
## 834                   31
## 835                  n/a
## 836                  n/a
## 837                  n/a
## 838                  n/a
## 839                   34
## 840                18.37
## 841                19.83
## 842                  n/a
## 843                11.73
## 844                21.94
## 845                 16.2
## 846                  n/a
## 847                16.43
## 848                64.74
## 849                 13.4
## 850                 12.5
## 851                 18.8
## 852                28.44
## 853                 8.03
## 854                18.29
## 855                 34.5
## 856                21.53
## 857                 9.43
## 858                  n/a
## 859                 1.24
## 860                12.19
## 861                18.06
## 862                   29
## 863                14.27
## 864                 1.48
## 865                   97
## 866                 7.97
## 867                    0
## 868                 16.8
## 869                 0.91
## 870                  n/a
## 871                21.54
## 872                  n/a
## 873                14.74
## 874                    2
## 875                16.96
## 876                22.17
## 877                21.58
## 878                 25.2
## 879                13.72
## 880                17.03
## 881                   12
## 882                17.55
## 883                21.17
## 884                21.11
## 885                21.21
## 886                 18.3
## 887                  n/a
## 888                  n/a
## 889                15.64
## 890                11.09
## 891                  n/a
## 892                  n/a
## 893                  n/a
## 894                  n/a
## 895                   16
## 896                19.57
## 897                18.71
## 898                  n/a
## 899                  n/a
## 900                  n/a
## 901                16.75
## 902                61.82
## 903                14.24
## 904                27.76
## 905                 16.2
## 906                13.61
## 907                10.25
## 908                12.64
## 909                   14
## 910                 7.72
## 911                  n/a
## 912                  n/a
## 913                21.67
## 914                  n/a
## 915                12.49
## 916                  n/a
## 917                12.44
## 918                  n/a
## 919                  n/a
## 920                17.38
## 921                 29.6
## 922                16.73
## 923                  n/a
## 924                  n/a
## 925                15.34
## 926                  n/a
## 927                  n/a
## 928                  n/a
## 929                13.51
## 930                20.72
## 931                 3.38
## 932                14.59
## 933                25.18
## 934                22.49
## 935                24.64
## 936                22.65
## 937                22.67
## 938                11.64
## 939                13.43
## 940                14.56
## 941                18.66
## 942                10.05
## 943                24.18
## 944                 25.5
## 945                   24
## 946                 23.3
## 947                13.97
## 948                24.06
## 949                  n/a
## 950                  n/a
## 951                  n/a
## 952                32.92
## 953                  n/a
## 954                14.69
## 955                32.94
## 956                  n/a
## 957                   13
## 958                  n/a
## 959                17.21
## 960                17.92
## 961                  7.4
## 962                  n/a
## 963                  n/a
## 964                  n/a
## 965                    8
## 966                  n/a
## 967                11.67
## 968                19.72
## 969                  n/a
## 970                 12.9
## 971                 3.83
## 972                   22
## 973                  n/a
## 974                16.98
## 975                  n/a
## 976                  n/a
## 977                 20.4
## 978                14.25
## 979                  n/a
## 980                  n/a
## 981                15.08
## 982                  n/a
## 983                15.99
## 984                16.38
## 985                   46
## 986                  n/a
## 987                   24
## 988                38.06
## 989                   15
## 990                  n/a
## 991                14.91
## 992                19.87
## 993                  n/a
## 994                 2.88
## 995                16.55
## 996                14.84
## 997                 25.5
## 998                14.09
## 999                24.04
## 1000                 n/a
## 1001                 n/a
## 1002                  17
## 1003                 n/a
## 1004                 n/a
## 1005               15.26
## 1006               14.89
## 1007                 n/a
## 1008               13.42
## 1009                9.43
## 1010                 n/a
## 1011                   0
## 1012                15.5
## 1013                9.18
## 1014               11.09
## 1015                8.38
## 1016               13.33
## 1017                6.79
## 1018               17.05
## 1019               20.32
## 1020                 n/a
## 1021               16.75
## 1022               17.62
## 1023               18.04
## 1024                 n/a
## 1025               18.57
## 1026               13.78
## 1027               14.84
## 1028               17.65
## 1029                 n/a
## 1030                   5
## 1031                 n/a
## 1032               54.98
## 1033                7.27
## 1034               12.84
## 1035                  20
## 1036               17.09
## 1037                5.17
## 1038               12.52
## 1039               13.05
## 1040               17.07
## 1041                 n/a
## 1042               13.86
## 1043               18.02
## 1044                 117
## 1045               11.75
## 1046               12.47
## 1047               12.94
## 1048                20.5
## 1049                  14
## 1050              154.33
## 1051                  46
## 1052               37.28
## 1053               21.38
## 1054               16.98
## 1055                7.72
## 1056               23.78
## 1057                 n/a
## 1058                 n/a
## 1059                  40
## 1060                 n/a
## 1061                16.5
## 1062               48.76
## 1063               11.54
## 1064               10.14
## 1065               209.3
## 1066                 n/a
## 1067                13.5
## 1068                 n/a
## 1069                9.89
## 1070               10.92
## 1071                22.8
## 1072              150.64
## 1073                 n/a
## 1074                  38
## 1075               14.62
## 1076               12.93
## 1077               13.24
## 1078                  11
## 1079                   0
## 1080               16.58
## 1081               12.84
## 1082               19.76
## 1083               16.45
## 1084               25.86
## 1085                 n/a
## 1086                5.67
## 1087               17.27
## 1088               16.44
## 1089               22.33
## 1090               14.07
## 1091               18.88
## 1092               10.96
## 1093                 n/a
## 1094                 n/a
## 1095                 n/a
## 1096                 9.7
## 1097                14.1
## 1098                 n/a
## 1099                 n/a
## 1100                 n/a
## 1101               10.53
## 1102               13.57
## 1103               20.69
## 1104                 5.5
## 1105               16.44
## 1106               14.17
## 1107               23.01
## 1108                   9
## 1109               22.09
## 1110               26.39
## 1111                 n/a
## 1112               12.34
## 1113                25.5
## 1114                0.91
## 1115               15.24
## 1116                   5
## 1117               22.56
## 1118               12.57
## 1119               13.26
## 1120               12.77
## 1121                 n/a
## 1122               19.38
## 1123               18.65
## 1124                 n/a
table(public_school$Agency.Type)
## 
## 1-Regular local school district that is NOT a component of a supervisory union 
##                                                                          90277 
##             2-Local school district that is a component of a supervisory union 
##                                                                           2462 
##                                     4-Regional Education Service Agency (RESA) 
##                                                                           1246 
##         5-State agency providing elementary and/or secondary level instruction 
##                                                                            717 
##                                                 7-Independent Charter District 
##                                                                           4229 
##                                                     8-Other education agencies 
##                                                                             68 
##                                           9-Specialized public school district 
##                                                                            349
public_school %>% filter(Agency.Type == "4-Regional Education Service Agency (RESA)")
##          State.Name ST
## 1          NEBRASKA NE
## 2         Minnesota MN
## 3         Minnesota MN
## 4         Minnesota MN
## 5         Minnesota MN
## 6         Minnesota MN
## 7         Minnesota MN
## 8         Minnesota MN
## 9         Minnesota MN
## 10        Minnesota MN
## 11        Minnesota MN
## 12        Minnesota MN
## 13        Minnesota MN
## 14        Minnesota MN
## 15        Minnesota MN
## 16        MINNESOTA MN
## 17        MINNESOTA MN
## 18        Minnesota MN
## 19        Minnesota MN
## 20        Minnesota MN
## 21        Minnesota MN
## 22        Minnesota MN
## 23        Minnesota MN
## 24        Minnesota MN
## 25         Illinois IL
## 26     Pennsylvania PA
## 27         Virginia VA
## 28        Minnesota MN
## 29         Illinois IL
## 30         ILLINOIS IL
## 31         Illinois IL
## 32         Illinois IL
## 33      Connecticut CT
## 34      Connecticut CT
## 35      Connecticut CT
## 36         Nebraska NE
## 37         Illinois IL
## 38     Pennsylvania PA
## 39         MICHIGAN MI
## 40         New York NY
## 41        Minnesota MN
## 42        MINNESOTA MN
## 43        MINNESOTA MN
## 44        MINNESOTA MN
## 45        MINNESOTA MN
## 46        Minnesota MN
## 47        Minnesota MN
## 48        Minnesota MN
## 49        Minnesota MN
## 50        Minnesota MN
## 51        Minnesota MN
## 52         Nebraska NE
## 53        MINNESOTA MN
## 54         Michigan MI
## 55        MINNESOTA MN
## 56         Illinois IL
## 57        Minnesota MN
## 58         Virginia VA
## 59       California CA
## 60         Virginia VA
## 61      Connecticut CT
## 62       California CA
## 63        Minnesota MN
## 64             Ohio OH
## 65         Virginia VA
## 66         Illinois IL
## 67         ILLINOIS IL
## 68         ILLINOIS IL
## 69          Indiana IN
## 70        Minnesota MN
## 71      Connecticut CT
## 72        Minnesota MN
## 73     Rhode Island RI
## 74             Ohio OH
## 75             Ohio OH
## 76         Illinois IL
## 77        MINNESOTA MN
## 78        MINNESOTA MN
## 79         Illinois IL
## 80         Illinois IL
## 81        Minnesota MN
## 82             Ohio OH
## 83        MINNESOTA MN
## 84         Michigan MI
## 85       California CA
## 86   South Carolina SC
## 87         Michigan MI
## 88        Minnesota MN
## 89        Minnesota MN
## 90   South Carolina SC
## 91     Pennsylvania PA
## 92     Pennsylvania PA
## 93         Michigan MI
## 94         NEBRASKA NE
## 95        Minnesota MN
## 96             Ohio OH
## 97        Minnesota MN
## 98        MINNESOTA MN
## 99        MINNESOTA MN
## 100       Minnesota MN
## 101       Minnesota MN
## 102    Pennsylvania PA
## 103    Pennsylvania PA
## 104        Michigan MI
## 105        Michigan MI
## 106    Pennsylvania PA
## 107        Illinois IL
## 108    North Dakota ND
## 109    North Dakota ND
## 110    North Dakota ND
## 111         Arizona AZ
## 112        ILLINOIS IL
## 113    SOUTH DAKOTA SD
## 114    South Dakota SD
## 115        Michigan MI
## 116        Virginia VA
## 117        Illinois IL
## 118        Nebraska NE
## 119        Michigan MI
## 120        Michigan MI
## 121        Illinois IL
## 122        Virginia VA
## 123        NEBRASKA NE
## 124        Illinois IL
## 125        Virginia VA
## 126        VIRGINIA VA
## 127        Nebraska NE
## 128        Michigan MI
## 129        New York NY
## 130        Illinois IL
## 131            Ohio OH
## 132            OHIO OH
## 133            Ohio OH
## 134    Pennsylvania PA
## 135            Ohio OH
## 136    North Dakota ND
## 137    Pennsylvania PA
## 138        Virginia VA
## 139            OHIO OH
## 140            Ohio OH
## 141            Ohio OH
## 142      California CA
## 143      CALIFORNIA CA
## 144        Michigan MI
## 145        Michigan MI
## 146       Minnesota MN
## 147       MINNESOTA MN
## 148    Pennsylvania PA
## 149       MINNESOTA MN
## 150        Illinois IL
## 151       Minnesota MN
## 152        Michigan MI
## 153        Michigan MI
## 154  South Carolina SC
## 155            Ohio OH
## 156      California CA
## 157    Pennsylvania PA
## 158        Michigan MI
## 159        MICHIGAN MI
## 160        Virginia VA
## 161    NORTH DAKOTA ND
## 162        New York NY
## 163        New York NY
## 164        Illinois IL
## 165        Michigan MI
## 166        Illinois IL
## 167        NEBRASKA NE
## 168        Nebraska NE
## 169        Nebraska NE
## 170       Minnesota MN
## 171       Minnesota MN
## 172       Minnesota MN
## 173       Minnesota MN
## 174       Minnesota MN
## 175       Minnesota MN
## 176    Pennsylvania PA
## 177         Indiana IN
## 178      California CA
## 179    Pennsylvania PA
## 180      California CA
## 181        Virginia VA
## 182    Pennsylvania PA
## 183        Illinois IL
## 184        Illinois IL
## 185        Michigan MI
## 186        Michigan MI
## 187    Rhode Island RI
## 188    Rhode Island RI
## 189    Rhode Island RI
## 190    Rhode Island RI
## 191    Rhode Island RI
## 192        Virginia VA
## 193        Virginia VA
## 194    Pennsylvania PA
## 195    Pennsylvania PA
## 196    Pennsylvania PA
## 197        Nebraska NE
## 198       MINNESOTA MN
## 199        ILLINOIS IL
## 200       Minnesota MN
## 201        Illinois IL
## 202      Washington WA
## 203        Michigan MI
## 204    Pennsylvania PA
## 205      Washington WA
## 206    Pennsylvania PA
## 207        Michigan MI
## 208        New York NY
## 209        Illinois IL
## 210      California CA
## 211        VIRGINIA VA
## 212    Rhode Island RI
## 213      California CA
## 214    Pennsylvania PA
## 215            Ohio OH
## 216        Virginia VA
## 217        Michigan MI
## 218        Michigan MI
## 219        Michigan MI
## 220        Michigan MI
## 221        MICHIGAN MI
## 222        Michigan MI
## 223      California CA
## 224     Connecticut CT
## 225        ILLINOIS IL
## 226    Pennsylvania PA
## 227      California CA
## 228        Illinois IL
## 229        Michigan MI
## 230        Michigan MI
## 231        Michigan MI
## 232        Michigan MI
## 233        Illinois IL
## 234  South Carolina SC
## 235        Michigan MI
## 236       Minnesota MN
## 237            Ohio OH
## 238           Idaho ID
## 239         Indiana IN
## 240      WASHINGTON WA
## 241    Pennsylvania PA
## 242        Virginia VA
## 243    Pennsylvania PA
## 244    Pennsylvania PA
## 245       MINNESOTA MN
## 246            Ohio OH
## 247       MINNESOTA MN
## 248        Illinois IL
## 249            Ohio OH
## 250       Minnesota MN
## 251  South Carolina SC
## 252    Pennsylvania PA
## 253       Minnesota MN
## 254        ILLINOIS IL
## 255        Michigan MI
## 256      California CA
## 257            Ohio OH
## 258            Ohio OH
## 259    Pennsylvania PA
## 260    Pennsylvania PA
## 261    Pennsylvania PA
## 262        New York NY
## 263        Michigan MI
## 264        Michigan MI
## 265        Arkansas AR
## 266        Michigan MI
## 267        Michigan MI
## 268    South Dakota SD
## 269        Illinois IL
## 270            Ohio OH
## 271        Michigan MI
## 272    North Dakota ND
## 273        Michigan MI
## 274        Michigan MI
## 275  South Carolina SC
## 276        ILLINOIS IL
## 277     Connecticut CT
## 278       Minnesota MN
## 279  South Carolina SC
## 280        Michigan MI
## 281        Nebraska NE
## 282        ILLINOIS IL
## 283     Connecticut CT
## 284        Illinois IL
## 285        New York NY
## 286         Indiana IN
## 287        Michigan MI
## 288        MICHIGAN MI
## 289       Minnesota MN
## 290        Michigan MI
## 291        Michigan MI
## 292        Michigan MI
## 293        MICHIGAN MI
## 294        MICHIGAN MI
## 295        MICHIGAN MI
## 296        Illinois IL
## 297    North Dakota ND
## 298       Minnesota MN
## 299      California CA
## 300       Minnesota MN
## 301    Pennsylvania PA
## 302        Nebraska NE
## 303        New York NY
## 304    Pennsylvania PA
## 305       Minnesota MN
## 306            Ohio OH
## 307       MINNESOTA MN
## 308        Michigan MI
## 309        Michigan MI
## 310        Michigan MI
## 311        Michigan MI
## 312        Michigan MI
## 313        MICHIGAN MI
## 314        MICHIGAN MI
## 315       Minnesota MN
## 316        Illinois IL
## 317        Illinois IL
## 318        Illinois IL
## 319      California CA
## 320       Minnesota MN
## 321        Michigan MI
## 322        ILLINOIS IL
## 323        Nebraska NE
## 324            Ohio OH
## 325       Minnesota MN
## 326        MICHIGAN MI
## 327       MINNESOTA MN
## 328        Michigan MI
## 329    North Dakota ND
## 330       MINNESOTA MN
## 331       MINNESOTA MN
## 332       MINNESOTA MN
## 333        Virginia VA
## 334       Minnesota MN
## 335        New York NY
## 336        New York NY
## 337    Pennsylvania PA
## 338      WASHINGTON WA
## 339      WASHINGTON WA
## 340        Nebraska NE
## 341        Nebraska NE
## 342        Michigan MI
## 343        Michigan MI
## 344        Illinois IL
## 345        Illinois IL
## 346    Rhode Island RI
## 347    Rhode Island RI
## 348       Minnesota MN
## 349  South Carolina SC
## 350            Ohio OH
## 351    North Dakota ND
## 352    Pennsylvania PA
## 353       Minnesota MN
## 354       Minnesota MN
## 355       Minnesota MN
## 356       MINNESOTA MN
## 357       MINNESOTA MN
## 358        ILLINOIS IL
## 359        Illinois IL
## 360       MINNESOTA MN
## 361       Minnesota MN
## 362        Illinois IL
## 363    Pennsylvania PA
## 364        Illinois IL
## 365    North Dakota ND
## 366      California CA
## 367            Ohio OH
## 368    Pennsylvania PA
## 369        New York NY
## 370       MINNESOTA MN
## 371        Michigan MI
## 372        Illinois IL
## 373        Illinois IL
## 374       Minnesota MN
## 375      California CA
## 376    North Dakota ND
## 377    Pennsylvania PA
## 378        Illinois IL
## 379  South Carolina SC
## 380        Illinois IL
## 381       MINNESOTA MN
## 382        MICHIGAN MI
## 383        Michigan MI
## 384        New York NY
## 385        NEBRASKA NE
## 386        Michigan MI
## 387       MINNESOTA MN
## 388     Connecticut CT
## 389        Michigan MI
## 390      California CA
## 391        Michigan MI
## 392       MINNESOTA MN
## 393        Virginia VA
## 394        Virginia VA
## 395        Illinois IL
## 396    North Dakota ND
## 397    North Dakota ND
## 398        Nebraska NE
## 399      Washington WA
## 400        Michigan MI
## 401    North Dakota ND
## 402        Michigan MI
## 403        Michigan MI
## 404        MICHIGAN MI
## 405    Pennsylvania PA
## 406     Connecticut CT
## 407     Connecticut CT
## 408    Pennsylvania PA
## 409        VIRGINIA VA
## 410        Illinois IL
## 411            Ohio OH
## 412    Pennsylvania PA
## 413         Indiana IN
## 414        Michigan MI
## 415    North Dakota ND
## 416        Michigan MI
## 417    Rhode Island RI
## 418        Illinois IL
## 419        Illinois IL
## 420  South Carolina SC
## 421        New York NY
## 422        Illinois IL
## 423        Nebraska NE
## 424            Ohio OH
## 425      California CA
## 426    Pennsylvania PA
## 427       Minnesota MN
## 428       MINNESOTA MN
## 429        NEBRASKA NE
## 430         Indiana IN
## 431        MICHIGAN MI
## 432        Michigan MI
## 433          Oregon OR
## 434       Minnesota MN
## 435       Minnesota MN
## 436       Minnesota MN
## 437        New York NY
## 438        Illinois IL
## 439        Michigan MI
## 440        Michigan MI
## 441        Michigan MI
## 442        Michigan MI
## 443        Michigan MI
## 444        NEBRASKA NE
## 445    Rhode Island RI
## 446       Wisconsin WI
## 447        Illinois IL
## 448    Rhode Island RI
## 449      California CA
## 450    Pennsylvania PA
## 451        Michigan MI
## 452        Michigan MI
## 453       Minnesota MN
## 454       MINNESOTA MN
## 455        Illinois IL
## 456      California CA
## 457       Minnesota MN
## 458    Pennsylvania PA
## 459       Minnesota MN
## 460        Michigan MI
## 461        Michigan MI
## 462            OHIO OH
## 463       MINNESOTA MN
## 464       Minnesota MN
## 465        MICHIGAN MI
## 466     Connecticut CT
## 467       Minnesota MN
## 468       Minnesota MN
## 469       Minnesota MN
## 470        Michigan MI
## 471       MINNESOTA MN
## 472        Michigan MI
## 473        Michigan MI
## 474        Michigan MI
## 475        Illinois IL
## 476        Michigan MI
## 477        Michigan MI
## 478        Virginia VA
## 479        Virginia VA
## 480        ILLINOIS IL
## 481    North Dakota ND
## 482    North Dakota ND
## 483        Illinois IL
## 484    North Dakota ND
## 485        Michigan MI
## 486        Arkansas AR
## 487            Ohio OH
## 488    Pennsylvania PA
## 489        New York NY
## 490        MICHIGAN MI
## 491        Illinois IL
## 492        Illinois IL
## 493       Minnesota MN
## 494        Illinois IL
## 495        ILLINOIS IL
## 496        Illinois IL
## 497        Illinois IL
## 498        Michigan MI
## 499        MICHIGAN MI
## 500        MICHIGAN MI
## 501        Michigan MI
## 502        Michigan MI
## 503        Illinois IL
## 504       Minnesota MN
## 505        Illinois IL
## 506        Illinois IL
## 507        Michigan MI
## 508        Michigan MI
## 509        MICHIGAN MI
## 510        Michigan MI
## 511        Michigan MI
## 512        MICHIGAN MI
## 513        Michigan MI
## 514       MINNESOTA MN
## 515      California CA
## 516      California CA
## 517    Pennsylvania PA
## 518    Rhode Island RI
## 519        NEBRASKA NE
## 520      California CA
## 521        Illinois IL
## 522      Washington WA
## 523       Minnesota MN
## 524            Ohio OH
## 525            OHIO OH
## 526        MICHIGAN MI
## 527        MICHIGAN MI
## 528        MICHIGAN MI
## 529        MICHIGAN MI
## 530        MICHIGAN MI
## 531      California CA
## 532        Illinois IL
## 533       Minnesota MN
## 534    North Dakota ND
## 535       MINNESOTA MN
## 536        Illinois IL
## 537      California CA
## 538    North Dakota ND
## 539       Wisconsin WI
## 540       MINNESOTA MN
## 541       MINNESOTA MN
## 542       MINNESOTA MN
## 543       Minnesota MN
## 544       MINNESOTA MN
## 545    Pennsylvania PA
## 546    Pennsylvania PA
## 547    Pennsylvania PA
## 548        Michigan MI
## 549        Illinois IL
## 550        Illinois IL
## 551      California CA
## 552       MINNESOTA MN
## 553            Ohio OH
## 554            Ohio OH
## 555    Pennsylvania PA
## 556       Minnesota MN
## 557        Michigan MI
## 558    Pennsylvania PA
## 559    Pennsylvania PA
## 560    Pennsylvania PA
## 561        Illinois IL
## 562        Illinois IL
## 563        Michigan MI
## 564        Nebraska NE
## 565        Michigan MI
## 566        Illinois IL
## 567        Illinois IL
## 568        Illinois IL
## 569        Illinois IL
## 570        ILLINOIS IL
## 571        Michigan MI
## 572       MINNESOTA MN
## 573            Ohio OH
## 574        Illinois IL
## 575        Illinois IL
## 576        Michigan MI
## 577        Michigan MI
## 578        Illinois IL
## 579        ILLINOIS IL
## 580        MICHIGAN MI
## 581        Michigan MI
## 582    North Dakota ND
## 583      California CA
## 584      California CA
## 585      California CA
## 586         Indiana IN
## 587        Michigan MI
## 588    Pennsylvania PA
## 589        Michigan MI
## 590        Virginia VA
## 591        Illinois IL
## 592        Illinois IL
## 593        Michigan MI
## 594        Illinois IL
## 595        Illinois IL
## 596        New York NY
## 597        Virginia VA
## 598            Ohio OH
## 599           Maine ME
## 600        MICHIGAN MI
## 601        Michigan MI
## 602        Michigan MI
## 603        Michigan MI
## 604            Ohio OH
## 605      California CA
## 606     Connecticut CT
## 607        Michigan MI
## 608        Michigan MI
## 609      Washington WA
## 610        Illinois IL
## 611        Virginia VA
## 612        Virginia VA
## 613        Michigan MI
## 614        Michigan MI
## 615    Pennsylvania PA
## 616        Michigan MI
## 617        Michigan MI
## 618            Ohio OH
## 619       Minnesota MN
## 620      California CA
## 621        Michigan MI
## 622        Nebraska NE
## 623      California CA
## 624    Pennsylvania PA
## 625        Nebraska NE
## 626    Rhode Island RI
## 627       Minnesota MN
## 628        Virginia VA
## 629     Connecticut CT
## 630        Michigan MI
## 631            Ohio OH
## 632            Ohio OH
## 633        Michigan MI
## 634       Minnesota MN
## 635       Minnesota MN
## 636           Maine ME
## 637       Minnesota MN
## 638    Pennsylvania PA
## 639        Illinois IL
## 640       Minnesota MN
## 641        Illinois IL
## 642       Minnesota MN
## 643    PENNSYLVANIA PA
## 644    Rhode Island RI
## 645        Illinois IL
## 646        Michigan MI
## 647        Illinois IL
## 648       Minnesota MN
## 649    NORTH DAKOTA ND
## 650      California CA
## 651      California CA
## 652    North Dakota ND
## 653        Illinois IL
## 654       MINNESOTA MN
## 655       Minnesota MN
## 656       Minnesota MN
## 657       Minnesota MN
## 658       Minnesota MN
## 659       Minnesota MN
## 660      California CA
## 661    Pennsylvania PA
## 662      California CA
## 663        New York NY
## 664        New York NY
## 665    Pennsylvania PA
## 666        Michigan MI
## 667        Michigan MI
## 668        Michigan MI
## 669        Michigan MI
## 670        Illinois IL
## 671        Michigan MI
## 672     Connecticut CT
## 673       MINNESOTA MN
## 674       MINNESOTA MN
## 675        ILLINOIS IL
## 676       Minnesota MN
## 677        Illinois IL
## 678        Nebraska NE
## 679    North Dakota ND
## 680       MINNESOTA MN
## 681       MINNESOTA MN
## 682        ILLINOIS IL
## 683    Rhode Island RI
## 684        Virginia VA
## 685        ILLINOIS IL
## 686     Connecticut CT
## 687        Michigan MI
## 688        MICHIGAN MI
## 689        Michigan MI
## 690        MICHIGAN MI
## 691        Illinois IL
## 692        Illinois IL
## 693      California CA
## 694        New York NY
## 695        Nebraska NE
## 696       MINNESOTA MN
## 697       MINNESOTA MN
## 698        Nebraska NE
## 699       Minnesota MN
## 700        Michigan MI
## 701        Illinois IL
## 702        Illinois IL
## 703        Michigan MI
## 704       MINNESOTA MN
## 705       Minnesota MN
## 706        ILLINOIS IL
## 707        Illinois IL
## 708        Virginia VA
## 709        Illinois IL
## 710        Virginia VA
## 711        ILLINOIS IL
## 712        ILLINOIS IL
## 713        Michigan MI
## 714        Michigan MI
## 715        Michigan MI
## 716      WASHINGTON WA
## 717       MINNESOTA MN
## 718           Maine ME
## 719        Illinois IL
## 720        Illinois IL
## 721       Minnesota MN
## 722      California CA
## 723       Minnesota MN
## 724      California CA
## 725    Pennsylvania PA
## 726      California CA
## 727        Michigan MI
## 728        Illinois IL
## 729        Illinois IL
## 730    North Dakota ND
## 731        ILLINOIS IL
## 732        ILLINOIS IL
## 733        Nebraska NE
## 734  North Carolina NC
## 735       Minnesota MN
## 736       MINNESOTA MN
## 737       MINNESOTA MN
## 738        VIRGINIA VA
## 739        Virginia VA
## 740        Virginia VA
## 741    North Dakota ND
## 742       Minnesota MN
## 743    Pennsylvania PA
## 744    Pennsylvania PA
## 745       Minnesota MN
## 746       Minnesota MN
## 747       Minnesota MN
## 748       Minnesota MN
## 749       Minnesota MN
## 750    Pennsylvania PA
## 751        ILLINOIS IL
## 752        Nebraska NE
## 753       MINNESOTA MN
## 754       Minnesota MN
## 755       Minnesota MN
## 756        Michigan MI
## 757       MINNESOTA MN
## 758        Illinois IL
## 759       MINNESOTA MN
## 760        Illinois IL
## 761        Michigan MI
## 762        Michigan MI
## 763        Michigan MI
## 764        Michigan MI
## 765        Michigan MI
## 766       Minnesota MN
## 767            Ohio OH
## 768    North Dakota ND
## 769        NEBRASKA NE
## 770       Minnesota MN
## 771        New York NY
## 772        New York NY
## 773        New York NY
## 774      WASHINGTON WA
## 775       Minnesota MN
## 776       Minnesota MN
## 777       Minnesota MN
## 778        New York NY
## 779        New York NY
## 780        New York NY
## 781        Illinois IL
## 782        New York NY
## 783        Michigan MI
## 784           Maine ME
## 785        Illinois IL
## 786        Illinois IL
## 787        Illinois IL
## 788        Illinois IL
## 789        Illinois IL
## 790        Illinois IL
## 791        Illinois IL
## 792        ILLINOIS IL
## 793       MINNESOTA MN
## 794       MINNESOTA MN
## 795        Illinois IL
## 796        Illinois IL
## 797       MINNESOTA MN
## 798    Pennsylvania PA
## 799        Illinois IL
## 800      Washington WA
## 801        Nebraska NE
## 802        Michigan MI
## 803        Michigan MI
## 804       MINNESOTA MN
## 805        Illinois IL
## 806       Minnesota MN
## 807       MINNESOTA MN
## 808        Illinois IL
## 809        Nebraska NE
## 810        ILLINOIS IL
## 811        ILLINOIS IL
## 812    North Dakota ND
## 813    North Dakota ND
## 814            Ohio OH
## 815            Ohio OH
## 816        Illinois IL
## 817        Illinois IL
## 818        Virginia VA
## 819       Minnesota MN
## 820        Illinois IL
## 821        Illinois IL
## 822            Ohio OH
## 823        Michigan MI
## 824        Virginia VA
## 825        Virginia VA
## 826       MINNESOTA MN
## 827       Minnesota MN
## 828        Michigan MI
## 829       MINNESOTA MN
## 830            Ohio OH
## 831        Illinois IL
## 832       Minnesota MN
## 833        ILLINOIS IL
## 834      California CA
## 835            Ohio OH
## 836    Rhode Island RI
## 837    Rhode Island RI
## 838            Ohio OH
## 839         Indiana IN
## 840       Minnesota MN
## 841       Minnesota MN
## 842       Minnesota MN
## 843       Minnesota MN
## 844        Illinois IL
## 845        Illinois IL
## 846       MINNESOTA MN
## 847        Michigan MI
## 848        Virginia VA
## 849        Illinois IL
## 850        Illinois IL
## 851        Illinois IL
## 852        Illinois IL
## 853        Virginia VA
## 854       Minnesota MN
## 855        Virginia VA
## 856        Virginia VA
## 857        Michigan MI
## 858       Minnesota MN
## 859        ILLINOIS IL
## 860        Illinois IL
## 861        ILLINOIS IL
## 862     Connecticut CT
## 863        New York NY
## 864     Connecticut CT
## 865       Minnesota MN
## 866        Illinois IL
## 867            Ohio OH
## 868  South Carolina SC
## 869       MINNESOTA MN
## 870        ILLINOIS IL
## 871        Illinois IL
## 872        Illinois IL
## 873        ILLINOIS IL
## 874        ILLINOIS IL
## 875        Illinois IL
## 876        Illinois IL
## 877       MINNESOTA MN
## 878       Minnesota MN
## 879    Pennsylvania PA
## 880       Minnesota MN
## 881       MINNESOTA MN
## 882       MINNESOTA MN
## 883        Virginia VA
## 884        Virginia VA
## 885        Illinois IL
## 886        Illinois IL
## 887        Illinois IL
## 888        Illinois IL
## 889     Connecticut CT
## 890           Maine ME
## 891           Maine ME
## 892        Illinois IL
## 893        Virginia VA
## 894        Virginia VA
## 895        Illinois IL
## 896        Virginia VA
## 897        Virginia VA
## 898        MICHIGAN MI
## 899        ILLINOIS IL
## 900        Virginia VA
## 901     Connecticut CT
## 902        Illinois IL
## 903        Illinois IL
## 904        Illinois IL
## 905        Virginia VA
## 906        New York NY
## 907    Rhode Island RI
## 908         Indiana IN
## 909         Indiana IN
## 910       Minnesota MN
## 911       Minnesota MN
## 912       Minnesota MN
## 913      California CA
## 914     Connecticut CT
## 915       Minnesota MN
## 916        Virginia VA
## 917        Illinois IL
## 918        New York NY
## 919        Michigan MI
## 920    Rhode Island RI
## 921        Illinois IL
## 922        Illinois IL
## 923        Illinois IL
## 924        Illinois IL
## 925        Illinois IL
## 926        Illinois IL
## 927        Illinois IL
## 928        Illinois IL
## 929        Illinois IL
## 930        MICHIGAN MI
## 931        Michigan MI
## 932        MICHIGAN MI
## 933    North Dakota ND
## 934        Virginia VA
## 935        ILLINOIS IL
## 936        Illinois IL
## 937        Illinois IL
## 938        ILLINOIS IL
## 939        Illinois IL
## 940        Illinois IL
## 941        Nebraska NE
## 942        Nebraska NE
## 943       MINNESOTA MN
## 944       Minnesota MN
## 945       Minnesota MN
## 946       Minnesota MN
## 947       Minnesota MN
## 948    North Dakota ND
## 949      California CA
## 950       Minnesota MN
## 951        Illinois IL
## 952        ILLINOIS IL
## 953        Illinois IL
## 954        Michigan MI
## 955        Michigan MI
## 956       Minnesota MN
## 957        MICHIGAN MI
## 958        Illinois IL
## 959        New York NY
## 960        ILLINOIS IL
## 961        Illinois IL
## 962      California CA
## 963      California CA
## 964      California CA
## 965      California CA
## 966      California CA
## 967      California CA
## 968        Illinois IL
## 969        Illinois IL
## 970        Michigan MI
## 971        Michigan MI
## 972      California CA
## 973      California CA
## 974      California CA
## 975      California CA
## 976        Illinois IL
## 977            Ohio OH
## 978        Illinois IL
## 979        New York NY
## 980    Pennsylvania PA
## 981    Pennsylvania PA
## 982            Ohio OH
## 983        Illinois IL
## 984        ILLINOIS IL
## 985       Minnesota MN
## 986        ILLINOIS IL
## 987        Michigan MI
## 988    Pennsylvania PA
## 989            Ohio OH
## 990        ILLINOIS IL
## 991      California CA
## 992        Illinois IL
## 993        Michigan MI
## 994        Virginia VA
## 995        Virginia VA
## 996    North Dakota ND
## 997    North Dakota ND
## 998        Michigan MI
## 999       MINNESOTA MN
## 1000       NEBRASKA NE
## 1001     California CA
## 1002     California CA
## 1003    Connecticut CT
## 1004     Washington WA
## 1005      MINNESOTA MN
## 1006       Michigan MI
## 1007      MINNESOTA MN
## 1008     Washington WA
## 1009      MINNESOTA MN
## 1010       ILLINOIS IL
## 1011      Minnesota MN
## 1012   Pennsylvania PA
## 1013     California CA
## 1014   North Dakota ND
## 1015      Minnesota MN
## 1016   North Dakota ND
## 1017      Minnesota MN
## 1018   North Dakota ND
## 1019       ILLINOIS IL
## 1020   North Dakota ND
## 1021        Indiana IN
## 1022     California CA
## 1023           Ohio OH
## 1024      Minnesota MN
## 1025      Minnesota MN
## 1026      Minnesota MN
## 1027       Virginia VA
## 1028   North Dakota ND
## 1029       Virginia VA
## 1030       Illinois IL
## 1031       Michigan MI
## 1032       Michigan MI
## 1033       Illinois IL
## 1034       Illinois IL
## 1035       Illinois IL
## 1036       Illinois IL
## 1037     Washington WA
## 1038           Ohio OH
## 1039      Minnesota MN
## 1040       Illinois IL
## 1041       Michigan MI
## 1042       Michigan MI
## 1043      MINNESOTA MN
## 1044       Illinois IL
## 1045       ILLINOIS IL
## 1046       Michigan MI
## 1047      MINNESOTA MN
## 1048       ILLINOIS IL
## 1049   Pennsylvania PA
## 1050       Nebraska NE
## 1051      Minnesota MN
## 1052      Minnesota MN
## 1053      Minnesota MN
## 1054       MICHIGAN MI
## 1055     Washington WA
## 1056       MICHIGAN MI
## 1057       ILLINOIS IL
## 1058       ILLINOIS IL
## 1059       ILLINOIS IL
## 1060       ILLINOIS IL
## 1061      MINNESOTA MN
## 1062       New York NY
## 1063      Minnesota MN
## 1064   Pennsylvania PA
## 1065      Minnesota MN
## 1066   Pennsylvania PA
## 1067      MINNESOTA MN
## 1068      MINNESOTA MN
## 1069      MINNESOTA MN
## 1070      MINNESOTA MN
## 1071      MINNESOTA MN
## 1072      MINNESOTA MN
## 1073      MINNESOTA MN
## 1074      MINNESOTA MN
## 1075      MINNESOTA MN
## 1076      Minnesota MN
## 1077      Minnesota MN
## 1078      Minnesota MN
## 1079      Minnesota MN
## 1080      Minnesota MN
## 1081       ILLINOIS IL
## 1082       Michigan MI
## 1083       Michigan MI
## 1084       Michigan MI
## 1085       Michigan MI
## 1086      Minnesota MN
## 1087   South Dakota SD
## 1088   SOUTH DAKOTA SD
## 1089   South Dakota SD
## 1090       NEW YORK NY
## 1091       Michigan MI
## 1092           Ohio OH
## 1093     California CA
## 1094       ILLINOIS IL
## 1095         Oregon OR
## 1096       Michigan MI
## 1097    Connecticut CT
## 1098       Virginia VA
## 1099       ILLINOIS IL
## 1100       Virginia VA
## 1101      Minnesota MN
## 1102    Connecticut CT
## 1103       Illinois IL
## 1104    Connecticut CT
## 1105       Virginia VA
## 1106       Illinois IL
## 1107           Ohio OH
## 1108       New York NY
## 1109       Nebraska NE
## 1110      Minnesota MN
## 1111       Illinois IL
## 1112      Minnesota MN
## 1113       Illinois IL
## 1114       MICHIGAN MI
## 1115       Illinois IL
## 1116       ILLINOIS IL
## 1117       Virginia VA
## 1118       Illinois IL
## 1119       Illinois IL
## 1120      Minnesota MN
## 1121     California CA
## 1122           Ohio OH
## 1123       Illinois IL
## 1124     California CA
## 1125       Illinois IL
## 1126       Illinois IL
## 1127           Ohio OH
## 1128     California CA
## 1129       Illinois IL
## 1130           Ohio OH
## 1131   North Dakota ND
## 1132       Michigan MI
## 1133        Indiana IN
## 1134    Connecticut CT
## 1135           Ohio OH
## 1136     WASHINGTON WA
## 1137       New York NY
## 1138          Maine ME
## 1139    Connecticut CT
## 1140   Pennsylvania PA
## 1141           Ohio OH
## 1142   North Dakota ND
## 1143       Nebraska NE
## 1144       Virginia VA
## 1145       Michigan MI
## 1146     California CA
## 1147      Minnesota MN
## 1148       Michigan MI
## 1149           Ohio OH
## 1150           Ohio OH
## 1151      Minnesota MN
## 1152      Minnesota MN
## 1153   Pennsylvania PA
## 1154      Minnesota MN
## 1155      Minnesota MN
## 1156           Ohio OH
## 1157      Minnesota MN
## 1158      Minnesota MN
## 1159       Michigan MI
## 1160      MINNESOTA MN
## 1161       ILLINOIS IL
## 1162      Minnesota MN
## 1163      MINNESOTA MN
## 1164   North Dakota ND
## 1165          Maine ME
## 1166       Michigan MI
## 1167     Washington WA
## 1168   Pennsylvania PA
## 1169           Ohio OH
## 1170           Ohio OH
## 1171       New York NY
## 1172       Michigan MI
## 1173       Michigan MI
## 1174       Michigan MI
## 1175       Michigan MI
## 1176       Michigan MI
## 1177       Illinois IL
## 1178   Rhode Island RI
## 1179           Ohio OH
## 1180       ILLINOIS IL
## 1181       Nebraska NE
## 1182      Minnesota MN
## 1183      Minnesota MN
## 1184       Michigan MI
## 1185       Illinois IL
## 1186       Illinois IL
## 1187       Illinois IL
## 1188      Minnesota MN
## 1189       Illinois IL
## 1190      Minnesota MN
## 1191      Minnesota MN
## 1192      Minnesota MN
## 1193   North Dakota ND
## 1194      Minnesota MN
## 1195      Minnesota MN
## 1196      Minnesota MN
## 1197   North Dakota ND
## 1198       Michigan MI
## 1199   Pennsylvania PA
## 1200      MINNESOTA MN
## 1201       New York NY
## 1202   Pennsylvania PA
## 1203       Nebraska NE
## 1204   Pennsylvania PA
## 1205       NEBRASKA NE
## 1206       New York NY
## 1207      Minnesota MN
## 1208       Michigan MI
## 1209       Michigan MI
## 1210     Washington WA
## 1211      Minnesota MN
## 1212   Pennsylvania PA
## 1213           Ohio OH
## 1214     California CA
## 1215       Illinois IL
## 1216       Illinois IL
## 1217   North Dakota ND
## 1218       Michigan MI
## 1219      Minnesota MN
## 1220      Minnesota MN
## 1221      Minnesota MN
## 1222       ILLINOIS IL
## 1223    Connecticut CT
## 1224       MICHIGAN MI
## 1225       MICHIGAN MI
## 1226      MINNESOTA MN
## 1227       Michigan MI
## 1228       Michigan MI
## 1229       Virginia VA
## 1230      Minnesota MN
## 1231      Minnesota MN
## 1232      Minnesota MN
## 1233       Illinois IL
## 1234     California CA
## 1235   Pennsylvania PA
## 1236     California CA
## 1237       Michigan MI
## 1238       Michigan MI
## 1239       Michigan MI
## 1240       Nebraska NE
## 1241      MINNESOTA MN
## 1242           Ohio OH
## 1243      Minnesota MN
## 1244      Minnesota MN
## 1245      Minnesota MN
## 1246      Minnesota MN
##                                                       School.Name   NCES.SchID
## 1                                                     18+ PROGRAM 318009000000
## 2                                                  270 - HAP - IS 270003000000
## 3                                         270 HOPKINS ALTERNATIVE 270003000000
## 4                                                  270 HOPKINS IS 270003000000
## 5                                   270 HOPKINS NORTH JR HIGH ALC 270003000000
## 6                                    270 HOPKINS WEST JR HIGH ALC 270003000000
## 7                                     272 CENTRAL MIDDLE SCH. ALT 270003000000
## 8                                          276 MINNETONKA COMPASS 270003000000
## 9                                   276 MINNETONKA COMPASS EXT YR 270003000000
## 10                                           276 MINNETONKA HS IS 270003000000
## 11                             277 WESTONKA AREA LEARNING ACADEMY 270003000000
## 12                                     277-GRANDVIEW MIDDLE - ALC 270003000000
## 13                              283 ST LOUIS PK INDEPENDENT STUDY 270003000000
## 14                               283-IND STDY 15 AND UNDER - I.S. 270003000000
## 15                                         283-ST. LOUIS PARK ALC 270003000000
## 16                               4092 - WATERSHED HIGH SCHOOL ALC 270003000000
## 17                                4122 - EAGLE RIDGE ACADEMY - IS 270003000000
## 18                              4126 - PRAIRIE SEEDS ACADEMY - IS 270003000000
## 19                                          916 MAHTOMEDI ACADEMY 270226000000
## 20                                                       917 DASH 270003000000
## 21                               917 INTRA-DAKOTA EDUCATIONAL ALT 270003000000
## 22                                                      917 PACES 270003000000
## 23                                                        917 SUN 270003000000
## 24                            917 TRANSITIONAL EDUCATION SERV ALT 270003000000
## 25                                     A E R O Educational Center 170002000000
## 26                                      A W Beattie Career Center 428001000000
## 27                            A. Linwood Holton Governor's School 510003000000
## 28                                                    A/O PROGRAM 270226000000
## 29                                                   Able Program 170138000000
## 30                                     Acad for Lifelong Learning 170003000000
## 31                               Academic Behavior&Community Acad 170016000000
## 32                                           Academy for Learning 170138000000
## 33                           Academy of Aerospace and Engineering  90070001513
## 34                Academy of Aerospace and Engineering Elementary  90070001629
## 35                              Academy of Science and Innovation  90070001592
## 36                                   ADAMS CO EARLY LEARNING CNTR 318009000000
## 37                                              Adams County RSSP 170016000000
## 38                                             Admiral Peary AVTS 428012000000
## 39                                      Adult Transition Services 268070000000
## 40                    ALBANY-SCHOHARIE-SCHENECTADY-SARATOGA BOCES 368010000000
## 41                                     ALC - EDEN PRAIRIE HS - IS 270003000000
## 42                                             ALC - Gateway - EY 270003000000
## 43                                                ALC - NECA - EY 270003000000
## 44                                                ALC - SECA - EY 270003000000
## 45                                               ALC - W-ALT - EY 270003000000
## 46                                         ALC EDEN PRAIRIE HS-IS 270003000000
## 47                                  ALC EDINA HS ALTERNATIVE - IS 270003000000
## 48                                  ALC RICHFIELD - SUCCESS AT 15 270003000000
## 49                                            ALC RICHFIELD HS-IS 270003000000
## 50                                              ALC WESTONKA - IS 270003000000
## 51                                       ALC-ORONO HIGH SCHOOL IS 270003000000
## 52                                           ALEGENT/IMMANUEL RTC 310018000000
## 53                                     Alexander Learning Academy 270042000000
## 54             Allegan County Area Technical and Education Center 268010000000
## 55                                                  Allina PHP CT 270003000000
## 56                                 ALOP Academic Learning Program 170022000000
## 57                                      ALP @ CAPITOL VIEW CENTER 270226000000
## 58                   Altern Ed Prgm/Behav Disord Youth/Montgomery 510008000000
## 59                                              Amador County ROP  60008910738
## 60                                        Amelia-Nottoway Voc Ctr 510001000000
## 61                Ana Grace Academy of the Arts Elementary School  90070001623
## 62                                            Antelope Valley ROP  60011210925
## 63                                           ANTHONY LOUIS CENTER 270003000000
## 64                                           Apollo Career Center 390508000000
## 65                          Appomattox Regional Governor's School 510003000000
## 66                                                  Arbor Academy 170003000000
## 67                                                            ARC 170016000000
## 68                                    Arcola Bridges/Beacons RSSP 170018000000
## 69                                          Area 30 Career Center 180003000000
## 70                                                           ARIS 270226000000
## 71                Arts at the Capitol Theater Magnet School (ACT)  90136001507
## 72                                                    ASD PROGRAM 270006000000
## 73                                      Ashaway Elementary School 440015000000
## 74                                 Ashland-W Holmes Career Center 390620000000
## 75                   Ashtabula County Technical and Career Campus 390508000000
## 76                                 Aspire Alternative High School 170017000000
## 77                                         ASSESSMENT CENTER ELEM 270226000000
## 78                                          ASSESSMENT CENTER SEC 270226000000
## 79                                                 ASSIST RSSP 12 170017000000
## 80                                                ASSIST TAOEP 12 170017000000
## 81                                                         ATTAIN 270003000000
## 82                                              Auburn Vocational 390512000000
## 83                              Austin Albert Lea Area Sp Ed Coop 270043000000
## 84                        Auxiliary Preschool and Services Center 268072000000
## 85                                                 Baldy View ROP  60013111116
## 86                                  Barnwell County Career Center 450098000000
## 87                                    Barry ISD Special Education 268014000000
## 88                                            BBE LEARNING CENTER 270009000000
## 89                             BEACON PROGRAM W CENTRAL ED. DIST. 279146000000
## 90                  Beaufort-Jasper Academy for Career Excellence 450110000000
## 91                                              Beaver County CTC 428050000000
## 92                                Bedford County Technical Center 420000000000
## 93                                    Behavioral Education Center 268099000000
## 94                                        BEHAVIORALLY DISORDERED 318004000000
## 95                                      BELLAIRE EDUCATION CENTER 270226000000
## 96                                          Belmont Career Center 390509000000
## 97                            BEMIDJI REGIONAL INTERDIST. COUNCIL 270005000000
## 98                            Benton Stearns Education District 1 270007000000
## 99                                  BENTON-STEARNS ED DISTRICT EC 270007000000
## 100                                   BENTON-STEARNS ED. DISTRICT 270007000000
## 101                               BENTON-STEARNS EDUCATION CENTER 270007000000
## 102                                         Berks CTC-East Campus 428006000000
## 103                                         Berks CTC-West Campus 428006000000
## 104                                Berrien County Juvenile Center 268016000000
## 105                                    Bert Goens Learning Center 268099000000
## 106                                                Bethlehem AVTS 428037000000
## 107                             Bi-County Sp Ed Preschool Program 170023000000
## 108                                          BISMARCK CAREER ACAD 380040000000
## 109                                         BISMARCK SPEC ED UNIT 388072000000
## 110                                          BISMARCK TECH CENTER 388075000000
## 111                                            Biyaagozhoo Center  40041902897
## 112                                Black Hawk Area Special Ed Ctr 170008000000
## 113                      Black Hills Academy at Canyon Hills - 08 468012000000
## 114          Black Hills Academy at Canyon Hills High School - 07 468012000000
## 115                                   Blossomland Learning Center 268016000000
## 116                                  Blue Ridge Governor's School 510006000000
## 117                                           Boone County Center 170002000000
## 118             BOYS TOWN INTERVENTION/ASSESSMENT INTERIM PROGRAM 310015000000
## 119                                             Bozymowski Center 268072000000
## 120                                    Branch Area Careers Center 268018000000
## 121                                      Braun Educational Center 170139000000
## 122                     Breaking Barriers Alternative Ed/Henry Co 510010000000
## 123                                         BRIDGEPORT HEAD START 318013000000
## 124                                       Bridges Learning Center 170007000000
## 125            Bridging Communities Reg Career & Technical Center 510026000000
## 126                             Bridging Communities STEM Academy 510026000000
## 127                                           BROOK VALLEY SCHOOL 318003000000
## 128                                     Brookside Learning Center 268022000000
## 129                                   BROOME-DELAWARE-TIOGA BOCES 368014000000
## 130                                        Bryce Ash Grove Ed Ctr 170005000000
## 131                                         Buckeye Career Center 390517000000
## 132                  Buckeye Career Center Annex-Hiland Satellite 390517000000
## 133                                   Buckeye Hills Career Center 390621000000
## 134                            Bucks County Technical High School 428009000000
## 135                                                Buffalo Campus 390513000000
## 136                                  BURLEIGH COUNTY SPEC ED UNIT 388012000000
## 137                                            Butler County AVTS 428052000000
## 138                               New Horizons Butler Farm Campus 510001000000
## 139                                 Butler Tech Bioscience Center 390509000000
## 140                            Butler Tech Natural Science Center 390509000000
## 141                                Butler Tech School of the Arts 390509000000
## 142                                              Butte County ROP  60009010744
## 143  California Advancing Pathways for Students in Los Angeles Co  60144014016
## 144                                    Calhoun Area Career Center 268020000000
## 145                                  Calhoun County Juvenile Home 268020000000
## 146                                  CANNON FALLS ALC HIGH SCHOOL 279144000000
## 147                               Cannon Falls HS Credit Recovery 279144000000
## 148                           Carbon Career & Technical Institute 428013000000
## 149                                                 CARDS Program 270033000000
## 150                                                  Care Program 170031000000
## 151                                     CAREER & TECHNICAL CENTER 270226000000
## 152                                Career and Technical Education 268051000000
## 153                         Career and Technical Education Center 268056000000
## 154                Career and Technology Center of Anderson 1 & 2 450076000000
## 155                     Career and Technology Educational Centers 390512000000
## 156                                       Career Education Center  60014811540
## 157                                Career Institute of Technology 428038000000
## 158                                        Careerline Tech Center 268090000000
## 159                                   Carman Park Early Childhood 268040000000
## 160                     Carroll-Galax Reg Alt Ed Prgm/The RAE Ctr 510010000000
## 161                            CASS COUNTY CAREER AND TECH CENTER 380040000000
## 162                       CATTARAUGUS-ALLEGANY-ERIE-WYOMING BOCES 368015000000
## 163                                         CAYUGA-ONONDAGA BOCES 368018000000
## 164                                       CCSI Alternative School 170020000000
## 165                                Center for Countywide Programs 268040000000
## 166                                           Center for Educ Opp 170020000000
## 167                                            CENTRAL HEAD START 318013000000
## 168                                       CENTRAL LEARNING CENTER 318008000000
## 169                                CENTRAL LEARNING CENTER  SOUTH 318008000000
## 170                            CENTRAL MINNESOTA JT. POWERS DIST. 270014000000
## 171                                    CENTRAL MN ALC HOLDINGFORD 270014000000
## 172                                        CENTRAL MN ALC KIMBALL 270014000000
## 173                                        CENTRAL MN ALC SARTELL 270014000000
## 174                            CENTRAL MN AREA LEARN CNTR - FOLEY 270014000000
## 175                                 CENTRAL MN. ALC - SAUK RAPIDS 270014000000
## 176                          Central Montco Technical High School 428033000000
## 177                                    Central Nine Career Center 180147000000
## 178                  Central Orange County CTE Partnership (CTEp)  60012410999
## 179                      Central PA Institute of Science & Techno 428053000000
## 180                                            Central Sierra ROP  60009610770
## 181                            Central Virginia Governor's School 510217000000
## 182                                      Central Westmoreland CTC 428047000000
## 183                                  Centralia Alternative School 170017000000
## 184                                  Chana Educ Center/Rock River 170008000000
## 185                                    CharEm Alternative Schools 268024000000
## 186                              CharEm Special Education Schools 268024000000
## 187                                            The R.Y.S.E School 440015000000
## 188                                Chariho Career and Tech Center 440015000000
## 189                                           Chariho High School 440015000000
## 190                                Chariho Regional Middle School 440015000000
## 191                                 Charlestown Elementary School 440015000000
## 192                                Charlottesville-Albemarle Tech 510000000000
## 193                              Chesapeake Bay Governor's School 510003000000
## 194                     Chester County Tech College HS Brandywine 420290000000
## 195                       Chester County Tech College HS Pennocks 420290000000
## 196                      Chester County Tech College HS Pickering 420290000000
## 197                                CHILD GUIDANCE CNTR TGH SCHOOL 310015000000
## 198                           Chisago County Schools' Life Work C 270002000000
## 199                                         Chrismont Safe School 170017000000
## 200                                                           CIP 270003000000
## 201                                        Circuit Breaker School 170023000000
## 202                                 Clallam Co Juvenile Detention 530001000000
## 203                                      ClareGladwin Area School 268030000000
## 204                                  Clarion County Career Center 428015000000
## 205                        Clark County Juvenile Detention School 530001000000
## 206                                         Clearfield County CTC 428016000000
## 207                               Clinton County Education Center 268032000000
## 208                         CLINTON-ESSEX-WARREN-WASHINGTON BOCES 368022000000
## 209                              Clnton/Mrn/Wshngtn Pre-Kind Prog 170017000000
## 210                                                 Coastline ROP  60012310998
## 211                                         CodeRVA Regional High 510026000000
## 212                                           Colt Andrews School 440007000000
## 213                                   Colton-Redlands-Yucaipa ROP  60013011115
## 214                                         Columbia-Montour AVTS 420637000000
## 215                                             Columbiana County 390509000000
## 216                                Commonwealth Governor's School 510004000000
## 217                               Community Based Early Childhood 268030000000
## 218                      Community Based Early Childhood Services 268016000000
## 219                      Community Based Early Childhood Services 268070000000
## 220                      Community Based Early Childhood Services 268097000000
## 221                          Community Based Instruction  Zeeland 268090000000
## 222                              Communitybased Transition Center 268099000000
## 223                                           Compton Unified ROP  60011310926
## 224                                     Connecticut River Academy  90345001581
## 225                                           Connections Program 170143000000
## 226                      Connellsville Area Career & Technical Ce 428022000000
## 227                                       Contra Costa County ROP  60009210761
## 228                                                 Coolidge RSSP 170020000000
## 229                                                      COOR CTE 268092000000
## 230                                 COOR Early Childhood Services 268092000000
## 231                               COOR Special Educational Center 268092000000
## 232                                              COP ESD Programs 268026000000
## 233                                       Cope Alternative School 170019000000
## 234                                       Cope Area Career Center 450001000000
## 235                                Copper Country Learning Center 268051000000
## 236                                          CORNERSTONES PROGRAM 270005000000
## 237                                Coshocton County Career Center 390652000000
## 238                                                 COSSA ACADEMY 160015000000
## 239                                   Covered Bridge Spec Ed Dist 180242000000
## 240                          Cowlitz County Youth Services Center 530001000000
## 241                                           Crawford County CTC 428017000000
## 242                           Crossroads Alternative/Bristol City 510009000000
## 243                                      CTC of Lackawanna County 428026000000
## 244                                         Cumberland Perry AVTS 428018000000
## 245                           Customized Alternative Solutions fo 270003000000
## 246                                 Cuyahoga Valley Career Center 390509000000
## 247                                                    CVSEC STEP 270042000000
## 248                                              Cyd Lash Academy 170006000000
## 249                         D Russel Lee Career-Technology Center 390509000000
## 250                                               DAKOTA CTY. ALC 270003000000
## 251                               Daniel Morgan Technology Center 450347000000
## 252                               Dauphin County Technical School 420739000000
## 253                                          DEAF/HARD OF HEARING 270003000000
## 254                                Deaf/Hard of Hearing/MN Prgrms 170143000000
## 255                              Dean Jennings Educational Center 268048000000
## 256                                          Del Norte County ROP  60009310765
## 257                      Delaware Area Career Center North Campus 390510000000
## 258                      Delaware Area Career Center South Campus 390510000000
## 259                      Delaware County Technical High School-As 428020000000
## 260                      Delaware County Technical High School-Fo 428020000000
## 261                      Delaware County Technical High School-Ma 428020000000
## 262                        DELAWARE-CHENANGO-MADISON-OTSEGO BOCES 368026000000
## 263                                  DeltaSchoolcraft Area Center 268034000000
## 264             DeltaSchoolcraft Manistique Area Satellite Center 268034000000
## 265                                  DEQUEEN/MENA AREA VOC CENTER  50003700645
## 266                                              Detention Center 268050000000
## 267                                      Developmental Classrooms 268076000000
## 268                       Developmental Disabilities Program - 01 468012000000
## 269                              Developmental Learning Pgm   DLP 170031000000
## 270                                              Diamond Oaks Cdc 390511000000
## 271                      Dickinson Iron Early Childhood Education 268036000000
## 272                                        DICKINSON SPEC ED UNIT 388045000000
## 273                               DickinsonIron Special Education 268036000000
## 274                                  DickinsonIron Tech Ed Center 268036000000
## 275                       Dillon County Applied Technology Center 450187000000
## 276                                            Directions Program 170143000000
## 277                                             Discovery Academy  90070001597
## 278                                       DISTRICT SERVICE CENTER 270003000000
## 279                       Dorchester Career and Technology Center 450199000000
## 280                                     Doris Klaussen Dev Center 268020000000
## 281                                   DOUGLAS COUNTY YOUTH CENTER 310015000000
## 282                                                 DREAM Academy 170019000000
## 283                     Dual Language & Arts Magnet Middle School  90345001556
## 284                                                   DuPage Alop 170018000000
## 285                                                DUTCHESS BOCES 368028000000
## 286                                   Eagle Park Community School 180832000000
## 287                                               Early Childhood 268076000000
## 288                                 Early Childhood ProgramsWSESD 268076000000
## 289                             EARLY CHILDHOOD SPECIAL EDUCATION 270001000000
## 290                                        Early College Alliance 268099000000
## 291                   Early College at Montcalm Community College 268083000000
## 292                                               Early Education 268018000000
## 293                                                      Early On 268040000000
## 294                                   Early On  Special Education 268040000000
## 295                                                 Early OnWSESD 268076000000
## 296                                           East Aurora HS RSSP 170019000000
## 297                                     EAST CENTRAL SPEC ED UNIT 388026000000
## 298                              EAST RANGE SEC. TECHNICAL CENTER 270003000000
## 299                                   East San Gabriel Valley ROP  60010510918
## 300                                             EAST VIEW ACADEMY 270226000000
## 301                          Eastern Center for Arts & Technology 428034000000
## 302                                       EASTERN LEARNING CENTER 318008000000
## 303                                         EASTERN SUFFOLK BOCES 368082000000
## 304                                      Eastern Westmoreland CTC 428048000000
## 305                                        EASTERN WRIGHT PROGRAM 270005000000
## 306                                        Eastland Career Center 390510000000
## 307                              Eastview Elementary School - SNW 270041000000
## 308                               Eastwood Early Childhood Center 268077000000
## 309                                       Eaton RESA  Great Start 268038000000
## 310                                Eaton RESA  Meadowview Offsite 268038000000
## 311                                 Eaton RESA  Meadowview Onsite 268038000000
## 312                          Eaton RESA Career Preparation Center 268038000000
## 313                                           Eaton RESA Early On 268038000000
## 314                      Eaton RESA Great Start Readiness Program 268038000000
## 315                                                EC & HK SUMMER 279144000000
## 316                                   ECHO Juvenile Detention Ctr 170018000000
## 317                                                   Echo School 170138000000
## 318                                   Ed & Life Skills Transition 170003000000
## 319                                                 Eden Area ROP  60008510732
## 320                                       EDOP DCALS EXTENDED DAY 270003000000
## 321                         Fremont Education and Activity Center 268086000000
## 322                                           Educational Daycare 170008000000
## 323                                    EDUCATIONAL SERVICE UNIT 5 318005000000
## 324                                           Ehove Career Center 390510000000
## 325                                             EHS SUMMER SCHOOL 270003000000
## 326                                           Elliott Street Bldg 268090000000
## 327                                              ELM TREE ACADEMY 270001000000
## 328                                 Elmer A Knopf Learning Center 268040000000
## 329                                    EMMONS COUNTY SPEC ED UNIT 388040000000
## 330                                                  Enrich Alden 270033000000
## 331                                              Enrich Kingsland 270033000000
## 332                                                Enrich Program 270033000000
## 333                          Enterprise Academy/Newport News City 510007000000
## 334                                                       EPSILON 270003000000
## 335                                                  ERIE 1 BOCES 368030000000
## 336                           ERIE 2-CHAUTAUQUA-CATTARAUGUS BOCES 368032000000
## 337                                  Erie County Technical School 428021000000
## 338                                      ESA 112 Special Ed Co-Op 530034000000
## 339                               ESD 112 Open Doors Reengagement 530001000000
## 340                                ESU #9 PRESCHOOL HOME BASE PRG 318009000000
## 341                                      ESU 2 INDEPENDENT SCHOOL 318002000000
## 342               EUPISD Community Based Early Childhood Services 268028000000
## 343                                   Rudyard Area Service Center 268028000000
## 344                                             Evergreen Academy 170020000000
## 345                                     Excel Alternative Program 170032000000
## 346                                Exeter-West Greenwich Reg. Jr. 440036000000
## 347                                Exeter-West Greenwich Regional 440036000000
## 348                                                       EXPLORE 270003000000
## 349                                    F. E. Dubose Career Center 450160000000
## 350                                       Fairfield Career Center 390510000000
## 351                                            FARGO SPEC ED UNIT 388041000000
## 352                      Fayette County Career & Technical Instit 428056000000
## 353                            FERGUS FALLS EARLY CHILDHOOD SP ED 270004000000
## 354                              FERGUS FALLS EC/ELEMENTARY SP ED 270004000000
## 355                             FERGUS FALLS ELEMENTARY SP ED 5-8 270004000000
## 356                                              First Step Adams 270033000000
## 357                                              First Step Alden 270033000000
## 358                              Five County Regional Alternative 170019000000
## 359                                                  FLEX Program 170018000000
## 360                                                Flight Program 270033000000
## 361                                                         FOCUS 270003000000
## 362                                        FOCUS Safe Sch Program 170017000000
## 363                                               Forbes Road CTC 428002000000
## 364                                Deaf/Hard of Hearing (Dist 62) 170003000000
## 365                                      FORT TOTTEN SPEC ED UNIT 388043000000
## 366                                               Forty-Niner ROP  60008211008
## 367                                     Four County Career Center 390510000000
## 368                                           Franklin County CTC 428023000000
## 369                                 FRANKLIN-ESSEX-HAMILTON BOCES 368034000000
## 370                                           Freedom Academy ALC 270042000000
## 371                                          Freedom Acres School 268054000000
## 372                                 Freeport Alternative High Sch 170017000000
## 373                              Fresh Start Treatment & Learning 170002000000
## 374                                      FRESHWATER ED. DIST. ALC 270001000000
## 375                                                    Fresno ROP  60009810788
## 376                                    STANDING ROCK SPEC ED UNIT 380006000000
## 377                                            Fulton County AVTS 420001000000
## 378                                             Futures Unlimited 170020000000
## 379                            G. Frank Russell Technology Center 450001000000
## 380                                             Gages Lake School 170006000000
## 381                                       Gateway to College - IS 270003000000
## 382                                      Genesee Career Institute 268040000000
## 383                                 Genesee ISD Transition Center 268040000000
## 384                                          GENESEE VALLEY BOCES 368046000000
## 385                                             GERING HEAD START 318013000000
## 386                                        GIRESD Center Programs 268046000000
## 387                           Glacial Ridge Transitional Skills P 270004000000
## 388                       Glastonbury/East Hartford Magnet School  90070000072
## 389                                          Glen H Peters School 268072000000
## 390                                              Glenn County ROP  60009910791
## 391                        GogebicOntonagon ISD Special Education 268042000000
## 392                           Goodhue High School Credit Recovery 279144000000
## 393                                Governor's School for the Arts 510218000000
## 394                       Governor's School of Southside Virginia 510003000000
## 395                                Grand Chain Alternative Center 170033000000
## 396                         GRAND FORKS AREA CAREER & TECH CENTER 380040000000
## 397                                      GRAND FORKS SPEC ED UNIT 388047000000
## 398                      GRAND ISLAND INTERVENTION AND ASSESSMENT 310015000000
## 399                                           GRAVITY High School 530001000000
## 400                                 Great Lakes Bay Early College 268093000000
## 401                     GREAT NORTHWEST AREA CAREER & TECH CENTER 380040000000
## 402                                     Great Parents Great Start 268072000000
## 403                                     Great Parents Great Start 268079000000
## 404                                 Great Start Readiness Program 268082000000
## 405                                           Greater Altoona CTC 428008000000
## 406   Greater Hartford Academy of  the Arts High School - Full Ti  90070001497
## 407            Greater Hartford Academy of the Arts Magnet Middle  90070001625
## 408                                         Greater Johnstown CTC 421097000000
## 409                     Greater Peninsula Governor's STEM Academy 510001000000
## 410                                    Greeley Alternative School 170020000000
## 411                                   Greene County Career Center 390510000000
## 412                                             Greene County CTC 428024000000
## 413                                     Greene-Sullivan Sp Ed Sch 180001000000
## 414                                             Greenfield School 268048000000
## 415                                              GST SPEC ED UNIT 388042000000
## 416                                                          GTEC 268046000000
## 417                                               Guiteras School 440007000000
## 418                                             H E L P  Marshall 170002000000
## 419                                             H E L P  Sullivan 170002000000
## 420                                  H. B. Swofford Career Center 450001000000
## 421                              HAMILTON-FULTON-MONTGOMERY BOCES 368040000000
## 422                               Harbor Academy Reg Safe Sch Prg 170022000000
## 423                                    HARMS ADV TECH CENTER-WNCC 318013000000
## 424                                        Harrison Career Center 390509000000
## 425                                                      Hart ROP  60011110924
## 426                                   Hazleton Area Career Center 428057000000
## 427                                               HEADWAY ACADEMY 270003000000
## 428                                         Headway Academy North 270003000000
## 429                        HEALTH & FAMILY RESOURCE CENTER (HFRC) 318013000000
## 430                                       Heartland Career Center 181193000000
## 431                            Heartlands Institute of Technology 268054000000
## 432                                              Heartwood School 268052000000
## 433                                        Helensview High School 418018000000
## 434                                   HENNEPIN GATEWAY TO COLLEGE 270003000000
## 435                                   HENNEPIN TECHNICAL PATHWAYS 270003000000
## 436                                   HENNEPIN TECHNICAL PATHWAYS 270003000000
## 437                         HERKIMER-FULTON-HAMILTON-OTSEGO BOCES 368042000000
## 438                               Deaf/Hard of Hearing (Dist 214) 170003000000
## 439                                             High Point School 268099000000
## 440                                         Highland Pines School 268098000000
## 441                                  Hillsdale ISD Local Programs 268048000000
## 442                            Hillsdale Workforce DevTech Center 268048000000
## 443                            Hillside Learning  Behavior Center 268010000000
## 444                                                    HOME BASED 318013000000
## 445                                 Hope Valley Elementary School 440015000000
## 446                                     Hopp Elementary/Secondary 550002000000
## 447                                     Hoyleton Education Center 170007000000
## 448                                              Hugh Cole School 440007000000
## 449                                           Humboldt County ROP  60010010802
## 450                                         Huntingdon County CTC 428025000000
## 451                                   Huron Area Technical Center 268050000000
## 452                                         Huron Learning Center 268050000000
## 453                                                     HVED ECSE 270006000000
## 454                                         HVED Spectrum Program 270006000000
## 455                             I Kan Regional Alternatve Att Ctr 170019000000
## 456                                           Imperial Valley ROP  60010110803
## 457                                              IMPRINTS PROGRAM 279135000000
## 458                              Indiana County Technology Center 428066000000
## 459                           INFINITY:MINNESOTA  DIGITAL ACADEMY 270031000000
## 460                                    Ingham Administrative Unit 268052000000
## 461                                       Ingham ISD ASD Programs 268052000000
## 462                                 Instructional Resource Center 390511000000
## 463                                          Intensive DCD  - SNW 270041000000
## 464                                 INTENSIVE INTERAGENCY PROGRAM 270004000000
## 465                                         International Academy 268088000000
## 466            International Magnet School for Global Citizenship  90070001511
## 467                                                     INTERSECT 270003000000
## 468                                            INVEST HIGH SCHOOL 270003000000
## 469                                             INVEST TRANSITION 270003000000
## 470                                  Iosco RESA Special Education 268056000000
## 471                                         ISD 361 - ALC Program 270022000000
## 472                                  ISD Early Childhood Services 268083000000
## 473                                      ISDLocal Center Programs 268083000000
## 474                                             ISDLocal Programs 268050000000
## 475                                        Ivan K Garrison Center 170008000000
## 476                                    Jackson Area Career Center 268058000000
## 477            Jackson ISD Local Based Special Education Programs 268058000000
## 478                               Jackson River Governor's School 510006000000
## 479                                        Jackson River Tech Ctr 510000000000
## 480                                        Jackson/Perry MS TAOEP 170019000000
## 481                               JAMES RIVER SPEC ED COOPERATIVE 380040000000
## 482                        JAMES VALLEY AREA CAREER & TECH CENTER 388068000000
## 483                                   James Whitcomb Riley School 170003000000
## 484                                        JAMESTOWN SPEC ED UNIT 380039000000
## 485                    JCCLISD Academy  A Regional Middle College 268068000000
## 486                              JEFFERSON AREA VOCATIONAL CENTER  50002400588
## 487                                              Jefferson County 390511000000
## 488                                  Jefferson County-DuBois AVTS 421234000000
## 489                JEFFERSON-LEWIS-HAMILTON-HERKIMER-ONEIDA BOCES 368044000000
## 490                                          John C Magnus Center 268030000000
## 491                                            John Powers Center 170006000000
## 492                                        Joseph E Fisher School 170139000000
## 493                                  JOURNEYS ALTERNATIVE PROGRAM 270005000000
## 494                                               Journeys School 170033000000
## 495                                                Journeys South 170033000000
## 496                               Julia S Molloy Education Center 170026000000
## 497                                     Juvenile Detention Center 170017000000
## 498                                      Juvenile Services Center 268090000000
## 499                                    Kalamazoo RESA  Head Start 268060000000
## 500                                Kalamazoo RESA West CampusECSE 268060000000
## 501                         Kalamazoo RESA West CampusGreat Start 268060000000
## 502                 Kalamazoo RESA West CampusYoung Adult Program 268060000000
## 503                                Kankakee Area Co-Op Day School 170006000000
## 504                                  KARNER BLUE EDUCATION CENTER 270226000000
## 505                                    Kaskaskia Education Center 170007000000
## 506                                           KEC Central EFE 170 170018000000
## 507                                       Keith Bovenschen School 268072000000
## 508                                       Kent Career Tech Center 268062000000
## 509                                   Kent Innovation High School 268062000000
## 510                                    Kent ISD Conference Center 268062000000
## 511                             Kent ISD Early Childhood Services 268062000000
## 512                                             Kent ISD Early On 268062000000
## 513                                        Kent Transition Center 268062000000
## 514                           Kenyon-Wanamingo High School Credit 279144000000
## 515                                               Kern County ROP  60007510813
## 516                                                 Kern High ROC  60007610814
## 517                                          Keystone Central CTC 428067000000
## 518                                       Kickemuit Middle School 440007000000
## 519                                            KIMBALL HEAD START 318013000000
## 520                                              Kings County ROP  60007710817
## 521                                                   Kirk School 170003000000
## 522                                       Kitsap Co Detention Ctr 530001000000
## 523                                           KMS LEARNING CENTER 270009000000
## 524                                     Knox County Career Center 390511000000
## 525                                   Knox County Career Center 4 390511000000
## 526                                          KRESA Head Start CLC 268060000000
## 527                                     KRESA Head Start new LIfe 268060000000
## 528                                          KRESA Head Start PCC 268060000000
## 529                                          KRESA Head Start SJC 268060000000
## 530                                    KRESA Head Start West Main 268060000000
## 531                                          La Puente Valley ROP  60010310916
## 532                                         Ladse Learning Center 172159000000
## 533                                LAKE AGASSIZ SPECIAL ED. COOP. 270004000000
## 534                                LAKE AREA CAREER & TECH CENTER 388064000000
## 535                                     Lake City Credit Recovery 279144000000
## 536                                    Lake Co Collaborative Alop 170019000000
## 537                                               Lake County ROP  60007810820
## 538                                      LAKE REGION SPEC ED UNIT 388028000000
## 539                                               Lakeland School 550002000000
## 540                                         Lakes Country Academy 270008000000
## 541                                  Lakes Country Academy - ALEX 270008000000
## 542                                   Lakes Country Academy - MHD 270008000000
## 543                                 LAKES COUNTRY YOUTH EDUC SVCS 270008000000
## 544                                              Lakeside Academy 270042000000
## 545                        Lancaster County CTC-Brownstown Campus 428027000000
## 546                            Lancaster County CTC-Mt Joy Campus 428027000000
## 547                         Lancaster County CTC-Willow St Campus 428027000000
## 548                    Lapeer Co Education and Technology  Center 268066000000
## 549                                               Laremont School 170006000000
## 550                                 LaSalle County Detention Home 170019000000
## 551                                                    Lassen ROP  60007910822
## 552                                       Laura Baker SUN Program 270042000000
## 553                                               Laurel Oaks Cdc 390511000000
## 554                                               Lawrence County 390512000000
## 555                                           Lawrence County CTC 421339000000
## 556                                            LEAF RIVER ACADEMY 270001000000
## 557                                               Learning Center 268034000000
## 558                                            Lebanon County CTC 428028000000
## 559                           Lehigh Career & Technical Institute 428029000000
## 560                                                   Lenape Tech 420260000000
## 561                                                 Lerna Bridges 170018000000
## 562                                Diagnostic & Developmental Ctr 170002000000
## 563                                            Life Skills Center 268044000000
## 564                                            LIFELINKS-NEBRASKA 318013000000
## 565                                   Lighthouse Education Center 268016000000
## 566                                               Lincoln Academy 170015000000
## 567                                           Lincoln School ALOP 170021000000
## 568                                           Lincoln School RSSP 170021000000
## 569                                          Lincoln School TAOEP 170021000000
## 570                                                Lisbon CCSD 90 170143000000
## 571                                              LISD TECH Center 268068000000
## 572                              Little Mountain Elementary - SNW 270041000000
## 573                                                 Live Oaks Cdc 390511000000
## 574                              Livingston Co Crossroads Academy 170023000000
## 575                                     Livingston County Academy 170023000000
## 576                                              LLCArenac Campus 268050000000
## 577                                                 LLCBay Campus 268050000000
## 578                                                       LMP ROE 170019000000
## 579                                                 LMP ROE TAOEP 170019000000
## 580        Local Based Special Education Early Childhood Programs 268058000000
## 581                                    LocalBased SpecEd Programs 268099000000
## 582                                         LONETREE SPEC ED UNIT 388016000000
## 583                        Long Beach Unified School District ROP  60010810921
## 584                                        Los Angeles County ROP  60011010923
## 585                      Los Angeles Unified School District ROCP  60010910922
## 586                                 Lost River Career Cooperative 180004000000
## 587                               Lutz School for Work Experience 268072000000
## 588                                                  Lycoming CTC 428939000000
## 589                                         Lyle A Torrant Center 268058000000
## 590                          Lynchburg City Secondary Alternative 510007000000
## 591                                Deaf/Hard of Hearing (Dist 23) 170003000000
## 592                                     MacArthur/Echo Elementary 170138000000
## 593                                            Macomb MIPP Center 268072000000
## 594                                        Mades-Johnstone Center 170005000000
## 595                                          Mades-Johnstone RSSP 170019000000
## 596                                          MADISON-ONEIDA BOCES 368048000000
## 597                            Maggie L. Walker Governor's School 510006000000
## 598                                   Mahoning Career & Technical 390512000000
## 599                           Maine Region Ten Technical High Sch 230530000000
## 600                                        MAISD Early On Program 268085000000
## 601                                       Malcolm Williams School 268052000000
## 602                                  Manistee ISD Center Programs 268074000000
## 603                                             Maple Lane School 268072000000
## 604                                       Maplewood Career Center 390514000000
## 605                                              Marin County ROP  60011710955
## 606   Marine Science Magnet High School of Southeastern Connectic  90345001606
## 607                                  Marion D Crouse Instr Center 268040000000
## 608                            MarquetteAlger Administrative Unit 268075000000
## 609                                     Martin Hall Detention Ctr 530001000000
## 610                               Martin P McKay Education Center 170010000000
## 611                        Massanutten Regional Governor's School 510011000000
## 612                                          Massanutten Tech Ctr 510001000000
## 613                                          Maurice Spear Campus 268068000000
## 614                    MCESA and Sugnet School Classroom Programs 268080000000
## 615                                      McKeesport Area Tech Ctr 428003000000
## 616                                  MecostaOsceola Career Center 268077000000
## 617                               MecostaOsceola Education Center 268077000000
## 618                                   Medina County Career Center 390621000000
## 619                           MEEKER-WRIGHT EARLY CHILDHOOD SP ED 270005000000
## 620                                          Mendocino County ROP  60011810959
## 621                               Menominee ISD Special Education 268079000000
## 622                                          MENTALLY HANDICAPPED 318004000000
## 623                                             Merced County ROP  60011910964
## 624                                   Mercer County Career Center 428031000000
## 625                                               MERIDIAN SCHOOL 318013000000
## 626                                                Metcalf School 440036000000
## 627                                         METRO HEIGHTS ACADEMY 270226000000
## 628                                 Metro Richmond Alternative Ed 510009000000
## 629   Metropolitan Learning Center for Global and International S  90070000880
## 630                                     MG Millet Learning Center 268093000000
## 631                                              Miami Valley Ctc 390513000000
## 632                                  Miami Valley Ctc Alternative 390513000000
## 633                                            Michael J McGivney 268093000000
## 634                               MID STAT ED DIST. SUCCESS PROG. 270007000000
## 635                           MID STATE ED DIST STEPS TRANS. PROG 270007000000
## 636                                Mid-Coast Sch of Tech-Region 8 230718000000
## 637                                               MID-STATE NORTH 270007000000
## 638                          Middle Bucks Institute of Technology 428010000000
## 639                                            Middle Fork School 174022000000
## 640                                  MIDDLE LEVEL LEARNING CENTER 270002000000
## 641                                        Middlefork School RSSP 170021000000
## 642                               MIDWEST SPECIAL EDUCATION COOP. 270004000000
## 643                      Mifflin County Academy of Science and Te 420088000000
## 644                                     Mildred E. Lineham School 440036000000
## 645                                         Milligan Academy Rssp 170020000000
## 646                                     Milton C Porter Ed Center 268068000000
## 647                                                  Miner School 170003000000
## 648                                       MINNESOTA VALLEY SCHOOL 270006000000
## 649                                            MINOT SPEC ED UNIT 380040000000
## 650                                            Mission Trails ROP  60012010972
## 651                                           Mission Valley ROCP  60008610733
## 652                      MISSOURI RIVER AREA CAREER & TECH CENTER 380039000000
## 653                                             MLK A R T Program 170020000000
## 654                                  MN ONLINE HIGH SCHOOL - I.S. 270003000000
## 655                              MN RIVER VALLEY ALC - IND. STUDY 270006000000
## 656                                 MN RIVER VALLEY ALC-SEATBASED 270006000000
## 657                                    MN RIVER VALLEY ALC-SUMMER 270006000000
## 658                            MN RIVER VALLEY ED-ONLINE LEARNING 270006000000
## 659                           MN VALLEY ED. DIST. EARLY CHILDHOOD 270006000000
## 660                                              Modoc County ROP  60008110966
## 661                                                Mon Valley CTC 428045000000
## 662                                               Mono County ROP  60015510968
## 663                                                MONROE 1 BOCES 368050000000
## 664                                        MONROE 2-ORLEANS BOCES 368052000000
## 665                                     Monroe Career & Tech Inst 428032000000
## 666                                Monroe County Education Center 268082000000
## 667                                  Monroe County Middle College 268082000000
## 668                               Monroe County Transition Center 268082000000
## 669                                    Monroe County Youth Center 268082000000
## 670                                 Monroe/Randolph Red Brick Sch 170020000000
## 671                                   Montcalm Area Career Center 268083000000
## 672                                      Montessori Magnet School  90070000210
## 673                                  Monticello High School - SNW 270041000000
## 674                                Monticello Middle School - SNW 270041000000
## 675                                 Morrison Alt Learning Program 170020000000
## 676                               MORRISON COUNTY LEARNING CENTER 270007000000
## 677                                    Morton Alternative Schools 170022000000
## 678                                                 MORTON SCHOOL 310015000000
## 679                                     MORTON-SIOUX SPEC ED UNIT 388046000000
## 680                                               MSED Birth to 3 270007000000
## 681                                                 MSED PAES LAB 270007000000
## 682                                  Mt Vernon Alternative School 170017000000
## 683                                          Mt. Hope High School 440007000000
## 684                              Mountain Vista Governor's School 510011000000
## 685                                           Multi Needs Program 170143000000
## 686                                                Museum Academy  90070001601
## 687                              Muskegon Area Career Tech Center 268085000000
## 688                    Muskegon County Juvenile Transition Center 268085000000
## 689                                     Muskegon River Youth Home 268077000000
## 690                                                  MySchoolKent 268062000000
## 691                                           Nachusa Campus RSSP 170020000000
## 692                                         Nachusa Campus School 170020000000
## 693                                               Napa County ROP  60008010978
## 694                                                  NASSAU BOCES 368054000000
## 695                                   NE CENTER FOR EDUC OF BLIND 318004000000
## 696                                                NE Metro North 270226000000
## 697                                               NE Metro Tartan 270226000000
## 698                                        NEBRASKA YOUTH ACADEMY 310017000000
## 699                                        NECA INDEPENDENT STUDY 270003000000
## 700                                       Neil E Reid High School 268072000000
## 701                                  New Approach Alternative H S 170017000000
## 702                             Gifford St Regional Safe Sch Prog 170019000000
## 703                                             New Campus Center 268044000000
## 704                                                    NEW CHANCE 270003000000
## 705                                   NEW CONNECTIONS DAY PROGRAM 270003000000
## 706                                       New Directions - Geneva 170019000000
## 707                                        New Directions Program 170019000000
## 708            New Dominion Alternative Center/Prince William Co. 510009000000
## 709                                                  New Horizons 170027000000
## 710                                New Horizons Governor's School 510218000000
## 711                                                Newark CCSD 66 170143000000
## 712                                                Newark CHSD 18 170143000000
## 713                                                  Neway Center 268086000000
## 714                             Newaygo County Career Tech Center 268086000000
## 715                                                 Newday Center 268086000000
## 716                                         NEWESD 101 Open Doors 530001000000
## 717                                             NLC Day Treatment 270022000000
## 718                                    No Penobscot Tech-Region 3 230910000000
## 719                                             Norris City Annex 174048000000
## 720                                North Cook Young Adult Academy 170022000000
## 721                                 NORTH COUNTRY VOC. COOP. CTR. 270003000000
## 722                    North County Regional Occupational Program  60134312546
## 723                                NORTH EDUCATION CENTER ACADEMY 270003000000
## 724                         North Kern Vocational Training Center  60007410812
## 725                               North Montco Tech Career Center 428059000000
## 726                                       North Orange County ROP  60012110996
## 727                                           North Pointe Center 268022000000
## 728                                           North Shore Academy 170003000000
## 729                                      North Shore Academy Elem 170003000000
## 730                        NORTH VALLEY AREA CAREER & TECH CENTER 388070000000
## 731                                        Northeast Academy East 170019000000
## 732                                       Northeast Academy North 170019000000
## 733                                NORTHEAST NE JUVENILE SERVICES 310015000000
## 734                      Northeast Regional School - Biotech/Agri 370032000000
## 735                             NORTHEAST SERVICE COOPERATIVE OLL 270008000000
## 736                                       Northern Lights Academy 270044000000
## 737                           Northern Lights Academy Cooperative 270044000000
## 738       Northern Neck Gov Stem Academy/Agric & Maritime Studies 510001000000
## 739                         Northern Neck Regional Alternative Ed 510010000000
## 740                                Northern Neck Technical Center 510001000000
## 741                                       NORTHERN PLAINS SPEC ED 388018000000
## 742                                          Northern Star Online 270003000000
## 743                                   Northern Tier Career Center 428051000000
## 744                                     Northern Westmoreland CTC 428049000000
## 745                                 NORTHLAND LEARNING CENTER 010 270022000000
## 746                                 NORTHLAND LEARNING CENTER 020 270022000000
## 747                                 NORTHLAND LEARNING CENTER 040 270022000000
## 748                                 NORTHLAND LEARNING CENTER 050 270022000000
## 749                                 NORTHLAND LEARNING CENTER 060 270022000000
## 750                                     Northumberland County CTC 428049000000
## 751                                             Northwest Academy 170142000000
## 752                                       NOVA ALTERNATIVE SCHOOL 310015000000
## 753                                       NSEC Transition Program 270022000000
## 754                                       NSO - Independent Study 270003000000
## 755                               NW REGION INTERDISTRICT COUNCIL 270004000000
## 756                         OAISD Community Based Early Childhood 268090000000
## 757                                         Oak Hills High School 270003000000
## 758                                                Oak Ridge RSSP 170019000000
## 759                                      Oakland Education Center 270043000000
## 760                                      Oakland Education Center 170005000000
## 761                                   Oakland Opportunity Academy 268088000000
## 762                            Oakland Schools Technical CampusNE 268088000000
## 763                            Oakland Schools Technical CampusNW 268088000000
## 764                            Oakland Schools Technical CampusSE 268088000000
## 765                            Oakland Schools Technical CampusSW 268088000000
## 766                                                OFF CAMPUS CTE 270003000000
## 767                                                 Ohio Hi-Point 390513000000
## 768                                    OLIVER-MERCER SPEC ED UNIT 388030000000
## 769                                   OMAHA HOME FOR BOYS SCHOOLS 310019000000
## 770                                                        OMEGON 270003000000
## 771                                 ONEIDA-HERKIMER-MADISON BOCES 368056000000
## 772                               ONONDAGA-CORTLAND-MADISON BOCES 368058000000
## 773                       ONTARIO-SENECA-YATES-CAYUGA-WAYNE BOCES 368060000000
## 774                       Open Doors - Youth Reengagement Program 530001000000
## 775                                                       OPTIONS 270003000000
## 776                                                       OPTIONS 270003000000
## 777                                          OPTIONS MID/ELEM EBD 270003000000
## 778                                           ORANGE-ULSTER BOCES 368062000000
## 779                                         ORLEANS-NIAGARA BOCES 368064000000
## 780                                                  OSWEGO BOCES 368066000000
## 781                                                   Oswego GOAL 170018000000
## 782                        OTSEGO-DELAWARE-SCHOHARIE-GREENE BOCES 368038000000
## 783                                            Ottawa Area Center 268090000000
## 784                                 Oxford Hills Tech - Region 11 231232000000
## 785                                              P R I D E School 170002000000
## 786                                       PACE Alternative School 170016000000
## 787                                               Pace Elementary 170138000000
## 788                                                  PAEC Academy 170003000000
## 789                                   PAEC Alternative Elementary 170003000000
## 790                                  PAEC Alternative High School 170003000000
## 791                                     PAEC Education Center  EC 170003000000
## 792                                                          PALS 174396000000
## 793                                                       Pankalo 270226000000
## 794                                               Paragon Academy 270003000000
## 795                                                 Paris Bridges 170018000000
## 796                                                   Park School 170025000000
## 797                                      Parkers Lake High School 270003000000
## 798                                              Parkway West CTC 428004000000
## 799                             Partners for Success-Old Mill Sch 170018000000
## 800                                                  Pass Program 530001000000
## 801                                PATHFINDER ED PRG-LANCASTER CO 310015000000
## 802                                 Pathfinder Educational Center 268096000000
## 803                                                Pathway School 268070000000
## 804                                             Pathway to Change 270002000000
## 805                                              Pathways  ROE 11 170018000000
## 806                                   Pathways Program Grades 6-7 279144000000
## 807                                  Pathways Program Grades 8-12 279144000000
## 808                                               Pathways School 174396000000
## 809                                PATRICK J THOMAS JUVENILE CNTR 310016000000
## 810                                                          PAWS 170019000000
## 811                                                  PAWS Academy 170019000000
## 812                   PEACE GARDEN SP ED STUDENT SUPPORT SERVICES 388048000000
## 813                                   PEMBINA SPEC ED COOPERATIVE 388020000000
## 814                               Penta Career Center - on campus 390514000000
## 815                                               Penta Satellite 390514000000
## 816                                   Peoria Regional High School 170020000000
## 817                                  Perandoe Educational Program 173131000000
## 818                               Petersburg Regional Alternative 510008000000
## 819                                                         PHASE 270003000000
## 820                               Philip J Rock Center and School 170004000000
## 821                                               Phoenix Program 170008000000
## 822                      Pickaway-Ross Career & Technology Center 390514000000
## 823                                             Pied Piper School 268012000000
## 824                                          Piedmont Alternative 510010000000
## 825                                    Piedmont Governor's School 510010000000
## 826                                Pine County Transition Program 270002000000
## 827                                    PINE TO PRAIRIE COOP. CTR. 270004000000
## 828                                                Pineview Homes 268077000000
## 829                                     PINEWOOD ELEMENTARY - SNW 270041000000
## 830                                   Pioneer Career & Technology 390514000000
## 831                              Pioneer Grove Educational Center 170010000000
## 832                                     PIPESTONE LEARNING CENTER 270009000000
## 833                                                 Plano CUSD 88 170143000000
## 834                                             Plumas County ROP  60008311011
## 835                                         Polaris Career Center 390509000000
## 836                                        Ponaganset High School 440042000000
## 837                                      Ponaganset Middle School 440042000000
## 838                                   Portage Lakes Career Center 390635000000
## 839                              Porter County Education Services 180913000000
## 840                                 POSITIVE APPROACH TO LEARNING 270005000000
## 841                              Prairie Care Brooklyn Park - IHP 270003000000
## 842                            PraIrie Care Brooklyn Park Day Prg 270003000000
## 843                                      PRAIRIE CARE EDINA - PHP 270003000000
## 844                                        Premier Academy Morris 170018000000
## 845                                  Premier Academy Morris TAOEP 170018000000
## 846                                             Primary DCD - SNW 270041000000
## 847                                                 Forest School 268099000000
## 848                                     Project Bridge/Russell Co 510009000000
## 849                                             Project Challenge 170139000000
## 850                                                  Project Echo 170018000000
## 851                                                Project Indian 170018000000
## 852                                               Project Insight 170027000000
## 853                                  Project Renew/Northampton Co 510008000000
## 854                                                PROJECT RETURN 270226000000
## 855                                    Project Return/Fluvanna Co 510008000000
## 856                                    Project Return/Powhatan Co 510008000000
## 857                                                Project SEARCH 268052000000
## 858                                 PROJECT SEARCH-AVERA MARSHALL 270009000000
## 859                                                  Project SOAR 170019000000
## 860                              Proviso Area Except Child Center 170003000000
## 861                                 Proviso THSD 209 Dream School 170022000000
## 862                              PSA Civic Leadership High School  90070001532
## 863                                      PUTNAM-WESTCHESTER BOCES 368068000000
## 864                                      Quinebaug Middle College  90136001530
## 865                                 CREATIVE ALTERNATIVES PROGRAM 270226000000
## 866                                             R E A D Y Program 170017000000
## 867                                R G Drage Career Technical Ctr 390620000000
## 868                      R. D. Anderson Applied Technology Center 450001000000
## 869                                              R.I.S.E. Program 279135000000
## 870                                              RAES East Alt Ed 170019000000
## 871                                             RAES Night School 170019000000
## 872                                                     RAES RSSP 170019000000
## 873                                                     RAES West 170019000000
## 874                                              RAES West Alt Ed 170019000000
## 875                                                 RAP Elizabeth 170017000000
## 876                                                  RAP Freeport 170017000000
## 877                                                Raptor Program 279135000000
## 878                                                REACH PROGRAMS 279144000000
## 879                                        Reading Muhlenberg CTC 428007000000
## 880                             RED ROCK RIDGE AREA LEARNING CNTR 270009000000
## 881                                  Red Rock Ridge Mid-Level ALC 270009000000
## 882                                   Red Wing HS Credit Recovery 279144000000
## 883             Regional Alternative Education Center/Buena Vista 510025000000
## 884                Reg Alternative Plus Self Project/Roanoke City 510008000000
## 885                              Reg'l Learning Academy Star Winn 170017000000
## 886                              Reg'l Learning Center Star Boone 170017000000
## 887                               Reg'l Learning Center Star Winn 170017000000
## 888                             Reg'l Safe School Program ROE #28 170017000000
## 889                              Reggio Magnet School of the Arts  90070001516
## 890                            Region 9 Sch of Applied Technology 230911000000
## 891                                Region Two Sch of Applied Tech 231226000000
## 892                                          Regional Alop School 170018000000
## 893                          Regional Alternative Ed/King William 510009000000
## 894                           Regional Alternative Ed/Stafford Co 510009000000
## 895                                   Regional Alternative School 170017000000
## 896                           Regional Alternative/Pittslvania Co 510008000000
## 897                                 Regional Alternative/Wythe Co 510009000000
## 898        Regional Center for Agriscience and Career Advancement 268086000000
## 899                                    Regional Center for Change 170020000000
## 900                             Regional Learning Academy/Wise Co 510010000000
## 901                          Regional Multicultural Magnet School  90345000079
## 902                               Regl Inst Scholastic Excellence 170019000000
## 903                               Regl Inst Scholastic Excellence 170019000000
## 904                              Regl Learning Academy Star Boone 170017000000
## 905                                          Renaissance/Scott Co 510008000000
## 906                              RENSSELAER-COLUMBIA-GREENE BOCES 368070000000
## 907                                    Richmond Elementary School 440015000000
## 908                               Ripley-Ohio-Dearborn Sp Ed Coop 180013000000
## 909                                          RISE Learning Center 180011000000
## 910                               RIVER BEND AREA LEARNING CENTER 279135000000
## 911                              RIVER BEND EARLY CHILDHOOD PROG. 279135000000
## 912                                      RIVER VALLEY ACADEMY ALC 270006000000
## 913                                          Riverside County ROP  60009411035
## 914                    Riverside Magnet School at Goodwin College  90345001627
## 915                                              RIVERSIDE SCHOOL 270003000000
## 916                              Roanoke Valley Governor's School 510218000000
## 917                                          Rock River Challenge 170020000000
## 918                                                ROCKLAND BOCES 368072000000
## 919                                        Rockwell Middle School 268072000000
## 920                                               Rockwell School 440007000000
## 921                             ROE 20 Learning Alt Branch School 170018000000
## 922                                                ROE 53 Academy 170021000000
## 923                                            ROE 53 Safe School 170021000000
## 924                                 ROE Adult Learning Ctr Jersey 170017000000
## 925                               ROE Adult Learning Ctr Macoupin 170017000000
## 926                               ROE Alternative Prog of Lake Co 170019000000
## 927                                           ROE Safe Sch Greene 170017000000
## 928                                         ROE Safe Sch Macoupin 170017000000
## 929                             ROE20 Learning Alternative Branch 170018000000
## 930                                 RoerinkKnoll Education Center 268090000000
## 931                                             ROOC Incorporated 268092000000
## 932                                      Roscommon COOP Preschool 268092000000
## 933                          ROUGHRIDER AREA CAREER & TECH CENTER 380040000000
## 934                                   Rowanty Vocational Tech Ctr 510001000000
## 935                                         ROYALS Academy Canton 170019000000
## 936                                       ROYALS Academy Carthage 170019000000
## 937                                         ROYALS Academy Macomb 170019000000
## 938                                            ROYALS RSSP Canton 170019000000
## 939                                          ROYALS RSSP Carthage 170019000000
## 940                                            ROYALS RSSP Macomb 170019000000
## 941                                                         RTC 1 310015000000
## 942                                                         RTC 2 310015000000
## 943                                                       RTR ALC 270009000000
## 944                              RUM RIVER EAST EDUCATION PROGRAM 270032000000
## 945                                               RUM RIVER NORTH 270032000000
## 946                                               RUM RIVER SOUTH 270032000000
## 947                            RUNESTONE REGIONAL LEARNING CENTER 270002000000
## 948                                       RURAL CASS SPEC ED UNIT 388031000000
## 949                                         Sacramento County ROP  60009511083
## 950                                                          SAFE 270003000000
## 951                                           Safe School Program 170018000000
## 952                                           Safe School Program 170017000000
## 953                                Safe School Program  Centralia 170017000000
## 954                                Saginaw County Juvenile Center 268093000000
## 955                                Saginaw ISD Transitions Center 268093000000
## 956                                                  SAIL PROGRAM 270006000000
## 957                      SAIL Skills for Adult Independent Living 268052000000
## 958                                Saint Clair Co ROE Safe School 170021000000
## 959                                    SAINT LAWRENCE-LEWIS BOCES 368074000000
## 960                                            Salt Creek Academy 170021000000
## 961                                                   Salt School 170019000000
## 962                                               San Antonio ROP  60011410927
## 963                                     San Bernardino County ROP  60013211117
## 964                                          San Diego County ROP  60013811406
## 965                                      San Francisco County ROP  60013911410
## 966                                       San Joaquin County ROCP  60014011424
## 967                                          San Mateo County ROP  60014211433
## 968                              Sangamon County Learning Academy 170021000000
## 969                                  Sangamon Safe School Program 170021000000
## 970                                         Sanilac Career Center 268097000000
## 971                        Sanilac ISD Special Education Services 268097000000
## 972                                Santa Barbara County ROP-North  60013311440
## 973                                Santa Barbara County ROP-South  60013311439
## 974                                  Santa Clara County ROP-South  60013711459
## 975                                         Santa Cruz County ROP  60014311465
## 976                                SASED Central-Proj Ican & Pace 170012000000
## 977                                              Scarlet Oaks Cdc 390511000000
## 978                                      Schramm Education Center 170009000000
## 979                 SCHUYLER-STEUBEN-CHEMUNG-TIOGA-ALLEGANY BOCES 368078000000
## 980                      Schuylkill Technology Centers-North Camp 428062000000
## 981                      Schuylkill Technology Centers-South Camp 428062000000
## 982                         Scioto County Career Technical Center 390515000000
## 983                                                SEAPCO Academy 170023000000
## 984                                                   SEAPCO RISE 170023000000
## 985                                                     SECA - IS 270003000000
## 986                                         SEDOL Sector Programs 170006000000
## 987                               Seiter Education Service Center 268083000000
## 988                      Seneca Highlands Career and Technical Ce 428063000000
## 989                           Sentinel Career & Technology Center 390515000000
## 990                                                   SESE School 170031000000
## 991                                            Shasta-Trinity ROP  60012511468
## 992                                           Shelbyville Bridges 170018000000
## 993                                          Sheldon Pines School 268090000000
## 994                           Shenandoah Valley Governor's School 510003000000
## 995                  Shenandoah Valley Reg Alternative Ed/Genesis 510010000000
## 996                     SHEYENNE VALLEY AREA CAREER & TECH CENTER 388056000000
## 997                                  SHEYENNE VALLEY SPEC ED UNIT 388050000000
## 998                Shiawassee RESD  Student Learning Center  West 268098000000
## 999                                      Sholund School for Girls 270005000000
## 1000                                            SIDNEY HEAD START 318013000000
## 1001                    Silicon Valley Career Technical Education  60013511457
## 1002                                          Siskiyou County ROP  60012711472
## 1003                                        Six-Six Magnet School  90091000340
## 1004                               Skagit County Detention Center 530001000000
## 1005                          Skillbuilding Opportunities for Aca 270002000000
## 1006                                                 SLCEvergreen 268052000000
## 1007                                                     SMEC ALC 270033000000
## 1008                                   Snohomish Detention Center 530001000000
## 1009                                                         SOAR 270002000000
## 1010                                 Social-Emotional Alt Program 170007000000
## 1011                                              SOCRATES ONLINE 270024000000
## 1012                            Somerset County Technology Center 428040000000
## 1013                                            Sonoma County ROP  60012911485
## 1014                                   SOURIS VALLEY SPEC ED UNIT 388022000000
## 1015                                             SOUTH CAMPUS 916 270226000000
## 1016                           SOUTH CENTRAL PRAIRIE SPEC ED UNIT 388034000000
## 1017                               SOUTH EDUCATION CENTER ACADEMY 270003000000
## 1018                                    SOUTH VALLEY SPEC ED UNIT 388052000000
## 1019                                 Southeast Alternative School 170143000000
## 1020                        SOUTHEAST REGION CAREER & TECH CENTER 388066000000
## 1021                                   Southeastern Career Center 181066000000
## 1022                                      Southern California ROC  60010710920
## 1023                       Southern Hills Career Technical Center 390508000000
## 1024                          SOUTHERN PLAINS AREA LEARNING CNTR. 270005000000
## 1025                                      SOUTHERN PLAINS BRIDGES 270005000000
## 1026                              SOUTHERN PLAINS EDUCATION COOP. 270005000000
## 1027                      Southside L.I.N.K. Project/Brunswick Co 510009000000
## 1028                                       SOUTHWEST SPEC ED UNIT 388024000000
## 1029                         Southwest Virginia Governor's School 510217000000
## 1030                                            SOWIC Educ Center 170139000000
## 1031                              Special Education ServicesSouth 268040000000
## 1032                                      Special Services  North 268040000000
## 1033                                  Speed Early Learning Center 170003000000
## 1034                                  Speed Independence Elem Sch 170003000000
## 1035                               Speed Independence High School 170003000000
## 1036                             Speed Program for Adaptive Learn 170003000000
## 1037                            Spokane Juvenile Detention School 530001000000
## 1038                                     Springfield-Clark County 390515000000
## 1039                                ST CLOUD EXTENDED DAY PROGRAM 270014000000
## 1040                               St Marys Adolescent Ed Program 170020000000
## 1041                                              St Vincent Home 268052000000
## 1042                                         STAR Family Literacy 268010000000
## 1043                                                 Star Program 279146000000
## 1044                                    Starquest Acad RSSP North 170018000000
## 1045                                    Starquest Acad RSSP South 170018000000
## 1046                                            Starr Albion Prep 268020000000
## 1047                                        STARRS ONLINE ACADEMY 270009000000
## 1048                                         STARS Autism Program 170143000000
## 1049                     Steel Center for Career and Technical Ed 428005000000
## 1050                                                  STEP SCHOOL 318015000000
## 1051                                              STEP TD PROGRAM 270005000000
## 1052                                             STRIVE SECONDARY 270003000000
## 1053                                            STRIVE TRANSITION 270003000000
## 1054                                    STRIVE Transition Program 268066000000
## 1055                            Structural Alt Confinement School 530001000000
## 1056                                             Student Services 268076000000
## 1057                                              SUCCESS Academy 170019000000
## 1058                                              Success Academy 170019000000
## 1059                                          Success Academy 4-5 170019000000
## 1060                                           Success Academy HS 170019000000
## 1061                                              Success Program 270033000000
## 1062                                               SULLIVAN BOCES 368088000000
## 1063                                                          SUN 270003000000
## 1064                                 SUN Area Technical Institute 428042000000
## 1065                                               SUN TRANSITION 270003000000
## 1066                                       Susquehanna County CTC 420000000000
## 1067                                                 SW Metro ALC 270042000000
## 1068                                                 SW Metro CCJ 270042000000
## 1069                                       SW Metro Day Treatment 270042000000
## 1070                                   SW Metro Independent Study 270042000000
## 1071                                                 SW Metro JAF 270042000000
## 1072                                    SW Metro Level 4 Programs 270042000000
## 1073                                     SW Metro Online Learning 270042000000
## 1074                                          SW Metro Seat Based 270042000000
## 1075                                       SW Shakopee Special Ed 270042000000
## 1076                                      Belview Learning Center 270009000000
## 1077                                       Cosmos Learning Center 270009000000
## 1078                                   BLUE MOUND LEARNING CENTER 270009000000
## 1079                                NORTH CENTRAL LEARNING CENTER 270009000000
## 1080                               Red Rock Ridge Learning Center 270009000000
## 1081                                                TAPESTRY ALOP 170022000000
## 1082                                       TBA Career Tech Center 268044000000
## 1083                           TBA ISD Oak Park Special Education 268044000000
## 1084                                     TBA ISD Traverse Heights 268044000000
## 1085                                       TBA SE Early Childhood 268044000000
## 1086                                                          TEA 270003000000
## 1087                           Teachwell Academy High School - 01 460003000000
## 1088                         Teachwell Academy Middle School - 04 460003000000
## 1089                                   Teachwell Transitions - 03 460003000000
## 1090                                      TECH VALLEY HIGH SCHOOL 368070000000
## 1091                                   Technical Education Center 268094000000
## 1092                                            Technology Center 390515000000
## 1093                                            Tehama County ROP  60014611524
## 1094                                   The Communications Program 170006000000
## 1095                                                   The Creeks 418018000000
## 1096                 The Early College  Lansing Community College 268052000000
## 1097                                        The Friendship School  90345001430
## 1098                      The Governor's School @ Innovation Park 510025000000
## 1099                                        The Lafayette Academy 170016000000
## 1100              The Regional Community Alternative Ed Continuum 510008000000
## 1101                                                  THE WILLOWS 270226000000
## 1102                           Thomas Edison Magnet Middle School  90007001358
## 1103                                              Thome Ed School 170023000000
## 1104                    Three Rivers Middle College Magnet School  90345001617
## 1105                    Tidewater Regional Alternative Ed Project 510007000000
## 1106                                          Timber Ridge School 170003000000
## 1107                             Tolles Career & Technical Center 390635000000
## 1108                                  TOMPKINS-SENECA-TIOGA BOCES 368090000000
## 1109                                                 TOWER SCHOOL 318001000000
## 1110                           TOWER VIEW ALTERNATIVE HIGH SCHOOL 279144000000
## 1111                                                   Transition 170139000000
## 1112                                         TRANSITION 2 SUCCESS 270005000000
## 1113                                            Transition Center 170006000000
## 1114                                            Transition Center 268092000000
## 1115                                   Transition Learning Center 170015000000
## 1116                                           Transition Program 170143000000
## 1117                   Transition Support Resource Center/Fairfax 510008000000
## 1118                                  Treatment & Learning Center 170002000000
## 1119                                Treatment & Learning Center-H 170002000000
## 1120                                                 TREK PROGRAM 270005000000
## 1121                                               Tri-Cities ROP  60010610919
## 1122                                     Tri-County Career Center 390516000000
## 1123                                            Tri-County Center 170005000000
## 1124                                               Tri-County ROP  60014511522
## 1125                                    Tri-County South - Choate 170005000000
## 1126                                              Tri-County Ward 170005000000
## 1127                                     Tri-Rivers Career Center 390653000000
## 1128                                               Tri-Valley ROP  60008410731
## 1129                                Tristar Acad Safe Sch Program 170017000000
## 1130                               Trumbull Career & Tech  Center 390516000000
## 1131                                 TURTLE MOUNTAIN SPEC ED UNIT 388025000000
## 1132                                    Tuscola Technology Center 268098000000
## 1133                            Twin Rivers Career & Tech Ed Area 181160000000
## 1134                              Two Rivers Magnet Middle School  90070001364
## 1135                                                    U S Grant 390628000000
## 1136                         Ugrad ? ESD123 Re-Engagement Program 530001000000
## 1137                                                 ULSTER BOCES 368092000000
## 1138                             United Technologies Ctr-Region 4 231237000000
## 1139                         University of Hartford Magnet School  90070001357
## 1140                          Upper Bucks County Technical School 428011000000
## 1141                                   Upper Valley Career Center 390621000000
## 1142                                    UPPER VALLEY SPEC ED UNIT 388054000000
## 1143                                    UTA HALEE ACADEMY PROGRAM 310017000000
## 1144                           Valley Career and Technical Center 510001000000
## 1145                                         Valley Center School 268060000000
## 1146                                                   Valley ROP  60009710787
## 1147                              VALLEY VIEW ALTERNATIVE PROGRAM 270006000000
## 1148                                  Van Buren Technology Center 268099000000
## 1149                                         Vanguard Tech Center 390515000000
## 1150                                        Vantage Career Center 390517000000
## 1151                                                 VECTOR BASIC 270003000000
## 1152                                         VECTOR LOW INCIDENCE 270003000000
## 1153                                    Venango Technology Center 428043000000
## 1154                                                      VENTURE 270003000000
## 1155                                           VENTURE TRANSITION 270003000000
## 1156                               Vern Riffe Career Technology C 390514000000
## 1157                                                          VET 270003000000
## 1158                            VILLAGE RANCH ALTERNATIVE PROGRAM 270005000000
## 1159                          Virtual Learning Academy Consortium 268088000000
## 1160                                                       Vision 270002000000
## 1161                                   Visually Impaired Programs 170143000000
## 1162                                                     W-ALT-IS 270003000000
## 1163                                             W.O.R.K. Program 279135000000
## 1164                                        WAHPETON SPEC ED UNIT 388057000000
## 1165                               Waldo County Tech Ctr-Region 7 231321000000
## 1166                                      Waldron Learning Center 268018000000
## 1167                        Walla Walla County Juvenile Detention 530001000000
## 1168                                           Warren County AVTS 428044000000
## 1169                                  Warren County Career Center 390515000000
## 1170                              Washington County CC use 051706 390517000000
## 1171              WASHINGTON-SARATOGA-WARREN-HAMILTON-ESSEX BOCES 368094000000
## 1172                     Washtenaw Alliance for Virtual Education 268099000000
## 1173                Washtenaw Alliance for Virtual Education Home 268099000000
## 1174          Washtenaw County Youth Center  Educational Programs 268099000000
## 1175                   Washtenaw Deaf and Hard of Hearing Program 268099000000
## 1176                          Washtenaw International High School 268099000000
## 1177                                       Wauconda CUSD 118 ALOP 170019000000
## 1178                                              Wawaloam School 440036000000
## 1179                           Wayne County Schools Career Center 390517000000
## 1180                                 WCSEA Black Patridge Pub Day 174307000000
## 1181                               WEBSTER CO EARLY LRN-BLUE HILL 318009000000
## 1182                                                   WELS NORTH 270226000000
## 1183                                                   WELS SOUTH 270226000000
## 1184                                                Wesley School 268085000000
## 1185                                       West 40 ALOP Achievers 170022000000
## 1186                              West 40 Reg Safe Sch Middle Prg 170022000000
## 1187                                             West 40-Sr. Plus 170022000000
## 1188                                                 WEST ACADEMY 270003000000
## 1189                                          West Aurora HS RSSP 170019000000
## 1190                            WEST CENTRAL AREA LEARNING CENTER 279146000000
## 1191                          WEST CENTRAL EDUCATION DISTRICT B-2 279146000000
## 1192                            WEST EDUCATION CENTER ALTERNATIVE 270003000000
## 1193                                      WEST FARGO SPEC ED UNIT 388035000000
## 1194                                             WEST HEIGHTS ALC 270003000000
## 1195                                    WEST HEIGHTS EXTENDED DAY 270003000000
## 1196                                             WEST HIGH SCHOOL 270003000000
## 1197                                  WEST RIVER STUDENT SERVICES 388010000000
## 1198                            West Shore ESD Career Tech Center 268076000000
## 1199                                                West Side CTC 422587000000
## 1200                                              West Transition 270003000000
## 1201                                            WESTCHESTER BOCES 368096000000
## 1202                                             Western Area CTC 428046000000
## 1203                                      WESTERN LEARNING CENTER 318008000000
## 1204                                       Western Montgomery CTC 428036000000
## 1205                     WESTERN NEBRASK CHILD DEV CENTER (WNCDC) 318013000000
## 1206                                        WESTERN SUFFOLK BOCES 368086000000
## 1207                                 WESTSIDE ALTERNATIVE PROGRAM 270005000000
## 1208                           WexfordMissaukee ISD Career Center 268000000000
## 1209                       WexfordMissaukee ISD Special Education 268000000000
## 1210                                     Whatcom Co Detention Ctr 530001000000
## 1211                                           WHITE PINE ACADEMY 270001000000
## 1212                                        Wilkes-Barre Area CTC 428030000000
## 1213                                             William R Burton 390512000000
## 1214                                         William R. Rouse ROP  60012611469
## 1215                                  School for Hearing Impaired 170012000000
## 1216                                  Williamson Co Learning Cntr 170012000000
## 1217                                          WILMAC SPEC ED UNIT 388036000000
## 1218                                         Wilson Talent Center 268052000000
## 1219                                                  WIN PROGRAM 270006000000
## 1220                                    WINGS ALTERNATIVE PROGRAM 270005000000
## 1221                                                    WINNEBAGO 270005000000
## 1222                                  Winnetka Covenant Preschool 170003000000
## 1223                     Wintergreen Interdistrict  Magnet School  90007000884
## 1224                                                WISD Early On 268099000000
## 1225                                   Wolverine Education Center 268098000000
## 1226                                            Wolverine Program 270033000000
## 1227                                Woodland Developmental Center 268094000000
## 1228                                    WoodsEdge Learning Center 268060000000
## 1229                                 New Horizons Woodside Campus 510001000000
## 1230                                      WRIGHT TECHNICAL CENTER 270004000000
## 1231                                  WRIGHT TECHNICAL CENTER ALC 270004000000
## 1232                           WRIGHT TECHNICAL CENTER ALC MIDDLE 270004000000
## 1233                                                  YEA Program 170018000000
## 1234                                              Yolo County ROP  60014911544
## 1235                                 York Co School of Technology 422681000000
## 1236                                                 Yosemite ROP  60014411499
## 1237                                         Young Adult Programs 268099000000
## 1238                                          Youth Center School 268060000000
## 1239                                       Youth Home Jackson ISD 268058000000
## 1240                                 YOUTH LINKS-HEARTLAND FAMILY 310018000000
## 1241                                     YOUTH TRANSITION PROGRAM 270003000000
## 1242                                            Zanesville Campus 390513000000
## 1243                                  ZUMBRO AREA LEARNING CENTER 270005000000
## 1244                              ZUMBRO ED. DIST. FUTURES/CHOICE 270005000000
## 1245                                    ZUMBRO EDUCATION DISTRICT 270005000000
## 1246                             Zumbrota-Mazeppa Credit Recovery 279144000000
##                                                     Agency_Name
## 1                                   EDUCATIONAL SERVICE UNIT 09
## 2                              INTERMEDIATE SCHOOL DISTRICT 287
## 3                              INTERMEDIATE SCHOOL DISTRICT 287
## 4                              INTERMEDIATE SCHOOL DISTRICT 287
## 5                              INTERMEDIATE SCHOOL DISTRICT 287
## 6                              INTERMEDIATE SCHOOL DISTRICT 287
## 7                              INTERMEDIATE SCHOOL DISTRICT 287
## 8                              INTERMEDIATE SCHOOL DISTRICT 287
## 9                              INTERMEDIATE SCHOOL DISTRICT 287
## 10                             INTERMEDIATE SCHOOL DISTRICT 287
## 11                             INTERMEDIATE SCHOOL DISTRICT 287
## 12                             INTERMEDIATE SCHOOL DISTRICT 287
## 13                             INTERMEDIATE SCHOOL DISTRICT 287
## 14                             INTERMEDIATE SCHOOL DISTRICT 287
## 15                             INTERMEDIATE SCHOOL DISTRICT 287
## 16                             INTERMEDIATE SCHOOL DISTRICT 287
## 17                             INTERMEDIATE SCHOOL DISTRICT 287
## 18                             INTERMEDIATE SCHOOL DISTRICT 287
## 19                                          NORTHEAST METRO 916
## 20                             INTERMEDIATE SCHOOL DISTRICT 917
## 21                             INTERMEDIATE SCHOOL DISTRICT 917
## 22                             INTERMEDIATE SCHOOL DISTRICT 917
## 23                             INTERMEDIATE SCHOOL DISTRICT 917
## 24                             INTERMEDIATE SCHOOL DISTRICT 917
## 25                                      A E R O  Spec Educ Coop
## 26                                    A W Beattie Career Center
## 27                                    A. LINWOOD HOLTON GOV SCH
## 28                                          NORTHEAST METRO 916
## 29                              Exc Children Have Opportunities
## 30                                              Speed SEJA #802
## 31                            Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 32                              Exc Children Have Opportunities
## 33                                CAPITOL REGION EDUCATION COUN
## 34                                CAPITOL REGION EDUCATION COUN
## 35                                CAPITOL REGION EDUCATION COUN
## 36                                  EDUCATIONAL SERVICE UNIT 09
## 37                            Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 38                                           Admiral Peary AVTS
## 39                                               Livingston ESA
## 40                  ALBANY-SCHOHARIE-SCHENECTADY-SARATOGA BOCES
## 41                             INTERMEDIATE SCHOOL DISTRICT 287
## 42                             INTERMEDIATE SCHOOL DISTRICT 287
## 43                             INTERMEDIATE SCHOOL DISTRICT 287
## 44                             INTERMEDIATE SCHOOL DISTRICT 287
## 45                             INTERMEDIATE SCHOOL DISTRICT 287
## 46                             INTERMEDIATE SCHOOL DISTRICT 287
## 47                             INTERMEDIATE SCHOOL DISTRICT 287
## 48                             INTERMEDIATE SCHOOL DISTRICT 287
## 49                             INTERMEDIATE SCHOOL DISTRICT 287
## 50                             INTERMEDIATE SCHOOL DISTRICT 287
## 51                             INTERMEDIATE SCHOOL DISTRICT 287
## 52                                         ALEGENT/IMMANUEL RTC
## 53                          Cannon Valley Special Education Coo
## 54                      Allegan Area Educational Service Agency
## 55                             INTERMEDIATE SCHOOL DISTRICT 287
## 56                                    Region 06 West Cook ISC 2
## 57                                          NORTHEAST METRO 916
## 58                    ALT ED PRGM/BEHAV DISORD YOUTH/MONTGOMERY
## 59                                            Amador County ROP
## 60                                      AMELIA-NOTTOWAY VOC CTR
## 61                                CAPITOL REGION EDUCATION COUN
## 62                                          Antelope Valley ROP
## 63                             INTERMEDIATE SCHOOL DISTRICT 917
## 64                                                       Apollo
## 65                                  APPOMATTOX REGIONAL GOV SCH
## 66                               Northern Suburban Spec Ed Dist
## 67                            Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 68                            Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 69                              Area 30 Career Center Edu Inter
## 70                                          NORTHEAST METRO 916
## 71                                 EASTERN CONNECTICUT REGIONAL
## 72                                 MN VALLEY EDUCATION DISTRICT
## 73                                                      Chariho
## 74                                   Ashland County-West Holmes
## 75                 Ashtabula County Technical and Career Center
## 76                            Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 77                                          NORTHEAST METRO 916
## 78                                          NORTHEAST METRO 916
## 79                              Clay/Cwford/Jsper/Lwrnce/Rhland
## 80                              Clay/Cwford/Jsper/Lwrnce/Rhland
## 81                             INTERMEDIATE SCHOOL DISTRICT 287
## 82                                                       Auburn
## 83                          Austin Albert Lea Area Special Educ
## 84                                                   Macomb ISD
## 85                                               Baldy View ROP
## 86                                                  Barnwell 80
## 87                                                    Barry ISD
## 88                            Region 6 and 8-SW/WC Service Coop
## 89                              WEST CENTRAL EDUCATION DISTRICT
## 90                                                  Beaufort 80
## 91                                            Beaver County CTC
## 92                              Bedford County Technical Center
## 93                                                Van Buren ISD
## 94                                  EDUCATIONAL SERVICE UNIT 04
## 95                                          NORTHEAST METRO 916
## 96                                             Belmont-Harrison
## 97                          BEMIDJI REGIONAL INTERDIST. COUNCIL
## 98                                  BENTON-STEARNS ED. DISTRICT
## 99                                  BENTON-STEARNS ED. DISTRICT
## 100                                 BENTON-STEARNS ED. DISTRICT
## 101                                 BENTON-STEARNS ED. DISTRICT
## 102                                                   Berks CTC
## 103                                                   Berks CTC
## 104                                                Berrien RESA
## 105                                               Van Buren ISD
## 106                                              Bethlehem AVTS
## 107                                 Bi-County Special Educ Coop
## 108                                     BISMARCK CAREER ACADEMY
## 109                                    BISMARCK SPECIAL ED UNIT
## 110                                   BISMARCK TECHNICAL CENTER
## 111                        Gila County Regional School District
## 112                              Black Hawk Area Sp Ed District
## 113                    Black Hills Special Services Cooperative
## 114                    Black Hills Special Services Cooperative
## 115                                                Berrien RESA
## 116                                       BLUE RIDGE GOV SCHOOL
## 117                                 Boone County Spec Educ Coop
## 118                                  BOYS TOWN INTERIM PRG SCHS
## 119                                                  Macomb ISD
## 120                                                  Branch ISD
## 121                                 Southwest Cook Coop Spec Ed
## 122                   BREAKING BARRIERS ALTERNATIVE ED/HENRY CO
## 123                                 EDUCATIONAL SERVICE UNIT 13
## 124                                Kaskaskia Spec Educ District
## 125                         BRIDGING COMMUNITIES REG CTE CENTER
## 126                         BRIDGING COMMUNITIES REG CTE CENTER
## 127                                 EDUCATIONAL SERVICE UNIT 03
## 128                                              Lewis Cass ISD
## 129                                 BROOME-DELAWARE-TIOGA BOCES
## 130                                  Iroquois Special Education
## 131                                                     Buckeye
## 132                                                     Buckeye
## 133                                       Gallia-Jackson-Vinton
## 134                          Bucks County Technical High School
## 135                      Mid-East Career and Technology Centers
## 136                                 BURLEIGH CO SPECIAL ED UNIT
## 137                                          Butler County AVTS
## 138                              NEW HORIZONS CAREER & TECH CTR
## 139              Butler Technology & Career Development Schools
## 140              Butler Technology & Career Development Schools
## 141              Butler Technology & Career Development Schools
## 142                                            Butte County ROP
## 143  CA Advancing Pathways for Students in Los Angeles Co ROC/P
## 144                                                 Calhoun ISD
## 145                                                 Calhoun ISD
## 146                           GOODHUE COUNTY EDUCATION DISTRICT
## 147                           GOODHUE COUNTY EDUCATION DISTRICT
## 148                         Carbon Career & Technical Institute
## 149                            SOUTHERN MN EDUCATION CONSORTIUM
## 150                                      Eisenhower Cooperative
## 151                                         NORTHEAST METRO 916
## 152                                          Copper Country ISD
## 153                                                  Iosco RESA
## 154                                                 Anderson 80
## 155                   Career and Technology Educational Centers
## 156                                          Ventura County ROP
## 157                              Career Institute of Technology
## 158                                             Ottawa Area ISD
## 159                                                 Genesee ISD
## 160                CARROLL-GALAX REG ALT ED PRGM/THE RAE CENTER
## 161                       CASS COUNTY CAREER & TECHNICAL CENTER
## 162                     CATTARAUGUS-ALLEGANY-ERIE-WYOMING BOCES
## 163                                       CAYUGA-ONONDAGA BOCES
## 164                                         Monroe/Randolph ROE
## 165                                                 Genesee ISD
## 166                                                 Madison ROE
## 167                                 EDUCATIONAL SERVICE UNIT 13
## 168                                 EDUCATIONAL SERVICE UNIT 08
## 169                                 EDUCATIONAL SERVICE UNIT 08
## 170                          CENTRAL MINNESOTA JT. POWERS DIST.
## 171                          CENTRAL MINNESOTA JT. POWERS DIST.
## 172                          CENTRAL MINNESOTA JT. POWERS DIST.
## 173                          CENTRAL MINNESOTA JT. POWERS DIST.
## 174                          CENTRAL MINNESOTA JT. POWERS DIST.
## 175                          CENTRAL MINNESOTA JT. POWERS DIST.
## 176                        Central Montco Technical High School
## 177                                  Central Nine Career Center
## 178                Central Orange County CTE Partnership (CTEp)
## 179                Central PA Institute of Science & Technology
## 180                                          Central Sierra ROP
## 181                       CENTRAL VIRGINIA GOV SCH FOR SCI/TECH
## 182                                    Central Westmoreland CTC
## 183                           Clintn/Jeffrsn/Marin/Washngtn ROE
## 184                               Ogle Co Education Cooperative
## 185                                        Charlevoix-Emmet ISD
## 186                                        Charlevoix-Emmet ISD
## 187                                                     Chariho
## 188                                                     Chariho
## 189                                                     Chariho
## 190                                                     Chariho
## 191                                                     Chariho
## 192                              CHARLOTTESVILLE-ALBEMARLE TECH
## 193                                      CHESAPEAKE BAY GOV SCH
## 194                Chester County Technical College High School
## 195                Chester County Technical College High School
## 196                Chester County Technical College High School
## 197                               CHILD GUIDANCE CTR TGH SCHOOL
## 198                          ST. CROIX RIVER EDUCATION DISTRICT
## 199                           Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 200                            INTERMEDIATE SCHOOL DISTRICT 287
## 201                                     LaSalle Putnam Alliance
## 202                    Olympic Educational Service District 114
## 203           Clare-Gladwin Regional Education Service District
## 204                                Clarion County Career Center
## 205                            Educational Service District 112
## 206                                       Clearfield County CTC
## 207                                         Clinton County RESA
## 208                       CLINTON-ESSEX-WARREN-WASHINGTON BOCES
## 209                           Clintn/Jeffrsn/Marin/Washngtn ROE
## 210                                               Coastline ROP
## 211                                               CODE RVA HIGH
## 212                                              Bristol Warren
## 213                                 Colton-Redlands-Yucaipa ROP
## 214                                       Columbia-Montour AVTS
## 215                                           Columbiana County
## 216                              COMMONWEALTH GOVERNOR'S SCHOOL
## 217           Clare-Gladwin Regional Education Service District
## 218                                                Berrien RESA
## 219                                              Livingston ESA
## 220                                                 Sanilac ISD
## 221                                             Ottawa Area ISD
## 222                                               Van Buren ISD
## 223                                         Compton Unified ROP
## 224                                                       LEARN
## 225                                School Assn For Special Educ
## 226                Connellsville Area Career & Technical Center
## 227                                     Contra Costa County ROP
## 228                                             Rock Island ROE
## 229                                                C.O.O.R. ISD
## 230                                                C.O.O.R. ISD
## 231                                                C.O.O.R. ISD
## 232                                Cheb-Otsego-Presque Isle ESD
## 233                           Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 234                                               Orangeburg 80
## 235                                          Copper Country ISD
## 236                         MEEKER AND WRIGHT SPECIAL EDUCATION
## 237                                            Coshocton County
## 238                 CANYON-OWYHEE SCHOOL SERVICE AGENCY (COSSA)
## 239                                 Covered Bridge Spec Ed Dist
## 240                            Educational Service District 112
## 241                                         Crawford County CTC
## 242                         CROSSROADS ALTERNATIVE/BRISTOL CITY
## 243                                    CTC of Lackawanna County
## 244                                       Cumberland Perry AVTS
## 245                            INTERMEDIATE SCHOOL DISTRICT 917
## 246                               Cuyahoga Valley Career Center
## 247                         Cannon Valley Special Education Coo
## 248                            Spec Educ Dist Lake County/Sedol
## 249              Butler Technology & Career Development Schools
## 250                            INTERMEDIATE SCHOOL DISTRICT 917
## 251                                              Spartanburg 80
## 252                             Dauphin County Technical School
## 253                            INTERMEDIATE SCHOOL DISTRICT 917
## 254                                School Assn For Special Educ
## 255                                               Hillsdale ISD
## 256                                        Del Norte County ROP
## 257                                 Delaware Area Career Center
## 258                                 Delaware Area Career Center
## 259                       Delaware County Technical High School
## 260                       Delaware County Technical High School
## 261                       Delaware County Technical High School
## 262                      DELAWARE-CHENANGO-MADISON-OTSEGO BOCES
## 263                                       Delta-Schoolcraft ISD
## 264                                       Delta-Schoolcraft ISD
## 265                                     DEQUEEN/MENA EDUC. COOP
## 266                                              Bay-Arenac ISD
## 267                     West Shore Educational Service District
## 268                    Black Hills Special Services Cooperative
## 269                                      Eisenhower Cooperative
## 270                                  Great Oaks Career Campuses
## 271                                          Dickinson-Iron ISD
## 272                                   DICKINSON SPECIAL ED UNIT
## 273                                          Dickinson-Iron ISD
## 274                                          Dickinson-Iron ISD
## 275                                                   Dillon 80
## 276                                School Assn For Special Educ
## 277                               CAPITOL REGION EDUCATION COUN
## 278                            INTERMEDIATE SCHOOL DISTRICT 287
## 279                                               Dorchester 80
## 280                                                 Calhoun ISD
## 281                                 DOUGLAS COUNTY YOUTH CENTER
## 282                                                    Kane ROE
## 283                                                       LEARN
## 284                                                  DuPage ROE
## 285                                              DUTCHESS BOCES
## 286                           NW Indiana Special Education Coop
## 287                     West Shore Educational Service District
## 288                     West Shore Educational Service District
## 289                                        FRESHWATER ED. DIST.
## 290                                               Washtenaw ISD
## 291                                           Montcalm Area ISD
## 292                                                  Branch ISD
## 293                                                 Genesee ISD
## 294                                                 Genesee ISD
## 295                     West Shore Educational Service District
## 296                                                    Kane ROE
## 297                                EAST CENTRAL SPECIAL ED UNIT
## 298                            EAST RANGE SEC. TECHNICAL CENTER
## 299                                 East San Gabriel Valley ROP
## 300                                         NORTHEAST METRO 916
## 301                        Eastern Center for Arts & Technology
## 302                                 EDUCATIONAL SERVICE UNIT 08
## 303                                       EASTERN SUFFOLK BOCES
## 304                                    Eastern Westmoreland CTC
## 305                         MEEKER AND WRIGHT SPECIAL EDUCATION
## 306                              Eastland-Fairfield Career/Tech
## 307                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 308                                         Mecosta-Osceola ISD
## 309                                                  Eaton RESA
## 310                                                  Eaton RESA
## 311                                                  Eaton RESA
## 312                                                  Eaton RESA
## 313                                                  Eaton RESA
## 314                                                  Eaton RESA
## 315                           GOODHUE COUNTY EDUCATION DISTRICT
## 316                           Frankln/Johnsn/Massc/Willimsn ROE
## 317                             Exc Children Have Opportunities
## 318                              Northern Suburban Spec Ed Dist
## 319                                               Eden Area ROP
## 320                            INTERMEDIATE SCHOOL DISTRICT 917
## 321                                         Newaygo County RESA
## 322                                  Four Rivers Spec Educ Dist
## 323                                 EDUCATIONAL SERVICE UNIT 05
## 324                                         EHOVE Career Center
## 325                            INTERMEDIATE SCHOOL DISTRICT 287
## 326                                             Ottawa Area ISD
## 327                                        FRESHWATER ED. DIST.
## 328                                                 Genesee ISD
## 329                                   EMMONS CO SPECIAL ED UNIT
## 330                            SOUTHERN MN EDUCATION CONSORTIUM
## 331                            SOUTHERN MN EDUCATION CONSORTIUM
## 332                            SOUTHERN MN EDUCATION CONSORTIUM
## 333                        ENTERPRISE ACADEMY/NEWPORT NEWS CITY
## 334                            INTERMEDIATE SCHOOL DISTRICT 287
## 335                                                ERIE 1 BOCES
## 336                         ERIE 2-CHAUTAUQUA-CATTARAUGUS BOCES
## 337                                Erie County Technical School
## 338                                                     ESA 112
## 339                            Educational Service District 112
## 340                                 EDUCATIONAL SERVICE UNIT 09
## 341                                 EDUCATIONAL SERVICE UNIT 02
## 342                                 Eastern Upper Peninsula ISD
## 343                                 Eastern Upper Peninsula ISD
## 344                                                 McHenry ROE
## 345                             Henry-Stark County Spec Ed Dist
## 346                                       Exeter-West Greenwich
## 347                                       Exeter-West Greenwich
## 348                            INTERMEDIATE SCHOOL DISTRICT 287
## 349                                                Clarendon 80
## 350                              Eastland-Fairfield Career/Tech
## 351                                       FARGO SPECIAL ED UNIT
## 352                 Fayette County Career & Technical Institute
## 353                             FERGUS FALLS AREA SP. ED. COOP.
## 354                             FERGUS FALLS AREA SP. ED. COOP.
## 355                             FERGUS FALLS AREA SP. ED. COOP.
## 356                            SOUTHERN MN EDUCATION CONSORTIUM
## 357                            SOUTHERN MN EDUCATION CONSORTIUM
## 358                           Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 359                                          Grundy/Kendall ROE
## 360                            SOUTHERN MN EDUCATION CONSORTIUM
## 361                            INTERMEDIATE SCHOOL DISTRICT 287
## 362                           Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 363                                             Forbes Road CTC
## 364                                   NW Suburban Spec Educ Org
## 365                                   FT TOTTEN SPECIAL ED UNIT
## 366                                             Forty-Niner ROP
## 367                                   Four County Career Center
## 368                                         Franklin County CTC
## 369                               FRANKLIN-ESSEX-HAMILTON BOCES
## 370                            Southwest Metro Intermediate 288
## 371                                                   Ionia ISD
## 372                           Carroll/Jo Daviess/Stephenson ROE
## 373                                Eastern IL Area of Spec Educ
## 374                                        FRESHWATER ED. DIST.
## 375                                                  Fresno ROP
## 376                               STANDING ROCK SPECIAL ED UNIT
## 377                                          Fulton County AVTS
## 378                                             Macon/Piatt ROE
## 379                                                Greenwood 80
## 380                            Spec Educ Dist Lake County/Sedol
## 381                            INTERMEDIATE SCHOOL DISTRICT 287
## 382                                                 Genesee ISD
## 383                                                 Genesee ISD
## 384                                        GENESEE VALLEY BOCES
## 385                                 EDUCATIONAL SERVICE UNIT 13
## 386                                       Gratiot-Isabella RESD
## 387                              LAKE AGASSIZ SPECIAL ED. COOP.
## 388                               CAPITOL REGION EDUCATION COUN
## 389                                                  Macomb ISD
## 390                                            Glenn County ROP
## 391                                       Gogebic-Ontonagon ISD
## 392                           GOODHUE COUNTY EDUCATION DISTRICT
## 393                              GOVERNOR'S SCHOOL FOR THE ARTS
## 394                               GOV SCH GLOBAL ECONOMICS/TECH
## 395                                     Jamp Spec Educ Services
## 396                  GRAND FORKS AREA CAREER & TECHNICAL CENTER
## 397                                 GRAND FORKS SPECIAL ED UNIT
## 398                                  BOYS TOWN INTERIM PRG SCHS
## 399                                      Capital Region ESD 113
## 400                                                 Saginaw ISD
## 401              GREAT NORTHWEST AREA CAREER & TECHNICAL CENTER
## 402                                                  Macomb ISD
## 403                                               Menominee ISD
## 404                                                  Monroe ISD
## 405                                         Greater Altoona CTC
## 406                               CAPITOL REGION EDUCATION COUN
## 407                               CAPITOL REGION EDUCATION COUN
## 408                                       Greater Johnstown CTC
## 409                              NEW HORIZONS CAREER & TECH CTR
## 410                                                  Peoria ROE
## 411                    Greene County Vocational School District
## 412                                           Greene County CTC
## 413                                  Greene-Sullivan Sp Ed Coop
## 414                                               Hillsdale ISD
## 415                                         GST SPECIAL ED UNIT
## 416                                       Gratiot-Isabella RESD
## 417                                              Bristol Warren
## 418                                Eastern IL Area of Spec Educ
## 419                                Eastern IL Area of Spec Educ
## 420                                              Spartanburg 82
## 421                            HAMILTON-FULTON-MONTGOMERY BOCES
## 422                                   Region 06 West Cook ISC 2
## 423                                 EDUCATIONAL SERVICE UNIT 13
## 424                                            Belmont-Harrison
## 425                                                    Hart ROP
## 426                                 Hazleton Area Career Center
## 427                            INTERMEDIATE SCHOOL DISTRICT 287
## 428                            INTERMEDIATE SCHOOL DISTRICT 287
## 429                                 EDUCATIONAL SERVICE UNIT 13
## 430                                     Heartland Career Center
## 431                                                   Ionia ISD
## 432                                                  Ingham ISD
## 433                                               Multnomah ESD
## 434                            INTERMEDIATE SCHOOL DISTRICT 287
## 435                            INTERMEDIATE SCHOOL DISTRICT 287
## 436                            INTERMEDIATE SCHOOL DISTRICT 287
## 437                       HERKIMER-FULTON-HAMILTON-OTSEGO BOCES
## 438                                   NW Suburban Spec Educ Org
## 439                                               Washtenaw ISD
## 440                                                 Tuscola ISD
## 441                                               Hillsdale ISD
## 442                                               Hillsdale ISD
## 443                     Allegan Area Educational Service Agency
## 444                                 EDUCATIONAL SERVICE UNIT 13
## 445                                                     Chariho
## 446                                               Brown Co CDEB
## 447                                Kaskaskia Spec Educ District
## 448                                              Bristol Warren
## 449                                         Humboldt County ROP
## 450                                       Huntingdon County CTC
## 451                                                   Huron ISD
## 452                                                   Huron ISD
## 453                                HIAWATHA VALLEY ED. DISTRICT
## 454                                HIAWATHA VALLEY ED. DISTRICT
## 455                                       Iroquois/Kankakee ROE
## 456                                         Imperial Valley ROP
## 457                               RIVER BEND EDUCATION DISTRICT
## 458                            Indiana County Technology Center
## 459                         INFINITY:MINNESOTA  DIGITAL ACADEMY
## 460                                                  Ingham ISD
## 461                                                  Ingham ISD
## 462                                  Great Oaks Career Campuses
## 463                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 464                              LAKE AGASSIZ SPECIAL ED. COOP.
## 465                                             Oakland Schools
## 466                               CAPITOL REGION EDUCATION COUN
## 467                            INTERMEDIATE SCHOOL DISTRICT 287
## 468                            INTERMEDIATE SCHOOL DISTRICT 287
## 469                            INTERMEDIATE SCHOOL DISTRICT 287
## 470                                                  Iosco RESA
## 471                                   NORTHLAND LEARNING CENTER
## 472                                           Montcalm Area ISD
## 473                                           Montcalm Area ISD
## 474                                              Bay-Arenac ISD
## 475                                  Four Rivers Spec Educ Dist
## 476                                                 Jackson ISD
## 477                                                 Jackson ISD
## 478                             JACKSON RIVER GOVERNOR'S SCHOOL
## 479                                      JACKSON RIVER TECH CTR
## 480                           Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 481                          JAMES RIVER SPECIAL ED COOPERATIVE
## 482                 JAMES VALLEY AREA CAREER & TECHNICAL CENTER
## 483                                   NW Suburban Spec Educ Org
## 484                                   JAMESTOWN SPECIAL ED UNIT
## 485                                                 Lenawee ISD
## 486                               ARK. RIVER EDUC  SERVICE COOP
## 487                                            Jefferson County
## 488                                Jefferson County-DuBois AVTS
## 489              JEFFERSON-LEWIS-HAMILTON-HERKIMER-ONEIDA BOCES
## 490           Clare-Gladwin Regional Education Service District
## 491                            Spec Educ Dist Lake County/Sedol
## 492                                  S Will Co Coop for Spec Ed
## 493                         MEEKER AND WRIGHT SPECIAL EDUCATION
## 494                                     Region III Spec Ed Coop
## 495                                     Region III Spec Ed Coop
## 496                            Niles Twp District for Spec Educ
## 497                                          Champaign/Ford ROE
## 498                                             Ottawa Area ISD
## 499                                              Kalamazoo RESA
## 500                                              Kalamazoo RESA
## 501                                              Kalamazoo RESA
## 502                                              Kalamazoo RESA
## 503                                Kankakee Area Spec Educ Coop
## 504                                         NORTHEAST METRO 916
## 505                                Kaskaskia Spec Educ District
## 506                                                 De Kalb ROE
## 507                                                  Macomb ISD
## 508                                                    Kent ISD
## 509                                                    Kent ISD
## 510                                                    Kent ISD
## 511                                                    Kent ISD
## 512                                                    Kent ISD
## 513                                                    Kent ISD
## 514                           GOODHUE COUNTY EDUCATION DISTRICT
## 515                                             Kern County ROP
## 516                                               Kern High ROC
## 517                                        Keystone Central CTC
## 518                                              Bristol Warren
## 519                                 EDUCATIONAL SERVICE UNIT 13
## 520                                            Kings County ROP
## 521                                   NW Suburban Spec Educ Org
## 522                    Olympic Educational Service District 114
## 523                           Region 6 and 8-SW/WC Service Coop
## 524                                            Knox County JVSD
## 525                                            Knox County JVSD
## 526                                              Kalamazoo RESA
## 527                                              Kalamazoo RESA
## 528                                              Kalamazoo RESA
## 529                                              Kalamazoo RESA
## 530                                              Kalamazoo RESA
## 531                                        La Puente Valley ROP
## 532                            Lagrange Area Dept Spec Ed-Ladse
## 533                              LAKE AGASSIZ SPECIAL ED. COOP.
## 534                         LAKE AREA CAREER & TECHNICAL CENTER
## 535                           GOODHUE COUNTY EDUCATION DISTRICT
## 536                                                    Lake ROE
## 537                                             Lake County ROP
## 538                                 LAKE REGION SPECIAL ED UNIT
## 539                                            Walworth Co CDEB
## 540                         REGION 4-LAKES COUNTRY SERVICE COOP
## 541                         REGION 4-LAKES COUNTRY SERVICE COOP
## 542                         REGION 4-LAKES COUNTRY SERVICE COOP
## 543                         REGION 4-LAKES COUNTRY SERVICE COOP
## 544                            Southwest Metro Intermediate 288
## 545                                        Lancaster County CTC
## 546                                        Lancaster County CTC
## 547                                        Lancaster County CTC
## 548                                                  Lapeer ISD
## 549                            Spec Educ Dist Lake County/Sedol
## 550                                La Salle/Marshall/Putnam ROE
## 551                                                  Lassen ROP
## 552                         Cannon Valley Special Education Coo
## 553                                  Great Oaks Career Campuses
## 554                                             Lawrence County
## 555                                         Lawrence County CTC
## 556                                        FRESHWATER ED. DIST.
## 557                                       Delta-Schoolcraft ISD
## 558                                          Lebanon County CTC
## 559                         Lehigh Career & Technical Institute
## 560                                                 Lenape Tech
## 561                           Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 562                                Eastern IL Area of Spec Educ
## 563                                       Traverse Bay Area ISD
## 564                                 EDUCATIONAL SERVICE UNIT 13
## 565                                                Berrien RESA
## 566                              North DuPage Sp Ed Cooperative
## 567                                                    Will ROE
## 568                                                    Will ROE
## 569                                                    Will ROE
## 570                                  Plano Area Special Ed Coop
## 571                                                 Lenawee ISD
## 572                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 573                                  Great Oaks Career Campuses
## 574                            Livingston Co Spec Services Unit
## 575                            Livingston Co Spec Services Unit
## 576                                              Bay-Arenac ISD
## 577                                              Bay-Arenac ISD
## 578                                La Salle/Marshall/Putnam ROE
## 579                                La Salle/Marshall/Putnam ROE
## 580                                                 Jackson ISD
## 581                                               Washtenaw ISD
## 582                                    LONETREE SPECIAL ED UNIT
## 583                                      Long Beach Unified ROP
## 584                                      Los Angeles County ROP
## 585                                    Los Angeles Unified ROCP
## 586                               Lost River Career Cooperative
## 587                                                  Macomb ISD
## 588                                                Lycoming CTC
## 589                                                 Jackson ISD
## 590                        LYNCHBURG CITY SECONDARY ALTERNATIVE
## 591                                   NW Suburban Spec Educ Org
## 592                             Exc Children Have Opportunities
## 593                                                  Macomb ISD
## 594                                  Mid-Valley Special Ed Coop
## 595                                                    Kane ROE
## 596                                        MADISON-ONEIDA BOCES
## 597                                    MAGGIE L. WALKER GOV SCH
## 598                               Mahoning Co Career & Tech Ctr
## 599                                         Brunswick-Region 10
## 600                                           Muskegon Area ISD
## 601                                                  Ingham ISD
## 602                                                Manistee ISD
## 603                                                  Macomb ISD
## 604                                     Maplewood Career Center
## 605                                            Marin County ROP
## 606                                                       LEARN
## 607                                                 Genesee ISD
## 608                                        Marquette-Alger RESA
## 609                            Educational Service District 101
## 610                            Lincoln-Way Area Spec Ed JA Dist
## 611                                  MASSANUTTEN GOVERNOR'S SCH
## 612                                        MASSANUTTEN TECH CTR
## 613                                                 Lenawee ISD
## 614                   Midland County Educational Service Agency
## 615                                    McKeesport Area Tech Ctr
## 616                                         Mecosta-Osceola ISD
## 617                                         Mecosta-Osceola ISD
## 618              Medina County Joint Vocational School District
## 619                         MEEKER AND WRIGHT SPECIAL EDUCATION
## 620                                    Mendocino County ROC/ROP
## 621                                               Menominee ISD
## 622                                 EDUCATIONAL SERVICE UNIT 04
## 623                                           Merced County ROP
## 624                                 Mercer County Career Center
## 625                                 EDUCATIONAL SERVICE UNIT 13
## 626                                       Exeter-West Greenwich
## 627                                         NORTHEAST METRO 916
## 628                               METRO RICHMOND ALTERNATIVE ED
## 629                               CAPITOL REGION EDUCATION COUN
## 630                                                 Saginaw ISD
## 631                                    Miami Valley Career Tech
## 632                                    Miami Valley Career Tech
## 633                                                 Saginaw ISD
## 634                                MID STATE EDUCATION DISTRICT
## 635                                MID STATE EDUCATION DISTRICT
## 636                                           Rockland-Region 8
## 637                                MID STATE EDUCATION DISTRICT
## 638                        Middle Bucks Institute of Technology
## 639                               Vermilion Assoc for Spec Educ
## 640                                 RUNESTONE AREA ED. DISTRICT
## 641                                               Vermilion ROE
## 642                             MIDWEST SPECIAL EDUCATION COOP.
## 643            Mifflin County Academy of Science and Technology
## 644                                       Exeter-West Greenwich
## 645                                             Macon/Piatt ROE
## 646                                                 Lenawee ISD
## 647                                   NW Suburban Spec Educ Org
## 648                                MN VALLEY EDUCATION DISTRICT
## 649                                       MINOT SPECIAL ED UNIT
## 650                                          Mission Trails ROP
## 651                                        Mission Valley ROC/P
## 652               MISSOURI RIVER AREA CAREER & TECHNICAL CENTER
## 653                                             Rock Island ROE
## 654                            INTERMEDIATE SCHOOL DISTRICT 287
## 655                          MN RIVER VALLEY EDUCATION DISTRICT
## 656                          MN RIVER VALLEY EDUCATION DISTRICT
## 657                          MN RIVER VALLEY EDUCATION DISTRICT
## 658                          MN RIVER VALLEY EDUCATION DISTRICT
## 659                                MN VALLEY EDUCATION DISTRICT
## 660                                            Modoc County ROP
## 661                                              Mon Valley CTC
## 662                                           Mono County ROC/P
## 663                                              MONROE 1 BOCES
## 664                                      MONROE 2-ORLEANS BOCES
## 665                                   Monroe Career & Tech Inst
## 666                                                  Monroe ISD
## 667                                                  Monroe ISD
## 668                                                  Monroe ISD
## 669                                                  Monroe ISD
## 670                                         Monroe/Randolph ROE
## 671                                           Montcalm Area ISD
## 672                               CAPITOL REGION EDUCATION COUN
## 673                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 674                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 675                                      Lee/Ogle/Whiteside ROE
## 676                                MID STATE EDUCATION DISTRICT
## 677                                   Region 06 West Cook ISC 2
## 678                                               MORTON SCHOOL
## 679                                MORTON-SIOUX SPECIAL ED UNIT
## 680                                MID STATE EDUCATION DISTRICT
## 681                                MID STATE EDUCATION DISTRICT
## 682                           Clintn/Jeffrsn/Marin/Washngtn ROE
## 683                                              Bristol Warren
## 684                               MOUNTAIN VISTA GOVERNOR'S SCH
## 685                                School Assn For Special Educ
## 686                               CAPITOL REGION EDUCATION COUN
## 687                                           Muskegon Area ISD
## 688                                           Muskegon Area ISD
## 689                                         Mecosta-Osceola ISD
## 690                                                    Kent ISD
## 691                                      Lee/Ogle/Whiteside ROE
## 692                                      Lee/Ogle/Whiteside ROE
## 693                                             Napa County ROP
## 694                                                NASSAU BOCES
## 695                                 EDUCATIONAL SERVICE UNIT 04
## 696                                         NORTHEAST METRO 916
## 697                                         NORTHEAST METRO 916
## 698                                      NEBRASKA YOUTH ACADEMY
## 699                            INTERMEDIATE SCHOOL DISTRICT 287
## 700                                                  Macomb ISD
## 701                           Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 702                                                    Kane ROE
## 703                                       Traverse Bay Area ISD
## 704                            INTERMEDIATE SCHOOL DISTRICT 917
## 705                            INTERMEDIATE SCHOOL DISTRICT 287
## 706                                                    Kane ROE
## 707                                                    Kane ROE
## 708                   NEW DOMINION ALT. CTR./PRINCE WILLIAM CO.
## 709                              West Central IL Spec Educ Coop
## 710                                     NEW HORIZONS GOV SCHOOL
## 711                                  Plano Area Special Ed Coop
## 712                                  Plano Area Special Ed Coop
## 713                                         Newaygo County RESA
## 714                                         Newaygo County RESA
## 715                                         Newaygo County RESA
## 716                            Educational Service District 101
## 717                                   NORTHLAND LEARNING CENTER
## 718                                            Lincoln-Region 3
## 719                             Wabash & Ohio Valley Sp Ed Dist
## 720                                  Region 05 North Cook ISC 1
## 721                               NORTH COUNTRY VOC. COOP. CTR.
## 722   North County Regional Occupational Center/Program (ROC/P)
## 723                            INTERMEDIATE SCHOOL DISTRICT 287
## 724                       North Kern Vocational Training Center
## 725                             North Montco Tech Career Center
## 726                               North Orange County ROP-Adult
## 727                                              Lewis Cass ISD
## 728                              Northern Suburban Spec Ed Dist
## 729                              Northern Suburban Spec Ed Dist
## 730                 NORTH VALLEY AREA CAREER & TECHNICAL CENTER
## 731                                                    Kane ROE
## 732                                                    Kane ROE
## 733                              NORTHEAST NE JUVENILE SERVICES
## 734                    Northeast Regional School - Biotech/Agri
## 735                           REGION 3 - NORTHEAST SERVICE COOP
## 736                         Northern Lights Academy Cooperative
## 737                         Northern Lights Academy Cooperative
## 738                              NORTHERN NECK TECHNICAL CENTER
## 739                       NORTHERN NECK REGIONAL ALTERNATIVE ED
## 740                              NORTHERN NECK TECHNICAL CENTER
## 741                             NORTHERN PLAINS SPECIAL ED UNIT
## 742                            INTERMEDIATE SCHOOL DISTRICT 287
## 743                                 Northern Tier Career Center
## 744                                   Northern Westmoreland CTC
## 745                                   NORTHLAND LEARNING CENTER
## 746                                   NORTHLAND LEARNING CENTER
## 747                                   NORTHLAND LEARNING CENTER
## 748                                   NORTHLAND LEARNING CENTER
## 749                                   NORTHLAND LEARNING CENTER
## 750                                   Northumberland County CTC
## 751                                 Northwest Sp Ed Cooperative
## 752                                     NOVA ALTERNATIVE SCHOOL
## 753                                   NORTHLAND LEARNING CENTER
## 754                            INTERMEDIATE SCHOOL DISTRICT 287
## 755                             NW REGION INTERDISTRICT COUNCIL
## 756                                             Ottawa Area ISD
## 757                            INTERMEDIATE SCHOOL DISTRICT 287
## 758                                                    Kane ROE
## 759                         Austin Albert Lea Area Special Educ
## 760                            Franklin-Jefferson Co Sp Ed Dist
## 761                                             Oakland Schools
## 762                                             Oakland Schools
## 763                                             Oakland Schools
## 764                                             Oakland Schools
## 765                                             Oakland Schools
## 766                            INTERMEDIATE SCHOOL DISTRICT 287
## 767                                 Ohio Hi-Point Career Center
## 768                               OLIVER-MERCER SPECIAL ED UNIT
## 769                                  OMAHA HOME FOR BOYS SCHOOL
## 770                            INTERMEDIATE SCHOOL DISTRICT 287
## 771                               ONEIDA-HERKIMER-MADISON BOCES
## 772                             ONONDAGA-CORTLAND-MADISON BOCES
## 773                     ONTARIO-SENECA-YATES-CAYUGA-WAYNE BOCES
## 774                  Northwest Educational Service District 189
## 775                            INTERMEDIATE SCHOOL DISTRICT 287
## 776                            INTERMEDIATE SCHOOL DISTRICT 917
## 777                            INTERMEDIATE SCHOOL DISTRICT 287
## 778                                         ORANGE-ULSTER BOCES
## 779                                       ORLEANS-NIAGARA BOCES
## 780                                                OSWEGO BOCES
## 781                                          Grundy/Kendall ROE
## 782                      OTSEGO-DELAWARE-SCHOHARIE-GREENE BOCES
## 783                                             Ottawa Area ISD
## 784                                            Oxford-Region 11
## 785                                     A E R O  Spec Educ Coop
## 786                           Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 787                             Exc Children Have Opportunities
## 788                              Proviso Area Exceptional Child
## 789                              Proviso Area Exceptional Child
## 790                              Proviso Area Exceptional Child
## 791                              Proviso Area Exceptional Child
## 792                            Belleville Area Special Services
## 793                                         NORTHEAST METRO 916
## 794                            INTERMEDIATE SCHOOL DISTRICT 287
## 795                           Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 796                               Evanston Dists 65/202 Jnt Agr
## 797                            INTERMEDIATE SCHOOL DISTRICT 287
## 798                                            Parkway West CTC
## 799                                                  DuPage ROE
## 800                  Northwest Educational Service District 189
## 801                              PATHFINDER ED PRG-LANCASTER CO
## 802                                       St. Joseph County ISD
## 803                                              Livingston ESA
## 804                          ST. CROIX RIVER EDUCATION DISTRICT
## 805                           Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 806                           GOODHUE COUNTY EDUCATION DISTRICT
## 807                           GOODHUE COUNTY EDUCATION DISTRICT
## 808                            Belleville Area Special Services
## 809                      PATRICK J THOMAS JUVENILE JUSTICE CNTR
## 810                                                    Kane ROE
## 811                                                    Kane ROE
## 812                       PEACE GARDEN STUDENT SUPPORT SERVICES
## 813                              PEMBINA SPECIAL ED COOPERATIVE
## 814                              Penta Career Center - District
## 815                              Penta Career Center - District
## 816                                                  Peoria ROE
## 817                                 Perandoe Spec Educ District
## 818                             PETERSBURG REGIONAL ALTERNATIVE
## 819                            INTERMEDIATE SCHOOL DISTRICT 287
## 820                             Philip J Rock Center and School
## 821                              Black Hawk Area Sp Ed District
## 822                                   Pickaway-Ross County JVSD
## 823                               Alpena-Montmorency-Alcona ESD
## 824                                 PIEDMONT ALTERNATIVE SCHOOL
## 825                          PIEDMONT GOV SCH FOR MATH/SCI/TECH
## 826                          ST. CROIX RIVER EDUCATION DISTRICT
## 827                            PINE TO PRAIRIE COOPERATIVE CTR.
## 828                                         Mecosta-Osceola ISD
## 829                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 830                                 Pioneer Career & Technology
## 831                            Lincoln-Way Area Spec Ed JA Dist
## 832                           Region 6 and 8-SW/WC Service Coop
## 833                                  Plano Area Special Ed Coop
## 834                                           Plumas County ROP
## 835                                                     Polaris
## 836                                            Foster-Glocester
## 837                                            Foster-Glocester
## 838                                               Portage Lakes
## 839                            Porter County Education Services
## 840                             SOUTHERN PLAINS EDUCATION COOP.
## 841                            INTERMEDIATE SCHOOL DISTRICT 287
## 842                            INTERMEDIATE SCHOOL DISTRICT 287
## 843                            INTERMEDIATE SCHOOL DISTRICT 287
## 844                                          Grundy/Kendall ROE
## 845                                          Grundy/Kendall ROE
## 846                         SHERBURNE AND NORTHERN WRIGHT SPECI
## 847                                               Washtenaw ISD
## 848                                   PROJECT BRIDGE/RUSSELL CO
## 849                                 Southwest Cook Coop Spec Ed
## 850                           Frankln/Johnsn/Massc/Willimsn ROE
## 851                                          Grundy/Kendall ROE
## 852                              West Central IL Spec Educ Coop
## 853                                PROJECT RENEW/NORTHAMPTON CO
## 854                                         NORTHEAST METRO 916
## 855                                  PROJECT RETURN/FLUVANNA CO
## 856                                  PROJECT RETURN/POWHATAN CO
## 857                                                  Ingham ISD
## 858                           Region 6 and 8-SW/WC Service Coop
## 859                           Alxndr/Jcksn/Pulsk/Prry/Union ROE
## 860                              Proviso Area Exceptional Child
## 861                                   Region 06 West Cook ISC 2
## 862                               CAPITOL REGION EDUCATION COUN
## 863                                    PUTNAM-WESTCHESTER BOCES
## 864                                EASTERN CONNECTICUT REGIONAL
## 865                                         NORTHEAST METRO 916
## 866                                          Champaign/Ford ROE
## 867                                           Stark County Area
## 868                                              Spartanburg 81
## 869                               RIVER BEND EDUCATION DISTRICT
## 870                            Henderson/Knox/Mercer/Warren ROE
## 871                            Henderson/Knox/Mercer/Warren ROE
## 872                            Henderson/Knox/Mercer/Warren ROE
## 873                            Henderson/Knox/Mercer/Warren ROE
## 874                            Henderson/Knox/Mercer/Warren ROE
## 875                           Carroll/Jo Daviess/Stephenson ROE
## 876                           Carroll/Jo Daviess/Stephenson ROE
## 877                               RIVER BEND EDUCATION DISTRICT
## 878                           GOODHUE COUNTY EDUCATION DISTRICT
## 879                                      Reading Muhlenberg CTC
## 880                           Region 6 and 8-SW/WC Service Coop
## 881                           Region 6 and 8-SW/WC Service Coop
## 882                           GOODHUE COUNTY EDUCATION DISTRICT
## 883                               REG ALT ED CENTER/BUENA VISTA
## 884              REG ALTERNATIVE PLUS SELF PROJECT/ROANOKE CITY
## 885                                         Boone/Winnebago ROE
## 886                                         Boone/Winnebago ROE
## 887                                         Boone/Winnebago ROE
## 888                                      Bureau/Henry/Stark ROE
## 889                               CAPITOL REGION EDUCATION COUN
## 890                                            Rumford-Region 9
## 891                                            Houlton-Region 2
## 892                           DeWitt/Livingstn/Logan/McLean ROE
## 893                        REGIONAL ALTERNATIVE ED/KING WILLIAM
## 894                         REGIONAL ALTERNATIVE ED/STAFFORD CO
## 895                                         Boone/Winnebago ROE
## 896                         REGIONAL ALTERNATIVE/PITTSLVANIA CO
## 897                               REGIONAL ALTERNATIVE/WYTHE CO
## 898                                         Newaygo County RESA
## 899                                      Lee/Ogle/Whiteside ROE
## 900                           REGIONAL LEARNING ACADEMY/WISE CO
## 901                                                       LEARN
## 902                                  Region 07 South Cook ISC 4
## 903                                  Region 07 South Cook ISC 4
## 904                                         Boone/Winnebago ROE
## 905                                        RENAISSANCE/SCOTT CO
## 906                            RENSSELAER-COLUMBIA-GREENE BOCES
## 907                                                     Chariho
## 908                             Ripley-Ohio-Dearborn Sp Ed Coop
## 909                              Southside Sp Srvs Of Marion Co
## 910                               RIVER BEND EDUCATION DISTRICT
## 911                               RIVER BEND EDUCATION DISTRICT
## 912                                HIAWATHA VALLEY ED. DISTRICT
## 913                    Riverside County Office Of Education ROP
## 914                                                       LEARN
## 915                            INTERMEDIATE SCHOOL DISTRICT 917
## 916                                      ROANOKE VALLEY GOV SCH
## 917                                      Lee/Ogle/Whiteside ROE
## 918                                              ROCKLAND BOCES
## 919                                                  Macomb ISD
## 920                                              Bristol Warren
## 921                           Edw/Glt/Hlt/Hdn/Pop/Sln/Wbh/Wn/Wh
## 922                                 Mason/Tazewell/Woodford ROE
## 923                                 Mason/Tazewell/Woodford ROE
## 924                           Calhoun/Greene/Jersy/Macoupin ROE
## 925                           Calhoun/Greene/Jersy/Macoupin ROE
## 926                                                    Lake ROE
## 927                           Calhoun/Greene/Jersy/Macoupin ROE
## 928                           Calhoun/Greene/Jersy/Macoupin ROE
## 929                           Edw/Glt/Hlt/Hdn/Pop/Sln/Wbh/Wn/Wh
## 930                                             Ottawa Area ISD
## 931                                                C.O.O.R. ISD
## 932                                                C.O.O.R. ISD
## 933                   ROUGHRIDER AREA CAREER & TECHNICAL CENTER
## 934                                 ROWANTY VOCATIONAL TECH CTR
## 935                           Hancck/Fultn/Schuylr/McDonogh ROE
## 936                           Hancck/Fultn/Schuylr/McDonogh ROE
## 937                           Hancck/Fultn/Schuylr/McDonogh ROE
## 938                           Hancck/Fultn/Schuylr/McDonogh ROE
## 939                           Hancck/Fultn/Schuylr/McDonogh ROE
## 940                           Hancck/Fultn/Schuylr/McDonogh ROE
## 941                                  BOYS TOWN INTERIM PRG SCHS
## 942                                  BOYS TOWN INTERIM PRG SCHS
## 943                           Region 6 and 8-SW/WC Service Coop
## 944                            RUM RIVER SPECIAL EDUCATION COOP
## 945                            RUM RIVER SPECIAL EDUCATION COOP
## 946                            RUM RIVER SPECIAL EDUCATION COOP
## 947                                 RUNESTONE AREA ED. DISTRICT
## 948                                  RURAL CASS SPECIAL ED UNIT
## 949                                       Sacramento County ROP
## 950                            INTERMEDIATE SCHOOL DISTRICT 287
## 951                           DeWitt/Livingstn/Logan/McLean ROE
## 952                           Clintn/Jeffrsn/Marin/Washngtn ROE
## 953                           Clintn/Jeffrsn/Marin/Washngtn ROE
## 954                                                 Saginaw ISD
## 955                                                 Saginaw ISD
## 956                                HIAWATHA VALLEY ED. DISTRICT
## 957                                                  Ingham ISD
## 958                                             Saint Clair ROE
## 959                                  SAINT LAWRENCE-LEWIS BOCES
## 960                                         Menard/Sangamon ROE
## 961                                       Iroquois/Kankakee ROE
## 962                                             San Antonio ROP
## 963                                   San Bernardino County ROP
## 964                                        San Diego County ROP
## 965                                    San Francisco County ROP
## 966                                      San Joaquin County ROP
## 967                                        San Mateo County ROP
## 968                                         Menard/Sangamon ROE
## 969                                         Menard/Sangamon ROE
## 970                                                 Sanilac ISD
## 971                                                 Sanilac ISD
## 972                                    Santa Barbara County ROP
## 973                                    Santa Barbara County ROP
## 974                                      Santa Clara County ROP
## 975                                       Santa Cruz County ROP
## 976                                  Sangamon Area Spec Ed Dist
## 977                                  Great Oaks Career Campuses
## 978                            Tazewell-Mason Cntys Sp Ed Assoc
## 979               SCHUYLER-STEUBEN-CHEMUNG-TIOGA-ALLEGANY BOCES
## 980                               Schuylkill Technology Centers
## 981                               Schuylkill Technology Centers
## 982                       Scioto County Career Technical Center
## 983                            Spec Educ Assoc of Peoria County
## 984                            Spec Educ Assoc of Peoria County
## 985                            INTERMEDIATE SCHOOL DISTRICT 287
## 986                            Spec Educ Dist Lake County/Sedol
## 987                                           Montcalm Area ISD
## 988                Seneca Highlands Career and Technical Center
## 989               Vanguard-Sentinel Career & Technology Centers
## 990                                 South Eastern Sp Ed Program
## 991                                          Shasta-Trinity ROP
## 992                           Clk/Cls/Cmbn/Dglas/Edgr/Mltr/Shlb
## 993                                             Ottawa Area ISD
## 994                          SHENANDOAH VALLEY GOVERNORS SCHOOL
## 995                SHENANDOAH VALLEY REG ALTERNATIVE ED/GENESIS
## 996              SHEYENNE VALLEY AREA CAREER & TECHNICAL CENTER
## 997                             SHEYENNE VALLEY SPECIAL ED UNIT
## 998                                     Shiawassee Regional ESD
## 999                         MEEKER AND WRIGHT SPECIAL EDUCATION
## 1000                                EDUCATIONAL SERVICE UNIT 13
## 1001                                            Metro Education
## 1002                                               Siskiyou ROP
## 1003                              COOPERATIVE EDUCATIONAL SERVI
## 1004                 Northwest Educational Service District 189
## 1005                         ST. CROIX RIVER EDUCATION DISTRICT
## 1006                                                 Ingham ISD
## 1007                           SOUTHERN MN EDUCATION CONSORTIUM
## 1008                 Northwest Educational Service District 189
## 1009                                RUNESTONE AREA ED. DISTRICT
## 1010                              Macon-Piatt Spec Educ Jnt Agr
## 1011                                                   SOCRATES
## 1012                          Somerset County Technology Center
## 1013                                          Sonoma County ROP
## 1014                              SOURIS VALLEY SPECIAL ED UNIT
## 1015                                        NORTHEAST METRO 916
## 1016                      SOUTH CENTRAL PRAIRIE SPECIAL ED UNIT
## 1017                           INTERMEDIATE SCHOOL DISTRICT 287
## 1018                               SOUTH VALLEY SPECIAL ED UNIT
## 1019                               School Assn For Special Educ
## 1020                 SOUTHEAST REGION CAREER & TECHNICAL CENTER
## 1021                                 Southeastern Career Center
## 1022                                    Southern California ROC
## 1023                                             Southern Hills
## 1024                            SOUTHERN PLAINS EDUCATION COOP.
## 1025                            SOUTHERN PLAINS EDUCATION COOP.
## 1026                            SOUTHERN PLAINS EDUCATION COOP.
## 1027                    SOUTHSIDE L.I.N.K. PROJECT/BRUNSWICK CO
## 1028                                  SOUTHWEST SPECIAL ED UNIT
## 1029                                 SOUTHWEST VIRGINIA GOV SCH
## 1030                                 S Will Co Coop for Spec Ed
## 1031                                                Genesee ISD
## 1032                                                Genesee ISD
## 1033                                            Speed SEJA #802
## 1034                                            Speed SEJA #802
## 1035                                            Speed SEJA #802
## 1036                                            Speed SEJA #802
## 1037                           Educational Service District 101
## 1038                                   Springfield-Clark County
## 1039                         CENTRAL MINNESOTA JT. POWERS DIST.
## 1040                                            Macon/Piatt ROE
## 1041                                                 Ingham ISD
## 1042                    Allegan Area Educational Service Agency
## 1043                            WEST CENTRAL EDUCATION DISTRICT
## 1044                          Frankln/Johnsn/Massc/Willimsn ROE
## 1045                          Frankln/Johnsn/Massc/Willimsn ROE
## 1046                                                Calhoun ISD
## 1047                          Region 6 and 8-SW/WC Service Coop
## 1048                               School Assn For Special Educ
## 1049            Steel Center for Career and Technical Education
## 1050                                EDUCATIONAL SERVICE UNIT 15
## 1051                        MEEKER AND WRIGHT SPECIAL EDUCATION
## 1052                           INTERMEDIATE SCHOOL DISTRICT 287
## 1053                           INTERMEDIATE SCHOOL DISTRICT 287
## 1054                                                 Lapeer ISD
## 1055                           Educational Service District 101
## 1056                    West Shore Educational Service District
## 1057                                                   Kane ROE
## 1058                                                   Kane ROE
## 1059                                                   Kane ROE
## 1060                                                   Kane ROE
## 1061                           SOUTHERN MN EDUCATION CONSORTIUM
## 1062                                             SULLIVAN BOCES
## 1063                           INTERMEDIATE SCHOOL DISTRICT 287
## 1064                               SUN Area Technical Institute
## 1065                           INTERMEDIATE SCHOOL DISTRICT 287
## 1066                                     Susquehanna County CTC
## 1067                           Southwest Metro Intermediate 288
## 1068                           Southwest Metro Intermediate 288
## 1069                           Southwest Metro Intermediate 288
## 1070                           Southwest Metro Intermediate 288
## 1071                           Southwest Metro Intermediate 288
## 1072                           Southwest Metro Intermediate 288
## 1073                           Southwest Metro Intermediate 288
## 1074                           Southwest Metro Intermediate 288
## 1075                           Southwest Metro Intermediate 288
## 1076                          Region 6 and 8-SW/WC Service Coop
## 1077                          Region 6 and 8-SW/WC Service Coop
## 1078                          Region 6 and 8-SW/WC Service Coop
## 1079                          Region 6 and 8-SW/WC Service Coop
## 1080                          Region 6 and 8-SW/WC Service Coop
## 1081                                  Region 06 West Cook ISC 2
## 1082                                      Traverse Bay Area ISD
## 1083                                      Traverse Bay Area ISD
## 1084                                      Traverse Bay Area ISD
## 1085                                      Traverse Bay Area ISD
## 1086                           INTERMEDIATE SCHOOL DISTRICT 917
## 1087                        East Dakota Educational Cooperative
## 1088                        East Dakota Educational Cooperative
## 1089                        East Dakota Educational Cooperative
## 1090                           RENSSELAER-COLUMBIA-GREENE BOCES
## 1091                                      St. Clair County RESA
## 1092              Vanguard-Sentinel Career & Technology Centers
## 1093                                          Tehama County ROP
## 1094                               Kankakee Area Spec Educ Coop
## 1095                                              Multnomah ESD
## 1096                                                 Ingham ISD
## 1097                                                      LEARN
## 1098                    THE GOVERNOR'S SCHOOL @ INNOVATION PARK
## 1099                          Adam/Brwn/Cass/Morgn/Pik/Sctt ROE
## 1100            THE REGIONAL COMMUNITY ALTERNATIVE ED CONTINUUM
## 1101                                        NORTHEAST METRO 916
## 1102                               AREA COOPERATIVE EDUCATIONAL
## 1103                                Bi-County Special Educ Coop
## 1104                                                      LEARN
## 1105                  TIDEWATER REGIONAL ALTERNATIVE ED PROJECT
## 1106                                  NW Suburban Spec Educ Org
## 1107                           Tolles Career & Technical Center
## 1108                                TOMPKINS-SENECA-TIOGA BOCES
## 1109                                EDUCATIONAL SERVICE UNIT 01
## 1110                          GOODHUE COUNTY EDUCATION DISTRICT
## 1111                                Southwest Cook Coop Spec Ed
## 1112                                  ZUMBRO EDUCATION DISTRICT
## 1113                           Spec Educ Dist Lake County/Sedol
## 1114                                               C.O.O.R. ISD
## 1115                             North DuPage Sp Ed Cooperative
## 1116                               School Assn For Special Educ
## 1117                    TRANSITION SUPPORT RESOURCE CTR/FAIRFAX
## 1118                               Eastern IL Area of Spec Educ
## 1119                               Eastern IL Area of Spec Educ
## 1120                        MEEKER AND WRIGHT SPECIAL EDUCATION
## 1121                                             Tri-Cities ROP
## 1122                                   Tri-County Career Center
## 1123                             Tri-County Sp Ed Jnt Agreement
## 1124                                             Tri-County ROP
## 1125                             Tri-County Sp Ed Jnt Agreement
## 1126                             Tri-County Sp Ed Jnt Agreement
## 1127                                                 Tri-Rivers
## 1128                                             Tri-Valley ROP
## 1129                          Bnd/Chrstn/Effngh/Fytt/Mntgmr ROE
## 1130                                 Trumbull Career & Tech Ctr
## 1131                            TURTLE MOUNTAIN SPECIAL ED UNIT
## 1132                                                Tuscola ISD
## 1133                          Twin Rivers Career & Tech Ed Area
## 1134                              CAPITOL REGION EDUCATION COUN
## 1135                                                  U S Grant
## 1136                           Educational Service District 123
## 1137                                               ULSTER BOCES
## 1138                                            Bangor-Region 4
## 1139                              CAPITOL REGION EDUCATION COUN
## 1140                        Upper Bucks County Technical School
## 1141                                 Upper Valley Career Center
## 1142                               UPPER VALLEY SPECIAL ED UNIT
## 1143                                  UTA HALEE ACADEMY PROGRAM
## 1144                                     VALLEY VOCATIONAL TECH
## 1145                                             Kalamazoo RESA
## 1146                                                 Valley ROP
## 1147                               HIAWATHA VALLEY ED. DISTRICT
## 1148                                              Van Buren ISD
## 1149              Vanguard-Sentinel Career & Technology Centers
## 1150                                      Vantage Career Center
## 1151                           INTERMEDIATE SCHOOL DISTRICT 287
## 1152                           INTERMEDIATE SCHOOL DISTRICT 287
## 1153                                  Venango Technology Center
## 1154                           INTERMEDIATE SCHOOL DISTRICT 287
## 1155                           INTERMEDIATE SCHOOL DISTRICT 287
## 1156                                           Pike County Area
## 1157                           INTERMEDIATE SCHOOL DISTRICT 287
## 1158                        MEEKER AND WRIGHT SPECIAL EDUCATION
## 1159                                            Oakland Schools
## 1160                         ST. CROIX RIVER EDUCATION DISTRICT
## 1161                               School Assn For Special Educ
## 1162                           INTERMEDIATE SCHOOL DISTRICT 287
## 1163                              RIVER BEND EDUCATION DISTRICT
## 1164                                   WAHPETON SPECIAL ED UNIT
## 1165                                             Waldo-Region 7
## 1166                                                 Branch ISD
## 1167                           Educational Service District 123
## 1168                                         Warren County AVTS
## 1169                            Warren County Vocational School
## 1170                            Washington County Career Center
## 1171            WASHINGTON-SARATOGA-WARREN-HAMILTON-ESSEX BOCES
## 1172                                              Washtenaw ISD
## 1173                                              Washtenaw ISD
## 1174                                              Washtenaw ISD
## 1175                                              Washtenaw ISD
## 1176                                              Washtenaw ISD
## 1177                                                   Lake ROE
## 1178                                      Exeter-West Greenwich
## 1179                                          Wayne County JVSD
## 1180                             Woodford County Spec Educ Assn
## 1181                                EDUCATIONAL SERVICE UNIT 09
## 1182                                        NORTHEAST METRO 916
## 1183                                        NORTHEAST METRO 916
## 1184                                          Muskegon Area ISD
## 1185                                  Region 06 West Cook ISC 2
## 1186                                  Region 06 West Cook ISC 2
## 1187                                  Region 06 West Cook ISC 2
## 1188                           INTERMEDIATE SCHOOL DISTRICT 287
## 1189                                                   Kane ROE
## 1190                            WEST CENTRAL EDUCATION DISTRICT
## 1191                            WEST CENTRAL EDUCATION DISTRICT
## 1192                           INTERMEDIATE SCHOOL DISTRICT 287
## 1193                                 WEST FARGO SPECIAL ED UNIT
## 1194                           INTERMEDIATE SCHOOL DISTRICT 917
## 1195                           INTERMEDIATE SCHOOL DISTRICT 917
## 1196                           INTERMEDIATE SCHOOL DISTRICT 287
## 1197                           WEST RIVER STUDENT SERVICES UNIT
## 1198                    West Shore Educational Service District
## 1199                                              West Side CTC
## 1200                           INTERMEDIATE SCHOOL DISTRICT 287
## 1201                                          WESTCHESTER BOCES
## 1202                                           Western Area CTC
## 1203                                EDUCATIONAL SERVICE UNIT 08
## 1204                                     Western Montgomery CTC
## 1205                                EDUCATIONAL SERVICE UNIT 13
## 1206                                      WESTERN SUFFOLK BOCES
## 1207                        MEEKER AND WRIGHT SPECIAL EDUCATION
## 1208                                      Wexford-Missaukee ISD
## 1209                                      Wexford-Missaukee ISD
## 1210                 Northwest Educational Service District 189
## 1211                                       FRESHWATER ED. DIST.
## 1212                                      Wilkes-Barre Area CTC
## 1213                                          Lorain County JVS
## 1214                                      WIlliam (R) Rouse ROP
## 1215                           Williamson Co Spec Educ District
## 1216                           Williamson Co Spec Educ District
## 1217                                     WILMAC SPECIAL ED UNIT
## 1218                                                 Ingham ISD
## 1219                               HIAWATHA VALLEY ED. DISTRICT
## 1220                        MEEKER AND WRIGHT SPECIAL EDUCATION
## 1221                            SOUTHERN PLAINS EDUCATION COOP.
## 1222                             Northern Suburban Spec Ed Dist
## 1223                               AREA COOPERATIVE EDUCATIONAL
## 1224                                              Washtenaw ISD
## 1225                                                Tuscola ISD
## 1226                           SOUTHERN MN EDUCATION CONSORTIUM
## 1227                                      St. Clair County RESA
## 1228                                             Kalamazoo RESA
## 1229                             NEW HORIZONS CAREER & TECH CTR
## 1230                                    WRIGHT TECHNICAL CENTER
## 1231                                    WRIGHT TECHNICAL CENTER
## 1232                                    WRIGHT TECHNICAL CENTER
## 1233                                         Grundy/Kendall ROE
## 1234                                            Yolo County ROP
## 1235                               York Co School of Technology
## 1236                                               Yosemite ROP
## 1237                                              Washtenaw ISD
## 1238                                             Kalamazoo RESA
## 1239                                                Jackson ISD
## 1240                               YOUTH LINKS-HEARTLAND FAMILY
## 1241                           INTERMEDIATE SCHOOL DISTRICT 917
## 1242                     Mid-East Career and Technology Centers
## 1243                                  ZUMBRO EDUCATION DISTRICT
## 1244                                  ZUMBRO EDUCATION DISTRICT
## 1245                                  ZUMBRO EDUCATION DISTRICT
## 1246                          GOODHUE COUNTY EDUCATION DISTRICT
##                County_Name COUNTY.ID Urban.centric.Locale Latitude  Longitude
## 1             Adams County     31001     32-Town: Distant 40.58287  -98.36683
## 2          Hennepin County     27053     21-Suburb: Large 44.95820  -93.41184
## 3          Hennepin County     27053     21-Suburb: Large 44.95825  -93.41183
## 4          Hennepin County     27053     21-Suburb: Large 44.93413  -93.41242
## 5          Hennepin County     27053     21-Suburb: Large 44.95458  -93.41379
## 6          Hennepin County     27053     21-Suburb: Large 44.93300  -93.44948
## 7          Hennepin County     27053       13-City: Small 44.85706  -93.47677
## 8          Hennepin County     27053     21-Suburb: Large 44.90960  -93.51107
## 9          Hennepin County     27053     21-Suburb: Large 44.90940  -93.51115
## 10         Hennepin County     27053     21-Suburb: Large 44.90941  -93.51147
## 11         Hennepin County     27053     41-Rural: Fringe 44.95491  -93.67219
## 12         Hennepin County     27053     21-Suburb: Large 44.94423  -93.66838
## 13         Hennepin County     27053     21-Suburb: Large 44.94308  -93.36092
## 14         Hennepin County     27053     21-Suburb: Large 44.94355  -93.36141
## 15         Hennepin County     27053     21-Suburb: Large 44.94316  -93.36095
## 16         Hennepin County     27053     21-Suburb: Large 44.88420  -93.25129
## 17         Hennepin County     27053     21-Suburb: Large 44.90035  -93.41835
## 18         Hennepin County     27053     21-Suburb: Large 45.06620  -93.37460
## 19           Ramsey County     27123     21-Suburb: Large 45.03684  -92.98547
## 20           Dakota County     27037     41-Rural: Fringe 44.73731  -93.07860
## 21           Dakota County     27037     21-Suburb: Large 44.74134  -93.11453
## 22           Dakota County     27037     41-Rural: Fringe 44.73725  -93.07806
## 23           Dakota County     27037     21-Suburb: Large 44.74140  -93.11454
## 24           Dakota County     27037     41-Rural: Fringe 44.73727  -93.07776
## 25             Cook County     17031     21-Suburb: Large 41.75374  -87.76978
## 26        Allegheny County     42003     21-Suburb: Large 40.57906  -80.00604
## 27       Washington County     51191     23-Suburb: Small 36.69671  -82.00065
## 28       Washington County     27163     21-Suburb: Large 45.04596  -92.81221
## 29             Cook County     17031     21-Suburb: Large 41.63585  -87.61333
## 30             Cook County     17031     21-Suburb: Large 41.52369  -87.65536
## 31            Adams County     17001      33-Town: Remote 39.93156  -91.39305
## 32             Cook County     17031     21-Suburb: Large 41.63447  -87.61485
## 33         Hartford County      9003     21-Suburb: Large 41.89561  -72.65293
## 34         Hartford County      9003     21-Suburb: Large 41.64388  -72.66433
## 35         Hartford County      9003     21-Suburb: Large 41.68454  -72.80979
## 36            Adams County     31001     41-Rural: Fringe 40.58420  -98.42259
## 37            Adams County     17001      33-Town: Remote 39.93156  -91.39305
## 38          Cambria County     42021      31-Town: Fringe 40.48855  -78.74073
## 39       Livingston County     26093  22-Suburb: Mid-size 42.61239  -83.95238
## 40           Albany County     36001     21-Suburb: Large 42.74465  -73.83815
## 41         Hennepin County     27053       13-City: Small 44.87209  -93.49274
## 42         Hennepin County     27053     21-Suburb: Large 45.09659  -93.39487
## 43         Hennepin County     27053     21-Suburb: Large 45.05369  -93.38660
## 44         Hennepin County     27053     21-Suburb: Large 44.86805  -93.31084
## 45         Hennepin County     27053     21-Suburb: Large 44.90105  -93.42134
## 46         Hennepin County     27053       13-City: Small 44.87208  -93.49304
## 47         Hennepin County     27053     21-Suburb: Large 44.88261  -93.37665
## 48         Hennepin County     27053     21-Suburb: Large 44.87519  -93.28547
## 49         Hennepin County     27053     21-Suburb: Large 44.87595  -93.28532
## 50         Hennepin County     27053     41-Rural: Fringe 44.95503  -93.67220
## 51         Hennepin County     27053     41-Rural: Fringe 44.99481  -93.59548
## 52          Douglas County     31055       11-City: Large 41.32225  -96.02053
## 53             Rice County     27131     32-Town: Distant 44.29164  -93.28169
## 54          Allegan County     26005     41-Rural: Fringe 42.53539  -85.82808
## 55         Hennepin County     27053       13-City: Small 45.01137  -93.45455
## 56             Cook County     17031     21-Suburb: Large 41.89010  -87.78885
## 57           Ramsey County     27123     21-Suburb: Large 45.01293  -93.10396
## 58       Montgomery County     51121       13-City: Small 37.13210  -80.40409
## 59           Amador County      6005     32-Town: Distant 38.35252 -120.77769
## 60         Nottoway County     51135    42-Rural: Distant 37.26374  -78.13269
## 61         Hartford County      9003     21-Suburb: Large 41.80994  -72.83578
## 62      Los Angeles County      6037     21-Suburb: Large 34.55736 -118.10665
## 63           Dakota County     27037     21-Suburb: Large 44.78424  -93.25230
## 64            Allen County     39003     23-Suburb: Small 40.69205  -84.14949
## 65         Petersburg city     51730     21-Suburb: Large 37.22558  -77.41153
## 66             Lake County     17097     21-Suburb: Large 42.16649  -87.82113
## 67           Morgan County     17137     32-Town: Distant 39.73754  -90.24033
## 68          Douglas County     17041     32-Town: Distant 39.68161  -88.28442
## 69           Putnam County     18133     32-Town: Distant 39.64738  -86.81598
## 70       Washington County     27163     21-Suburb: Large 44.92410  -92.94985
## 71          Windham County      9015      31-Town: Fringe 41.71232  -72.21622
## 72         Nicollet County     27103      31-Town: Fringe 44.34323  -93.96180
## 73       Washington County     44009  22-Suburb: Mid-size 41.42057  -71.79119
## 74          Ashland County     39005    42-Rural: Distant 40.80119  -82.26679
## 75        Ashtabula County     39007     41-Rural: Fringe 41.74693  -80.73591
## 76        Effingham County     17049      33-Town: Remote 39.11982  -88.55341
## 77           Ramsey County     27123     21-Suburb: Large 45.01294  -93.10406
## 78           Ramsey County     27123     21-Suburb: Large 45.01293  -93.10405
## 79           Jasper County     17079    42-Rural: Distant 38.99028  -88.02157
## 80           Jasper County     17079    42-Rural: Distant 38.99028  -88.02157
## 81         Hennepin County     27053       13-City: Small 44.99981  -93.45045
## 82             Lake County     39085     41-Rural: Fringe 41.64912  -81.24373
## 83            Mower County     27099     32-Town: Distant 43.66821  -93.00214
## 84           Macomb County     26099     21-Suburb: Large 42.57326  -82.95219
## 85   San Bernardino County      6071    12-City: Mid-size 34.04615 -117.63615
## 86         Barnwell County     45011    42-Rural: Distant 33.31729  -81.34412
## 87            Barry County     26015     32-Town: Distant 42.66121  -85.29197
## 88          Stearns County     27145     43-Rural: Remote 45.50223  -95.12993
## 89          Stearns County     27145     32-Town: Distant 45.72886  -94.94325
## 90           Jasper County     45053     41-Rural: Fringe 32.35341  -80.92167
## 91           Beaver County     42007     21-Suburb: Large 40.65383  -80.30275
## 92          Bedford County     42009     41-Rural: Fringe 40.02188  -78.43729
## 93        Van Buren County     26159    42-Rural: Distant 42.30924  -86.11187
## 94       Richardson County     31147     43-Rural: Remote 40.16839  -95.94675
## 95           Ramsey County     27123     21-Suburb: Large 45.06370  -92.99277
## 96          Belmont County     39013     41-Rural: Fringe 40.07840  -80.96569
## 97         Beltrami County     27007     41-Rural: Fringe 47.47007  -94.90367
## 98           Benton County     27009  22-Suburb: Mid-size 45.58679  -94.16047
## 99          Stearns County     27145  22-Suburb: Mid-size 45.61611  -94.21214
## 100         Stearns County     27145  22-Suburb: Mid-size 45.61572  -94.21220
## 101          Benton County     27009  22-Suburb: Mid-size 45.58696  -94.16047
## 102           Berks County     42011     41-Rural: Fringe 40.38343  -75.79583
## 103           Berks County     42011     21-Suburb: Large 40.38836  -76.00082
## 104         Berrien County     26021     41-Rural: Fringe 41.95477  -86.30448
## 105       Van Buren County     26159    42-Rural: Distant 42.21190  -86.04984
## 106     Northampton County     42095     21-Suburb: Large 40.66433  -75.33416
## 107       Whiteside County     17195     32-Town: Distant 41.78992  -89.70318
## 108        Burleigh County     38015       13-City: Small 46.82186 -100.81164
## 109        Burleigh County     38015       13-City: Small 46.81347 -100.79489
## 110        Burleigh County     38015       13-City: Small 46.82295 -100.81390
## 111            Gila County      4007      33-Town: Remote 33.34534 -110.45315
## 112     Rock Island County     17161     21-Suburb: Large 41.48430  -90.43613
## 113        Lawrence County     46081     32-Town: Distant 44.48446 -103.81780
## 114        Lawrence County     46081     32-Town: Distant 44.48446 -103.81780
## 115         Berrien County     26021      31-Town: Fringe 41.95067  -86.34668
## 116        Fluvanna County     51065    42-Rural: Distant 37.87394  -78.26150
## 117           Boone County     17007     21-Suburb: Large 42.24726  -88.83116
## 118         Douglas County     31055     21-Suburb: Large 41.25970  -96.12788
## 119          Macomb County     26099     21-Suburb: Large 42.55540  -83.00549
## 120          Branch County     26023     32-Town: Distant 41.95025  -84.99541
## 121            Cook County     17031     21-Suburb: Large 41.61871  -87.76759
## 122           Henry County     51089     41-Rural: Fringe 36.74228  -79.89285
## 123         Morrill County     31123     43-Rural: Remote 41.66634 -103.09644
## 124          Marion County     17121      33-Town: Remote 38.50459  -89.13817
## 125        New Kent County     51127    42-Rural: Distant 37.51591  -76.98009
## 126        New Kent County     51127    42-Rural: Distant 37.51591  -76.98009
## 127           Sarpy County     31153     21-Suburb: Large 41.18848  -96.08866
## 128            Cass County     26027    42-Rural: Distant 41.90207  -86.08871
## 129          Broome County     36007  22-Suburb: Mid-size 42.13000  -75.93473
## 130        Iroquois County     17075    42-Rural: Distant 40.64748  -87.78849
## 131      Tuscarawas County     39157     41-Rural: Fringe 40.47029  -81.40183
## 132          Holmes County     39075    42-Rural: Distant 40.54837  -81.78084
## 133          Gallia County     39053    42-Rural: Distant 38.89218  -82.38798
## 134           Bucks County     42017     21-Suburb: Large 40.15957  -74.85295
## 135        Guernsey County     39059     41-Rural: Fringe 39.92763  -81.52126
## 136        Burleigh County     38015       13-City: Small 46.84962 -100.77097
## 137          Butler County     42019      31-Town: Fringe 40.86463  -79.91724
## 138           Hampton city     51650    12-City: Mid-size 37.06274  -76.41125
## 139          Butler County     39017     21-Suburb: Large 39.34167  -84.39937
## 140          Butler County     39017     21-Suburb: Large 39.44174  -84.36538
## 141          Butler County     39017     21-Suburb: Large 39.39980  -84.56545
## 142           Butte County      6007       13-City: Small 39.71583 -121.80445
## 143     Los Angeles County      6037     21-Suburb: Large 33.88254 -118.13434
## 144         Calhoun County     26025       13-City: Small 42.33918  -85.17321
## 145         Calhoun County     26025     41-Rural: Fringe 42.28370  -84.93716
## 146         Goodhue County     27049     32-Town: Distant 44.51040  -92.90240
## 147         Goodhue County     27049     32-Town: Distant 44.51263  -92.88654
## 148          Carbon County     42025      31-Town: Fringe 40.88522  -75.72777
## 149           Mower County     27099     43-Rural: Remote 43.51310  -92.50939
## 150            Cook County     17031     21-Suburb: Large 41.64873  -87.75143
## 151      Washington County     27163     21-Suburb: Large 45.04127  -92.98128
## 152        Houghton County     26061      33-Town: Remote 47.12695  -88.57767
## 153           Iosco County     26069    42-Rural: Distant 44.28022  -83.58477
## 154        Anderson County     45007     41-Rural: Fringe 34.60510  -82.50028
## 155         Licking County     39089     23-Suburb: Small 40.10007  -82.42907
## 156         Ventura County      6111       13-City: Small 34.20761 -119.07515
## 157     Northampton County     42095     41-Rural: Fringe 40.76303  -75.23363
## 158          Ottawa County     26139     41-Rural: Fringe 42.88720  -86.12226
## 159         Genesee County     26049     21-Suburb: Large 42.97813  -83.69993
## 160         Carroll County     51035    42-Rural: Distant 36.76781  -80.73500
## 161            Cass County     38017  22-Suburb: Mid-size 46.87600  -96.90211
## 162     Cattaraugus County     36009     41-Rural: Fringe 42.09326  -78.40556
## 163          Cayuga County     36011     41-Rural: Fringe 42.91759  -76.61630
## 164          Monroe County     17133    42-Rural: Distant 38.29051  -89.94887
## 165         Genesee County     26049     21-Suburb: Large 42.95678  -83.72120
## 166         Madison County     17119     21-Suburb: Large 38.73010  -89.88071
## 167    Scotts Bluff County     31157      33-Town: Remote 41.84379 -103.65960
## 168        Antelope County     31003     43-Rural: Remote 42.12926  -98.03422
## 169        Antelope County     31003     43-Rural: Remote 42.12712  -98.03026
## 170         Stearns County     27145       13-City: Small 45.57095  -94.17216
## 171         Stearns County     27145    42-Rural: Distant 45.73443  -94.46511
## 172         Stearns County     27145    42-Rural: Distant 45.31398  -94.30370
## 173         Stearns County     27145  22-Suburb: Mid-size 45.62261  -94.20777
## 174          Benton County     27009    42-Rural: Distant 45.67209  -93.90897
## 175          Benton County     27009     41-Rural: Fringe 45.60965  -94.12629
## 176      Montgomery County     42091     21-Suburb: Large 40.12583  -75.31411
## 177         Johnson County     18081     21-Suburb: Large 39.58954  -86.09987
## 178          Orange County      6059    12-City: Mid-size 33.66799 -117.88006
## 179          Centre County     42027     41-Rural: Fringe 40.88230  -77.74039
## 180       El Dorado County      6017     41-Rural: Fringe 38.72118 -120.86658
## 181         Lynchburg city     51680       13-City: Small 37.36073  -79.20551
## 182    Westmoreland County     42129     21-Suburb: Large 40.22656  -79.60348
## 183          Marion County     17121      33-Town: Remote 38.55000  -89.12895
## 184            Ogle County     17141    42-Rural: Distant 41.98107  -89.22220
## 185      Charlevoix County     26029      33-Town: Remote 45.21144  -85.01287
## 186      Charlevoix County     26029      33-Town: Remote 45.32988  -85.23964
## 187      Washington County     44009     41-Rural: Fringe 41.45012  -71.69765
## 188      Washington County     44009     41-Rural: Fringe 41.44831  -71.69588
## 189      Washington County     44009     41-Rural: Fringe 41.45009  -71.69645
## 190      Washington County     44009     41-Rural: Fringe 41.44861  -71.69815
## 191      Washington County     44009     41-Rural: Fringe 41.44979  -71.65539
## 192       Albemarle County     51003     23-Suburb: Small 38.06248  -78.46378
## 193           Essex County     51057     32-Town: Distant 37.93099  -76.86109
## 194         Chester County     42029     21-Suburb: Large 40.00590  -75.68172
## 195         Chester County     42029     21-Suburb: Large 39.80111  -75.87698
## 196         Chester County     42029     21-Suburb: Large 40.11815  -75.54033
## 197       Lancaster County     31109       11-City: Large 40.79624  -96.70818
## 198         Chisago County     27025     41-Rural: Fringe 45.50766  -92.96452
## 199      Montgomery County     17135     32-Town: Distant 39.30017  -89.27973
## 200        Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 201         LaSalle County     17099     32-Town: Distant 41.32964  -89.13580
## 202         Clallam County     53009      33-Town: Remote 48.11928 -123.48486
## 203           Clare County     26035    42-Rural: Distant 43.96314  -84.76537
## 204         Clarion County     42031     41-Rural: Fringe 41.23352  -79.42555
## 205           Clark County     53011    12-City: Mid-size 45.62995 -122.67652
## 206      Clearfield County     42033     41-Rural: Fringe 41.03064  -78.41876
## 207         Clinton County     26037     41-Rural: Fringe 42.98568  -84.54412
## 208         Clinton County     36019     32-Town: Distant 44.70502  -73.52761
## 209       Jefferson County     17081     32-Town: Distant 38.31658  -88.91125
## 210          Orange County      6059    12-City: Mid-size 33.67112 -117.90086
## 211          Richmond city     51760    12-City: Mid-size 37.56809  -77.45502
## 212         Bristol County     44001     21-Suburb: Large 41.67176  -71.27642
## 213  San Bernardino County      6071       13-City: Small 34.06830 -117.20498
## 214        Columbia County     42037     23-Suburb: Small 41.02860  -76.36218
## 215      Columbiana County     39029     32-Town: Distant 40.76785  -80.74800
## 216    Spotsylvania County     51177     41-Rural: Fringe 38.29519  -77.57545
## 217           Clare County     26035    42-Rural: Distant 43.96200  -84.76656
## 218         Berrien County     26021      31-Town: Fringe 41.95144  -86.34869
## 219      Livingston County     26093  22-Suburb: Mid-size 42.61249  -83.95241
## 220         Sanilac County     26151     32-Town: Distant 43.42255  -82.82484
## 221          Ottawa County     26139     23-Suburb: Small 42.81016  -86.02385
## 222       Van Buren County     26159      31-Town: Fringe 42.21822  -85.87953
## 223     Los Angeles County      6037     21-Suburb: Large 33.90071 -118.20656
## 224        Hartford County      9003       13-City: Small 41.74977  -72.64365
## 225          DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 226         Fayette County     42051     41-Rural: Fringe 40.02541  -79.57001
## 227    Contra Costa County      6013     21-Suburb: Large 37.93491 -122.06974
## 228     Rock Island County     17161       13-City: Small 41.49087  -90.48815
## 229       Roscommon County     26143    42-Rural: Distant 44.49980  -84.66516
## 230       Roscommon County     26143    42-Rural: Distant 44.49980  -84.66516
## 231       Roscommon County     26143    42-Rural: Distant 44.49446  -84.66222
## 232       Cheboygan County     26031     43-Rural: Remote 45.46184  -84.61095
## 233         Jackson County     17077      31-Town: Fringe 37.75606  -89.34142
## 234      Orangeburg County     45075    42-Rural: Distant 33.37416  -81.00584
## 235        Houghton County     26061      33-Town: Remote 47.13094  -88.61023
## 236          Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 237       Coshocton County     39031     41-Rural: Fringe 40.29834  -81.84763
## 238          Canyon County     16027    42-Rural: Distant 43.68167 -116.90547
## 239            Vigo County     18167       13-City: Small 39.46510  -87.39682
## 240         Cowlitz County     53015       13-City: Small 46.14054 -122.91945
## 241        Crawford County     42039     32-Town: Distant 41.63462  -80.12628
## 242           Bristol city     51520       13-City: Small 36.60001  -82.18638
## 243      Lackawanna County     42069       13-City: Small 41.45359  -75.65230
## 244      Cumberland County     42041     41-Rural: Fringe 40.25592  -77.03604
## 245          Dakota County     27037     21-Suburb: Large 44.74147  -93.11446
## 246        Cuyahoga County     39035     21-Suburb: Large 41.34434  -81.62544
## 247            Rice County     27131     41-Rural: Fringe 44.32086  -93.27140
## 248            Lake County     17097     21-Suburb: Large 42.35536  -87.98389
## 249          Butler County     39017     21-Suburb: Large 39.40884  -84.49210
## 250          Dakota County     27037     41-Rural: Fringe 44.73730  -93.07818
## 251     Spartanburg County     45083  22-Suburb: Mid-size 34.98064  -81.86311
## 252         Dauphin County     42043     21-Suburb: Large 40.29290  -76.77974
## 253          Dakota County     27037     21-Suburb: Large 44.76738  -93.26704
## 254          DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 255       Hillsdale County     26059     32-Town: Distant 41.94720  -84.65798
## 256       Del Norte County      6015      33-Town: Remote 41.76987 -124.20919
## 257        Delaware County     39041     41-Rural: Fringe 40.29942  -83.02795
## 258        Delaware County     39041     41-Rural: Fringe 40.23160  -83.03902
## 259        Delaware County     42045     21-Suburb: Large 39.88228  -75.45361
## 260        Delaware County     42045     21-Suburb: Large 39.89188  -75.27954
## 261        Delaware County     42045     21-Suburb: Large 39.98855  -75.36722
## 262        Chenango County     36017     41-Rural: Fringe 42.58526  -75.52016
## 263           Delta County     26041      33-Town: Remote 45.74211  -87.08408
## 264     Schoolcraft County     26153      33-Town: Remote 45.95892  -86.24530
## 265          Sevier County      5133    42-Rural: Distant 34.17103  -94.31517
## 266             Bay County     26017     23-Suburb: Small 43.61654  -83.80192
## 267           Mason County     26105     41-Rural: Fringe 43.95617  -86.33297
## 268           Meade County     46093     32-Town: Distant 44.39284 -103.50164
## 269            Cook County     17031     21-Suburb: Large 41.62423  -87.70179
## 270        Hamilton County     39061     21-Suburb: Large 39.18680  -84.65741
## 271       Dickinson County     26043      33-Town: Remote 45.80575  -88.08624
## 272           Stark County     38089      33-Town: Remote 46.88348 -102.79243
## 273       Dickinson County     26043      33-Town: Remote 45.80469  -88.08654
## 274       Dickinson County     26043      33-Town: Remote 45.80519  -88.08321
## 275          Dillon County     45033     41-Rural: Fringe 34.40623  -79.35072
## 276          DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 277        Hartford County      9003     21-Suburb: Large 41.71936  -72.67520
## 278        Hennepin County     27053       13-City: Small 44.99976  -93.45035
## 279      Dorchester County     45035    42-Rural: Distant 33.14857  -80.38789
## 280         Calhoun County     26025     23-Suburb: Small 42.32145  -85.13409
## 281         Douglas County     31055       11-City: Large 41.24701  -95.97375
## 282            Kane County     17089    12-City: Mid-size 42.03659  -88.27632
## 283      New London County      9011  22-Suburb: Mid-size 41.33198  -72.16726
## 284          DuPage County     17043     21-Suburb: Large 41.86762  -88.14269
## 285        Dutchess County     36027     21-Suburb: Large 41.74298  -73.86683
## 286            Lake County     18089     21-Suburb: Large 41.44126  -87.36051
## 287          Oceana County     26127     32-Town: Distant 43.70231  -86.35751
## 288           Mason County     26105     41-Rural: Fringe 43.95640  -86.33283
## 289          Wadena County     27159      33-Town: Remote 46.43768  -95.12209
## 290       Washtenaw County     26161     21-Suburb: Large 42.24750  -83.62416
## 291        Montcalm County     26117    42-Rural: Distant 43.25404  -85.10007
## 292          Branch County     26023     32-Town: Distant 41.95297  -85.01802
## 293         Genesee County     26049     21-Suburb: Large 42.97813  -83.69993
## 294         Genesee County     26049     21-Suburb: Large 42.95593  -83.72158
## 295          Oceana County     26127     32-Town: Distant 43.68969  -86.35687
## 296            Kane County     17089     21-Suburb: Large 41.79072  -88.28147
## 297            Eddy County     38027     43-Rural: Remote 47.67950  -99.13830
## 298       St. Louis County     27137      33-Town: Remote 47.51748  -92.54176
## 299     Los Angeles County      6037     21-Suburb: Large 34.07681 -117.93763
## 300          Ramsey County     27123     21-Suburb: Large 45.01293  -93.10405
## 301      Montgomery County     42091     21-Suburb: Large 40.15899  -75.10847
## 302         Madison County     31119     41-Rural: Fringe 42.06238  -97.41058
## 303         Suffolk County     36103     21-Suburb: Large 40.78125  -72.99658
## 304    Westmoreland County     42129     21-Suburb: Large 40.31005  -79.35879
## 305          Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 306        Franklin County     39049     21-Suburb: Large 39.88274  -82.88518
## 307          Wright County     27171      31-Town: Fringe 45.28660  -93.77213
## 308         Mecosta County     26107     32-Town: Distant 43.69308  -85.46242
## 309           Eaton County     26045      31-Town: Fringe 42.58004  -84.80187
## 310           Eaton County     26045     41-Rural: Fringe 42.63083  -84.73626
## 311           Eaton County     26045      31-Town: Fringe 42.58125  -84.80179
## 312           Eaton County     26045     21-Suburb: Large 42.71815  -84.63028
## 313           Eaton County     26045      31-Town: Fringe 42.58151  -84.80174
## 314           Eaton County     26045     21-Suburb: Large 42.75528  -84.74012
## 315         Goodhue County     27049     41-Rural: Fringe 44.53680  -92.51713
## 316        Franklin County     17055     32-Town: Distant 37.99812  -88.91577
## 317            Cook County     17031     21-Suburb: Large 41.61607  -87.62627
## 318            Cook County     17031     21-Suburb: Large 42.12906  -87.82688
## 319         Alameda County      6001    12-City: Mid-size 37.63824 -122.10062
## 320          Dakota County     27037     41-Rural: Fringe 44.73720  -93.07735
## 321         Newaygo County     26123     41-Rural: Fringe 43.46905  -85.91647
## 322          Morgan County     17137     32-Town: Distant 39.71944  -90.23115
## 323            Gage County     31067     32-Town: Distant 40.26664  -96.77611
## 324            Erie County     39043     41-Rural: Fringe 41.33170  -82.63156
## 325        Hennepin County     27053     21-Suburb: Large 44.88229  -93.37679
## 326          Ottawa County     26139  22-Suburb: Mid-size 43.06465  -86.22259
## 327      Otter Tail County     27111    42-Rural: Distant 46.39054  -95.32601
## 328         Genesee County     26049     21-Suburb: Large 42.95526  -83.70767
## 329          Emmons County     38029     43-Rural: Remote 46.26705 -100.22720
## 330        Freeborn County     27047    42-Rural: Distant 43.67252  -93.57428
## 331        Fillmore County     27045    42-Rural: Distant 43.69715  -92.38829
## 332           Mower County     27099    42-Rural: Distant 43.70927  -92.56207
## 333      Newport News city     51700    12-City: Mid-size 37.08471  -76.46466
## 334        Hennepin County     27053     21-Suburb: Large 44.89544  -93.45762
## 335            Erie County     36029     21-Suburb: Large 42.85128  -78.78550
## 336            Erie County     36029     21-Suburb: Large 42.64880  -79.03762
## 337            Erie County     42049     41-Rural: Fringe 42.02962  -80.09503
## 338           Clark County     53011    12-City: Mid-size 45.63909 -122.60581
## 339           Clark County     53011    12-City: Mid-size 45.63909 -122.60581
## 340           Adams County     31001     32-Town: Distant 40.58298  -98.36632
## 341        Saunders County     31155     41-Rural: Fringe 41.37974  -96.50284
## 342        Chippewa County     26033      33-Town: Remote 46.49771  -84.34319
## 343        Chippewa County     26033    42-Rural: Distant 46.22919  -84.59652
## 344         McHenry County     17111     41-Rural: Fringe 42.23411  -88.53744
## 345           Henry County     17073    42-Rural: Distant 41.41599  -90.01604
## 346            Kent County     44003     41-Rural: Fringe 41.60759  -71.63840
## 347            Kent County     44003     41-Rural: Fringe 41.60759  -71.63840
## 348        Hennepin County     27053     21-Suburb: Large 45.07516  -93.38731
## 349       Clarendon County     45027     41-Rural: Fringe 33.72564  -80.19969
## 350       Fairfield County     39045     41-Rural: Fringe 39.75902  -82.66788
## 351            Cass County     38017    12-City: Mid-size 46.88082  -96.78376
## 352         Fayette County     42051     23-Suburb: Small 39.86141  -79.74107
## 353      Otter Tail County     27111      33-Town: Remote 46.28802  -96.08819
## 354      Otter Tail County     27111      33-Town: Remote 46.28849  -96.06783
## 355      Otter Tail County     27111      33-Town: Remote 46.28849  -96.06783
## 356           Mower County     27099    42-Rural: Distant 43.56566  -92.71830
## 357        Freeborn County     27047    42-Rural: Distant 43.67312  -93.57402
## 358         Jackson County     17077      31-Town: Fringe 37.76411  -89.33496
## 359         Kendall County     17093     21-Suburb: Large 41.66585  -88.54680
## 360           Mower County     27099    42-Rural: Distant 43.50914  -92.94379
## 361        Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 362         Fayette County     17051      33-Town: Remote 38.96549  -89.11121
## 363       Allegheny County     42003     21-Suburb: Large 40.44903  -79.74874
## 364            Cook County     17031       13-City: Small 42.02804  -87.90552
## 365          Benson County     38005    42-Rural: Distant 47.97485  -99.02523
## 366          Placer County      6061      31-Town: Fringe 38.90653 -121.08116
## 367           Henry County     39069    42-Rural: Distant 41.45105  -84.29914
## 368        Franklin County     42055     41-Rural: Fringe 39.89839  -77.68723
## 369        Franklin County     36033      33-Town: Remote 44.84181  -74.28201
## 370           Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 371           Ionia County     26067     41-Rural: Fringe 42.95503  -85.09336
## 372      Stephenson County     17177     32-Town: Distant 42.28664  -89.62734
## 373       Effingham County     17049      33-Town: Remote 39.12344  -88.53874
## 374            Todd County     27153      33-Town: Remote 46.36554  -94.79227
## 375          Fresno County      6019       11-City: Large 36.81031 -119.76460
## 376           Sioux County     38085     43-Rural: Remote 46.09340 -100.67893
## 377          Fulton County     42057    42-Rural: Distant 39.92911  -77.99909
## 378           Macon County     17115       13-City: Small 39.84388  -88.95343
## 379       Greenwood County     45047     32-Town: Distant 34.23398  -82.16543
## 380            Lake County     17097     21-Suburb: Large 42.35394  -87.98613
## 381        Hennepin County     27053     21-Suburb: Large 45.09659  -93.39487
## 382         Genesee County     26049     21-Suburb: Large 42.95611  -83.72808
## 383         Genesee County     26049     21-Suburb: Large 42.98372  -83.77590
## 384         Genesee County     36037     32-Town: Distant 42.97078  -78.00187
## 385    Scotts Bluff County     31157      33-Town: Remote 41.82635 -103.66515
## 386        Isabella County     26073     32-Town: Distant 43.61027  -84.77011
## 387            Clay County     27027    42-Rural: Distant 46.88316  -96.31986
## 388        Hartford County      9003     21-Suburb: Large 41.70883  -72.59441
## 389          Macomb County     26099     21-Suburb: Large 42.64102  -82.91472
## 390           Glenn County      6021     32-Town: Distant 39.51729 -122.20961
## 391       Ontonagon County     26131     43-Rural: Remote 46.59193  -89.57296
## 392         Goodhue County     27049    42-Rural: Distant 44.40199  -92.62818
## 393           Norfolk city     51710    12-City: Mid-size 36.84942  -76.29055
## 394       Charlotte County     51037     43-Rural: Remote 37.03500  -78.45755
## 395         Pulaski County     17153     43-Rural: Remote 37.24940  -89.02100
## 396     Grand Forks County     38035       13-City: Small 47.87601  -97.06313
## 397     Grand Forks County     38035       13-City: Small 47.87595  -97.06315
## 398            Hall County     31079     41-Rural: Fringe 40.85964  -98.37745
## 399        Thurston County     53067       13-City: Small 46.99463 -122.91663
## 400         Saginaw County     26145  22-Suburb: Mid-size 43.51625  -83.96569
## 401        Williams County     38105      33-Town: Remote 48.15861 -103.61307
## 402          Macomb County     26099     21-Suburb: Large 42.61797  -82.95458
## 403       Menominee County     26109     32-Town: Distant 45.13647  -87.61533
## 404          Monroe County     26115     41-Rural: Fringe 41.92379  -83.46654
## 405           Blair County     42013       13-City: Small 40.50830  -78.39808
## 406        Hartford County      9003    12-City: Mid-size 41.75114  -72.68372
## 407        Hartford County      9003    12-City: Mid-size 41.75558  -72.66299
## 408         Cambria County     42021     23-Suburb: Small 40.27262  -78.83120
## 409           Hampton city     51650    12-City: Mid-size 37.06274  -76.41160
## 410          Peoria County     17143    12-City: Mid-size 40.69969  -89.58054
## 411          Greene County     39057     41-Rural: Fringe 39.76944  -83.94639
## 412          Greene County     42059     32-Town: Distant 39.89373  -80.15108
## 413          Greene County     18055     32-Town: Distant 39.03474  -87.16545
## 414       Hillsdale County     26059     32-Town: Distant 41.94720  -84.65798
## 415          Traill County     38097     43-Rural: Remote 47.50046  -97.37163
## 416         Gratiot County     26057     32-Town: Distant 43.37793  -84.65734
## 417         Bristol County     44001     21-Suburb: Large 41.67741  -71.27694
## 418           Clark County     17023     32-Town: Distant 39.38427  -87.69093
## 419        Moultrie County     17139     32-Town: Distant 39.58471  -88.60572
## 420     Spartanburg County     45083     41-Rural: Fringe 35.12303  -82.02238
## 421      Montgomery County     36057     41-Rural: Fringe 42.98433  -74.29897
## 422            Cook County     17031     21-Suburb: Large 41.88090  -87.90779
## 423    Scotts Bluff County     31157      33-Town: Remote 41.87283 -103.64549
## 424        Harrison County     39067     41-Rural: Fringe 40.29205  -80.99761
## 425     Los Angeles County      6037     21-Suburb: Large 34.39958 -118.49257
## 426         Luzerne County     42079     23-Suburb: Small 40.97134  -75.99221
## 427        Hennepin County     27053     21-Suburb: Large 44.93413  -93.41242
## 428        Hennepin County     27053     21-Suburb: Large 45.06266  -93.31123
## 429    Scotts Bluff County     31157      33-Town: Remote 41.84298 -103.65967
## 430          Wabash County     18169     41-Rural: Fringe 40.82306  -85.82883
## 431           Ionia County     26067     41-Rural: Fringe 42.95345  -85.07034
## 432          Ingham County     26065     41-Rural: Fringe 42.59922  -84.45048
## 433       Multnomah County     41051       11-City: Large 45.56126 -122.57425
## 434        Hennepin County     27053     21-Suburb: Large 45.09655  -93.39784
## 435        Hennepin County     27053     21-Suburb: Large 45.09597  -93.39686
## 436        Hennepin County     27053       13-City: Small 44.83574  -93.44424
## 437        Herkimer County     36043     41-Rural: Fringe 43.03852  -74.96313
## 438            Cook County     17031       13-City: Small 42.10390  -87.95936
## 439       Washtenaw County     26161     21-Suburb: Large 42.26024  -83.79713
## 440         Tuscola County     26157     41-Rural: Fringe 43.50614  -83.39145
## 441       Hillsdale County     26059     32-Town: Distant 41.94720  -84.65798
## 442       Hillsdale County     26059     32-Town: Distant 41.94053  -84.65287
## 443         Allegan County     26005     32-Town: Distant 42.52710  -85.85806
## 444    Scotts Bluff County     31157      33-Town: Remote 41.84311 -103.66107
## 445      Washington County     44009    42-Rural: Distant 41.51071  -71.71360
## 446           Brown County     55009  22-Suburb: Mid-size 44.42999  -88.08064
## 447      Washington County     17189    42-Rural: Distant 38.44649  -89.27361
## 448         Bristol County     44001     21-Suburb: Large 41.72444  -71.25407
## 449        Humboldt County      6023      33-Town: Remote 40.80149 -124.14944
## 450      Huntingdon County     42061    42-Rural: Distant 40.43398  -77.92789
## 451           Huron County     26063     41-Rural: Fringe 43.80378  -83.03914
## 452           Huron County     26063     41-Rural: Fringe 43.80273  -83.04043
## 453          Winona County     27169     32-Town: Distant 44.02134  -91.60939
## 454         Houston County     27055     32-Town: Distant 43.63406  -91.50261
## 455        Kankakee County     17091     23-Suburb: Small 41.08055  -87.87005
## 456        Imperial County      6025       13-City: Small 32.79150 -115.55892
## 457           Brown County     27015     32-Town: Distant 44.29984  -94.44788
## 458         Indiana County     42063     41-Rural: Fringe 40.64551  -79.12259
## 459          Itasca County     27061      33-Town: Remote 47.24319  -93.49492
## 460          Ingham County     26065     41-Rural: Fringe 42.59740  -84.44778
## 461          Ingham County     26065       13-City: Small 42.75434  -84.49654
## 462        Hamilton County     39061     21-Suburb: Large 39.28646  -84.41417
## 463          Wright County     27171      31-Town: Fringe 45.30052  -93.78243
## 464            Clay County     27027    42-Rural: Distant 46.88344  -96.31992
## 465         Oakland County     26125     21-Suburb: Large 42.60248  -83.22617
## 466        Hartford County      9003     21-Suburb: Large 41.80551  -72.59644
## 467        Hennepin County     27053     21-Suburb: Large 44.86805  -93.31084
## 468        Hennepin County     27053     21-Suburb: Large 45.08292  -93.39390
## 469        Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 470           Iosco County     26069    42-Rural: Distant 44.28022  -83.58477
## 471     Koochiching County     27071      33-Town: Remote 48.59270  -93.42826
## 472        Montcalm County     26117    42-Rural: Distant 43.29870  -85.07521
## 473        Montcalm County     26117     32-Town: Distant 43.19146  -85.23578
## 474             Bay County     26017     23-Suburb: Small 43.61937  -83.93236
## 475          Morgan County     17137     32-Town: Distant 39.71659  -90.24299
## 476         Jackson County     26075     41-Rural: Fringe 42.16544  -84.41079
## 477         Jackson County     26075     41-Rural: Fringe 42.16644  -84.40966
## 478       Alleghany County     51005     41-Rural: Fringe 37.81127  -79.85256
## 479       Alleghany County     51005    42-Rural: Distant 37.78813  -79.90985
## 480           Perry County     17145     32-Town: Distant 38.00918  -89.22994
## 481        Stutsman County     38093      33-Town: Remote 46.90680  -98.70595
## 482        Stutsman County     38093      33-Town: Remote 46.91750  -98.69083
## 483            Cook County     17031       13-City: Small 42.12805  -87.96738
## 484        Stutsman County     38093      33-Town: Remote 46.90680  -98.70595
## 485         Lenawee County     26091     41-Rural: Fringe 41.91702  -84.02345
## 486       Jefferson County      5069       13-City: Small 34.22760  -92.00926
## 487       Jefferson County     39081     41-Rural: Fringe 40.35901  -80.76084
## 488       Jefferson County     42065      33-Town: Remote 41.10946  -78.89244
## 489       Jefferson County     36045     41-Rural: Fringe 43.97033  -75.97104
## 490           Clare County     26035    42-Rural: Distant 43.94165  -84.76892
## 491            Lake County     17097     21-Suburb: Large 42.24156  -87.97197
## 492            Will County     17197     21-Suburb: Large 41.54670  -88.12662
## 493          Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 494          Jersey County     17083    42-Rural: Distant 39.04337  -90.25950
## 495         Madison County     17119     23-Suburb: Small 38.90956  -90.06123
## 496            Cook County     17031     21-Suburb: Large 42.03933  -87.77086
## 497       Champaign County     17019       13-City: Small 40.11017  -88.18369
## 498          Ottawa County     26139    42-Rural: Distant 42.94050  -86.08473
## 499       Kalamazoo County     26077       13-City: Small 42.29137  -85.57905
## 500       Kalamazoo County     26077       13-City: Small 42.30290  -85.64766
## 501       Kalamazoo County     26077       13-City: Small 42.25827  -85.61769
## 502       Kalamazoo County     26077       13-City: Small 42.29137  -85.57874
## 503        Kankakee County     17091     23-Suburb: Small 41.07897  -87.87074
## 504           Anoka County     27003     21-Suburb: Large 45.14132  -93.17557
## 505          Marion County     17121      33-Town: Remote 38.51898  -89.10402
## 506          DeKalb County     17037     41-Rural: Fringe 41.93987  -88.87793
## 507          Macomb County     26099    12-City: Mid-size 42.48607  -82.99753
## 508            Kent County     26081    12-City: Mid-size 42.99356  -85.59583
## 509            Kent County     26081    12-City: Mid-size 42.99356  -85.59583
## 510            Kent County     26081    12-City: Mid-size 42.99186  -85.59164
## 511            Kent County     26081    12-City: Mid-size 42.99657  -85.59878
## 512            Kent County     26081    12-City: Mid-size 42.99657  -85.59878
## 513            Kent County     26081    12-City: Mid-size 42.99465  -85.59869
## 514         Goodhue County     27049    42-Rural: Distant 44.26785  -92.98972
## 515            Kern County      6029     32-Town: Distant 35.05314 -118.17223
## 516            Kern County      6029       11-City: Large 35.34934 -118.96683
## 517         Clinton County     42035     41-Rural: Fringe 41.11368  -77.50745
## 518         Bristol County     44001     21-Suburb: Large 41.72914  -71.25937
## 519         Kimball County     31105     43-Rural: Remote 41.23504 -103.66539
## 520           Kings County      6031       13-City: Small 36.33091 -119.66567
## 521            Cook County     17031     21-Suburb: Large 42.10087  -88.04469
## 522          Kitsap County     53035  22-Suburb: Mid-size 47.52060 -122.66573
## 523           Swift County     27151     43-Rural: Remote 45.19503  -95.32222
## 524            Knox County     39083     32-Town: Distant 40.37597  -82.47485
## 525            Knox County     39083     32-Town: Distant 40.37597  -82.47485
## 526       Kalamazoo County     26077       13-City: Small 42.30324  -85.60149
## 527       Kalamazoo County     26077       13-City: Small 42.32469  -85.55617
## 528       Kalamazoo County     26077       13-City: Small 42.20156  -85.58574
## 529       Kalamazoo County     26077       13-City: Small 42.28052  -85.56821
## 530       Kalamazoo County     26077  22-Suburb: Mid-size 42.29061  -85.65181
## 531     Los Angeles County      6037     21-Suburb: Large 34.01266 -117.89855
## 532          DuPage County     17043     21-Suburb: Large 41.75528  -87.95510
## 533            Clay County     27027    42-Rural: Distant 46.87800  -96.32319
## 534          Ramsey County     38071      33-Town: Remote 48.12586  -98.87099
## 535         Wabasha County     27157     32-Town: Distant 44.44443  -92.26620
## 536            Lake County     17097     21-Suburb: Large 42.35397  -87.98619
## 537            Lake County      6033     32-Town: Distant 39.03430 -122.91478
## 538          Ramsey County     38071      33-Town: Remote 48.10151  -98.85969
## 539        Walworth County     55127     41-Rural: Fringe 42.66120  -88.49073
## 540      Otter Tail County     27111      33-Town: Remote 46.28638  -96.11581
## 541         Douglas County     27041      33-Town: Remote 45.88612  -95.39032
## 542            Clay County     27027  22-Suburb: Mid-size 46.85050  -96.75691
## 543            Clay County     27027  22-Suburb: Mid-size 46.86674  -96.76247
## 544          Wright County     27171     41-Rural: Fringe 45.15272  -93.75506
## 545       Lancaster County     42071     41-Rural: Fringe 40.13408  -76.19330
## 546       Lancaster County     42071     41-Rural: Fringe 40.11661  -76.50748
## 547       Lancaster County     42071     21-Suburb: Large 39.98476  -76.26641
## 548          Lapeer County     26087    42-Rural: Distant 43.05334  -83.16488
## 549            Lake County     17097     21-Suburb: Large 42.35598  -87.98568
## 550         LaSalle County     17099     32-Town: Distant 41.37284  -88.82579
## 551          Lassen County      6035      33-Town: Remote 40.37574 -120.58094
## 552            Rice County     27131     32-Town: Distant 44.45741  -93.14728
## 553         Clinton County     39027     41-Rural: Fringe 39.42791  -83.78927
## 554        Lawrence County     39087     41-Rural: Fringe 38.49185  -82.47393
## 555        Lawrence County     42073      31-Town: Fringe 40.97601  -80.33096
## 556      Otter Tail County     27111    42-Rural: Distant 46.39048  -95.32600
## 557           Delta County     26041      33-Town: Remote 45.73631  -87.07893
## 558         Lebanon County     42075     23-Suburb: Small 40.34108  -76.39077
## 559          Lehigh County     42077     21-Suburb: Large 40.66387  -75.60862
## 560       Armstrong County     42005     41-Rural: Fringe 40.76765  -79.52107
## 561           Coles County     17029    42-Rural: Distant 39.41564  -88.28618
## 562           Coles County     17029     32-Town: Distant 39.47103  -88.36089
## 563  Grand Traverse County     26055      33-Town: Remote 44.74587  -85.56388
## 564    Scotts Bluff County     31157      33-Town: Remote 41.87283 -103.64549
## 565         Berrien County     26021     41-Rural: Fringe 42.04429  -86.46236
## 566          DuPage County     17043     21-Suburb: Large 41.98928  -88.08613
## 567            Will County     17197     21-Suburb: Large 41.54212  -88.06797
## 568            Will County     17197     21-Suburb: Large 41.54212  -88.06797
## 569            Will County     17197     21-Suburb: Large 41.54212  -88.06797
## 570         Kendall County     17093    42-Rural: Distant 41.47868  -88.48157
## 571         Lenawee County     26091     41-Rural: Fringe 41.91709  -84.02341
## 572          Wright County     27171      31-Town: Fringe 45.28643  -93.78375
## 573        Clermont County     39025     21-Suburb: Large 39.19748  -84.21840
## 574      Livingston County     17105     41-Rural: Fringe 40.88900  -88.61324
## 575      Livingston County     17105     32-Town: Distant 40.88529  -88.64066
## 576          Arenac County     26011    42-Rural: Distant 43.98335  -83.88769
## 577             Bay County     26017     23-Suburb: Small 43.59535  -83.83491
## 578         LaSalle County     17099     32-Town: Distant 41.32983  -89.13588
## 579         LaSalle County     17099     32-Town: Distant 41.34628  -88.84237
## 580         Jackson County     26075       13-City: Small 42.23326  -84.42954
## 581       Washtenaw County     26161     21-Suburb: Large 42.26024  -83.79713
## 582           Wells County     38103     43-Rural: Remote 47.77531  -99.92541
## 583     Los Angeles County      6037       11-City: Large 33.80541 -118.14927
## 584     Los Angeles County      6037     21-Suburb: Large 33.91647 -118.12929
## 585     Los Angeles County      6037       11-City: Large 34.05646 -118.25745
## 586          Orange County     18117     32-Town: Distant 38.54980  -86.47706
## 587          Macomb County     26099     21-Suburb: Large 42.60648  -82.92223
## 588        Lycoming County     42081      31-Town: Fringe 41.23911  -76.73315
## 589         Jackson County     26075     23-Suburb: Small 42.28995  -84.40960
## 590         Lynchburg city     51680       13-City: Small 37.40788  -79.14736
## 591            Cook County     17031     21-Suburb: Large 42.10821  -87.94707
## 592            Cook County     17031     21-Suburb: Large 41.59003  -87.60037
## 593          Macomb County     26099     21-Suburb: Large 42.61797  -82.95458
## 594            Kane County     17089     21-Suburb: Large 41.90678  -88.29381
## 595            Kane County     17089     21-Suburb: Large 41.90584  -88.29371
## 596          Oneida County     36065     41-Rural: Fringe 43.14220  -75.56060
## 597          Richmond city     51760    12-City: Mid-size 37.55791  -77.45363
## 598        Mahoning County     39099     21-Suburb: Large 41.03226  -80.78694
## 599      Cumberland County     23005      31-Town: Fringe 43.90838  -69.99303
## 600        Muskegon County     26121       13-City: Small 43.24077  -86.20276
## 601          Ingham County     26065    42-Rural: Distant 42.43989  -84.54471
## 602        Manistee County     26101     41-Rural: Fringe 44.27084  -86.28771
## 603          Macomb County     26099     21-Suburb: Large 42.54843  -83.01163
## 604         Portage County     39133     41-Rural: Fringe 41.18569  -81.22472
## 605           Marin County      6041       13-City: Small 38.01378 -122.55028
## 606      New London County      9011  22-Suburb: Mid-size 41.33746  -72.07167
## 607         Genesee County     26049     21-Suburb: Large 43.05459  -83.80097
## 608       Marquette County     26103      33-Town: Remote 46.54894  -87.38806
## 609         Spokane County     53063      31-Town: Fringe 47.57086 -117.69608
## 610            Will County     17197     21-Suburb: Large 41.50764  -87.96519
## 611      Shenandoah County     51171    42-Rural: Distant 38.73458  -78.64576
## 612      Harrisonburg city     51660       13-City: Small 38.40105  -78.90210
## 613         Lenawee County     26091     41-Rural: Fringe 41.87723  -84.06814
## 614         Midland County     26111       13-City: Small 43.63308  -84.22739
## 615       Allegheny County     42003     21-Suburb: Large 40.34432  -79.83155
## 616         Mecosta County     26107     32-Town: Distant 43.69573  -85.46221
## 617         Mecosta County     26107     32-Town: Distant 43.69308  -85.46239
## 618          Medina County     39103     41-Rural: Fringe 41.15498  -81.90134
## 619          Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 620       Mendocino County      6045     41-Rural: Fringe 39.12932 -123.16531
## 621       Menominee County     26109     32-Town: Distant 45.13640  -87.61526
## 622          Nemaha County     31127      33-Town: Remote 40.39317  -95.84927
## 623          Merced County      6047       13-City: Small 37.29762 -120.48800
## 624          Mercer County     42085     41-Rural: Fringe 41.25005  -80.24504
## 625    Scotts Bluff County     31157      33-Town: Remote 41.88933 -103.67446
## 626      Washington County     44009     41-Rural: Fringe 41.59980  -71.64307
## 627           Anoka County     27003     21-Suburb: Large 45.09743  -93.26474
## 628          Richmond city     51760    12-City: Mid-size 37.54105  -77.43304
## 629        Hartford County      9003     21-Suburb: Large 41.87101  -72.72675
## 630         Saginaw County     26145  22-Suburb: Mid-size 43.36908  -83.90261
## 631      Montgomery County     39113     21-Suburb: Large 39.84272  -84.32858
## 632      Montgomery County     39113    12-City: Mid-size 39.74190  -84.19719
## 633         Saginaw County     26145  22-Suburb: Mid-size 43.42425  -84.05391
## 634        Morrison County     27097    42-Rural: Distant 45.80385  -94.57007
## 635        Morrison County     27097     32-Town: Distant 45.97492  -94.33299
## 636            Knox County     23013      33-Town: Remote 44.09068  -69.10914
## 637      Mille Lacs County     27095     43-Rural: Remote 46.07434  -93.66002
## 638           Bucks County     42017     21-Suburb: Large 40.27051  -75.08719
## 639       Vermilion County     17183     23-Suburb: Small 40.10157  -87.66134
## 640         Douglas County     27041      33-Town: Remote 45.90178  -95.36500
## 641       Vermilion County     17183     23-Suburb: Small 40.10163  -87.66174
## 642         Stevens County     27149     41-Rural: Fringe 45.59016  -95.90823
## 643         Mifflin County     42087     32-Town: Distant 40.60572  -77.55394
## 644            Kent County     44003     41-Rural: Fringe 41.61270  -71.63767
## 645           Macon County     17115       13-City: Small 39.84661  -88.95212
## 646         Lenawee County     26091     32-Town: Distant 41.94971  -83.96648
## 647            Cook County     17031       13-City: Small 42.08413  -87.96977
## 648        Nicollet County     27103      31-Town: Fringe 44.34334  -93.96187
## 649            Ward County     38101      33-Town: Remote 48.23384 -101.28955
## 650        Monterey County      6053    12-City: Mid-size 36.68752 -121.62480
## 651         Alameda County      6001     21-Suburb: Large 37.52817 -121.98415
## 652          Morton County     38059     23-Suburb: Small 46.81914 -100.85348
## 653     Rock Island County     17161       13-City: Small 41.42442  -90.58599
## 654          Ramsey County     27123       11-City: Large 44.96237  -93.19559
## 655        Chippewa County     27023      33-Town: Remote 44.94911  -95.71076
## 656        Chippewa County     27023      33-Town: Remote 44.94913  -95.71072
## 657        Chippewa County     27023      33-Town: Remote 44.94915  -95.71067
## 658        Chippewa County     27023      33-Town: Remote 44.94937  -95.70965
## 659        Nicollet County     27103      31-Town: Fringe 44.34336  -93.96181
## 660           Modoc County      6049      33-Town: Remote 41.48016 -120.54473
## 661      Washington County     42125     23-Suburb: Small 40.12006  -79.88833
## 662            Mono County      6051     43-Rural: Remote 38.25711 -119.22860
## 663          Monroe County     36055     21-Suburb: Large 43.10555  -77.46006
## 664          Monroe County     36055     21-Suburb: Large 43.19449  -77.79031
## 665          Monroe County     42089     23-Suburb: Small 41.01587  -75.28176
## 666          Monroe County     26115     41-Rural: Fringe 41.92394  -83.46698
## 667          Monroe County     26115     41-Rural: Fringe 41.92390  -83.46703
## 668          Monroe County     26115     41-Rural: Fringe 41.92291  -83.46631
## 669          Monroe County     26115     23-Suburb: Small 41.93261  -83.45969
## 670          Monroe County     17133    42-Rural: Distant 38.28978  -89.94879
## 671        Montcalm County     26117    42-Rural: Distant 43.25185  -85.10477
## 672        Hartford County      9003    12-City: Mid-size 41.74926  -72.68654
## 673          Wright County     27171      31-Town: Fringe 45.30009  -93.78277
## 674          Wright County     27171      31-Town: Fringe 45.30009  -93.78277
## 675       Whiteside County     17195     32-Town: Distant 41.80172  -89.96640
## 676        Morrison County     27097     32-Town: Distant 45.98076  -94.35142
## 677            Cook County     17031     21-Suburb: Large 41.85467  -87.75944
## 678       Lancaster County     31109       11-City: Large 40.83561  -96.63922
## 679          Morton County     38059     23-Suburb: Small 46.83510 -100.90384
## 680        Morrison County     27097     32-Town: Distant 45.97534  -94.33026
## 681        Morrison County     27097     32-Town: Distant 45.97492  -94.33299
## 682       Jefferson County     17081     32-Town: Distant 38.29309  -88.90267
## 683         Bristol County     44001     21-Suburb: Large 41.68771  -71.26931
## 684        Fauquier County     51061     41-Rural: Fringe 38.68209  -77.78342
## 685          DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 686        Hartford County      9003     21-Suburb: Large 41.82368  -72.73354
## 687        Muskegon County     26121       13-City: Small 43.25176  -86.20282
## 688        Muskegon County     26121       13-City: Small 43.23393  -86.23863
## 689         Osceola County     26133     43-Rural: Remote 43.93776  -85.15076
## 690            Kent County     26081    12-City: Mid-size 42.99356  -85.59583
## 691             Lee County     17103    42-Rural: Distant 41.83673  -89.38891
## 692             Lee County     17103    42-Rural: Distant 41.83673  -89.38891
## 693            Napa County      6055     23-Suburb: Small 38.27942 -122.25676
## 694          Nassau County     36059     21-Suburb: Large 40.72754  -73.62113
## 695            Otoe County     31131     32-Town: Distant 40.68655  -95.85606
## 696          Ramsey County     27123     21-Suburb: Large 45.01486  -92.99847
## 697      Washington County     27163     21-Suburb: Large 44.96125  -92.97197
## 698           Adams County     31001     32-Town: Distant 40.58587  -98.43926
## 699        Hennepin County     27053     21-Suburb: Large 45.05369  -93.38660
## 700          Macomb County     26099     21-Suburb: Large 42.57435  -82.87256
## 701         Fayette County     17051      33-Town: Remote 38.96549  -89.11121
## 702            Kane County     17089    12-City: Mid-size 42.03655  -88.27618
## 703  Grand Traverse County     26055      33-Town: Remote 44.75143  -85.64466
## 704          Dakota County     27037      31-Town: Fringe 44.74124  -92.88777
## 705        Hennepin County     27053       13-City: Small 44.85435  -93.41688
## 706            Kane County     17089     21-Suburb: Large 41.89360  -88.31739
## 707            Kane County     17089     21-Suburb: Large 41.90685  -88.29376
## 708  Prince William County     51153     21-Suburb: Large 38.76714  -77.44708
## 709          Fulton County     17057    42-Rural: Distant 40.39463  -90.15299
## 710           Hampton city     51650    12-City: Mid-size 37.06274  -76.41179
## 711         Kendall County     17093    42-Rural: Distant 41.54312  -88.57873
## 712         Kendall County     17093    42-Rural: Distant 41.54194  -88.57920
## 713         Newaygo County     26123     41-Rural: Fringe 43.42504  -85.81041
## 714         Newaygo County     26123     41-Rural: Fringe 43.47063  -85.91628
## 715         Newaygo County     26123     32-Town: Distant 43.41208  -85.79480
## 716         Spokane County     53063    12-City: Mid-size 47.65497 -117.39653
## 717       St. Louis County     27137      33-Town: Remote 47.51415  -92.55444
## 718       Penobscot County     23019     43-Rural: Remote 45.36364  -68.50751
## 719           White County     17193    42-Rural: Distant 37.97826  -88.32499
## 720            Cook County     17031       13-City: Small 42.01089  -87.87115
## 721        Beltrami County     27007      33-Town: Remote 47.45286  -94.85407
## 722     Santa Clara County      6085    12-City: Mid-size 37.35281 -122.03750
## 723        Hennepin County     27053     21-Suburb: Large 45.05369  -93.38660
## 724            Kern County      6029     32-Town: Distant 35.59482 -119.34960
## 725      Montgomery County     42091     21-Suburb: Large 40.23591  -75.31975
## 726          Orange County      6059       11-City: Large 33.83658 -117.95076
## 727            Cass County     26027      31-Town: Fringe 41.99164  -86.10805
## 728            Lake County     17097     21-Suburb: Large 42.16587  -87.82009
## 729            Cook County     17031     21-Suburb: Large 42.14830  -87.80225
## 730           Walsh County     38099      33-Town: Remote 48.40742  -97.42542
## 731            Kane County     17089     21-Suburb: Large 41.91066  -88.32132
## 732            Kane County     17089     21-Suburb: Large 41.91066  -88.32132
## 733         Madison County     31119     43-Rural: Remote 41.84358  -97.45772
## 734          Martin County     37117    42-Rural: Distant 35.80964  -76.89801
## 735       St. Louis County     27137      33-Town: Remote 47.51761  -92.59406
## 736         Carlton County     27017      31-Town: Fringe 46.71732  -92.44845
## 737         Carlton County     27017      31-Town: Fringe 46.71732  -92.44845
## 738        Richmond County     51159    42-Rural: Distant 37.94464  -76.74794
## 739        Richmond County     51159    42-Rural: Distant 37.94464  -76.74794
## 740        Richmond County     51159    42-Rural: Distant 37.94463  -76.74795
## 741       Mountrail County     38061     43-Rural: Remote 48.30955 -102.39221
## 742        Hennepin County     27053       13-City: Small 44.99973  -93.45054
## 743        Bradford County     42015     41-Rural: Fringe 41.80149  -76.48635
## 744    Westmoreland County     42129     21-Suburb: Large 40.56888  -79.75559
## 745       St. Louis County     27137      33-Town: Remote 47.51411  -92.55445
## 746       St. Louis County     27137      33-Town: Remote 47.51412  -92.55445
## 747       St. Louis County     27137      33-Town: Remote 47.51411  -92.55444
## 748       St. Louis County     27137      33-Town: Remote 47.51415  -92.55444
## 749       St. Louis County     27137      33-Town: Remote 47.51415  -92.55439
## 750  Northumberland County     42097     32-Town: Distant 40.78082  -76.57953
## 751      Jo Daviess County     17085    42-Rural: Distant 42.31828  -90.22786
## 752         Douglas County     31055       11-City: Large 41.33635  -95.99033
## 753       St. Louis County     27137      33-Town: Remote 47.51738  -92.54141
## 754        Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 755        Marshall County     27089     43-Rural: Remote 48.35735  -96.33300
## 756          Ottawa County     26139     41-Rural: Fringe 42.95339  -86.02187
## 757        Hennepin County     27053     21-Suburb: Large 44.89544  -93.45762
## 758            Kane County     17089     21-Suburb: Large 42.10809  -88.27302
## 759           Mower County     27099     32-Town: Distant 43.66821  -93.00214
## 760       Jefferson County     17081     32-Town: Distant 38.32563  -88.91175
## 761         Oakland County     26125     21-Suburb: Large 42.53764  -83.51596
## 762         Oakland County     26125       13-City: Small 42.66852  -83.26403
## 763         Oakland County     26125     41-Rural: Fringe 42.73619  -83.45257
## 764         Oakland County     26125     21-Suburb: Large 42.53669  -83.17957
## 765         Oakland County     26125     21-Suburb: Large 42.53803  -83.51459
## 766        Hennepin County     27053     21-Suburb: Large 45.09622  -93.39702
## 767           Logan County     39091     41-Rural: Fringe 40.37105  -83.71832
## 768          Mercer County     38057    42-Rural: Distant 47.29726 -101.62202
## 769         Douglas County     31055       11-City: Large 41.29764  -95.99243
## 770        Hennepin County     27053     21-Suburb: Large 44.96375  -93.42116
## 771          Oneida County     36065  22-Suburb: Mid-size 43.09374  -75.32594
## 772        Onondaga County     36067     21-Suburb: Large 43.10202  -76.09524
## 773           Wayne County     36117     32-Town: Distant 43.03820  -77.08182
## 774          Skagit County     53057      31-Town: Fringe 48.50946 -122.60740
## 775        Hennepin County     27053     21-Suburb: Large 44.90124  -93.42089
## 776          Dakota County     27037     21-Suburb: Large 44.77078  -93.28000
## 777        Hennepin County     27053     21-Suburb: Large 45.05369  -93.38660
## 778          Orange County     36071     41-Rural: Fringe 41.38395  -74.35173
## 779         Orleans County     36073     41-Rural: Fringe 43.20340  -78.43016
## 780          Oswego County     36075    42-Rural: Distant 43.45766  -76.25928
## 781         Kendall County     17093     21-Suburb: Large 41.68390  -88.34326
## 782        Delaware County     36025     43-Rural: Remote 42.36936  -74.50907
## 783          Ottawa County     26139     41-Rural: Fringe 42.95339  -86.02187
## 784          Oxford County     23017     32-Town: Distant 44.21167  -70.52740
## 785            Cook County     17031     21-Suburb: Large 41.74984  -87.77738
## 786            Pike County     17149      33-Town: Remote 39.60963  -90.80119
## 787            Cook County     17031     21-Suburb: Large 41.63590  -87.61335
## 788            Cook County     17031     21-Suburb: Large 41.88094  -87.90782
## 789            Cook County     17031     21-Suburb: Large 41.87195  -87.84573
## 790            Cook County     17031     21-Suburb: Large 41.87195  -87.84573
## 791            Cook County     17031     21-Suburb: Large 41.87195  -87.84573
## 792       St. Clair County     17163     21-Suburb: Large 38.51571  -89.98713
## 793      Washington County     27163     21-Suburb: Large 44.95482  -92.92878
## 794        Hennepin County     27053     21-Suburb: Large 45.06765  -93.44378
## 795           Edgar County     17045     32-Town: Distant 39.61092  -87.69192
## 796            Cook County     17031       13-City: Small 42.03367  -87.68324
## 797        Hennepin County     27053       13-City: Small 44.99145  -93.47785
## 798       Allegheny County     42003     21-Suburb: Large 40.44275  -80.17709
## 799          DuPage County     17043     21-Suburb: Large 41.94257  -88.00509
## 800       Snohomish County     53061    12-City: Mid-size 48.00451 -122.19415
## 801       Lancaster County     31109       11-City: Large 40.76379  -96.70522
## 802      St. Joseph County     26149    42-Rural: Distant 41.89038  -85.50407
## 803      Livingston County     26093  22-Suburb: Mid-size 42.61242  -83.95287
## 804         Chisago County     27025     32-Town: Distant 45.39089  -92.82807
## 805           Coles County     17029     32-Town: Distant 39.48451  -88.34623
## 806         Goodhue County     27049     32-Town: Distant 44.54453  -92.54420
## 807         Goodhue County     27049     41-Rural: Fringe 44.53680  -92.51713
## 808       St. Clair County     17163     21-Suburb: Large 38.51179  -89.93143
## 809           Sarpy County     31153     21-Suburb: Large 41.16556  -96.06583
## 810            Kane County     17089     21-Suburb: Large 41.84704  -88.32956
## 811            Kane County     17089     21-Suburb: Large 41.83035  -88.29109
## 812       Bottineau County     38009     43-Rural: Remote 48.83067 -100.44220
## 813         Pembina County     38067     43-Rural: Remote 48.79466  -97.62210
## 814            Wood County     39173     21-Suburb: Large 41.58369  -83.57208
## 815            Wood County     39173     21-Suburb: Large 41.58369  -83.57208
## 816          Peoria County     17143     41-Rural: Fringe 40.73449  -89.74395
## 817        Randolph County     17157    42-Rural: Distant 38.20951  -89.68184
## 818        Petersburg city     51730     21-Suburb: Large 37.22722  -77.38991
## 819        Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 820          DuPage County     17043     21-Suburb: Large 41.86161  -88.05183
## 821     Rock Island County     17161     21-Suburb: Large 41.49417  -90.38702
## 822            Ross County     39141    42-Rural: Distant 39.44006  -82.96143
## 823          Alpena County     26007     41-Rural: Fringe 45.08781  -83.45231
## 824        Nottoway County     51135    42-Rural: Distant 37.26374  -78.13269
## 825           Henry County     51089     41-Rural: Fringe 36.73786  -79.87116
## 826            Pine County     27115     43-Rural: Remote 46.01610  -92.93978
## 827        Red Lake County     27125     43-Rural: Remote 47.87522  -96.27690
## 828         Osceola County     26133     43-Rural: Remote 43.91952  -85.25627
## 829          Wright County     27171      31-Town: Fringe 45.30974  -93.80897
## 830        Richland County     39139      31-Town: Fringe 40.90306  -82.67075
## 831            Will County     17197     21-Suburb: Large 41.51059  -87.85714
## 832       Pipestone County     27117     32-Town: Distant 43.99749  -96.33990
## 833         Kendall County     17093     21-Suburb: Large 41.65673  -88.53297
## 834          Plumas County      6063      33-Town: Remote 39.93618 -120.94369
## 835        Cuyahoga County     39035     21-Suburb: Large 41.36444  -81.83258
## 836      Providence County     44007     41-Rural: Fringe 41.86588  -71.71264
## 837      Providence County     44007     41-Rural: Fringe 41.86793  -71.67672
## 838          Summit County     39153     21-Suburb: Large 40.94317  -81.47190
## 839          Porter County     18127     21-Suburb: Large 41.50086  -87.06956
## 840       Faribault County     27043    42-Rural: Distant 43.76605  -94.16279
## 841        Hennepin County     27053     21-Suburb: Large 45.12530  -93.35423
## 842        Hennepin County     27053     21-Suburb: Large 45.06782  -93.44401
## 843        Hennepin County     27053     21-Suburb: Large 44.88450  -93.32773
## 844          Grundy County     17063     41-Rural: Fringe 41.39769  -88.40232
## 845          Grundy County     17063     41-Rural: Fringe 41.39769  -88.40232
## 846          Wright County     27171      31-Town: Fringe 45.28682  -93.77211
## 847       Washtenaw County     26161     21-Suburb: Large 42.23372  -83.59031
## 848         Russell County     51167     32-Town: Distant 36.90094  -82.05765
## 849            Cook County     17031     21-Suburb: Large 41.61871  -87.76759
## 850      Williamson County     17199     41-Rural: Fringe 37.84784  -88.93175
## 851          Grundy County     17063     21-Suburb: Large 41.45449  -88.26253
## 852       McDonough County     17109      33-Town: Remote 40.46214  -90.67357
## 853     Northampton County     51131     43-Rural: Remote 37.40387  -75.91047
## 854          Ramsey County     27123     21-Suburb: Large 45.01293  -93.10392
## 855        Fluvanna County     51065    42-Rural: Distant 37.87407  -78.26174
## 856        Powhatan County     51145    42-Rural: Distant 37.54588  -77.91916
## 857          Ingham County     26065       13-City: Small 42.72628  -84.47095
## 858            Lyon County     27083      33-Town: Remote 44.44778  -95.77754
## 859           Perry County     17145     32-Town: Distant 38.00918  -89.22994
## 860            Cook County     17031     21-Suburb: Large 41.87280  -87.84537
## 861            Cook County     17031     21-Suburb: Large 41.86508  -87.83252
## 862        Hartford County      9003     21-Suburb: Large 41.94789  -72.59813
## 863     Westchester County     36119     41-Rural: Fringe 41.27832  -73.76560
## 864         Windham County      9015     21-Suburb: Large 41.82637  -71.88994
## 865          Ramsey County     27123     21-Suburb: Large 45.01296  -93.10392
## 866       Champaign County     17019       13-City: Small 40.11559  -88.24127
## 867           Stark County     39151       13-City: Small 40.76704  -81.47893
## 868     Spartanburg County     45083     41-Rural: Fringe 34.83624  -81.99775
## 869           Brown County     27015     32-Town: Distant 44.29980  -94.44662
## 870            Knox County     17095     32-Town: Distant 40.94779  -90.36551
## 871            Knox County     17095     32-Town: Distant 40.94611  -90.36772
## 872            Knox County     17095     32-Town: Distant 40.94611  -90.36772
## 873          Warren County     17187     32-Town: Distant 40.91264  -90.65426
## 874          Warren County     17187     32-Town: Distant 40.91264  -90.65426
## 875      Jo Daviess County     17085    42-Rural: Distant 42.31456  -90.23715
## 876      Stephenson County     17177     32-Town: Distant 42.29860  -89.61782
## 877           Brown County     27015     32-Town: Distant 44.29978  -94.44669
## 878         Goodhue County     27049     41-Rural: Fringe 44.53680  -92.51713
## 879           Berks County     42011     21-Suburb: Large 40.37396  -75.90370
## 880      Cottonwood County     27033      33-Town: Remote 43.86695  -95.11962
## 881      Cottonwood County     27033      33-Town: Remote 43.86695  -95.11962
## 882         Goodhue County     27049     41-Rural: Fringe 44.53509  -92.51432
## 883       Buena Vista city     51530     32-Town: Distant 37.73683  -79.35117
## 884           Roanoke city     51770       13-City: Small 37.28330  -79.94007
## 885       Winnebago County     17201     41-Rural: Fringe 42.30331  -89.15320
## 886           Boone County     17007     21-Suburb: Large 42.25482  -88.83221
## 887       Winnebago County     17201     41-Rural: Fringe 42.30331  -89.15320
## 888           Henry County     17073    42-Rural: Distant 41.41507  -90.01597
## 889        Hartford County      9003     21-Suburb: Large 41.80092  -72.82040
## 890          Oxford County     23017     41-Rural: Fringe 44.53575  -70.50667
## 891       Aroostook County     23003     41-Rural: Fringe 46.12878  -67.82533
## 892          McLean County     17113       13-City: Small 40.47925  -88.99710
## 893    King William County     51101    42-Rural: Distant 37.74186  -77.12974
## 894        Stafford County     51179     41-Rural: Fringe 38.38150  -77.44352
## 895       Winnebago County     17201     41-Rural: Fringe 42.30326  -89.15320
## 896    Pittsylvania County     51143    42-Rural: Distant 36.79017  -79.38893
## 897           Wythe County     51197     32-Town: Distant 36.94243  -81.10309
## 898         Newaygo County     26123     41-Rural: Fringe 43.42529  -85.93720
## 899       Whiteside County     17195     32-Town: Distant 41.80781  -89.71024
## 900            Wise County     51195     32-Town: Distant 36.98058  -82.57048
## 901      New London County      9011       13-City: Small 41.35876  -72.09981
## 902            Cook County     17031     21-Suburb: Large 41.68804  -87.77976
## 903            Cook County     17031     21-Suburb: Large 41.52391  -87.65422
## 904           Boone County     17007     21-Suburb: Large 42.24725  -88.83121
## 905           Scott County     51169  22-Suburb: Mid-size 36.64105  -82.57585
## 906      Rensselaer County     36083     21-Suburb: Large 42.57753  -73.68381
## 907      Washington County     44009     41-Rural: Fringe 41.50076  -71.66183
## 908          Ripley County     18137    42-Rural: Distant 39.24570  -85.09705
## 909          Marion County     18097       11-City: Large 39.68850  -86.13801
## 910           Brown County     27015     32-Town: Distant 44.29978  -94.44669
## 911           Brown County     27015     32-Town: Distant 44.29978  -94.44669
## 912         Wabasha County     27157     43-Rural: Remote 44.30994  -92.00185
## 913       Riverside County      6065       11-City: Large 33.97888 -117.38041
## 914        Hartford County      9003       13-City: Small 41.74450  -72.63804
## 915          Dakota County     27037      31-Town: Fringe 44.74124  -92.88777
## 916           Roanoke city     51770       13-City: Small 37.25632  -79.98471
## 917            Ogle County     17141    42-Rural: Distant 41.98105  -89.22220
## 918        Rockland County     36087     21-Suburb: Large 41.12106  -73.97709
## 919          Macomb County     26099    12-City: Mid-size 42.52948  -83.00212
## 920         Bristol County     44001     21-Suburb: Large 41.69851  -71.28038
## 921           White County     17193    42-Rural: Distant 37.98283  -88.32493
## 922        Tazewell County     17179     21-Suburb: Large 40.64335  -89.59410
## 923        Tazewell County     17179     21-Suburb: Large 40.64352  -89.59399
## 924          Jersey County     17083     32-Town: Distant 39.11988  -90.32952
## 925        Macoupin County     17117     32-Town: Distant 39.26532  -89.89781
## 926            Lake County     17097     21-Suburb: Large 42.45453  -87.83214
## 927          Greene County     17061     32-Town: Distant 39.43746  -90.40069
## 928        Macoupin County     17117     32-Town: Distant 39.29358  -89.87593
## 929           White County     17193    42-Rural: Distant 37.97826  -88.32499
## 930          Ottawa County     26139     23-Suburb: Small 42.79096  -86.08764
## 931       Roscommon County     26143    42-Rural: Distant 44.49980  -84.66516
## 932       Roscommon County     26143    42-Rural: Distant 44.48667  -84.65271
## 933          Morton County     38059     43-Rural: Remote 46.90386 -102.04958
## 934   Prince George County     51149    42-Rural: Distant 37.03558  -77.37969
## 935          Fulton County     17057     41-Rural: Fringe 40.52797  -90.07235
## 936         Hancock County     17067      33-Town: Remote 40.41405  -91.13480
## 937       McDonough County     17109      33-Town: Remote 40.45549  -90.67430
## 938          Fulton County     17057     32-Town: Distant 40.55873  -90.02359
## 939         Hancock County     17067      33-Town: Remote 40.41405  -91.13480
## 940       McDonough County     17109      33-Town: Remote 40.45549  -90.67429
## 941         Douglas County     31055     21-Suburb: Large 41.25000  -96.13493
## 942         Douglas County     31055     21-Suburb: Large 41.25007  -96.13405
## 943         Lincoln County     27081     43-Rural: Remote 44.28174  -96.13353
## 944          Isanti County     27059     41-Rural: Fringe 45.57572  -93.20302
## 945      Mille Lacs County     27095     32-Town: Distant 45.75190  -93.65341
## 946          Isanti County     27059     41-Rural: Fringe 45.59024  -93.21567
## 947         Douglas County     27041      33-Town: Remote 45.90184  -95.36500
## 948            Cass County     38017    42-Rural: Distant 46.88701  -97.05116
## 949      Sacramento County      6067       13-City: Small 38.56607 -121.29842
## 950        Hennepin County     27053     21-Suburb: Large 45.05369  -93.38660
## 951          McLean County     17113       13-City: Small 40.47925  -88.99696
## 952       Jefferson County     17081     32-Town: Distant 38.29309  -88.90267
## 953          Marion County     17121      33-Town: Remote 38.52425  -89.12364
## 954         Saginaw County     26145  22-Suburb: Mid-size 43.45764  -84.05088
## 955         Saginaw County     26145  22-Suburb: Mid-size 43.46794  -83.96732
## 956         Wabasha County     27157     43-Rural: Remote 44.30982  -92.00184
## 957          Ingham County     26065     41-Rural: Fringe 42.59943  -84.44642
## 958       St. Clair County     17163     21-Suburb: Large 38.51804  -90.00361
## 959    St. Lawrence County     36089      33-Town: Remote 44.59534  -75.18156
## 960          Menard County     17129    42-Rural: Distant 39.99729  -89.60284
## 961        Kankakee County     17091     23-Suburb: Small 41.08055  -87.87005
## 962     Los Angeles County      6037     21-Suburb: Large 34.06335 -117.72194
## 963  San Bernardino County      6071    12-City: Mid-size 34.11054 -117.29376
## 964       San Diego County      6073       11-City: Large 32.77005 -117.17956
## 965   San Francisco County      6075       11-City: Large 37.77611 -122.40649
## 966     San Joaquin County      6077       11-City: Large 37.90906 -121.23247
## 967       San Mateo County      6081       13-City: Small 37.52602 -122.26290
## 968        Sangamon County     17167    12-City: Mid-size 39.71845  -89.62646
## 969        Sangamon County     17167    12-City: Mid-size 39.71867  -89.62582
## 970         Sanilac County     26151    42-Rural: Distant 43.31799  -82.81451
## 971         Sanilac County     26151     32-Town: Distant 43.42202  -82.82418
## 972   Santa Barbara County      6083  22-Suburb: Mid-size 34.86565 -120.43374
## 973   Santa Barbara County      6083  22-Suburb: Mid-size 34.45141 -119.76951
## 974     Santa Clara County      6085     23-Suburb: Small 37.00377 -121.57739
## 975      Santa Cruz County      6087       13-City: Small 36.98724 -122.03854
## 976        Sangamon County     17167    12-City: Mid-size 39.77040  -89.61727
## 977        Hamilton County     39061     21-Suburb: Large 39.28492  -84.40054
## 978        Tazewell County     17179     21-Suburb: Large 40.57361  -89.60815
## 979         Steuben County     36101     41-Rural: Fringe 42.19162  -77.13619
## 980      Schuylkill County     42107     41-Rural: Fringe 40.77566  -76.22987
## 981      Schuylkill County     42107     32-Town: Distant 40.68370  -76.25179
## 982          Scioto County     39145     41-Rural: Fringe 38.85472  -82.97946
## 983          Peoria County     17143     21-Suburb: Large 40.69288  -89.70795
## 984          Peoria County     17143     21-Suburb: Large 40.63758  -89.67059
## 985        Hennepin County     27053     21-Suburb: Large 44.86805  -93.31084
## 986            Lake County     17097     21-Suburb: Large 42.35397  -87.98619
## 987        Montcalm County     26117     32-Town: Distant 43.19141  -85.23576
## 988          McKean County     42083     43-Rural: Remote 41.82066  -78.26520
## 989          Seneca County     39147     41-Rural: Fringe 41.08912  -83.15309
## 990          Jasper County     17079    42-Rural: Distant 38.93632  -88.02612
## 991          Shasta County      6089       13-City: Small 40.54684 -122.38548
## 992          Shelby County     17173     41-Rural: Fringe 39.42204  -88.79236
## 993          Ottawa County     26139     41-Rural: Fringe 42.88794  -86.11916
## 994         Augusta County     51015     41-Rural: Fringe 38.11577  -78.98858
## 995          Staunton city     51790       13-City: Small 38.17524  -79.08743
## 996          Barnes County     38003      33-Town: Remote 46.91968  -97.99109
## 997          Barnes County     38003      33-Town: Remote 46.92515  -98.00069
## 998      Shiawassee County     26155     41-Rural: Fringe 42.96394  -84.19815
## 999          Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1000       Cheyenne County     31033      33-Town: Remote 41.15159 -102.98807
## 1001    Santa Clara County      6085       11-City: Large 37.27856 -121.86577
## 1002       Siskiyou County      6093     32-Town: Distant 41.73845 -122.63756
## 1003      Fairfield County      9001    12-City: Mid-size 41.20466  -73.16240
## 1004         Skagit County     53057       13-City: Small 48.41827 -122.33576
## 1005        Chisago County     27025     32-Town: Distant 45.39089  -92.82807
## 1006         Ingham County     26065     41-Rural: Fringe 42.59943  -84.44642
## 1007       Fillmore County     27045    42-Rural: Distant 43.70935  -92.26982
## 1008      Snohomish County     53061    12-City: Mid-size 48.00484 -122.19355
## 1009        Douglas County     27041     41-Rural: Fringe 45.86120  -95.39576
## 1010          Macon County     17115       13-City: Small 39.83063  -88.93165
## 1011       Nicollet County     27103     41-Rural: Fringe 44.19103  -94.05528
## 1012       Somerset County     42111     41-Rural: Fringe 40.00479  -79.02976
## 1013         Sonoma County      6097     21-Suburb: Large 38.51225 -122.79811
## 1014           Ward County     38101      33-Town: Remote 48.21173 -101.31394
## 1015         Ramsey County     27123     21-Suburb: Large 45.04865  -93.00706
## 1016          Logan County     38047     43-Rural: Remote 46.50334  -99.76873
## 1017       Hennepin County     27053     21-Suburb: Large 44.86805  -93.31084
## 1018       Richland County     38077     43-Rural: Remote 46.06575  -96.90129
## 1019         DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 1020       Richland County     38077     32-Town: Distant 46.29061  -96.61324
## 1021         Ripley County     18137    42-Rural: Distant 39.06995  -85.26604
## 1022    Los Angeles County      6037    12-City: Mid-size 33.82426 -118.32726
## 1023          Brown County     39015     41-Rural: Fringe 38.88946  -83.89121
## 1024      Faribault County     27043    42-Rural: Distant 43.76619  -94.16335
## 1025      Faribault County     27043    42-Rural: Distant 43.76605  -94.16279
## 1026         Martin County     27091      33-Town: Remote 43.65262  -94.46044
## 1027      Brunswick County     51025     41-Rural: Fringe 36.80997  -77.77299
## 1028      Hettinger County     38041     43-Rural: Remote 46.37259 -102.32678
## 1029        Pulaski County     51155      31-Town: Fringe 37.05894  -80.77954
## 1030           Will County     17197     41-Rural: Fringe 41.30368  -88.13182
## 1031        Genesee County     26049     21-Suburb: Large 42.95593  -83.72158
## 1032        Genesee County     26049     21-Suburb: Large 42.95799  -83.72768
## 1033           Cook County     17031     21-Suburb: Large 41.51092  -87.66310
## 1034           Cook County     17031     21-Suburb: Large 41.51113  -87.66378
## 1035           Cook County     17031     21-Suburb: Large 41.51101  -87.66318
## 1036           Cook County     17031     21-Suburb: Large 41.51091  -87.66325
## 1037        Spokane County     53063    12-City: Mid-size 47.66562 -117.43059
## 1038          Clark County     39023       13-City: Small 39.90039  -83.79439
## 1039        Stearns County     27145       13-City: Small 45.57102  -94.17217
## 1040          Macon County     17115       13-City: Small 39.82674  -88.93247
## 1041         Ingham County     26065     21-Suburb: Large 42.74886  -84.58805
## 1042        Allegan County     26005      31-Town: Fringe 42.46624  -85.64136
## 1043        Stearns County     27145     32-Town: Distant 45.67316  -94.81538
## 1044     Williamson County     17199     41-Rural: Fringe 37.84784  -88.93178
## 1045         Massac County     17127      33-Town: Remote 37.16180  -88.73909
## 1046        Calhoun County     26025     41-Rural: Fringe 42.27633  -84.79887
## 1047     Cottonwood County     27033      33-Town: Remote 43.86695  -95.11962
## 1048         DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 1049      Allegheny County     42003     21-Suburb: Large 40.32341  -79.94024
## 1050     Red Willow County     31145      33-Town: Remote 40.20006 -100.62416
## 1051         Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1052       Hennepin County     27053     21-Suburb: Large 45.07533  -93.38732
## 1053       Hennepin County     27053     21-Suburb: Large 45.07516  -93.38731
## 1054         Lapeer County     26087      31-Town: Fringe 43.05512  -83.30868
## 1055        Spokane County     53063    12-City: Mid-size 47.66562 -117.43058
## 1056          Mason County     26105     41-Rural: Fringe 43.95640  -86.33283
## 1057           Kane County     17089     21-Suburb: Large 41.79096  -88.35076
## 1058           Kane County     17089     21-Suburb: Large 42.10779  -88.27423
## 1059        McHenry County     17111     21-Suburb: Large 42.16185  -88.34122
## 1060           Kane County     17089     21-Suburb: Large 42.13381  -88.26982
## 1061          Mower County     27099    42-Rural: Distant 43.56833  -92.71641
## 1062       Sullivan County     36105     32-Town: Distant 41.79526  -74.74526
## 1063       Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 1064          Union County     42119    42-Rural: Distant 40.87955  -76.98078
## 1065       Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 1066    Susquehanna County     42115    42-Rural: Distant 41.73860  -75.95580
## 1067         Carver County     27019     21-Suburb: Large 44.78894  -93.59610
## 1068          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1069          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1070          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1071          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1072          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1073          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1074          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1075          Scott County     27139     21-Suburb: Large 44.79266  -93.47200
## 1076        Redwood County     27127     43-Rural: Remote 44.60522  -95.32626
## 1077         Meeker County     27093     43-Rural: Remote 44.93982  -94.70013
## 1078      Pipestone County     27117     32-Town: Distant 44.02151  -96.31860
## 1079      Kandiyohi County     27067      33-Town: Remote 45.14249  -95.01971
## 1080     Cottonwood County     27033      33-Town: Remote 43.86698  -95.10851
## 1081           Cook County     17031     21-Suburb: Large 41.86238  -87.89266
## 1082 Grand Traverse County     26055      33-Town: Remote 44.74549  -85.56456
## 1083 Grand Traverse County     26055      33-Town: Remote 44.76189  -85.59475
## 1084 Grand Traverse County     26055      33-Town: Remote 44.74960  -85.59977
## 1085 Grand Traverse County     26055      33-Town: Remote 44.75106  -85.64579
## 1086         Dakota County     27037     21-Suburb: Large 44.73338  -93.18249
## 1087      Minnehaha County     46099    12-City: Mid-size 43.54110  -96.71711
## 1088      Minnehaha County     46099    12-City: Mid-size 43.54110  -96.71711
## 1089      Minnehaha County     46099    12-City: Mid-size 43.54110  -96.71711
## 1090         Albany County     36001       13-City: Small 42.69176  -73.83594
## 1091      St. Clair County     26147     23-Suburb: Small 42.91901  -82.50435
## 1092       Sandusky County     39143     32-Town: Distant 41.36487  -83.12588
## 1093         Tehama County      6103     32-Town: Distant 40.17831 -122.24549
## 1094       Kankakee County     17091     41-Rural: Fringe 41.19120  -87.77639
## 1095      Multnomah County     41051     21-Suburb: Large 45.53422 -122.41312
## 1096         Ingham County     26065    12-City: Mid-size 42.73769  -84.55360
## 1097     New London County      9011  22-Suburb: Mid-size 41.34135  -72.13290
## 1098 Prince William County     51153     21-Suburb: Large 38.75661  -77.52143
## 1099         Morgan County     17137     32-Town: Distant 39.73754  -90.24033
## 1100       Fauquier County     51061    42-Rural: Distant 38.62386  -77.69165
## 1101          Anoka County     27003     41-Rural: Fringe 45.15758  -93.19631
## 1102      New Haven County      9009     21-Suburb: Large 41.55506  -72.77679
## 1103      Whiteside County     17195     32-Town: Distant 41.77842  -89.68359
## 1104     New London County      9011       13-City: Small 41.50978  -72.10302
## 1105          Norfolk city     51710    12-City: Mid-size 36.85119  -76.19301
## 1106           Cook County     17031       13-City: Small 42.07970  -87.95219
## 1107        Madison County     39097    42-Rural: Distant 40.05458  -83.29113
## 1108       Tompkins County     36109     23-Suburb: Small 42.47795  -76.46611
## 1109          Wayne County     31179     32-Town: Distant 42.24240  -97.00529
## 1110        Goodhue County     27049     41-Rural: Fringe 44.57018  -92.63799
## 1111           Cook County     17031     21-Suburb: Large 41.62557  -87.85041
## 1112        Olmsted County     27109      31-Town: Fringe 44.03555  -92.64648
## 1113           Lake County     17097     21-Suburb: Large 42.26845  -88.01614
## 1114      Roscommon County     26143    42-Rural: Distant 44.49704  -84.59339
## 1115         DuPage County     17043     21-Suburb: Large 41.95698  -87.94289
## 1116         DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 1117        Fairfax County     51059     21-Suburb: Large 38.76373  -77.07935
## 1118          Edgar County     17045     43-Rural: Remote 39.55283  -87.93424
## 1119          Coles County     17029    42-Rural: Distant 39.60651  -88.31722
## 1120         Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1121    Los Angeles County      6037     21-Suburb: Large 33.97173 -118.07946
## 1122         Athens County     39009     41-Rural: Fringe 39.43357  -82.21054
## 1123        Jackson County     17077      31-Town: Fringe 37.75635  -89.34175
## 1124         Sutter County      6101       13-City: Small 39.13909 -121.65224
## 1125          Union County     17181     32-Town: Distant 37.47763  -89.24266
## 1126          Perry County     17145     32-Town: Distant 38.01474  -89.23812
## 1127         Marion County     39101     32-Town: Distant 40.58302  -83.07018
## 1128        Alameda County      6001     23-Suburb: Small 37.69966 -121.81279
## 1129      Effingham County     17049      33-Town: Remote 39.11982  -88.55341
## 1130       Trumbull County     39155     21-Suburb: Large 41.28057  -80.82286
## 1131        Rolette County     38079     43-Rural: Remote 48.84577  -99.73644
## 1132        Tuscola County     26157     41-Rural: Fringe 43.50773  -83.39169
## 1133           Knox County     18083      33-Town: Remote 38.67974  -87.53104
## 1134       Hartford County      9003       13-City: Small 41.75693  -72.65381
## 1135       Clermont County     39025      31-Town: Fringe 38.96975  -84.09391
## 1136       Franklin County     53021  22-Suburb: Mid-size 46.24104 -119.14250
## 1137         Ulster County     36111     21-Suburb: Large 41.76146  -74.08201
## 1138      Penobscot County     23019       13-City: Small 44.82083  -68.74118
## 1139       Hartford County      9003    12-City: Mid-size 41.79352  -72.71291
## 1140          Bucks County     42017     41-Rural: Fringe 40.43060  -75.23422
## 1141          Miami County     39109      31-Town: Fringe 40.16119  -84.21410
## 1142          Walsh County     38099      33-Town: Remote 48.41918  -97.40522
## 1143        Douglas County     31055     41-Rural: Fringe 41.35616  -95.97535
## 1144        Augusta County     51015     41-Rural: Fringe 38.11584  -78.98867
## 1145      Kalamazoo County     26077  22-Suburb: Mid-size 42.27826  -85.54101
## 1146         Fresno County      6019      31-Town: Fringe 36.69833 -119.56029
## 1147        Olmsted County     27109    42-Rural: Distant 43.97480  -92.14173
## 1148      Van Buren County     26159    42-Rural: Distant 42.21268  -86.04724
## 1149       Sandusky County     39143     32-Town: Distant 41.36523  -83.12820
## 1150       Van Wert County     39161     32-Town: Distant 40.88017  -84.57290
## 1151       Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 1152       Hennepin County     27053       13-City: Small 44.99969  -93.45060
## 1153        Venango County     42121      33-Town: Remote 41.42621  -79.69032
## 1154       Hennepin County     27053     21-Suburb: Large 45.08292  -93.39390
## 1155       Hennepin County     27053     21-Suburb: Large 45.08292  -93.39390
## 1156           Pike County     39131     41-Rural: Fringe 39.05406  -83.00670
## 1157       Hennepin County     27053     21-Suburb: Large 44.86805  -93.31084
## 1158         Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1159        Oakland County     26125     21-Suburb: Large 42.65047  -83.33162
## 1160           Pine County     27115      33-Town: Remote 45.81990  -92.96939
## 1161         DuPage County     17043     21-Suburb: Large 41.77983  -88.11197
## 1162       Hennepin County     27053     21-Suburb: Large 44.90124  -93.42111
## 1163          Brown County     27015     32-Town: Distant 44.29978  -94.44669
## 1164       Richland County     38077     32-Town: Distant 46.26889  -96.61233
## 1165          Waldo County     23027    42-Rural: Distant 44.45387  -69.09739
## 1166         Branch County     26023     32-Town: Distant 41.95318  -85.01967
## 1167    Walla Walla County     53071       13-City: Small 46.06501 -118.34580
## 1168         Warren County     42123     41-Rural: Fringe 41.85845  -79.13370
## 1169         Warren County     39165     41-Rural: Fringe 39.48877  -84.20320
## 1170     Washington County     39167     41-Rural: Fringe 39.43318  -81.50126
## 1171     Washington County     36115     23-Suburb: Small 43.28344  -73.58184
## 1172      Washtenaw County     26161     21-Suburb: Large 42.24037  -83.61673
## 1173      Washtenaw County     26161     21-Suburb: Large 42.24037  -83.61673
## 1174      Washtenaw County     26161     21-Suburb: Large 42.25428  -83.67891
## 1175      Washtenaw County     26161     21-Suburb: Large 42.26159  -83.79643
## 1176      Washtenaw County     26161     21-Suburb: Large 42.23362  -83.59789
## 1177           Lake County     17097     21-Suburb: Large 42.26742  -88.14731
## 1178     Washington County     44009     41-Rural: Fringe 41.58493  -71.61810
## 1179          Wayne County     39169     32-Town: Distant 40.86430  -81.86987
## 1180       Woodford County     17203     21-Suburb: Large 40.76744  -89.46654
## 1181        Webster County     31181     43-Rural: Remote 40.32677  -98.45019
## 1182         Ramsey County     27123     21-Suburb: Large 45.04823  -93.05452
## 1183         Ramsey County     27123     21-Suburb: Large 45.01298  -93.10405
## 1184       Muskegon County     26121       13-City: Small 43.24073  -86.22085
## 1185           Cook County     17031     21-Suburb: Large 41.93277  -87.87205
## 1186           Cook County     17031     21-Suburb: Large 41.88090  -87.90779
## 1187           Cook County     17031     21-Suburb: Large 41.86248  -87.89251
## 1188       Hennepin County     27053     21-Suburb: Large 44.90105  -93.42134
## 1189           Kane County     17089     21-Suburb: Large 41.79096  -88.35076
## 1190        Stearns County     27145     32-Town: Distant 45.67316  -94.81538
## 1191        Stearns County     27145     32-Town: Distant 45.72971  -94.94403
## 1192       Hennepin County     27053     21-Suburb: Large 44.90117  -93.42120
## 1193           Cass County     38017  22-Suburb: Mid-size 46.87609  -96.90218
## 1194         Dakota County     27037     21-Suburb: Large 44.89106  -93.07748
## 1195         Dakota County     27037     21-Suburb: Large 44.89105  -93.07748
## 1196       Hennepin County     27053     21-Suburb: Large 44.90105  -93.42134
## 1197          Stark County     38089      33-Town: Remote 46.88505 -102.81158
## 1198          Mason County     26105    42-Rural: Distant 44.00965  -86.32996
## 1199        Luzerne County     42079     21-Suburb: Large 41.27816  -75.90210
## 1200       Hennepin County     27053     21-Suburb: Large 44.90105  -93.42134
## 1201    Westchester County     36119     21-Suburb: Large 41.02172  -73.68546
## 1202     Washington County     42125     41-Rural: Fringe 40.25443  -80.24595
## 1203           Holt County     31089      33-Town: Remote 42.45920  -98.64537
## 1204     Montgomery County     42091     41-Rural: Fringe 40.23647  -75.50788
## 1205   Scotts Bluff County     31157      33-Town: Remote 41.87806 -103.64196
## 1206        Suffolk County     36103     21-Suburb: Large 40.80090  -73.34363
## 1207         Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1208        Wexford County     26165     41-Rural: Fringe 44.26763  -85.37985
## 1209        Wexford County     26165     41-Rural: Fringe 44.26798  -85.38016
## 1210        Whatcom County     53073       13-City: Small 48.75435 -122.48000
## 1211     Otter Tail County     27111    42-Rural: Distant 46.39048  -95.32600
## 1212        Luzerne County     42079     21-Suburb: Large 41.26205  -75.81037
## 1213         Lorain County     39093     41-Rural: Fringe 41.26212  -82.21316
## 1214         Sierra County      6091    42-Rural: Distant 39.58457 -120.36910
## 1215     Williamson County     17199       13-City: Small 37.73801  -88.91759
## 1216     Williamson County     17199       13-City: Small 37.72744  -88.93225
## 1217       Williams County     38105      33-Town: Remote 48.14674 -103.61469
## 1218         Ingham County     26065     41-Rural: Fringe 42.59943  -84.44642
## 1219        Houston County     27055     41-Rural: Fringe 43.75737  -91.35210
## 1220         Wright County     27171    42-Rural: Distant 45.05898  -94.07130
## 1221      Faribault County     27043    42-Rural: Distant 43.76591  -94.17885
## 1222           Cook County     17031     21-Suburb: Large 42.08555  -87.75102
## 1223      New Haven County      9009     21-Suburb: Large 41.35635  -72.96154
## 1224      Washtenaw County     26161     21-Suburb: Large 42.26128  -83.79640
## 1225        Saginaw County     26145  22-Suburb: Mid-size 43.45693  -83.89316
## 1226       Freeborn County     27047    42-Rural: Distant 43.57216  -93.28281
## 1227      St. Clair County     26147     23-Suburb: Small 42.91760  -82.50172
## 1228      Kalamazoo County     26077       13-City: Small 42.23217  -85.57133
## 1229     Newport News city     51700    12-City: Mid-size 37.17137  -76.52699
## 1230         Wright County     27171      31-Town: Fringe 45.19178  -93.87289
## 1231         Wright County     27171      31-Town: Fringe 45.19182  -93.87286
## 1232         Wright County     27171      31-Town: Fringe 45.19177  -93.87287
## 1233        Kendall County     17093     21-Suburb: Large 41.65176  -88.45314
## 1234           Yolo County      6113     23-Suburb: Small 38.69393 -121.76462
## 1235           York County     42133  22-Suburb: Mid-size 39.93013  -76.68488
## 1236     Stanislaus County      6099    12-City: Mid-size 37.64108 -121.00000
## 1237      Washtenaw County     26161     21-Suburb: Large 42.26128  -83.79640
## 1238      Kalamazoo County     26077       13-City: Small 42.30416  -85.56184
## 1239        Jackson County     26075       13-City: Small 42.26288  -84.38747
## 1240         Saline County     31151     32-Town: Distant 40.63012  -96.94590
## 1241         Dakota County     27037     21-Suburb: Large 44.77828  -93.28177
## 1242      Muskingum County     39119     41-Rural: Fringe 39.93710  -81.97602
## 1243        Olmsted County     27109      31-Town: Fringe 44.03553  -92.64654
## 1244        Olmsted County     27109      31-Town: Fringe 44.02759  -92.64936
## 1245        Olmsted County     27109      31-Town: Fringe 44.02949  -92.65844
## 1246        Wabasha County     27157    42-Rural: Distant 44.27466  -92.54413
##                                         Title.I.School.Status Updated.Status
## 1                                                         n/a         1-Open
## 2                                      6-Not a Title I school         1-Open
## 3                                                         n/a         1-Open
## 4                                      6-Not a Title I school         1-Open
## 5                                                         n/a         1-Open
## 6                                                         n/a         1-Open
## 7                                                         n/a         1-Open
## 8                                                         n/a         1-Open
## 9                                                         n/a         1-Open
## 10                                                        n/a         1-Open
## 11                                     6-Not a Title I school         1-Open
## 12                                                        n/a         1-Open
## 13                                                        n/a         1-Open
## 14                                                        n/a         1-Open
## 15                                                        n/a         1-Open
## 16                                                        n/a         1-Open
## 17                                                        n/a         1-Open
## 18                                                        n/a         1-Open
## 19                                     6-Not a Title I school         1-Open
## 20                                     6-Not a Title I school         1-Open
## 21                                     6-Not a Title I school         1-Open
## 22                                     6-Not a Title I school         1-Open
## 23                                     6-Not a Title I school         1-Open
## 24                                     6-Not a Title I school         1-Open
## 25                                     6-Not a Title I school         1-Open
## 26                                                        n/a         1-Open
## 27                                                        n/a         1-Open
## 28                                     6-Not a Title I school         1-Open
## 29                                     6-Not a Title I school         1-Open
## 30                                     6-Not a Title I school         1-Open
## 31                                     6-Not a Title I school         1-Open
## 32                                     6-Not a Title I school         1-Open
## 33                                5-Title I schoolwide school         1-Open
## 34                                     6-Not a Title I school         1-Open
## 35                                5-Title I schoolwide school         1-Open
## 36                                                        n/a         1-Open
## 37                                     6-Not a Title I school         1-Open
## 38                                                        n/a         1-Open
## 39                                     6-Not a Title I school         1-Open
## 40                                     6-Not a Title I school         1-Open
## 41                                                        n/a         1-Open
## 42                                                        n/a         1-Open
## 43                                                        n/a         1-Open
## 44                                                        n/a         1-Open
## 45                                                        n/a         1-Open
## 46                                                        n/a         1-Open
## 47                                                        n/a         1-Open
## 48                                                        n/a         1-Open
## 49                                                        n/a         1-Open
## 50                                                        n/a         1-Open
## 51                                                        n/a         1-Open
## 52                                                        n/a         1-Open
## 53                                     6-Not a Title I school         1-Open
## 54                                                        n/a         1-Open
## 55                                     6-Not a Title I school         1-Open
## 56                                                        n/a         1-Open
## 57                                     6-Not a Title I school         1-Open
## 58                                                        n/a         1-Open
## 59                                                        n/a         1-Open
## 60                                                        n/a         1-Open
## 61                                5-Title I schoolwide school         1-Open
## 62                                                        n/a         1-Open
## 63                                     6-Not a Title I school         1-Open
## 64                                                        n/a         1-Open
## 65                                                        n/a         1-Open
## 66                                     6-Not a Title I school         1-Open
## 67                                     6-Not a Title I school         1-Open
## 68                                     6-Not a Title I school          3-New
## 69                                                        n/a         1-Open
## 70                                     6-Not a Title I school         1-Open
## 71                       2-Title I targeted assistance school         1-Open
## 72                                     6-Not a Title I school         1-Open
## 73   1-Title I targeted assistance eligible school-No program         1-Open
## 74                                                        n/a         1-Open
## 75                                                        n/a         1-Open
## 76                                     6-Not a Title I school         1-Open
## 77                                                        n/a         1-Open
## 78                                                        n/a         1-Open
## 79                                     6-Not a Title I school         1-Open
## 80                                     6-Not a Title I school         1-Open
## 81                                                        n/a         1-Open
## 82                                                        n/a         1-Open
## 83                                                        n/a         1-Open
## 84                                                        n/a         1-Open
## 85                                                        n/a         1-Open
## 86                                                        n/a         1-Open
## 87                                     6-Not a Title I school         1-Open
## 88                                                        n/a         1-Open
## 89                                     6-Not a Title I school         1-Open
## 90                                                        n/a         1-Open
## 91                                                        n/a         1-Open
## 92                                                        n/a         1-Open
## 93                                     6-Not a Title I school         1-Open
## 94                                                        n/a         1-Open
## 95                                     6-Not a Title I school         1-Open
## 96                                                        n/a         1-Open
## 97                                     6-Not a Title I school         1-Open
## 98                                     6-Not a Title I school         1-Open
## 99                                     6-Not a Title I school         1-Open
## 100                                    6-Not a Title I school         1-Open
## 101                                    6-Not a Title I school         1-Open
## 102                                                       n/a         1-Open
## 103                                                       n/a         1-Open
## 104                                    6-Not a Title I school         1-Open
## 105                                    6-Not a Title I school         1-Open
## 106                                                       n/a         1-Open
## 107                                    6-Not a Title I school         1-Open
## 108                                                       n/a         1-Open
## 109                                                       n/a         1-Open
## 110                                                       n/a         1-Open
## 111                                    6-Not a Title I school         1-Open
## 112                                    6-Not a Title I school         1-Open
## 113                                    6-Not a Title I school         1-Open
## 114                                    6-Not a Title I school         1-Open
## 115                                    6-Not a Title I school         1-Open
## 116                                                       n/a         1-Open
## 117                                                       n/a         1-Open
## 118                                                       n/a         1-Open
## 119                                    6-Not a Title I school         1-Open
## 120                                                       n/a         1-Open
## 121                                    6-Not a Title I school         1-Open
## 122                                                       n/a         1-Open
## 123                                                       n/a         1-Open
## 124                                    6-Not a Title I school         1-Open
## 125                                                       n/a         1-Open
## 126                                                       n/a         1-Open
## 127                                                       n/a         1-Open
## 128                                    6-Not a Title I school         1-Open
## 129                                    6-Not a Title I school         1-Open
## 130                                    6-Not a Title I school         1-Open
## 131                                                       n/a         1-Open
## 132                                                       n/a         1-Open
## 133                                                       n/a         1-Open
## 134                                    6-Not a Title I school         1-Open
## 135                                                       n/a         1-Open
## 136                                                       n/a         1-Open
## 137                                                       n/a         1-Open
## 138                                                       n/a         1-Open
## 139                                                       n/a         1-Open
## 140                                                       n/a         1-Open
## 141                                                       n/a         1-Open
## 142                                                       n/a         1-Open
## 143                                                       n/a         1-Open
## 144                                                       n/a         1-Open
## 145                                    6-Not a Title I school         1-Open
## 146                                                       n/a         1-Open
## 147                                                       n/a         1-Open
## 148                                    6-Not a Title I school         1-Open
## 149                                    6-Not a Title I school         1-Open
## 150                                    6-Not a Title I school         1-Open
## 151                                                       n/a         1-Open
## 152                                                       n/a         1-Open
## 153                                                       n/a         1-Open
## 154                                                       n/a         1-Open
## 155                                                       n/a         1-Open
## 156                                                       n/a         1-Open
## 157                                                       n/a         1-Open
## 158                                                       n/a         1-Open
## 159                                                       n/a          3-New
## 160                                                       n/a         1-Open
## 161                                                       n/a         1-Open
## 162                                    6-Not a Title I school         1-Open
## 163                                    6-Not a Title I school         1-Open
## 164                                    6-Not a Title I school         1-Open
## 165                                                       n/a         1-Open
## 166                                    6-Not a Title I school         1-Open
## 167                                                       n/a         1-Open
## 168                                                       n/a         1-Open
## 169                                                       n/a         1-Open
## 170                                                       n/a         1-Open
## 171                                                       n/a         1-Open
## 172                                                       n/a         1-Open
## 173                                    6-Not a Title I school         1-Open
## 174                                                       n/a         1-Open
## 175                                    6-Not a Title I school         1-Open
## 176                                                       n/a         1-Open
## 177                                                       n/a         1-Open
## 178                                                       n/a         1-Open
## 179                                                       n/a         1-Open
## 180                                                       n/a         1-Open
## 181                                                       n/a         1-Open
## 182                                                       n/a         1-Open
## 183                                    6-Not a Title I school         1-Open
## 184                                    6-Not a Title I school         1-Open
## 185                                    6-Not a Title I school         1-Open
## 186                                    6-Not a Title I school         1-Open
## 187           4-Title I schoolwide eligible school-No program         1-Open
## 188                                                       n/a         1-Open
## 189                                    6-Not a Title I school         1-Open
## 190                      2-Title I targeted assistance school         1-Open
## 191                                    6-Not a Title I school         1-Open
## 192                                                       n/a         1-Open
## 193                                                       n/a         1-Open
## 194                                                       n/a         1-Open
## 195                                                       n/a         1-Open
## 196                                                       n/a         1-Open
## 197                                                       n/a         1-Open
## 198                                                       n/a       7-Future
## 199                                    6-Not a Title I school         1-Open
## 200                                    6-Not a Title I school         1-Open
## 201                                    6-Not a Title I school         1-Open
## 202                                    6-Not a Title I school         1-Open
## 203                                    6-Not a Title I school         1-Open
## 204                                                       n/a         1-Open
## 205                                    6-Not a Title I school         1-Open
## 206                                                       n/a         1-Open
## 207                                    6-Not a Title I school         1-Open
## 208                                    6-Not a Title I school         1-Open
## 209                                                       n/a         1-Open
## 210                                                       n/a         1-Open
## 211                                                       n/a          3-New
## 212                               5-Title I schoolwide school         1-Open
## 213                                                       n/a         1-Open
## 214                                    6-Not a Title I school         1-Open
## 215                                                       n/a         1-Open
## 216                                                       n/a         1-Open
## 217                                                       n/a         1-Open
## 218                                                       n/a         1-Open
## 219                                                       n/a         1-Open
## 220                                                       n/a         1-Open
## 221                                                       n/a         1-Open
## 222                                    6-Not a Title I school         1-Open
## 223                                                       n/a         1-Open
## 224                                    6-Not a Title I school         1-Open
## 225                                                       n/a         1-Open
## 226                                    6-Not a Title I school         1-Open
## 227                                                       n/a         1-Open
## 228                                    6-Not a Title I school         1-Open
## 229                                                       n/a         1-Open
## 230                                                       n/a         1-Open
## 231                                    6-Not a Title I school         1-Open
## 232                                    6-Not a Title I school         1-Open
## 233                                    6-Not a Title I school         1-Open
## 234                                                       n/a         1-Open
## 235                                    6-Not a Title I school         1-Open
## 236                                    6-Not a Title I school         1-Open
## 237                                                       n/a         1-Open
## 238                                    6-Not a Title I school         1-Open
## 239                                    6-Not a Title I school         1-Open
## 240                                    6-Not a Title I school         1-Open
## 241                                                       n/a         1-Open
## 242                                                       n/a         1-Open
## 243                                                       n/a         1-Open
## 244                                                       n/a         1-Open
## 245                                    6-Not a Title I school        4-Added
## 246                                                       n/a         1-Open
## 247                                    6-Not a Title I school         1-Open
## 248                                    6-Not a Title I school         1-Open
## 249                                                       n/a         1-Open
## 250                                    6-Not a Title I school         1-Open
## 251                                                       n/a         1-Open
## 252                                    6-Not a Title I school         1-Open
## 253                                    6-Not a Title I school         1-Open
## 254                                    6-Not a Title I school         1-Open
## 255                                                       n/a         1-Open
## 256                                                       n/a         1-Open
## 257                                                       n/a         1-Open
## 258                                                       n/a         1-Open
## 259                                                       n/a         1-Open
## 260                                                       n/a         1-Open
## 261                                                       n/a         1-Open
## 262                                    6-Not a Title I school         1-Open
## 263                                                       n/a         1-Open
## 264                                                       n/a         1-Open
## 265                                                       n/a         1-Open
## 266                                    6-Not a Title I school         1-Open
## 267                                    6-Not a Title I school         1-Open
## 268                                    6-Not a Title I school         1-Open
## 269                                    6-Not a Title I school         1-Open
## 270                                                       n/a         1-Open
## 271                                                       n/a         1-Open
## 272                                                       n/a         1-Open
## 273                                    6-Not a Title I school         1-Open
## 274                                                       n/a         1-Open
## 275                                                       n/a         1-Open
## 276                                    6-Not a Title I school         1-Open
## 277                               5-Title I schoolwide school         1-Open
## 278                                                       n/a         1-Open
## 279                                                       n/a         1-Open
## 280                                    6-Not a Title I school         1-Open
## 281                                                       n/a         1-Open
## 282                                    6-Not a Title I school         1-Open
## 283                               5-Title I schoolwide school         1-Open
## 284                                    6-Not a Title I school         1-Open
## 285                                    6-Not a Title I school         1-Open
## 286                                    6-Not a Title I school         1-Open
## 287                                                       n/a         1-Open
## 288                                                       n/a         1-Open
## 289                                    6-Not a Title I school         1-Open
## 290                                    6-Not a Title I school         1-Open
## 291                                    6-Not a Title I school         1-Open
## 292                                                       n/a         1-Open
## 293                                                       n/a         1-Open
## 294                                                       n/a         1-Open
## 295                                                       n/a         1-Open
## 296                                    6-Not a Title I school         1-Open
## 297                                                       n/a         1-Open
## 298                                                       n/a         1-Open
## 299                                                       n/a         1-Open
## 300                                    6-Not a Title I school         1-Open
## 301                                                       n/a         1-Open
## 302                                                       n/a         1-Open
## 303                                    6-Not a Title I school         1-Open
## 304                                                       n/a         1-Open
## 305                                    6-Not a Title I school         1-Open
## 306                                                       n/a         1-Open
## 307                                    6-Not a Title I school         1-Open
## 308                                                       n/a         1-Open
## 309                                                       n/a         1-Open
## 310                                    6-Not a Title I school         1-Open
## 311                                    6-Not a Title I school         1-Open
## 312                                                       n/a         1-Open
## 313                                                       n/a         1-Open
## 314                                                       n/a         1-Open
## 315                                                       n/a         1-Open
## 316                                    6-Not a Title I school         1-Open
## 317                                    6-Not a Title I school         1-Open
## 318                                    6-Not a Title I school         1-Open
## 319                                                       n/a         1-Open
## 320                                                       n/a         1-Open
## 321                                    6-Not a Title I school         1-Open
## 322                                    6-Not a Title I school         1-Open
## 323                                                       n/a         1-Open
## 324                                                       n/a         1-Open
## 325                                                       n/a         1-Open
## 326                                                       n/a        4-Added
## 327                                    6-Not a Title I school         1-Open
## 328                                    6-Not a Title I school         1-Open
## 329                                                       n/a         1-Open
## 330                                                       n/a       7-Future
## 331                                    6-Not a Title I school        4-Added
## 332                                    6-Not a Title I school         1-Open
## 333                                                       n/a         1-Open
## 334                                    6-Not a Title I school         1-Open
## 335                                    6-Not a Title I school         1-Open
## 336                                    6-Not a Title I school         1-Open
## 337                                                       n/a         1-Open
## 338                                                       n/a         1-Open
## 339                                    6-Not a Title I school         1-Open
## 340                                                       n/a         1-Open
## 341                                                       n/a         1-Open
## 342                                                       n/a         1-Open
## 343                                    6-Not a Title I school         1-Open
## 344                                    6-Not a Title I school         1-Open
## 345                                    6-Not a Title I school         1-Open
## 346  1-Title I targeted assistance eligible school-No program         1-Open
## 347  1-Title I targeted assistance eligible school-No program         1-Open
## 348                                    6-Not a Title I school         1-Open
## 349                                                       n/a         1-Open
## 350                                                       n/a         1-Open
## 351                                                       n/a         1-Open
## 352                                                       n/a         1-Open
## 353                                    6-Not a Title I school         1-Open
## 354                                    6-Not a Title I school         1-Open
## 355                                    6-Not a Title I school         1-Open
## 356                                    6-Not a Title I school        4-Added
## 357                                    6-Not a Title I school        4-Added
## 358                                                       n/a         1-Open
## 359                                    6-Not a Title I school         1-Open
## 360                                    6-Not a Title I school         1-Open
## 361                                    6-Not a Title I school         1-Open
## 362                                    6-Not a Title I school         1-Open
## 363                                                       n/a         1-Open
## 364                                    6-Not a Title I school         1-Open
## 365                                                       n/a         1-Open
## 366                                                       n/a         1-Open
## 367                                                       n/a         1-Open
## 368                                                       n/a         1-Open
## 369                                    6-Not a Title I school         1-Open
## 370                                    6-Not a Title I school          3-New
## 371                                    6-Not a Title I school         1-Open
## 372                                    6-Not a Title I school         1-Open
## 373                                    6-Not a Title I school         1-Open
## 374                                    6-Not a Title I school         1-Open
## 375                                                       n/a         1-Open
## 376                                                       n/a         1-Open
## 377                                                       n/a         1-Open
## 378                                    6-Not a Title I school         1-Open
## 379                                                       n/a         1-Open
## 380                                    6-Not a Title I school         1-Open
## 381                                                       n/a        4-Added
## 382                                                       n/a         1-Open
## 383                                    6-Not a Title I school         1-Open
## 384                                    6-Not a Title I school         1-Open
## 385                                                       n/a         1-Open
## 386                                    6-Not a Title I school         1-Open
## 387                                    6-Not a Title I school          3-New
## 388                               5-Title I schoolwide school         1-Open
## 389                                    6-Not a Title I school         1-Open
## 390                                                       n/a         1-Open
## 391                                    6-Not a Title I school         1-Open
## 392                                                       n/a         1-Open
## 393                                                       n/a         1-Open
## 394                                                       n/a         1-Open
## 395                                    6-Not a Title I school         1-Open
## 396                                                       n/a         1-Open
## 397                                                       n/a         1-Open
## 398                                                       n/a         1-Open
## 399                                    6-Not a Title I school         1-Open
## 400                                    6-Not a Title I school         1-Open
## 401                                                       n/a         1-Open
## 402                                                       n/a         1-Open
## 403                                                       n/a         1-Open
## 404                                                       n/a         1-Open
## 405                                                       n/a         1-Open
## 406                               5-Title I schoolwide school         1-Open
## 407                               5-Title I schoolwide school         1-Open
## 408                                                       n/a         1-Open
## 409                                                       n/a         1-Open
## 410                                    6-Not a Title I school         1-Open
## 411                                                       n/a         1-Open
## 412                                                       n/a         1-Open
## 413                                                       n/a         1-Open
## 414                                    6-Not a Title I school         1-Open
## 415                                                       n/a         1-Open
## 416                                                       n/a         1-Open
## 417                      2-Title I targeted assistance school         1-Open
## 418                                                       n/a         1-Open
## 419                                    6-Not a Title I school         1-Open
## 420                                                       n/a         1-Open
## 421                                    6-Not a Title I school         1-Open
## 422                                    6-Not a Title I school         1-Open
## 423                                                       n/a         1-Open
## 424                                                       n/a         1-Open
## 425                                                       n/a         1-Open
## 426                                                       n/a         1-Open
## 427                                    6-Not a Title I school         1-Open
## 428                                    6-Not a Title I school         1-Open
## 429                                                       n/a         1-Open
## 430                                                       n/a         1-Open
## 431                                                       n/a         1-Open
## 432                                    6-Not a Title I school         1-Open
## 433                                    6-Not a Title I school         1-Open
## 434                                    6-Not a Title I school         1-Open
## 435                                                       n/a         1-Open
## 436                                                       n/a         1-Open
## 437                                    6-Not a Title I school         1-Open
## 438                                    6-Not a Title I school         1-Open
## 439                                    6-Not a Title I school         1-Open
## 440                                    6-Not a Title I school         1-Open
## 441                                                       n/a         1-Open
## 442                                                       n/a         1-Open
## 443                                    6-Not a Title I school         1-Open
## 444                                                       n/a         1-Open
## 445  1-Title I targeted assistance eligible school-No program         1-Open
## 446                                                       n/a         1-Open
## 447                                    6-Not a Title I school         1-Open
## 448                               5-Title I schoolwide school         1-Open
## 449                                                       n/a         1-Open
## 450                                                       n/a         1-Open
## 451                                                       n/a         1-Open
## 452                                    6-Not a Title I school         1-Open
## 453                                    6-Not a Title I school         1-Open
## 454                                    6-Not a Title I school         1-Open
## 455                                    6-Not a Title I school         1-Open
## 456                                                       n/a         1-Open
## 457                                    6-Not a Title I school         1-Open
## 458                                                       n/a         1-Open
## 459                                                       n/a         1-Open
## 460                                                       n/a         1-Open
## 461                                    6-Not a Title I school         1-Open
## 462                                                       n/a         1-Open
## 463                                    6-Not a Title I school          3-New
## 464                                    6-Not a Title I school         1-Open
## 465                                    6-Not a Title I school         1-Open
## 466                               5-Title I schoolwide school         1-Open
## 467                                    6-Not a Title I school         1-Open
## 468                                    6-Not a Title I school         1-Open
## 469                                                       n/a         1-Open
## 470                                    6-Not a Title I school         1-Open
## 471                                    6-Not a Title I school         1-Open
## 472                                                       n/a         1-Open
## 473                                    6-Not a Title I school         1-Open
## 474                                    6-Not a Title I school         1-Open
## 475                                    6-Not a Title I school         1-Open
## 476                                                       n/a         1-Open
## 477                                    6-Not a Title I school         1-Open
## 478                                                       n/a         1-Open
## 479                                                       n/a         1-Open
## 480                                    6-Not a Title I school         1-Open
## 481                                                       n/a         1-Open
## 482                                                       n/a         1-Open
## 483                                    6-Not a Title I school         1-Open
## 484                                                       n/a         1-Open
## 485                                    6-Not a Title I school         1-Open
## 486                                                       n/a         1-Open
## 487                                                       n/a         1-Open
## 488                                    6-Not a Title I school         1-Open
## 489                                    6-Not a Title I school         1-Open
## 490                                                       n/a         1-Open
## 491                                    6-Not a Title I school         1-Open
## 492                                    6-Not a Title I school         1-Open
## 493                                    6-Not a Title I school         1-Open
## 494                                    6-Not a Title I school         1-Open
## 495                                    6-Not a Title I school         1-Open
## 496                                    6-Not a Title I school         1-Open
## 497                                                       n/a         1-Open
## 498                                    6-Not a Title I school         1-Open
## 499                                                       n/a         1-Open
## 500                                                       n/a         1-Open
## 501                                                       n/a         1-Open
## 502                                    6-Not a Title I school         1-Open
## 503                                    6-Not a Title I school         1-Open
## 504                                    6-Not a Title I school         1-Open
## 505                                    6-Not a Title I school         1-Open
## 506                                    6-Not a Title I school         1-Open
## 507                                    6-Not a Title I school         1-Open
## 508                                                       n/a         1-Open
## 509                                                       n/a         1-Open
## 510                                                       n/a         1-Open
## 511                                                       n/a         1-Open
## 512                                                       n/a         1-Open
## 513                                                       n/a         1-Open
## 514                                                       n/a        4-Added
## 515                                                       n/a         1-Open
## 516                                                       n/a         1-Open
## 517                                                       n/a         1-Open
## 518  1-Title I targeted assistance eligible school-No program         1-Open
## 519                                                       n/a         1-Open
## 520                                                       n/a         1-Open
## 521                                    6-Not a Title I school         1-Open
## 522                                    6-Not a Title I school         1-Open
## 523                                                       n/a         1-Open
## 524                                                       n/a         1-Open
## 525                                                       n/a     6-Inactive
## 526                                                       n/a         1-Open
## 527                                                       n/a          3-New
## 528                                                       n/a         1-Open
## 529                                                       n/a         1-Open
## 530                                                       n/a          3-New
## 531                                                       n/a         1-Open
## 532                                                       n/a         1-Open
## 533                                    6-Not a Title I school         1-Open
## 534                                                       n/a         1-Open
## 535                                                       n/a         1-Open
## 536                                                       n/a         1-Open
## 537                                                       n/a         1-Open
## 538                                                       n/a         1-Open
## 539                                                       n/a         1-Open
## 540                                                       n/a        4-Added
## 541                                                       n/a        4-Added
## 542                                                       n/a        4-Added
## 543                                    6-Not a Title I school         1-Open
## 544                                    6-Not a Title I school          3-New
## 545                                                       n/a         1-Open
## 546                                                       n/a         1-Open
## 547                                                       n/a         1-Open
## 548                                    6-Not a Title I school         1-Open
## 549                                    6-Not a Title I school         1-Open
## 550                                    6-Not a Title I school         1-Open
## 551                                                       n/a         1-Open
## 552                                    6-Not a Title I school         1-Open
## 553                                                       n/a         1-Open
## 554                                                       n/a         1-Open
## 555                                    6-Not a Title I school         1-Open
## 556                                    6-Not a Title I school         1-Open
## 557                                    6-Not a Title I school         1-Open
## 558                                                       n/a         1-Open
## 559                                                       n/a         1-Open
## 560                                    6-Not a Title I school         1-Open
## 561                                    6-Not a Title I school         1-Open
## 562                                    6-Not a Title I school         1-Open
## 563                                    6-Not a Title I school         1-Open
## 564                                                       n/a         1-Open
## 565                                    6-Not a Title I school         1-Open
## 566                                    6-Not a Title I school         1-Open
## 567                                    6-Not a Title I school         1-Open
## 568                                    6-Not a Title I school         1-Open
## 569                                    6-Not a Title I school         1-Open
## 570                                                       n/a         1-Open
## 571                                                       n/a         1-Open
## 572                                    6-Not a Title I school          3-New
## 573                                                       n/a         1-Open
## 574                                    6-Not a Title I school         1-Open
## 575                                    6-Not a Title I school         1-Open
## 576                                    6-Not a Title I school         1-Open
## 577                                    6-Not a Title I school         1-Open
## 578                                    6-Not a Title I school         1-Open
## 579                                    6-Not a Title I school         1-Open
## 580                                                       n/a         1-Open
## 581                                    6-Not a Title I school         1-Open
## 582                                                       n/a         1-Open
## 583                                                       n/a         1-Open
## 584                                                       n/a         1-Open
## 585                                                       n/a         1-Open
## 586                                                       n/a         1-Open
## 587                                    6-Not a Title I school         1-Open
## 588                                                       n/a         1-Open
## 589                                    6-Not a Title I school         1-Open
## 590                                                       n/a         1-Open
## 591                                    6-Not a Title I school         1-Open
## 592                                    6-Not a Title I school         1-Open
## 593                                                       n/a         1-Open
## 594                                    6-Not a Title I school         1-Open
## 595                                    6-Not a Title I school         1-Open
## 596                                    6-Not a Title I school         1-Open
## 597                                                       n/a         1-Open
## 598                                                       n/a         1-Open
## 599                                                       n/a         1-Open
## 600                                                       n/a         1-Open
## 601                                    6-Not a Title I school         1-Open
## 602                                    6-Not a Title I school         1-Open
## 603                                    6-Not a Title I school         1-Open
## 604                                                       n/a         1-Open
## 605                                                       n/a         1-Open
## 606                                    6-Not a Title I school         1-Open
## 607                                    6-Not a Title I school         1-Open
## 608                                    6-Not a Title I school         1-Open
## 609                                    6-Not a Title I school         1-Open
## 610                                    6-Not a Title I school         1-Open
## 611                                                       n/a         1-Open
## 612                                                       n/a         1-Open
## 613                                    6-Not a Title I school         1-Open
## 614                                    6-Not a Title I school         1-Open
## 615                                                       n/a         1-Open
## 616                                                       n/a         1-Open
## 617                                    6-Not a Title I school         1-Open
## 618                                                       n/a         1-Open
## 619                                    6-Not a Title I school         1-Open
## 620                                                       n/a         1-Open
## 621                                    6-Not a Title I school         1-Open
## 622                                                       n/a         1-Open
## 623                                                       n/a         1-Open
## 624                                                       n/a         1-Open
## 625                                                       n/a         1-Open
## 626                      2-Title I targeted assistance school         1-Open
## 627                                    6-Not a Title I school         1-Open
## 628                                                       n/a         1-Open
## 629                               5-Title I schoolwide school         1-Open
## 630                                    6-Not a Title I school         1-Open
## 631                                                       n/a         1-Open
## 632                                                       n/a         1-Open
## 633                                    6-Not a Title I school         1-Open
## 634                                    6-Not a Title I school         1-Open
## 635                                    6-Not a Title I school         1-Open
## 636                                                       n/a         1-Open
## 637                                    6-Not a Title I school         1-Open
## 638                                                       n/a         1-Open
## 639                                    6-Not a Title I school         1-Open
## 640                                                       n/a         1-Open
## 641                                    6-Not a Title I school         1-Open
## 642                                    6-Not a Title I school         1-Open
## 643                                                       n/a         1-Open
## 644                                    6-Not a Title I school         1-Open
## 645                                    6-Not a Title I school         1-Open
## 646                                    6-Not a Title I school         1-Open
## 647                                    6-Not a Title I school         1-Open
## 648                                    6-Not a Title I school         1-Open
## 649                                                       n/a         1-Open
## 650                                                       n/a         1-Open
## 651                                                       n/a         1-Open
## 652                                                       n/a         1-Open
## 653                                                       n/a         1-Open
## 654                                                       n/a         1-Open
## 655                                    6-Not a Title I school         1-Open
## 656                                    6-Not a Title I school         1-Open
## 657                                                       n/a         1-Open
## 658                                                       n/a         1-Open
## 659                                    6-Not a Title I school         1-Open
## 660                                                       n/a         1-Open
## 661                                                       n/a         1-Open
## 662                                                       n/a         1-Open
## 663                                    6-Not a Title I school         1-Open
## 664                                    6-Not a Title I school         1-Open
## 665                                                       n/a         1-Open
## 666                                    6-Not a Title I school         1-Open
## 667                                    6-Not a Title I school         1-Open
## 668                                    6-Not a Title I school         1-Open
## 669                                    6-Not a Title I school         1-Open
## 670                                    6-Not a Title I school         1-Open
## 671                                                       n/a         1-Open
## 672                               5-Title I schoolwide school         1-Open
## 673                                    6-Not a Title I school         1-Open
## 674                                    6-Not a Title I school         1-Open
## 675                                    6-Not a Title I school         1-Open
## 676                                    6-Not a Title I school         1-Open
## 677                                    6-Not a Title I school         1-Open
## 678                                                       n/a         1-Open
## 679                                                       n/a         1-Open
## 680                                    6-Not a Title I school        4-Added
## 681                                                       n/a         1-Open
## 682                                    6-Not a Title I school         1-Open
## 683  1-Title I targeted assistance eligible school-No program         1-Open
## 684                                                       n/a         1-Open
## 685                                    6-Not a Title I school         1-Open
## 686                               5-Title I schoolwide school         1-Open
## 687                                                       n/a         1-Open
## 688                                    6-Not a Title I school         1-Open
## 689                                    6-Not a Title I school         1-Open
## 690                                                       n/a         1-Open
## 691                                    6-Not a Title I school         1-Open
## 692                                    6-Not a Title I school         1-Open
## 693                                                       n/a         1-Open
## 694                                    6-Not a Title I school         1-Open
## 695                                                       n/a         1-Open
## 696                                    6-Not a Title I school         1-Open
## 697                                    6-Not a Title I school         1-Open
## 698                                                       n/a         1-Open
## 699                                                       n/a         1-Open
## 700                                    6-Not a Title I school         1-Open
## 701                                    6-Not a Title I school         1-Open
## 702                                    6-Not a Title I school         1-Open
## 703                                    6-Not a Title I school         1-Open
## 704                                    6-Not a Title I school         1-Open
## 705                                                       n/a         1-Open
## 706                                    6-Not a Title I school          3-New
## 707                                    6-Not a Title I school         1-Open
## 708                                                       n/a         1-Open
## 709                                    6-Not a Title I school         1-Open
## 710                                                       n/a         1-Open
## 711                                                       n/a         1-Open
## 712                                                       n/a         1-Open
## 713                                                       n/a         1-Open
## 714                                                       n/a         1-Open
## 715                                                       n/a         1-Open
## 716                                    6-Not a Title I school         1-Open
## 717                                                       n/a         1-Open
## 718                                                       n/a         1-Open
## 719                                    6-Not a Title I school         1-Open
## 720                                    6-Not a Title I school         1-Open
## 721                                                       n/a         1-Open
## 722                                                       n/a         1-Open
## 723                                    6-Not a Title I school         1-Open
## 724                                                       n/a         1-Open
## 725                                                       n/a         1-Open
## 726                                                       n/a         1-Open
## 727                                    6-Not a Title I school         1-Open
## 728                                    6-Not a Title I school         1-Open
## 729                                    6-Not a Title I school         1-Open
## 730                                                       n/a         1-Open
## 731                                    6-Not a Title I school          3-New
## 732                                                       n/a          3-New
## 733                                                       n/a         1-Open
## 734                                    6-Not a Title I school         1-Open
## 735                                                       n/a         1-Open
## 736                                    6-Not a Title I school         1-Open
## 737                                    6-Not a Title I school        4-Added
## 738                                                       n/a         1-Open
## 739                                                       n/a         1-Open
## 740                                                       n/a         1-Open
## 741                                                       n/a         1-Open
## 742                                                       n/a         1-Open
## 743                                                       n/a         1-Open
## 744                                                       n/a         1-Open
## 745                                    6-Not a Title I school         1-Open
## 746                                    6-Not a Title I school         1-Open
## 747                                                       n/a         1-Open
## 748                                                       n/a         1-Open
## 749                                    6-Not a Title I school         1-Open
## 750                                                       n/a         1-Open
## 751                                    6-Not a Title I school         1-Open
## 752                                                       n/a         1-Open
## 753                                    6-Not a Title I school         1-Open
## 754                                                       n/a         1-Open
## 755                                                       n/a         1-Open
## 756                                                       n/a         1-Open
## 757                                    6-Not a Title I school         1-Open
## 758                                    6-Not a Title I school         1-Open
## 759                                    6-Not a Title I school         1-Open
## 760                                    6-Not a Title I school         1-Open
## 761                                    6-Not a Title I school         1-Open
## 762                                                       n/a         1-Open
## 763                                                       n/a         1-Open
## 764                                                       n/a         1-Open
## 765                                                       n/a         1-Open
## 766                                                       n/a         1-Open
## 767                                                       n/a         1-Open
## 768                                                       n/a         1-Open
## 769                                                       n/a         1-Open
## 770                                    6-Not a Title I school         1-Open
## 771                                    6-Not a Title I school         1-Open
## 772                                    6-Not a Title I school         1-Open
## 773                                    6-Not a Title I school         1-Open
## 774                                                       n/a          3-New
## 775                                                       n/a         1-Open
## 776                                    6-Not a Title I school         1-Open
## 777                                    6-Not a Title I school         1-Open
## 778                                    6-Not a Title I school         1-Open
## 779                                    6-Not a Title I school         1-Open
## 780                                    6-Not a Title I school         1-Open
## 781                                    6-Not a Title I school         1-Open
## 782                                    6-Not a Title I school         1-Open
## 783                                    6-Not a Title I school         1-Open
## 784                                                       n/a         1-Open
## 785                                    6-Not a Title I school         1-Open
## 786                                    6-Not a Title I school         1-Open
## 787                                    6-Not a Title I school         1-Open
## 788                                    6-Not a Title I school         1-Open
## 789                                    6-Not a Title I school         1-Open
## 790                                    6-Not a Title I school         1-Open
## 791                                    6-Not a Title I school         1-Open
## 792                                    6-Not a Title I school         1-Open
## 793                                    6-Not a Title I school         1-Open
## 794                                    6-Not a Title I school         1-Open
## 795                                    6-Not a Title I school         1-Open
## 796                                    6-Not a Title I school         1-Open
## 797                                    6-Not a Title I school         1-Open
## 798                                                       n/a         1-Open
## 799                                    6-Not a Title I school         1-Open
## 800                                                       n/a         1-Open
## 801                                                       n/a         1-Open
## 802                                    6-Not a Title I school         1-Open
## 803                                    6-Not a Title I school         1-Open
## 804                                                       n/a       7-Future
## 805                                    6-Not a Title I school         1-Open
## 806                                    6-Not a Title I school         1-Open
## 807                                    6-Not a Title I school         1-Open
## 808                                    6-Not a Title I school         1-Open
## 809                                                       n/a         1-Open
## 810                                    6-Not a Title I school         1-Open
## 811                                                       n/a          3-New
## 812                                                       n/a         1-Open
## 813                                                       n/a         1-Open
## 814                                                       n/a         1-Open
## 815                                                       n/a         1-Open
## 816                                    6-Not a Title I school         1-Open
## 817                                    6-Not a Title I school         1-Open
## 818                                                       n/a         1-Open
## 819                                    6-Not a Title I school         1-Open
## 820                                    6-Not a Title I school         1-Open
## 821                                    6-Not a Title I school         1-Open
## 822                                                       n/a         1-Open
## 823                                    6-Not a Title I school         1-Open
## 824                                                       n/a         1-Open
## 825                                                       n/a         1-Open
## 826                                                       n/a       7-Future
## 827                                                       n/a         1-Open
## 828                                    6-Not a Title I school         1-Open
## 829                                    6-Not a Title I school         1-Open
## 830                                                       n/a         1-Open
## 831                                    6-Not a Title I school         1-Open
## 832                                                       n/a         1-Open
## 833                                                       n/a         1-Open
## 834                                                       n/a         1-Open
## 835                                                       n/a         1-Open
## 836  1-Title I targeted assistance eligible school-No program         1-Open
## 837                      2-Title I targeted assistance school         1-Open
## 838                                                       n/a         1-Open
## 839                                    6-Not a Title I school         1-Open
## 840                                    6-Not a Title I school         1-Open
## 841                                    6-Not a Title I school         1-Open
## 842                                    6-Not a Title I school         1-Open
## 843                                    6-Not a Title I school         1-Open
## 844                                    6-Not a Title I school         1-Open
## 845                                    6-Not a Title I school         1-Open
## 846                                    6-Not a Title I school          3-New
## 847                                    6-Not a Title I school         1-Open
## 848                                                       n/a         1-Open
## 849                                    6-Not a Title I school         1-Open
## 850                                    6-Not a Title I school         1-Open
## 851                                    6-Not a Title I school         1-Open
## 852                                    6-Not a Title I school         1-Open
## 853                                                       n/a         1-Open
## 854                                                       n/a         1-Open
## 855                                                       n/a         1-Open
## 856                                                       n/a         1-Open
## 857                                    6-Not a Title I school         1-Open
## 858                                    6-Not a Title I school         1-Open
## 859                                    6-Not a Title I school         1-Open
## 860                                    6-Not a Title I school         1-Open
## 861                                    6-Not a Title I school         1-Open
## 862                               5-Title I schoolwide school         1-Open
## 863                                    6-Not a Title I school         1-Open
## 864                      2-Title I targeted assistance school         1-Open
## 865                                    6-Not a Title I school         1-Open
## 866                                    6-Not a Title I school         1-Open
## 867                                                       n/a         1-Open
## 868                                                       n/a         1-Open
## 869                                    6-Not a Title I school          3-New
## 870                                    6-Not a Title I school         1-Open
## 871                                                       n/a         1-Open
## 872                                    6-Not a Title I school         1-Open
## 873                                    6-Not a Title I school         1-Open
## 874                                    6-Not a Title I school         1-Open
## 875                                    6-Not a Title I school         1-Open
## 876                                    6-Not a Title I school         1-Open
## 877                                                       n/a        4-Added
## 878                                    6-Not a Title I school         1-Open
## 879                                                       n/a         1-Open
## 880                                    6-Not a Title I school         1-Open
## 881                                                       n/a         1-Open
## 882                                                       n/a         1-Open
## 883                                                       n/a         1-Open
## 884                                                       n/a         1-Open
## 885                                    6-Not a Title I school         1-Open
## 886                                    6-Not a Title I school         1-Open
## 887                                    6-Not a Title I school         1-Open
## 888                                    6-Not a Title I school         1-Open
## 889                               5-Title I schoolwide school         1-Open
## 890                                                       n/a         1-Open
## 891                                                       n/a         1-Open
## 892                                    6-Not a Title I school         1-Open
## 893                                                       n/a         1-Open
## 894                                                       n/a         1-Open
## 895                                    6-Not a Title I school         1-Open
## 896                                                       n/a         1-Open
## 897                                                       n/a         1-Open
## 898                                                       n/a         1-Open
## 899                                    6-Not a Title I school         1-Open
## 900                                                       n/a         1-Open
## 901                               5-Title I schoolwide school         1-Open
## 902                                    6-Not a Title I school         1-Open
## 903                                    6-Not a Title I school         1-Open
## 904                                    6-Not a Title I school         1-Open
## 905                                                       n/a         1-Open
## 906                                    6-Not a Title I school         1-Open
## 907                                    6-Not a Title I school         1-Open
## 908                                                       n/a         1-Open
## 909                                    6-Not a Title I school         1-Open
## 910                                    6-Not a Title I school         1-Open
## 911                                    6-Not a Title I school         1-Open
## 912                                    6-Not a Title I school         1-Open
## 913                                                       n/a         1-Open
## 914                                    6-Not a Title I school         1-Open
## 915                                    6-Not a Title I school         1-Open
## 916                                                       n/a         1-Open
## 917                                    6-Not a Title I school         1-Open
## 918                                    6-Not a Title I school         1-Open
## 919                                    6-Not a Title I school         1-Open
## 920                                    6-Not a Title I school         1-Open
## 921                                    6-Not a Title I school         1-Open
## 922                                    6-Not a Title I school         1-Open
## 923                                    6-Not a Title I school         1-Open
## 924                                                       n/a         1-Open
## 925                                                       n/a         1-Open
## 926                                    6-Not a Title I school         1-Open
## 927                                    6-Not a Title I school         1-Open
## 928                                    6-Not a Title I school         1-Open
## 929                                    6-Not a Title I school         1-Open
## 930                                                       n/a        4-Added
## 931                                                       n/a         1-Open
## 932                                                       n/a         1-Open
## 933                                                       n/a         1-Open
## 934                                                       n/a         1-Open
## 935                                    6-Not a Title I school         1-Open
## 936                                    6-Not a Title I school         1-Open
## 937                                    6-Not a Title I school         1-Open
## 938                                    6-Not a Title I school         1-Open
## 939                                    6-Not a Title I school         1-Open
## 940                                    6-Not a Title I school         1-Open
## 941                                                       n/a         1-Open
## 942                                                       n/a         1-Open
## 943                                                       n/a         1-Open
## 944                                                       n/a         1-Open
## 945                                    6-Not a Title I school         1-Open
## 946                                                       n/a         1-Open
## 947                                    6-Not a Title I school         1-Open
## 948                                                       n/a         1-Open
## 949                                                       n/a         1-Open
## 950                                    6-Not a Title I school         1-Open
## 951                                    6-Not a Title I school         1-Open
## 952                                    6-Not a Title I school         1-Open
## 953                                    6-Not a Title I school         1-Open
## 954                                    6-Not a Title I school         1-Open
## 955                                    6-Not a Title I school         1-Open
## 956                                    6-Not a Title I school         1-Open
## 957                                    6-Not a Title I school         1-Open
## 958                                    6-Not a Title I school         1-Open
## 959                                    6-Not a Title I school         1-Open
## 960                                    6-Not a Title I school         1-Open
## 961                                    6-Not a Title I school         1-Open
## 962                                                       n/a         1-Open
## 963                                                       n/a         1-Open
## 964                                                       n/a         1-Open
## 965                                                       n/a         1-Open
## 966                                                       n/a         1-Open
## 967                                                       n/a         1-Open
## 968                                    6-Not a Title I school         1-Open
## 969                                    6-Not a Title I school         1-Open
## 970                                                       n/a         1-Open
## 971                                    6-Not a Title I school         1-Open
## 972                                                       n/a         1-Open
## 973                                                       n/a         1-Open
## 974                                                       n/a         1-Open
## 975                                                       n/a         1-Open
## 976                                    6-Not a Title I school         1-Open
## 977                                                       n/a         1-Open
## 978                                    6-Not a Title I school         1-Open
## 979                                    6-Not a Title I school         1-Open
## 980                                                       n/a         1-Open
## 981                                                       n/a         1-Open
## 982                                                       n/a         1-Open
## 983                                    6-Not a Title I school         1-Open
## 984                                                       n/a          3-New
## 985                                                       n/a         1-Open
## 986                                    6-Not a Title I school         1-Open
## 987                                    6-Not a Title I school         1-Open
## 988                                                       n/a         1-Open
## 989                                                       n/a         1-Open
## 990                                                       n/a         1-Open
## 991                                                       n/a         1-Open
## 992                                    6-Not a Title I school         1-Open
## 993                                    6-Not a Title I school         1-Open
## 994                                                       n/a         1-Open
## 995                                                       n/a         1-Open
## 996                                                       n/a         1-Open
## 997                                                       n/a         1-Open
## 998                                    6-Not a Title I school         1-Open
## 999                                    6-Not a Title I school         1-Open
## 1000                                                      n/a         1-Open
## 1001                                                      n/a         1-Open
## 1002                                                      n/a         1-Open
## 1003                     2-Title I targeted assistance school         1-Open
## 1004                                   6-Not a Title I school         1-Open
## 1005                                                      n/a       7-Future
## 1006                                   6-Not a Title I school         1-Open
## 1007                                   6-Not a Title I school         1-Open
## 1008                                   6-Not a Title I school         1-Open
## 1009                                   6-Not a Title I school         1-Open
## 1010                                   6-Not a Title I school         1-Open
## 1011                                                      n/a         1-Open
## 1012                                                      n/a         1-Open
## 1013                                                      n/a         1-Open
## 1014                                                      n/a         1-Open
## 1015                                   6-Not a Title I school         1-Open
## 1016                                                      n/a         1-Open
## 1017                                   6-Not a Title I school         1-Open
## 1018                                                      n/a         1-Open
## 1019                                   6-Not a Title I school         1-Open
## 1020                                                      n/a         1-Open
## 1021                                                      n/a         1-Open
## 1022                                                      n/a         1-Open
## 1023                                                      n/a         1-Open
## 1024                                   6-Not a Title I school         1-Open
## 1025                                   6-Not a Title I school         1-Open
## 1026                                   6-Not a Title I school         1-Open
## 1027                                                      n/a         1-Open
## 1028                                                      n/a         1-Open
## 1029                                                      n/a         1-Open
## 1030                                   6-Not a Title I school         1-Open
## 1031                                   6-Not a Title I school         1-Open
## 1032                                   6-Not a Title I school         1-Open
## 1033                                   6-Not a Title I school         1-Open
## 1034                                   6-Not a Title I school         1-Open
## 1035                                   6-Not a Title I school         1-Open
## 1036                                   6-Not a Title I school         1-Open
## 1037                                   6-Not a Title I school         1-Open
## 1038                                                      n/a         1-Open
## 1039                                                      n/a         1-Open
## 1040                                                      n/a         1-Open
## 1041                                   6-Not a Title I school         1-Open
## 1042                                   6-Not a Title I school         1-Open
## 1043                                                      n/a        4-Added
## 1044                                   6-Not a Title I school         1-Open
## 1045                                   6-Not a Title I school         1-Open
## 1046                                   6-Not a Title I school         1-Open
## 1047                                                      n/a          3-New
## 1048                                   6-Not a Title I school         1-Open
## 1049                                                      n/a         1-Open
## 1050                                                      n/a         1-Open
## 1051                                   6-Not a Title I school         1-Open
## 1052                                   6-Not a Title I school         1-Open
## 1053                                   6-Not a Title I school         1-Open
## 1054                                   6-Not a Title I school         1-Open
## 1055                                   6-Not a Title I school         1-Open
## 1056                                   6-Not a Title I school         1-Open
## 1057                                   6-Not a Title I school         1-Open
## 1058                                   6-Not a Title I school         1-Open
## 1059                                   6-Not a Title I school          3-New
## 1060                                   6-Not a Title I school         1-Open
## 1061                                   6-Not a Title I school         1-Open
## 1062                                   6-Not a Title I school         1-Open
## 1063                                   6-Not a Title I school         1-Open
## 1064                                                      n/a         1-Open
## 1065                                   6-Not a Title I school         1-Open
## 1066                                                      n/a         1-Open
## 1067                                   6-Not a Title I school         1-Open
## 1068                                   6-Not a Title I school         1-Open
## 1069                                   6-Not a Title I school         1-Open
## 1070                                   6-Not a Title I school         1-Open
## 1071                                   6-Not a Title I school         1-Open
## 1072                                   6-Not a Title I school         1-Open
## 1073                                   6-Not a Title I school         1-Open
## 1074                                                      n/a         1-Open
## 1075                                   6-Not a Title I school         1-Open
## 1076                                   6-Not a Title I school         1-Open
## 1077                                   6-Not a Title I school         1-Open
## 1078                                   6-Not a Title I school         1-Open
## 1079                                   6-Not a Title I school         1-Open
## 1080                                   6-Not a Title I school         1-Open
## 1081                                   6-Not a Title I school         1-Open
## 1082                                   6-Not a Title I school         1-Open
## 1083                                   6-Not a Title I school         1-Open
## 1084                                   6-Not a Title I school         1-Open
## 1085                                                      n/a         1-Open
## 1086                                   6-Not a Title I school         1-Open
## 1087                                   6-Not a Title I school         1-Open
## 1088                                   6-Not a Title I school         1-Open
## 1089                                   6-Not a Title I school         1-Open
## 1090                                   6-Not a Title I school         1-Open
## 1091                                                      n/a         1-Open
## 1092                                                      n/a         1-Open
## 1093                                                      n/a         1-Open
## 1094                                   6-Not a Title I school         1-Open
## 1095                                   6-Not a Title I school         1-Open
## 1096                                   6-Not a Title I school         1-Open
## 1097                              5-Title I schoolwide school         1-Open
## 1098                                                      n/a         1-Open
## 1099                                   6-Not a Title I school         1-Open
## 1100                                                      n/a         1-Open
## 1101                                   6-Not a Title I school         1-Open
## 1102                              5-Title I schoolwide school         1-Open
## 1103                                   6-Not a Title I school         1-Open
## 1104                              5-Title I schoolwide school         1-Open
## 1105                                                      n/a         1-Open
## 1106                                   6-Not a Title I school         1-Open
## 1107                                                      n/a         1-Open
## 1108                                   6-Not a Title I school         1-Open
## 1109                                                      n/a         1-Open
## 1110                                   6-Not a Title I school         1-Open
## 1111                                   6-Not a Title I school         1-Open
## 1112                                   6-Not a Title I school         1-Open
## 1113                                   6-Not a Title I school         1-Open
## 1114                                                      n/a         1-Open
## 1115                                   6-Not a Title I school         1-Open
## 1116                                   6-Not a Title I school         1-Open
## 1117                                                      n/a         1-Open
## 1118                                   6-Not a Title I school         1-Open
## 1119                                   6-Not a Title I school         1-Open
## 1120                                   6-Not a Title I school         1-Open
## 1121                                                      n/a         1-Open
## 1122                                                      n/a         1-Open
## 1123                                   6-Not a Title I school         1-Open
## 1124                                                      n/a         1-Open
## 1125                                   6-Not a Title I school         1-Open
## 1126                                   6-Not a Title I school         1-Open
## 1127                                                      n/a         1-Open
## 1128                                                      n/a         1-Open
## 1129                                   6-Not a Title I school         1-Open
## 1130                                                      n/a         1-Open
## 1131                                                      n/a         1-Open
## 1132                                                      n/a         1-Open
## 1133                                                      n/a         1-Open
## 1134                              5-Title I schoolwide school         1-Open
## 1135                                                      n/a         1-Open
## 1136                                   6-Not a Title I school         1-Open
## 1137                                   6-Not a Title I school         1-Open
## 1138                                                      n/a         1-Open
## 1139                              5-Title I schoolwide school         1-Open
## 1140                                                      n/a         1-Open
## 1141                                                      n/a         1-Open
## 1142                                                      n/a         1-Open
## 1143                                                      n/a         1-Open
## 1144                                                      n/a         1-Open
## 1145                                   6-Not a Title I school         1-Open
## 1146                                                      n/a         1-Open
## 1147                                                      n/a         1-Open
## 1148                                                      n/a         1-Open
## 1149                                                      n/a         1-Open
## 1150                                                      n/a         1-Open
## 1151                                   6-Not a Title I school         1-Open
## 1152                                   6-Not a Title I school         1-Open
## 1153                                                      n/a         1-Open
## 1154                                   6-Not a Title I school         1-Open
## 1155                                                      n/a         1-Open
## 1156                                                      n/a         1-Open
## 1157                                                      n/a         1-Open
## 1158                                   6-Not a Title I school         1-Open
## 1159                                   6-Not a Title I school         1-Open
## 1160                                                      n/a       7-Future
## 1161                                   6-Not a Title I school         1-Open
## 1162                                                      n/a         1-Open
## 1163                                   6-Not a Title I school         1-Open
## 1164                                                      n/a         1-Open
## 1165                                                      n/a         1-Open
## 1166                                   6-Not a Title I school         1-Open
## 1167                                                      n/a         1-Open
## 1168                                                      n/a         1-Open
## 1169                                                      n/a         1-Open
## 1170                                                      n/a         1-Open
## 1171                                   6-Not a Title I school         1-Open
## 1172                                   6-Not a Title I school         1-Open
## 1173                                   6-Not a Title I school         1-Open
## 1174                                   6-Not a Title I school         1-Open
## 1175                                   6-Not a Title I school         1-Open
## 1176                                   6-Not a Title I school         1-Open
## 1177                                                      n/a         1-Open
## 1178                                   6-Not a Title I school         1-Open
## 1179                                                      n/a         1-Open
## 1180                                   6-Not a Title I school          3-New
## 1181                                                      n/a         1-Open
## 1182                                   6-Not a Title I school         1-Open
## 1183                                   6-Not a Title I school         1-Open
## 1184                                   6-Not a Title I school         1-Open
## 1185                                                      n/a         1-Open
## 1186                                   6-Not a Title I school         1-Open
## 1187                                   6-Not a Title I school         1-Open
## 1188                                   6-Not a Title I school         1-Open
## 1189                                   6-Not a Title I school         1-Open
## 1190                                   6-Not a Title I school         1-Open
## 1191                                   6-Not a Title I school         1-Open
## 1192                                   6-Not a Title I school         1-Open
## 1193                                                      n/a         1-Open
## 1194                                   6-Not a Title I school         1-Open
## 1195                                   6-Not a Title I school         1-Open
## 1196                                   6-Not a Title I school         1-Open
## 1197                                                      n/a         1-Open
## 1198                                                      n/a         1-Open
## 1199                                   6-Not a Title I school         1-Open
## 1200                                   6-Not a Title I school        4-Added
## 1201                                   6-Not a Title I school         1-Open
## 1202                                                      n/a         1-Open
## 1203                                                      n/a         1-Open
## 1204                                                      n/a         1-Open
## 1205                                                      n/a         1-Open
## 1206                                   6-Not a Title I school         1-Open
## 1207                                   6-Not a Title I school         1-Open
## 1208                                                      n/a         1-Open
## 1209                                   6-Not a Title I school         1-Open
## 1210                                   6-Not a Title I school         1-Open
## 1211                                   6-Not a Title I school         1-Open
## 1212                                                      n/a         1-Open
## 1213                                                      n/a         1-Open
## 1214                                                      n/a         1-Open
## 1215                                                      n/a         1-Open
## 1216                                   6-Not a Title I school         1-Open
## 1217                                                      n/a         1-Open
## 1218                                                      n/a         1-Open
## 1219                                   6-Not a Title I school         1-Open
## 1220                                   6-Not a Title I school         1-Open
## 1221                                   6-Not a Title I school         1-Open
## 1222                                   6-Not a Title I school          3-New
## 1223                              5-Title I schoolwide school         1-Open
## 1224                                                      n/a         1-Open
## 1225                                   6-Not a Title I school         1-Open
## 1226                                   6-Not a Title I school         1-Open
## 1227                                   6-Not a Title I school         1-Open
## 1228                                   6-Not a Title I school         1-Open
## 1229                                                      n/a         1-Open
## 1230                                                      n/a         1-Open
## 1231                                   6-Not a Title I school         1-Open
## 1232                                   6-Not a Title I school         1-Open
## 1233                                   6-Not a Title I school         1-Open
## 1234                                                      n/a         1-Open
## 1235                                   6-Not a Title I school         1-Open
## 1236                                                      n/a         1-Open
## 1237                                   6-Not a Title I school         1-Open
## 1238                                   6-Not a Title I school         1-Open
## 1239                                   6-Not a Title I school         1-Open
## 1240                                                      n/a         1-Open
## 1241                                   6-Not a Title I school         1-Open
## 1242                                                      n/a         1-Open
## 1243                                   6-Not a Title I school         1-Open
## 1244                                   6-Not a Title I school         1-Open
## 1245                                   6-Not a Title I school         1-Open
## 1246                                                      n/a         1-Open
##                                     Agency.Type                School.Type
## 1    4-Regional Education Service Agency (RESA) 2-Special education school
## 2    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 3    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 4    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 5    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 6    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 7    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 8    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 9    4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 10   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 11   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 12   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 13   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 14   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 15   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 16   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 17   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 18   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 19   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 20   4-Regional Education Service Agency (RESA) 2-Special education school
## 21   4-Regional Education Service Agency (RESA) 2-Special education school
## 22   4-Regional Education Service Agency (RESA) 2-Special education school
## 23   4-Regional Education Service Agency (RESA) 2-Special education school
## 24   4-Regional Education Service Agency (RESA) 2-Special education school
## 25   4-Regional Education Service Agency (RESA) 2-Special education school
## 26   4-Regional Education Service Agency (RESA)        3-Vocational school
## 27   4-Regional Education Service Agency (RESA)           1-Regular school
## 28   4-Regional Education Service Agency (RESA) 2-Special education school
## 29   4-Regional Education Service Agency (RESA) 2-Special education school
## 30   4-Regional Education Service Agency (RESA) 2-Special education school
## 31   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 32   4-Regional Education Service Agency (RESA) 2-Special education school
## 33   4-Regional Education Service Agency (RESA)           1-Regular school
## 34   4-Regional Education Service Agency (RESA)           1-Regular school
## 35   4-Regional Education Service Agency (RESA)           1-Regular school
## 36   4-Regional Education Service Agency (RESA)           1-Regular school
## 37   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 38   4-Regional Education Service Agency (RESA)        3-Vocational school
## 39   4-Regional Education Service Agency (RESA) 2-Special education school
## 40   4-Regional Education Service Agency (RESA) 2-Special education school
## 41   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 42   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 43   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 44   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 45   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 46   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 47   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 48   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 49   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 50   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 51   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 52   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 53   4-Regional Education Service Agency (RESA) 2-Special education school
## 54   4-Regional Education Service Agency (RESA)        3-Vocational school
## 55   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 56   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 57   4-Regional Education Service Agency (RESA) 2-Special education school
## 58   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 59   4-Regional Education Service Agency (RESA)        3-Vocational school
## 60   4-Regional Education Service Agency (RESA)        3-Vocational school
## 61   4-Regional Education Service Agency (RESA)           1-Regular school
## 62   4-Regional Education Service Agency (RESA)        3-Vocational school
## 63   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 64   4-Regional Education Service Agency (RESA)        3-Vocational school
## 65   4-Regional Education Service Agency (RESA)           1-Regular school
## 66   4-Regional Education Service Agency (RESA) 2-Special education school
## 67   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 68   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 69   4-Regional Education Service Agency (RESA)        3-Vocational school
## 70   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 71   4-Regional Education Service Agency (RESA)           1-Regular school
## 72   4-Regional Education Service Agency (RESA) 2-Special education school
## 73   4-Regional Education Service Agency (RESA)           1-Regular school
## 74   4-Regional Education Service Agency (RESA)        3-Vocational school
## 75   4-Regional Education Service Agency (RESA)        3-Vocational school
## 76   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 77   4-Regional Education Service Agency (RESA)           1-Regular school
## 78   4-Regional Education Service Agency (RESA)           1-Regular school
## 79   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 80   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 81   4-Regional Education Service Agency (RESA) 2-Special education school
## 82   4-Regional Education Service Agency (RESA)        3-Vocational school
## 83   4-Regional Education Service Agency (RESA) 2-Special education school
## 84   4-Regional Education Service Agency (RESA) 2-Special education school
## 85   4-Regional Education Service Agency (RESA)        3-Vocational school
## 86   4-Regional Education Service Agency (RESA)        3-Vocational school
## 87   4-Regional Education Service Agency (RESA) 2-Special education school
## 88   4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 89   4-Regional Education Service Agency (RESA) 2-Special education school
## 90   4-Regional Education Service Agency (RESA)        3-Vocational school
## 91   4-Regional Education Service Agency (RESA)        3-Vocational school
## 92   4-Regional Education Service Agency (RESA)        3-Vocational school
## 93   4-Regional Education Service Agency (RESA) 2-Special education school
## 94   4-Regional Education Service Agency (RESA) 2-Special education school
## 95   4-Regional Education Service Agency (RESA) 2-Special education school
## 96   4-Regional Education Service Agency (RESA)        3-Vocational school
## 97   4-Regional Education Service Agency (RESA) 2-Special education school
## 98   4-Regional Education Service Agency (RESA) 2-Special education school
## 99   4-Regional Education Service Agency (RESA) 2-Special education school
## 100  4-Regional Education Service Agency (RESA) 2-Special education school
## 101  4-Regional Education Service Agency (RESA) 2-Special education school
## 102  4-Regional Education Service Agency (RESA)        3-Vocational school
## 103  4-Regional Education Service Agency (RESA)        3-Vocational school
## 104  4-Regional Education Service Agency (RESA) 2-Special education school
## 105  4-Regional Education Service Agency (RESA) 2-Special education school
## 106  4-Regional Education Service Agency (RESA)        3-Vocational school
## 107  4-Regional Education Service Agency (RESA) 2-Special education school
## 108  4-Regional Education Service Agency (RESA)        3-Vocational school
## 109  4-Regional Education Service Agency (RESA) 2-Special education school
## 110  4-Regional Education Service Agency (RESA)        3-Vocational school
## 111  4-Regional Education Service Agency (RESA)           1-Regular school
## 112  4-Regional Education Service Agency (RESA) 2-Special education school
## 113  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 114  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 115  4-Regional Education Service Agency (RESA) 2-Special education school
## 116  4-Regional Education Service Agency (RESA)           1-Regular school
## 117  4-Regional Education Service Agency (RESA) 2-Special education school
## 118  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 119  4-Regional Education Service Agency (RESA) 2-Special education school
## 120  4-Regional Education Service Agency (RESA)        3-Vocational school
## 121  4-Regional Education Service Agency (RESA) 2-Special education school
## 122  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 123  4-Regional Education Service Agency (RESA)           1-Regular school
## 124  4-Regional Education Service Agency (RESA) 2-Special education school
## 125  4-Regional Education Service Agency (RESA)        3-Vocational school
## 126  4-Regional Education Service Agency (RESA)        3-Vocational school
## 127  4-Regional Education Service Agency (RESA) 2-Special education school
## 128  4-Regional Education Service Agency (RESA) 2-Special education school
## 129  4-Regional Education Service Agency (RESA) 2-Special education school
## 130  4-Regional Education Service Agency (RESA) 2-Special education school
## 131  4-Regional Education Service Agency (RESA)        3-Vocational school
## 132  4-Regional Education Service Agency (RESA)        3-Vocational school
## 133  4-Regional Education Service Agency (RESA)        3-Vocational school
## 134  4-Regional Education Service Agency (RESA)        3-Vocational school
## 135  4-Regional Education Service Agency (RESA)        3-Vocational school
## 136  4-Regional Education Service Agency (RESA) 2-Special education school
## 137  4-Regional Education Service Agency (RESA)        3-Vocational school
## 138  4-Regional Education Service Agency (RESA)        3-Vocational school
## 139  4-Regional Education Service Agency (RESA)        3-Vocational school
## 140  4-Regional Education Service Agency (RESA)        3-Vocational school
## 141  4-Regional Education Service Agency (RESA)        3-Vocational school
## 142  4-Regional Education Service Agency (RESA)        3-Vocational school
## 143  4-Regional Education Service Agency (RESA)        3-Vocational school
## 144  4-Regional Education Service Agency (RESA) 2-Special education school
## 145  4-Regional Education Service Agency (RESA) 2-Special education school
## 146  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 147  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 148  4-Regional Education Service Agency (RESA)        3-Vocational school
## 149  4-Regional Education Service Agency (RESA) 2-Special education school
## 150  4-Regional Education Service Agency (RESA) 2-Special education school
## 151  4-Regional Education Service Agency (RESA)        3-Vocational school
## 152  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 153  4-Regional Education Service Agency (RESA)        3-Vocational school
## 154  4-Regional Education Service Agency (RESA)        3-Vocational school
## 155  4-Regional Education Service Agency (RESA)        3-Vocational school
## 156  4-Regional Education Service Agency (RESA)        3-Vocational school
## 157  4-Regional Education Service Agency (RESA)        3-Vocational school
## 158  4-Regional Education Service Agency (RESA)        3-Vocational school
## 159  4-Regional Education Service Agency (RESA) 2-Special education school
## 160  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 161  4-Regional Education Service Agency (RESA)        3-Vocational school
## 162  4-Regional Education Service Agency (RESA) 2-Special education school
## 163  4-Regional Education Service Agency (RESA) 2-Special education school
## 164  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 165  4-Regional Education Service Agency (RESA)           1-Regular school
## 166  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 167  4-Regional Education Service Agency (RESA)           1-Regular school
## 168  4-Regional Education Service Agency (RESA) 2-Special education school
## 169  4-Regional Education Service Agency (RESA) 2-Special education school
## 170  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 171  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 172  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 173  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 174  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 175  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 176  4-Regional Education Service Agency (RESA)        3-Vocational school
## 177  4-Regional Education Service Agency (RESA)        3-Vocational school
## 178  4-Regional Education Service Agency (RESA)        3-Vocational school
## 179  4-Regional Education Service Agency (RESA)        3-Vocational school
## 180  4-Regional Education Service Agency (RESA)        3-Vocational school
## 181  4-Regional Education Service Agency (RESA)           1-Regular school
## 182  4-Regional Education Service Agency (RESA)        3-Vocational school
## 183  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 184  4-Regional Education Service Agency (RESA) 2-Special education school
## 185  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 186  4-Regional Education Service Agency (RESA) 2-Special education school
## 187  4-Regional Education Service Agency (RESA)           1-Regular school
## 188  4-Regional Education Service Agency (RESA)        3-Vocational school
## 189  4-Regional Education Service Agency (RESA)           1-Regular school
## 190  4-Regional Education Service Agency (RESA)           1-Regular school
## 191  4-Regional Education Service Agency (RESA)           1-Regular school
## 192  4-Regional Education Service Agency (RESA)        3-Vocational school
## 193  4-Regional Education Service Agency (RESA)           1-Regular school
## 194  4-Regional Education Service Agency (RESA)        3-Vocational school
## 195  4-Regional Education Service Agency (RESA)        3-Vocational school
## 196  4-Regional Education Service Agency (RESA)        3-Vocational school
## 197  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 198  4-Regional Education Service Agency (RESA) 2-Special education school
## 199  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 200  4-Regional Education Service Agency (RESA) 2-Special education school
## 201  4-Regional Education Service Agency (RESA) 2-Special education school
## 202  4-Regional Education Service Agency (RESA)           1-Regular school
## 203  4-Regional Education Service Agency (RESA) 2-Special education school
## 204  4-Regional Education Service Agency (RESA)        3-Vocational school
## 205  4-Regional Education Service Agency (RESA)           1-Regular school
## 206  4-Regional Education Service Agency (RESA)        3-Vocational school
## 207  4-Regional Education Service Agency (RESA) 2-Special education school
## 208  4-Regional Education Service Agency (RESA) 2-Special education school
## 209  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 210  4-Regional Education Service Agency (RESA)        3-Vocational school
## 211  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 212  4-Regional Education Service Agency (RESA)           1-Regular school
## 213  4-Regional Education Service Agency (RESA)        3-Vocational school
## 214  4-Regional Education Service Agency (RESA)        3-Vocational school
## 215  4-Regional Education Service Agency (RESA)        3-Vocational school
## 216  4-Regional Education Service Agency (RESA)           1-Regular school
## 217  4-Regional Education Service Agency (RESA) 2-Special education school
## 218  4-Regional Education Service Agency (RESA) 2-Special education school
## 219  4-Regional Education Service Agency (RESA)           1-Regular school
## 220  4-Regional Education Service Agency (RESA)           1-Regular school
## 221  4-Regional Education Service Agency (RESA) 2-Special education school
## 222  4-Regional Education Service Agency (RESA) 2-Special education school
## 223  4-Regional Education Service Agency (RESA)        3-Vocational school
## 224  4-Regional Education Service Agency (RESA)           1-Regular school
## 225  4-Regional Education Service Agency (RESA) 2-Special education school
## 226  4-Regional Education Service Agency (RESA)        3-Vocational school
## 227  4-Regional Education Service Agency (RESA)        3-Vocational school
## 228  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 229  4-Regional Education Service Agency (RESA)        3-Vocational school
## 230  4-Regional Education Service Agency (RESA) 2-Special education school
## 231  4-Regional Education Service Agency (RESA) 2-Special education school
## 232  4-Regional Education Service Agency (RESA) 2-Special education school
## 233  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 234  4-Regional Education Service Agency (RESA)        3-Vocational school
## 235  4-Regional Education Service Agency (RESA) 2-Special education school
## 236  4-Regional Education Service Agency (RESA) 2-Special education school
## 237  4-Regional Education Service Agency (RESA)        3-Vocational school
## 238  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 239  4-Regional Education Service Agency (RESA) 2-Special education school
## 240  4-Regional Education Service Agency (RESA)           1-Regular school
## 241  4-Regional Education Service Agency (RESA)        3-Vocational school
## 242  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 243  4-Regional Education Service Agency (RESA)        3-Vocational school
## 244  4-Regional Education Service Agency (RESA)        3-Vocational school
## 245  4-Regional Education Service Agency (RESA) 2-Special education school
## 246  4-Regional Education Service Agency (RESA)        3-Vocational school
## 247  4-Regional Education Service Agency (RESA) 2-Special education school
## 248  4-Regional Education Service Agency (RESA) 2-Special education school
## 249  4-Regional Education Service Agency (RESA)        3-Vocational school
## 250  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 251  4-Regional Education Service Agency (RESA)        3-Vocational school
## 252  4-Regional Education Service Agency (RESA)        3-Vocational school
## 253  4-Regional Education Service Agency (RESA) 2-Special education school
## 254  4-Regional Education Service Agency (RESA) 2-Special education school
## 255  4-Regional Education Service Agency (RESA) 2-Special education school
## 256  4-Regional Education Service Agency (RESA)        3-Vocational school
## 257  4-Regional Education Service Agency (RESA)        3-Vocational school
## 258  4-Regional Education Service Agency (RESA)        3-Vocational school
## 259  4-Regional Education Service Agency (RESA)        3-Vocational school
## 260  4-Regional Education Service Agency (RESA)        3-Vocational school
## 261  4-Regional Education Service Agency (RESA)        3-Vocational school
## 262  4-Regional Education Service Agency (RESA) 2-Special education school
## 263  4-Regional Education Service Agency (RESA)        3-Vocational school
## 264  4-Regional Education Service Agency (RESA)        3-Vocational school
## 265  4-Regional Education Service Agency (RESA)        3-Vocational school
## 266  4-Regional Education Service Agency (RESA) 2-Special education school
## 267  4-Regional Education Service Agency (RESA) 2-Special education school
## 268  4-Regional Education Service Agency (RESA) 2-Special education school
## 269  4-Regional Education Service Agency (RESA) 2-Special education school
## 270  4-Regional Education Service Agency (RESA)        3-Vocational school
## 271  4-Regional Education Service Agency (RESA)           1-Regular school
## 272  4-Regional Education Service Agency (RESA) 2-Special education school
## 273  4-Regional Education Service Agency (RESA) 2-Special education school
## 274  4-Regional Education Service Agency (RESA)        3-Vocational school
## 275  4-Regional Education Service Agency (RESA)        3-Vocational school
## 276  4-Regional Education Service Agency (RESA) 2-Special education school
## 277  4-Regional Education Service Agency (RESA)           1-Regular school
## 278  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 279  4-Regional Education Service Agency (RESA)        3-Vocational school
## 280  4-Regional Education Service Agency (RESA) 2-Special education school
## 281  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 282  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 283  4-Regional Education Service Agency (RESA)           1-Regular school
## 284  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 285  4-Regional Education Service Agency (RESA) 2-Special education school
## 286  4-Regional Education Service Agency (RESA) 2-Special education school
## 287  4-Regional Education Service Agency (RESA) 2-Special education school
## 288  4-Regional Education Service Agency (RESA)           1-Regular school
## 289  4-Regional Education Service Agency (RESA) 2-Special education school
## 290  4-Regional Education Service Agency (RESA)           1-Regular school
## 291  4-Regional Education Service Agency (RESA)           1-Regular school
## 292  4-Regional Education Service Agency (RESA)           1-Regular school
## 293  4-Regional Education Service Agency (RESA) 2-Special education school
## 294  4-Regional Education Service Agency (RESA) 2-Special education school
## 295  4-Regional Education Service Agency (RESA) 2-Special education school
## 296  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 297  4-Regional Education Service Agency (RESA) 2-Special education school
## 298  4-Regional Education Service Agency (RESA)        3-Vocational school
## 299  4-Regional Education Service Agency (RESA)        3-Vocational school
## 300  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 301  4-Regional Education Service Agency (RESA)        3-Vocational school
## 302  4-Regional Education Service Agency (RESA) 2-Special education school
## 303  4-Regional Education Service Agency (RESA) 2-Special education school
## 304  4-Regional Education Service Agency (RESA)        3-Vocational school
## 305  4-Regional Education Service Agency (RESA) 2-Special education school
## 306  4-Regional Education Service Agency (RESA)        3-Vocational school
## 307  4-Regional Education Service Agency (RESA) 2-Special education school
## 308  4-Regional Education Service Agency (RESA)           1-Regular school
## 309  4-Regional Education Service Agency (RESA) 2-Special education school
## 310  4-Regional Education Service Agency (RESA) 2-Special education school
## 311  4-Regional Education Service Agency (RESA) 2-Special education school
## 312  4-Regional Education Service Agency (RESA)        3-Vocational school
## 313  4-Regional Education Service Agency (RESA) 2-Special education school
## 314  4-Regional Education Service Agency (RESA)           1-Regular school
## 315  4-Regional Education Service Agency (RESA) 2-Special education school
## 316  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 317  4-Regional Education Service Agency (RESA) 2-Special education school
## 318  4-Regional Education Service Agency (RESA) 2-Special education school
## 319  4-Regional Education Service Agency (RESA)        3-Vocational school
## 320  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 321  4-Regional Education Service Agency (RESA) 2-Special education school
## 322  4-Regional Education Service Agency (RESA) 2-Special education school
## 323  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 324  4-Regional Education Service Agency (RESA)        3-Vocational school
## 325  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 326  4-Regional Education Service Agency (RESA) 2-Special education school
## 327  4-Regional Education Service Agency (RESA) 2-Special education school
## 328  4-Regional Education Service Agency (RESA) 2-Special education school
## 329  4-Regional Education Service Agency (RESA) 2-Special education school
## 330  4-Regional Education Service Agency (RESA) 2-Special education school
## 331  4-Regional Education Service Agency (RESA) 2-Special education school
## 332  4-Regional Education Service Agency (RESA) 2-Special education school
## 333  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 334  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 335  4-Regional Education Service Agency (RESA) 2-Special education school
## 336  4-Regional Education Service Agency (RESA) 2-Special education school
## 337  4-Regional Education Service Agency (RESA)        3-Vocational school
## 338  4-Regional Education Service Agency (RESA) 2-Special education school
## 339  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 340  4-Regional Education Service Agency (RESA)           1-Regular school
## 341  4-Regional Education Service Agency (RESA) 2-Special education school
## 342  4-Regional Education Service Agency (RESA) 2-Special education school
## 343  4-Regional Education Service Agency (RESA) 2-Special education school
## 344  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 345  4-Regional Education Service Agency (RESA) 2-Special education school
## 346  4-Regional Education Service Agency (RESA)           1-Regular school
## 347  4-Regional Education Service Agency (RESA)           1-Regular school
## 348  4-Regional Education Service Agency (RESA) 2-Special education school
## 349  4-Regional Education Service Agency (RESA)        3-Vocational school
## 350  4-Regional Education Service Agency (RESA)        3-Vocational school
## 351  4-Regional Education Service Agency (RESA) 2-Special education school
## 352  4-Regional Education Service Agency (RESA)        3-Vocational school
## 353  4-Regional Education Service Agency (RESA) 2-Special education school
## 354  4-Regional Education Service Agency (RESA) 2-Special education school
## 355  4-Regional Education Service Agency (RESA) 2-Special education school
## 356  4-Regional Education Service Agency (RESA) 2-Special education school
## 357  4-Regional Education Service Agency (RESA) 2-Special education school
## 358  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 359  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 360  4-Regional Education Service Agency (RESA) 2-Special education school
## 361  4-Regional Education Service Agency (RESA) 2-Special education school
## 362  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 363  4-Regional Education Service Agency (RESA)        3-Vocational school
## 364  4-Regional Education Service Agency (RESA) 2-Special education school
## 365  4-Regional Education Service Agency (RESA) 2-Special education school
## 366  4-Regional Education Service Agency (RESA)        3-Vocational school
## 367  4-Regional Education Service Agency (RESA)        3-Vocational school
## 368  4-Regional Education Service Agency (RESA)        3-Vocational school
## 369  4-Regional Education Service Agency (RESA) 2-Special education school
## 370  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 371  4-Regional Education Service Agency (RESA) 2-Special education school
## 372  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 373  4-Regional Education Service Agency (RESA) 2-Special education school
## 374  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 375  4-Regional Education Service Agency (RESA)        3-Vocational school
## 376  4-Regional Education Service Agency (RESA) 2-Special education school
## 377  4-Regional Education Service Agency (RESA)        3-Vocational school
## 378  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 379  4-Regional Education Service Agency (RESA)        3-Vocational school
## 380  4-Regional Education Service Agency (RESA) 2-Special education school
## 381  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 382  4-Regional Education Service Agency (RESA)        3-Vocational school
## 383  4-Regional Education Service Agency (RESA) 2-Special education school
## 384  4-Regional Education Service Agency (RESA) 2-Special education school
## 385  4-Regional Education Service Agency (RESA)           1-Regular school
## 386  4-Regional Education Service Agency (RESA) 2-Special education school
## 387  4-Regional Education Service Agency (RESA) 2-Special education school
## 388  4-Regional Education Service Agency (RESA)           1-Regular school
## 389  4-Regional Education Service Agency (RESA) 2-Special education school
## 390  4-Regional Education Service Agency (RESA)        3-Vocational school
## 391  4-Regional Education Service Agency (RESA) 2-Special education school
## 392  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 393  4-Regional Education Service Agency (RESA)           1-Regular school
## 394  4-Regional Education Service Agency (RESA)           1-Regular school
## 395  4-Regional Education Service Agency (RESA) 2-Special education school
## 396  4-Regional Education Service Agency (RESA)        3-Vocational school
## 397  4-Regional Education Service Agency (RESA) 2-Special education school
## 398  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 399  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 400  4-Regional Education Service Agency (RESA)           1-Regular school
## 401  4-Regional Education Service Agency (RESA)        3-Vocational school
## 402  4-Regional Education Service Agency (RESA) 2-Special education school
## 403  4-Regional Education Service Agency (RESA)           1-Regular school
## 404  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 405  4-Regional Education Service Agency (RESA)        3-Vocational school
## 406  4-Regional Education Service Agency (RESA)           1-Regular school
## 407  4-Regional Education Service Agency (RESA)           1-Regular school
## 408  4-Regional Education Service Agency (RESA)        3-Vocational school
## 409  4-Regional Education Service Agency (RESA)        3-Vocational school
## 410  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 411  4-Regional Education Service Agency (RESA)        3-Vocational school
## 412  4-Regional Education Service Agency (RESA)        3-Vocational school
## 413  4-Regional Education Service Agency (RESA) 2-Special education school
## 414  4-Regional Education Service Agency (RESA) 2-Special education school
## 415  4-Regional Education Service Agency (RESA) 2-Special education school
## 416  4-Regional Education Service Agency (RESA)        3-Vocational school
## 417  4-Regional Education Service Agency (RESA)           1-Regular school
## 418  4-Regional Education Service Agency (RESA) 2-Special education school
## 419  4-Regional Education Service Agency (RESA) 2-Special education school
## 420  4-Regional Education Service Agency (RESA)        3-Vocational school
## 421  4-Regional Education Service Agency (RESA) 2-Special education school
## 422  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 423  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 424  4-Regional Education Service Agency (RESA)        3-Vocational school
## 425  4-Regional Education Service Agency (RESA)        3-Vocational school
## 426  4-Regional Education Service Agency (RESA)        3-Vocational school
## 427  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 428  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 429  4-Regional Education Service Agency (RESA)           1-Regular school
## 430  4-Regional Education Service Agency (RESA)        3-Vocational school
## 431  4-Regional Education Service Agency (RESA)        3-Vocational school
## 432  4-Regional Education Service Agency (RESA) 2-Special education school
## 433  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 434  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 435  4-Regional Education Service Agency (RESA)        3-Vocational school
## 436  4-Regional Education Service Agency (RESA)        3-Vocational school
## 437  4-Regional Education Service Agency (RESA) 2-Special education school
## 438  4-Regional Education Service Agency (RESA) 2-Special education school
## 439  4-Regional Education Service Agency (RESA) 2-Special education school
## 440  4-Regional Education Service Agency (RESA) 2-Special education school
## 441  4-Regional Education Service Agency (RESA) 2-Special education school
## 442  4-Regional Education Service Agency (RESA)        3-Vocational school
## 443  4-Regional Education Service Agency (RESA) 2-Special education school
## 444  4-Regional Education Service Agency (RESA)           1-Regular school
## 445  4-Regional Education Service Agency (RESA)           1-Regular school
## 446  4-Regional Education Service Agency (RESA) 2-Special education school
## 447  4-Regional Education Service Agency (RESA) 2-Special education school
## 448  4-Regional Education Service Agency (RESA)           1-Regular school
## 449  4-Regional Education Service Agency (RESA)        3-Vocational school
## 450  4-Regional Education Service Agency (RESA)        3-Vocational school
## 451  4-Regional Education Service Agency (RESA)        3-Vocational school
## 452  4-Regional Education Service Agency (RESA) 2-Special education school
## 453  4-Regional Education Service Agency (RESA) 2-Special education school
## 454  4-Regional Education Service Agency (RESA) 2-Special education school
## 455  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 456  4-Regional Education Service Agency (RESA)        3-Vocational school
## 457  4-Regional Education Service Agency (RESA) 2-Special education school
## 458  4-Regional Education Service Agency (RESA)        3-Vocational school
## 459  4-Regional Education Service Agency (RESA)           1-Regular school
## 460  4-Regional Education Service Agency (RESA) 2-Special education school
## 461  4-Regional Education Service Agency (RESA) 2-Special education school
## 462  4-Regional Education Service Agency (RESA)        3-Vocational school
## 463  4-Regional Education Service Agency (RESA) 2-Special education school
## 464  4-Regional Education Service Agency (RESA) 2-Special education school
## 465  4-Regional Education Service Agency (RESA)           1-Regular school
## 466  4-Regional Education Service Agency (RESA)           1-Regular school
## 467  4-Regional Education Service Agency (RESA) 2-Special education school
## 468  4-Regional Education Service Agency (RESA) 2-Special education school
## 469  4-Regional Education Service Agency (RESA) 2-Special education school
## 470  4-Regional Education Service Agency (RESA) 2-Special education school
## 471  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 472  4-Regional Education Service Agency (RESA) 2-Special education school
## 473  4-Regional Education Service Agency (RESA) 2-Special education school
## 474  4-Regional Education Service Agency (RESA) 2-Special education school
## 475  4-Regional Education Service Agency (RESA) 2-Special education school
## 476  4-Regional Education Service Agency (RESA)        3-Vocational school
## 477  4-Regional Education Service Agency (RESA) 2-Special education school
## 478  4-Regional Education Service Agency (RESA)           1-Regular school
## 479  4-Regional Education Service Agency (RESA)        3-Vocational school
## 480  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 481  4-Regional Education Service Agency (RESA) 2-Special education school
## 482  4-Regional Education Service Agency (RESA)        3-Vocational school
## 483  4-Regional Education Service Agency (RESA) 2-Special education school
## 484  4-Regional Education Service Agency (RESA) 2-Special education school
## 485  4-Regional Education Service Agency (RESA)           1-Regular school
## 486  4-Regional Education Service Agency (RESA)        3-Vocational school
## 487  4-Regional Education Service Agency (RESA)        3-Vocational school
## 488  4-Regional Education Service Agency (RESA)        3-Vocational school
## 489  4-Regional Education Service Agency (RESA) 2-Special education school
## 490  4-Regional Education Service Agency (RESA)        3-Vocational school
## 491  4-Regional Education Service Agency (RESA) 2-Special education school
## 492  4-Regional Education Service Agency (RESA) 2-Special education school
## 493  4-Regional Education Service Agency (RESA) 2-Special education school
## 494  4-Regional Education Service Agency (RESA) 2-Special education school
## 495  4-Regional Education Service Agency (RESA) 2-Special education school
## 496  4-Regional Education Service Agency (RESA) 2-Special education school
## 497  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 498  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 499  4-Regional Education Service Agency (RESA)           1-Regular school
## 500  4-Regional Education Service Agency (RESA) 2-Special education school
## 501  4-Regional Education Service Agency (RESA)           1-Regular school
## 502  4-Regional Education Service Agency (RESA) 2-Special education school
## 503  4-Regional Education Service Agency (RESA) 2-Special education school
## 504  4-Regional Education Service Agency (RESA) 2-Special education school
## 505  4-Regional Education Service Agency (RESA) 2-Special education school
## 506  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 507  4-Regional Education Service Agency (RESA) 2-Special education school
## 508  4-Regional Education Service Agency (RESA)        3-Vocational school
## 509  4-Regional Education Service Agency (RESA)           1-Regular school
## 510  4-Regional Education Service Agency (RESA)        3-Vocational school
## 511  4-Regional Education Service Agency (RESA)           1-Regular school
## 512  4-Regional Education Service Agency (RESA)           1-Regular school
## 513  4-Regional Education Service Agency (RESA)        3-Vocational school
## 514  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 515  4-Regional Education Service Agency (RESA)        3-Vocational school
## 516  4-Regional Education Service Agency (RESA)        3-Vocational school
## 517  4-Regional Education Service Agency (RESA)        3-Vocational school
## 518  4-Regional Education Service Agency (RESA)           1-Regular school
## 519  4-Regional Education Service Agency (RESA)           1-Regular school
## 520  4-Regional Education Service Agency (RESA)        3-Vocational school
## 521  4-Regional Education Service Agency (RESA) 2-Special education school
## 522  4-Regional Education Service Agency (RESA)           1-Regular school
## 523  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 524  4-Regional Education Service Agency (RESA)        3-Vocational school
## 525  4-Regional Education Service Agency (RESA)        3-Vocational school
## 526  4-Regional Education Service Agency (RESA)           1-Regular school
## 527  4-Regional Education Service Agency (RESA)           1-Regular school
## 528  4-Regional Education Service Agency (RESA)           1-Regular school
## 529  4-Regional Education Service Agency (RESA)           1-Regular school
## 530  4-Regional Education Service Agency (RESA)           1-Regular school
## 531  4-Regional Education Service Agency (RESA)        3-Vocational school
## 532  4-Regional Education Service Agency (RESA) 2-Special education school
## 533  4-Regional Education Service Agency (RESA) 2-Special education school
## 534  4-Regional Education Service Agency (RESA)        3-Vocational school
## 535  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 536  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 537  4-Regional Education Service Agency (RESA)        3-Vocational school
## 538  4-Regional Education Service Agency (RESA) 2-Special education school
## 539  4-Regional Education Service Agency (RESA) 2-Special education school
## 540  4-Regional Education Service Agency (RESA) 2-Special education school
## 541  4-Regional Education Service Agency (RESA) 2-Special education school
## 542  4-Regional Education Service Agency (RESA) 2-Special education school
## 543  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 544  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 545  4-Regional Education Service Agency (RESA)        3-Vocational school
## 546  4-Regional Education Service Agency (RESA)        3-Vocational school
## 547  4-Regional Education Service Agency (RESA)        3-Vocational school
## 548  4-Regional Education Service Agency (RESA)        3-Vocational school
## 549  4-Regional Education Service Agency (RESA) 2-Special education school
## 550  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 551  4-Regional Education Service Agency (RESA)        3-Vocational school
## 552  4-Regional Education Service Agency (RESA) 2-Special education school
## 553  4-Regional Education Service Agency (RESA)        3-Vocational school
## 554  4-Regional Education Service Agency (RESA)        3-Vocational school
## 555  4-Regional Education Service Agency (RESA)        3-Vocational school
## 556  4-Regional Education Service Agency (RESA) 2-Special education school
## 557  4-Regional Education Service Agency (RESA) 2-Special education school
## 558  4-Regional Education Service Agency (RESA)        3-Vocational school
## 559  4-Regional Education Service Agency (RESA)        3-Vocational school
## 560  4-Regional Education Service Agency (RESA)        3-Vocational school
## 561  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 562  4-Regional Education Service Agency (RESA) 2-Special education school
## 563  4-Regional Education Service Agency (RESA) 2-Special education school
## 564  4-Regional Education Service Agency (RESA) 2-Special education school
## 565  4-Regional Education Service Agency (RESA) 2-Special education school
## 566  4-Regional Education Service Agency (RESA) 2-Special education school
## 567  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 568  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 569  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 570  4-Regional Education Service Agency (RESA) 2-Special education school
## 571  4-Regional Education Service Agency (RESA)        3-Vocational school
## 572  4-Regional Education Service Agency (RESA)           1-Regular school
## 573  4-Regional Education Service Agency (RESA)        3-Vocational school
## 574  4-Regional Education Service Agency (RESA) 2-Special education school
## 575  4-Regional Education Service Agency (RESA) 2-Special education school
## 576  4-Regional Education Service Agency (RESA) 2-Special education school
## 577  4-Regional Education Service Agency (RESA) 2-Special education school
## 578  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 579  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 580  4-Regional Education Service Agency (RESA) 2-Special education school
## 581  4-Regional Education Service Agency (RESA) 2-Special education school
## 582  4-Regional Education Service Agency (RESA) 2-Special education school
## 583  4-Regional Education Service Agency (RESA)        3-Vocational school
## 584  4-Regional Education Service Agency (RESA)        3-Vocational school
## 585  4-Regional Education Service Agency (RESA)        3-Vocational school
## 586  4-Regional Education Service Agency (RESA)        3-Vocational school
## 587  4-Regional Education Service Agency (RESA) 2-Special education school
## 588  4-Regional Education Service Agency (RESA)        3-Vocational school
## 589  4-Regional Education Service Agency (RESA) 2-Special education school
## 590  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 591  4-Regional Education Service Agency (RESA) 2-Special education school
## 592  4-Regional Education Service Agency (RESA) 2-Special education school
## 593  4-Regional Education Service Agency (RESA) 2-Special education school
## 594  4-Regional Education Service Agency (RESA) 2-Special education school
## 595  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 596  4-Regional Education Service Agency (RESA) 2-Special education school
## 597  4-Regional Education Service Agency (RESA)           1-Regular school
## 598  4-Regional Education Service Agency (RESA)        3-Vocational school
## 599  4-Regional Education Service Agency (RESA)        3-Vocational school
## 600  4-Regional Education Service Agency (RESA) 2-Special education school
## 601  4-Regional Education Service Agency (RESA) 2-Special education school
## 602  4-Regional Education Service Agency (RESA) 2-Special education school
## 603  4-Regional Education Service Agency (RESA) 2-Special education school
## 604  4-Regional Education Service Agency (RESA)        3-Vocational school
## 605  4-Regional Education Service Agency (RESA)        3-Vocational school
## 606  4-Regional Education Service Agency (RESA)           1-Regular school
## 607  4-Regional Education Service Agency (RESA) 2-Special education school
## 608  4-Regional Education Service Agency (RESA) 2-Special education school
## 609  4-Regional Education Service Agency (RESA)           1-Regular school
## 610  4-Regional Education Service Agency (RESA) 2-Special education school
## 611  4-Regional Education Service Agency (RESA)           1-Regular school
## 612  4-Regional Education Service Agency (RESA)        3-Vocational school
## 613  4-Regional Education Service Agency (RESA) 2-Special education school
## 614  4-Regional Education Service Agency (RESA) 2-Special education school
## 615  4-Regional Education Service Agency (RESA)        3-Vocational school
## 616  4-Regional Education Service Agency (RESA)        3-Vocational school
## 617  4-Regional Education Service Agency (RESA) 2-Special education school
## 618  4-Regional Education Service Agency (RESA)        3-Vocational school
## 619  4-Regional Education Service Agency (RESA) 2-Special education school
## 620  4-Regional Education Service Agency (RESA)        3-Vocational school
## 621  4-Regional Education Service Agency (RESA) 2-Special education school
## 622  4-Regional Education Service Agency (RESA) 2-Special education school
## 623  4-Regional Education Service Agency (RESA)        3-Vocational school
## 624  4-Regional Education Service Agency (RESA)        3-Vocational school
## 625  4-Regional Education Service Agency (RESA) 2-Special education school
## 626  4-Regional Education Service Agency (RESA)           1-Regular school
## 627  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 628  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 629  4-Regional Education Service Agency (RESA)           1-Regular school
## 630  4-Regional Education Service Agency (RESA) 2-Special education school
## 631  4-Regional Education Service Agency (RESA)        3-Vocational school
## 632  4-Regional Education Service Agency (RESA)        3-Vocational school
## 633  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 634  4-Regional Education Service Agency (RESA) 2-Special education school
## 635  4-Regional Education Service Agency (RESA) 2-Special education school
## 636  4-Regional Education Service Agency (RESA)        3-Vocational school
## 637  4-Regional Education Service Agency (RESA) 2-Special education school
## 638  4-Regional Education Service Agency (RESA)        3-Vocational school
## 639  4-Regional Education Service Agency (RESA) 2-Special education school
## 640  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 641  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 642  4-Regional Education Service Agency (RESA) 2-Special education school
## 643  4-Regional Education Service Agency (RESA)        3-Vocational school
## 644  4-Regional Education Service Agency (RESA)           1-Regular school
## 645  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 646  4-Regional Education Service Agency (RESA) 2-Special education school
## 647  4-Regional Education Service Agency (RESA) 2-Special education school
## 648  4-Regional Education Service Agency (RESA) 2-Special education school
## 649  4-Regional Education Service Agency (RESA) 2-Special education school
## 650  4-Regional Education Service Agency (RESA)        3-Vocational school
## 651  4-Regional Education Service Agency (RESA)        3-Vocational school
## 652  4-Regional Education Service Agency (RESA)        3-Vocational school
## 653  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 654  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 655  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 656  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 657  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 658  4-Regional Education Service Agency (RESA)           1-Regular school
## 659  4-Regional Education Service Agency (RESA) 2-Special education school
## 660  4-Regional Education Service Agency (RESA)        3-Vocational school
## 661  4-Regional Education Service Agency (RESA)        3-Vocational school
## 662  4-Regional Education Service Agency (RESA)        3-Vocational school
## 663  4-Regional Education Service Agency (RESA) 2-Special education school
## 664  4-Regional Education Service Agency (RESA) 2-Special education school
## 665  4-Regional Education Service Agency (RESA)        3-Vocational school
## 666  4-Regional Education Service Agency (RESA) 2-Special education school
## 667  4-Regional Education Service Agency (RESA)           1-Regular school
## 668  4-Regional Education Service Agency (RESA) 2-Special education school
## 669  4-Regional Education Service Agency (RESA)           1-Regular school
## 670  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 671  4-Regional Education Service Agency (RESA)        3-Vocational school
## 672  4-Regional Education Service Agency (RESA)           1-Regular school
## 673  4-Regional Education Service Agency (RESA) 2-Special education school
## 674  4-Regional Education Service Agency (RESA) 2-Special education school
## 675  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 676  4-Regional Education Service Agency (RESA) 2-Special education school
## 677  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 678  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 679  4-Regional Education Service Agency (RESA) 2-Special education school
## 680  4-Regional Education Service Agency (RESA) 2-Special education school
## 681  4-Regional Education Service Agency (RESA) 2-Special education school
## 682  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 683  4-Regional Education Service Agency (RESA)           1-Regular school
## 684  4-Regional Education Service Agency (RESA)           1-Regular school
## 685  4-Regional Education Service Agency (RESA) 2-Special education school
## 686  4-Regional Education Service Agency (RESA)           1-Regular school
## 687  4-Regional Education Service Agency (RESA)        3-Vocational school
## 688  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 689  4-Regional Education Service Agency (RESA) 2-Special education school
## 690  4-Regional Education Service Agency (RESA)           1-Regular school
## 691  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 692  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 693  4-Regional Education Service Agency (RESA)        3-Vocational school
## 694  4-Regional Education Service Agency (RESA) 2-Special education school
## 695  4-Regional Education Service Agency (RESA) 2-Special education school
## 696  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 697  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 698  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 699  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 700  4-Regional Education Service Agency (RESA) 2-Special education school
## 701  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 702  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 703  4-Regional Education Service Agency (RESA) 2-Special education school
## 704  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 705  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 706  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 707  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 708  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 709  4-Regional Education Service Agency (RESA) 2-Special education school
## 710  4-Regional Education Service Agency (RESA)           1-Regular school
## 711  4-Regional Education Service Agency (RESA) 2-Special education school
## 712  4-Regional Education Service Agency (RESA) 2-Special education school
## 713  4-Regional Education Service Agency (RESA)           1-Regular school
## 714  4-Regional Education Service Agency (RESA)        3-Vocational school
## 715  4-Regional Education Service Agency (RESA) 2-Special education school
## 716  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 717  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 718  4-Regional Education Service Agency (RESA)        3-Vocational school
## 719  4-Regional Education Service Agency (RESA) 2-Special education school
## 720  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 721  4-Regional Education Service Agency (RESA)        3-Vocational school
## 722  4-Regional Education Service Agency (RESA)        3-Vocational school
## 723  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 724  4-Regional Education Service Agency (RESA)        3-Vocational school
## 725  4-Regional Education Service Agency (RESA)        3-Vocational school
## 726  4-Regional Education Service Agency (RESA)        3-Vocational school
## 727  4-Regional Education Service Agency (RESA) 2-Special education school
## 728  4-Regional Education Service Agency (RESA) 2-Special education school
## 729  4-Regional Education Service Agency (RESA) 2-Special education school
## 730  4-Regional Education Service Agency (RESA)        3-Vocational school
## 731  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 732  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 733  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 734  4-Regional Education Service Agency (RESA)        3-Vocational school
## 735  4-Regional Education Service Agency (RESA)           1-Regular school
## 736  4-Regional Education Service Agency (RESA) 2-Special education school
## 737  4-Regional Education Service Agency (RESA) 2-Special education school
## 738  4-Regional Education Service Agency (RESA)        3-Vocational school
## 739  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 740  4-Regional Education Service Agency (RESA)        3-Vocational school
## 741  4-Regional Education Service Agency (RESA) 2-Special education school
## 742  4-Regional Education Service Agency (RESA)           1-Regular school
## 743  4-Regional Education Service Agency (RESA)        3-Vocational school
## 744  4-Regional Education Service Agency (RESA)        3-Vocational school
## 745  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 746  4-Regional Education Service Agency (RESA) 2-Special education school
## 747  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 748  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 749  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 750  4-Regional Education Service Agency (RESA)        3-Vocational school
## 751  4-Regional Education Service Agency (RESA) 2-Special education school
## 752  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 753  4-Regional Education Service Agency (RESA) 2-Special education school
## 754  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 755  4-Regional Education Service Agency (RESA) 2-Special education school
## 756  4-Regional Education Service Agency (RESA) 2-Special education school
## 757  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 758  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 759  4-Regional Education Service Agency (RESA) 2-Special education school
## 760  4-Regional Education Service Agency (RESA) 2-Special education school
## 761  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 762  4-Regional Education Service Agency (RESA)        3-Vocational school
## 763  4-Regional Education Service Agency (RESA)        3-Vocational school
## 764  4-Regional Education Service Agency (RESA)        3-Vocational school
## 765  4-Regional Education Service Agency (RESA)        3-Vocational school
## 766  4-Regional Education Service Agency (RESA)           1-Regular school
## 767  4-Regional Education Service Agency (RESA)        3-Vocational school
## 768  4-Regional Education Service Agency (RESA) 2-Special education school
## 769  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 770  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 771  4-Regional Education Service Agency (RESA) 2-Special education school
## 772  4-Regional Education Service Agency (RESA) 2-Special education school
## 773  4-Regional Education Service Agency (RESA) 2-Special education school
## 774  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 775  4-Regional Education Service Agency (RESA) 2-Special education school
## 776  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 777  4-Regional Education Service Agency (RESA) 2-Special education school
## 778  4-Regional Education Service Agency (RESA) 2-Special education school
## 779  4-Regional Education Service Agency (RESA) 2-Special education school
## 780  4-Regional Education Service Agency (RESA) 2-Special education school
## 781  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 782  4-Regional Education Service Agency (RESA) 2-Special education school
## 783  4-Regional Education Service Agency (RESA) 2-Special education school
## 784  4-Regional Education Service Agency (RESA)        3-Vocational school
## 785  4-Regional Education Service Agency (RESA) 2-Special education school
## 786  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 787  4-Regional Education Service Agency (RESA) 2-Special education school
## 788  4-Regional Education Service Agency (RESA) 2-Special education school
## 789  4-Regional Education Service Agency (RESA) 2-Special education school
## 790  4-Regional Education Service Agency (RESA) 2-Special education school
## 791  4-Regional Education Service Agency (RESA) 2-Special education school
## 792  4-Regional Education Service Agency (RESA) 2-Special education school
## 793  4-Regional Education Service Agency (RESA) 2-Special education school
## 794  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 795  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 796  4-Regional Education Service Agency (RESA) 2-Special education school
## 797  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 798  4-Regional Education Service Agency (RESA)        3-Vocational school
## 799  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 800  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 801  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 802  4-Regional Education Service Agency (RESA) 2-Special education school
## 803  4-Regional Education Service Agency (RESA) 2-Special education school
## 804  4-Regional Education Service Agency (RESA) 2-Special education school
## 805  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 806  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 807  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 808  4-Regional Education Service Agency (RESA) 2-Special education school
## 809  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 810  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 811  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 812  4-Regional Education Service Agency (RESA) 2-Special education school
## 813  4-Regional Education Service Agency (RESA) 2-Special education school
## 814  4-Regional Education Service Agency (RESA)        3-Vocational school
## 815  4-Regional Education Service Agency (RESA)        3-Vocational school
## 816  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 817  4-Regional Education Service Agency (RESA) 2-Special education school
## 818  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 819  4-Regional Education Service Agency (RESA) 2-Special education school
## 820  4-Regional Education Service Agency (RESA) 2-Special education school
## 821  4-Regional Education Service Agency (RESA) 2-Special education school
## 822  4-Regional Education Service Agency (RESA)        3-Vocational school
## 823  4-Regional Education Service Agency (RESA) 2-Special education school
## 824  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 825  4-Regional Education Service Agency (RESA)           1-Regular school
## 826  4-Regional Education Service Agency (RESA) 2-Special education school
## 827  4-Regional Education Service Agency (RESA)        3-Vocational school
## 828  4-Regional Education Service Agency (RESA) 2-Special education school
## 829  4-Regional Education Service Agency (RESA) 2-Special education school
## 830  4-Regional Education Service Agency (RESA)        3-Vocational school
## 831  4-Regional Education Service Agency (RESA) 2-Special education school
## 832  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 833  4-Regional Education Service Agency (RESA) 2-Special education school
## 834  4-Regional Education Service Agency (RESA)        3-Vocational school
## 835  4-Regional Education Service Agency (RESA)        3-Vocational school
## 836  4-Regional Education Service Agency (RESA)           1-Regular school
## 837  4-Regional Education Service Agency (RESA)           1-Regular school
## 838  4-Regional Education Service Agency (RESA)        3-Vocational school
## 839  4-Regional Education Service Agency (RESA) 2-Special education school
## 840  4-Regional Education Service Agency (RESA) 2-Special education school
## 841  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 842  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 843  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 844  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 845  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 846  4-Regional Education Service Agency (RESA) 2-Special education school
## 847  4-Regional Education Service Agency (RESA) 2-Special education school
## 848  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 849  4-Regional Education Service Agency (RESA) 2-Special education school
## 850  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 851  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 852  4-Regional Education Service Agency (RESA) 2-Special education school
## 853  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 854  4-Regional Education Service Agency (RESA)           1-Regular school
## 855  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 856  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 857  4-Regional Education Service Agency (RESA)        3-Vocational school
## 858  4-Regional Education Service Agency (RESA) 2-Special education school
## 859  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 860  4-Regional Education Service Agency (RESA) 2-Special education school
## 861  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 862  4-Regional Education Service Agency (RESA)           1-Regular school
## 863  4-Regional Education Service Agency (RESA) 2-Special education school
## 864  4-Regional Education Service Agency (RESA)           1-Regular school
## 865  4-Regional Education Service Agency (RESA) 2-Special education school
## 866  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 867  4-Regional Education Service Agency (RESA)        3-Vocational school
## 868  4-Regional Education Service Agency (RESA)        3-Vocational school
## 869  4-Regional Education Service Agency (RESA) 2-Special education school
## 870  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 871  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 872  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 873  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 874  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 875  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 876  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 877  4-Regional Education Service Agency (RESA) 2-Special education school
## 878  4-Regional Education Service Agency (RESA) 2-Special education school
## 879  4-Regional Education Service Agency (RESA)        3-Vocational school
## 880  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 881  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 882  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 883  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 884  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 885  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 886  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 887  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 888  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 889  4-Regional Education Service Agency (RESA)           1-Regular school
## 890  4-Regional Education Service Agency (RESA)        3-Vocational school
## 891  4-Regional Education Service Agency (RESA)        3-Vocational school
## 892  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 893  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 894  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 895  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 896  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 897  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 898  4-Regional Education Service Agency (RESA)        3-Vocational school
## 899  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 900  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 901  4-Regional Education Service Agency (RESA)           1-Regular school
## 902  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 903  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 904  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 905  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 906  4-Regional Education Service Agency (RESA) 2-Special education school
## 907  4-Regional Education Service Agency (RESA)           1-Regular school
## 908  4-Regional Education Service Agency (RESA) 2-Special education school
## 909  4-Regional Education Service Agency (RESA)           1-Regular school
## 910  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 911  4-Regional Education Service Agency (RESA) 2-Special education school
## 912  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 913  4-Regional Education Service Agency (RESA)        3-Vocational school
## 914  4-Regional Education Service Agency (RESA)           1-Regular school
## 915  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 916  4-Regional Education Service Agency (RESA)           1-Regular school
## 917  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 918  4-Regional Education Service Agency (RESA) 2-Special education school
## 919  4-Regional Education Service Agency (RESA) 2-Special education school
## 920  4-Regional Education Service Agency (RESA)           1-Regular school
## 921  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 922  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 923  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 924  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 925  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 926  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 927  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 928  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 929  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 930  4-Regional Education Service Agency (RESA) 2-Special education school
## 931  4-Regional Education Service Agency (RESA) 2-Special education school
## 932  4-Regional Education Service Agency (RESA)           1-Regular school
## 933  4-Regional Education Service Agency (RESA)        3-Vocational school
## 934  4-Regional Education Service Agency (RESA)        3-Vocational school
## 935  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 936  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 937  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 938  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 939  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 940  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 941  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 942  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 943  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 944  4-Regional Education Service Agency (RESA) 2-Special education school
## 945  4-Regional Education Service Agency (RESA) 2-Special education school
## 946  4-Regional Education Service Agency (RESA) 2-Special education school
## 947  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 948  4-Regional Education Service Agency (RESA) 2-Special education school
## 949  4-Regional Education Service Agency (RESA)        3-Vocational school
## 950  4-Regional Education Service Agency (RESA) 2-Special education school
## 951  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 952  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 953  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 954  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 955  4-Regional Education Service Agency (RESA) 2-Special education school
## 956  4-Regional Education Service Agency (RESA) 2-Special education school
## 957  4-Regional Education Service Agency (RESA) 2-Special education school
## 958  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 959  4-Regional Education Service Agency (RESA) 2-Special education school
## 960  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 961  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 962  4-Regional Education Service Agency (RESA)        3-Vocational school
## 963  4-Regional Education Service Agency (RESA)        3-Vocational school
## 964  4-Regional Education Service Agency (RESA)        3-Vocational school
## 965  4-Regional Education Service Agency (RESA)        3-Vocational school
## 966  4-Regional Education Service Agency (RESA)        3-Vocational school
## 967  4-Regional Education Service Agency (RESA)        3-Vocational school
## 968  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 969  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 970  4-Regional Education Service Agency (RESA)        3-Vocational school
## 971  4-Regional Education Service Agency (RESA) 2-Special education school
## 972  4-Regional Education Service Agency (RESA)        3-Vocational school
## 973  4-Regional Education Service Agency (RESA)        3-Vocational school
## 974  4-Regional Education Service Agency (RESA)        3-Vocational school
## 975  4-Regional Education Service Agency (RESA)        3-Vocational school
## 976  4-Regional Education Service Agency (RESA) 2-Special education school
## 977  4-Regional Education Service Agency (RESA)        3-Vocational school
## 978  4-Regional Education Service Agency (RESA) 2-Special education school
## 979  4-Regional Education Service Agency (RESA) 2-Special education school
## 980  4-Regional Education Service Agency (RESA)        3-Vocational school
## 981  4-Regional Education Service Agency (RESA)        3-Vocational school
## 982  4-Regional Education Service Agency (RESA)        3-Vocational school
## 983  4-Regional Education Service Agency (RESA) 2-Special education school
## 984  4-Regional Education Service Agency (RESA) 2-Special education school
## 985  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 986  4-Regional Education Service Agency (RESA) 2-Special education school
## 987  4-Regional Education Service Agency (RESA) 2-Special education school
## 988  4-Regional Education Service Agency (RESA)        3-Vocational school
## 989  4-Regional Education Service Agency (RESA)        3-Vocational school
## 990  4-Regional Education Service Agency (RESA) 2-Special education school
## 991  4-Regional Education Service Agency (RESA)        3-Vocational school
## 992  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 993  4-Regional Education Service Agency (RESA) 2-Special education school
## 994  4-Regional Education Service Agency (RESA)           1-Regular school
## 995  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 996  4-Regional Education Service Agency (RESA)        3-Vocational school
## 997  4-Regional Education Service Agency (RESA) 2-Special education school
## 998  4-Regional Education Service Agency (RESA) 2-Special education school
## 999  4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1000 4-Regional Education Service Agency (RESA)           1-Regular school
## 1001 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1002 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1003 4-Regional Education Service Agency (RESA)           1-Regular school
## 1004 4-Regional Education Service Agency (RESA)           1-Regular school
## 1005 4-Regional Education Service Agency (RESA) 2-Special education school
## 1006 4-Regional Education Service Agency (RESA) 2-Special education school
## 1007 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1008 4-Regional Education Service Agency (RESA)           1-Regular school
## 1009 4-Regional Education Service Agency (RESA) 2-Special education school
## 1010 4-Regional Education Service Agency (RESA) 2-Special education school
## 1011 4-Regional Education Service Agency (RESA)           1-Regular school
## 1012 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1013 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1014 4-Regional Education Service Agency (RESA) 2-Special education school
## 1015 4-Regional Education Service Agency (RESA) 2-Special education school
## 1016 4-Regional Education Service Agency (RESA) 2-Special education school
## 1017 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1018 4-Regional Education Service Agency (RESA) 2-Special education school
## 1019 4-Regional Education Service Agency (RESA) 2-Special education school
## 1020 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1021 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1022 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1023 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1024 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1025 4-Regional Education Service Agency (RESA) 2-Special education school
## 1026 4-Regional Education Service Agency (RESA) 2-Special education school
## 1027 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1028 4-Regional Education Service Agency (RESA) 2-Special education school
## 1029 4-Regional Education Service Agency (RESA)           1-Regular school
## 1030 4-Regional Education Service Agency (RESA) 2-Special education school
## 1031 4-Regional Education Service Agency (RESA) 2-Special education school
## 1032 4-Regional Education Service Agency (RESA) 2-Special education school
## 1033 4-Regional Education Service Agency (RESA) 2-Special education school
## 1034 4-Regional Education Service Agency (RESA) 2-Special education school
## 1035 4-Regional Education Service Agency (RESA) 2-Special education school
## 1036 4-Regional Education Service Agency (RESA) 2-Special education school
## 1037 4-Regional Education Service Agency (RESA)           1-Regular school
## 1038 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1039 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1040 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1041 4-Regional Education Service Agency (RESA) 2-Special education school
## 1042 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1043 4-Regional Education Service Agency (RESA) 2-Special education school
## 1044 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1045 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1046 4-Regional Education Service Agency (RESA) 2-Special education school
## 1047 4-Regional Education Service Agency (RESA)           1-Regular school
## 1048 4-Regional Education Service Agency (RESA) 2-Special education school
## 1049 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1050 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1051 4-Regional Education Service Agency (RESA) 2-Special education school
## 1052 4-Regional Education Service Agency (RESA) 2-Special education school
## 1053 4-Regional Education Service Agency (RESA) 2-Special education school
## 1054 4-Regional Education Service Agency (RESA) 2-Special education school
## 1055 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1056 4-Regional Education Service Agency (RESA) 2-Special education school
## 1057 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1058 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1059 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1060 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1061 4-Regional Education Service Agency (RESA) 2-Special education school
## 1062 4-Regional Education Service Agency (RESA) 2-Special education school
## 1063 4-Regional Education Service Agency (RESA) 2-Special education school
## 1064 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1065 4-Regional Education Service Agency (RESA) 2-Special education school
## 1066 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1067 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1068 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1069 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1070 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1071 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1072 4-Regional Education Service Agency (RESA) 2-Special education school
## 1073 4-Regional Education Service Agency (RESA)           1-Regular school
## 1074 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1075 4-Regional Education Service Agency (RESA) 2-Special education school
## 1076 4-Regional Education Service Agency (RESA) 2-Special education school
## 1077 4-Regional Education Service Agency (RESA) 2-Special education school
## 1078 4-Regional Education Service Agency (RESA) 2-Special education school
## 1079 4-Regional Education Service Agency (RESA) 2-Special education school
## 1080 4-Regional Education Service Agency (RESA) 2-Special education school
## 1081 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1082 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1083 4-Regional Education Service Agency (RESA) 2-Special education school
## 1084 4-Regional Education Service Agency (RESA) 2-Special education school
## 1085 4-Regional Education Service Agency (RESA) 2-Special education school
## 1086 4-Regional Education Service Agency (RESA) 2-Special education school
## 1087 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1088 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1089 4-Regional Education Service Agency (RESA) 2-Special education school
## 1090 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1091 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1092 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1093 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1094 4-Regional Education Service Agency (RESA) 2-Special education school
## 1095 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1096 4-Regional Education Service Agency (RESA)           1-Regular school
## 1097 4-Regional Education Service Agency (RESA)           1-Regular school
## 1098 4-Regional Education Service Agency (RESA)           1-Regular school
## 1099 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1100 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1101 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1102 4-Regional Education Service Agency (RESA)           1-Regular school
## 1103 4-Regional Education Service Agency (RESA) 2-Special education school
## 1104 4-Regional Education Service Agency (RESA)           1-Regular school
## 1105 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1106 4-Regional Education Service Agency (RESA) 2-Special education school
## 1107 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1108 4-Regional Education Service Agency (RESA) 2-Special education school
## 1109 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1110 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1111 4-Regional Education Service Agency (RESA) 2-Special education school
## 1112 4-Regional Education Service Agency (RESA) 2-Special education school
## 1113 4-Regional Education Service Agency (RESA) 2-Special education school
## 1114 4-Regional Education Service Agency (RESA) 2-Special education school
## 1115 4-Regional Education Service Agency (RESA) 2-Special education school
## 1116 4-Regional Education Service Agency (RESA) 2-Special education school
## 1117 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1118 4-Regional Education Service Agency (RESA) 2-Special education school
## 1119 4-Regional Education Service Agency (RESA) 2-Special education school
## 1120 4-Regional Education Service Agency (RESA) 2-Special education school
## 1121 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1122 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1123 4-Regional Education Service Agency (RESA) 2-Special education school
## 1124 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1125 4-Regional Education Service Agency (RESA) 2-Special education school
## 1126 4-Regional Education Service Agency (RESA) 2-Special education school
## 1127 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1128 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1129 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1130 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1131 4-Regional Education Service Agency (RESA) 2-Special education school
## 1132 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1133 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1134 4-Regional Education Service Agency (RESA)           1-Regular school
## 1135 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1136 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1137 4-Regional Education Service Agency (RESA) 2-Special education school
## 1138 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1139 4-Regional Education Service Agency (RESA)           1-Regular school
## 1140 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1141 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1142 4-Regional Education Service Agency (RESA) 2-Special education school
## 1143 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1144 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1145 4-Regional Education Service Agency (RESA)           1-Regular school
## 1146 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1147 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1148 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1149 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1150 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1151 4-Regional Education Service Agency (RESA) 2-Special education school
## 1152 4-Regional Education Service Agency (RESA) 2-Special education school
## 1153 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1154 4-Regional Education Service Agency (RESA) 2-Special education school
## 1155 4-Regional Education Service Agency (RESA) 2-Special education school
## 1156 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1157 4-Regional Education Service Agency (RESA) 2-Special education school
## 1158 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1159 4-Regional Education Service Agency (RESA)           1-Regular school
## 1160 4-Regional Education Service Agency (RESA) 2-Special education school
## 1161 4-Regional Education Service Agency (RESA) 2-Special education school
## 1162 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1163 4-Regional Education Service Agency (RESA) 2-Special education school
## 1164 4-Regional Education Service Agency (RESA) 2-Special education school
## 1165 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1166 4-Regional Education Service Agency (RESA) 2-Special education school
## 1167 4-Regional Education Service Agency (RESA)           1-Regular school
## 1168 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1169 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1170 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1171 4-Regional Education Service Agency (RESA) 2-Special education school
## 1172 4-Regional Education Service Agency (RESA)           1-Regular school
## 1173 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1174 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1175 4-Regional Education Service Agency (RESA) 2-Special education school
## 1176 4-Regional Education Service Agency (RESA)           1-Regular school
## 1177 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1178 4-Regional Education Service Agency (RESA)           1-Regular school
## 1179 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1180 4-Regional Education Service Agency (RESA) 2-Special education school
## 1181 4-Regional Education Service Agency (RESA)           1-Regular school
## 1182 4-Regional Education Service Agency (RESA) 2-Special education school
## 1183 4-Regional Education Service Agency (RESA) 2-Special education school
## 1184 4-Regional Education Service Agency (RESA) 2-Special education school
## 1185 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1186 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1187 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1188 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1189 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1190 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1191 4-Regional Education Service Agency (RESA) 2-Special education school
## 1192 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1193 4-Regional Education Service Agency (RESA) 2-Special education school
## 1194 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1195 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1196 4-Regional Education Service Agency (RESA) 2-Special education school
## 1197 4-Regional Education Service Agency (RESA) 2-Special education school
## 1198 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1199 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1200 4-Regional Education Service Agency (RESA) 2-Special education school
## 1201 4-Regional Education Service Agency (RESA) 2-Special education school
## 1202 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1203 4-Regional Education Service Agency (RESA) 2-Special education school
## 1204 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1205 4-Regional Education Service Agency (RESA)           1-Regular school
## 1206 4-Regional Education Service Agency (RESA) 2-Special education school
## 1207 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1208 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1209 4-Regional Education Service Agency (RESA) 2-Special education school
## 1210 4-Regional Education Service Agency (RESA)           1-Regular school
## 1211 4-Regional Education Service Agency (RESA) 2-Special education school
## 1212 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1213 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1214 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1215 4-Regional Education Service Agency (RESA) 2-Special education school
## 1216 4-Regional Education Service Agency (RESA) 2-Special education school
## 1217 4-Regional Education Service Agency (RESA) 2-Special education school
## 1218 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1219 4-Regional Education Service Agency (RESA) 2-Special education school
## 1220 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1221 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1222 4-Regional Education Service Agency (RESA) 2-Special education school
## 1223 4-Regional Education Service Agency (RESA)           1-Regular school
## 1224 4-Regional Education Service Agency (RESA) 2-Special education school
## 1225 4-Regional Education Service Agency (RESA) 2-Special education school
## 1226 4-Regional Education Service Agency (RESA) 2-Special education school
## 1227 4-Regional Education Service Agency (RESA) 2-Special education school
## 1228 4-Regional Education Service Agency (RESA) 2-Special education school
## 1229 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1230 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1231 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1232 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1233 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1234 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1235 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1236 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1237 4-Regional Education Service Agency (RESA) 2-Special education school
## 1238 4-Regional Education Service Agency (RESA) 2-Special education school
## 1239 4-Regional Education Service Agency (RESA) 2-Special education school
## 1240 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1241 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1242 4-Regional Education Service Agency (RESA)        3-Vocational school
## 1243 4-Regional Education Service Agency (RESA) 4-Alternative/other school
## 1244 4-Regional Education Service Agency (RESA) 2-Special education school
## 1245 4-Regional Education Service Agency (RESA) 2-Special education school
## 1246 4-Regional Education Service Agency (RESA) 4-Alternative/other school
##      Members Male Female FTE.Equivalent Pupil.Teacher.Ratio
## 1          0    0      0              1                   0
## 2          5    3      2           0.07               71.43
## 3          0    0      0              0                 n/a
## 4          1    0      1           0.26                3.85
## 5          0    0      0              0                 n/a
## 6          0    0      0              0                 n/a
## 7          0    0      0              0                 n/a
## 8          0    0      0              0                 n/a
## 9          0    0      0              0                 n/a
## 10         0    0      0              0                 n/a
## 11        20   10     10            0.6               33.33
## 12         0    0      0              0                 n/a
## 13         0    0      0              0                 n/a
## 14         0    0      0              0                 n/a
## 15         0    0      0              0                 n/a
## 16         0    0      0              0                 n/a
## 17         0    0      0              0                 n/a
## 18         0    0      0              0                 n/a
## 19        67   39     28           5.57               12.03
## 20        28   19      9            6.7                4.18
## 21        49   43      6          10.56                4.64
## 22        38   31      7            7.3                5.21
## 23       102   80     22           21.7                 4.7
## 24        60   41     19           8.04                7.46
## 25        78   59     19             48                1.63
## 26         0    0      0             30                   0
## 27       n/a  n/a    n/a           <NA>                 n/a
## 28         7    3      4            1.3                5.38
## 29        64   54     10              7                9.14
## 30        24   18      6            3.7                6.49
## 31        24   20      4              3                   8
## 32        97   79     18             13                7.46
## 33       773  543    230          66.62                11.6
## 34       434  231    203             27               16.07
## 35       776  310    466             74               10.49
## 36         0    0      0              3                   0
## 37        48   25     23              6                   8
## 38         0    0      0             17                   0
## 39        64   41     23              1                  64
## 40       445  324    121           5.99               74.29
## 41         0    0      0              0                 n/a
## 42         0    0      0              0                 n/a
## 43         0    0      0              0                 n/a
## 44         0    0      0              0                 n/a
## 45         0    0      0              0                 n/a
## 46         0    0      0              0                 n/a
## 47         0    0      0              0                 n/a
## 48         0    0      0           0.14                   0
## 49         0    0      0           0.18                   0
## 50         0    0      0              0                 n/a
## 51         0    0      0              0                 n/a
## 52       n/a  n/a    n/a              0                 n/a
## 53        41   35      6             15                2.73
## 54         0    0      0             19                   0
## 55         5    4      1           0.33               15.15
## 56      <NA>  n/a    n/a           <NA>                 n/a
## 57        40   27     13          13.92                2.87
## 58       n/a  n/a    n/a           <NA>                 n/a
## 59         0    0      0           <NA>                 n/a
## 60       n/a  n/a    n/a           <NA>                 n/a
## 61       483  201    282          35.62               13.56
## 62         0    0      0           <NA>                 n/a
## 63         5    2      3           0.59                8.47
## 64         0    0      0          55.14                   0
## 65       n/a  n/a    n/a           <NA>                 n/a
## 66        23   17      6              8                2.88
## 67        11    6      5            0.5                  22
## 68         7    4      3           2.12                 3.3
## 69         0    0      0              0                 n/a
## 70        12    7      5           1.42                8.45
## 71       117   27     90          15.16                7.72
## 72        13    8      5              2                 6.5
## 73       200   93    107           15.1               13.25
## 74         0    0      0             34                   0
## 75         0    0      0             51                   0
## 76        32   20     12              4                   8
## 77         0    0      0              0                 n/a
## 78         0    0      0              0                 n/a
## 79         9    9    n/a              1                   9
## 80        34   22     12              3               11.33
## 81         0    0      0           0.72                   0
## 82         0    0      0              0                 n/a
## 83         0    0      0              0                 n/a
## 84         0    0      0            7.6                   0
## 85         0    0      0           <NA>                 n/a
## 86         0    0      0             12                   0
## 87        30   20     10              8                3.75
## 88         0    0      0              0                 n/a
## 89         8    7      1              2                   4
## 90         0    0      0             16                   0
## 91         0    0      0             21                   0
## 92         0    0      0              8                   0
## 93        54   45      9             10                 5.4
## 94         0    0      0              3                   0
## 95        72   54     18          12.88                5.59
## 96         0    0      0           33.5                   0
## 97        23   13     10           <NA>                 n/a
## 98        12    9      3           <NA>                 n/a
## 99        62   38     24           <NA>                 n/a
## 100       34   29      5          20.43                1.66
## 101        5    4      1           <NA>                 n/a
## 102        0    0      0             29                   0
## 103        0    0      0           26.5                   0
## 104       24   23      1              3                   8
## 105      115   74     41             39                2.95
## 106        0    0      0             33                   0
## 107        3    3    n/a            1.2                 2.5
## 108      n/a  n/a    n/a          15.33                 n/a
## 109      n/a  n/a    n/a              2                 n/a
## 110      n/a  n/a    n/a            5.3                 n/a
## 111        8    7      1              0                 n/a
## 112      144   93     51          24.12                5.97
## 113        1    1      0           0.25                   4
## 114        4    3      1           0.02                 200
## 115      160   95     65             24                6.67
## 116      n/a  n/a    n/a           <NA>                 n/a
## 117     <NA>  n/a    n/a           <NA>                 n/a
## 118      n/a  n/a    n/a          13.03                 n/a
## 119      334  267     67             72                4.64
## 120        0    0      0             21                   0
## 121      115   92     23           19.5                 5.9
## 122      n/a  n/a    n/a           <NA>                 n/a
## 123        0    0      0              1                   0
## 124       69   60      9          12.12                5.69
## 125      n/a  n/a    n/a           <NA>                 n/a
## 126      n/a  n/a    n/a           <NA>                 n/a
## 127        0    0      0             18                   0
## 128       35   24     11             11                3.18
## 129      971  695    276             24               40.46
## 130       11    9      2            4.5                2.44
## 131        0    0      0              0                 n/a
## 132        0    0      0              0                 n/a
## 133        0    0      0           49.3                   0
## 134     1396  767    629          113.5                12.3
## 135        0    0      0             22                   0
## 136      n/a  n/a    n/a              0                 n/a
## 137        0    0      0          21.15                   0
## 138      n/a  n/a    n/a           <NA>                 n/a
## 139        0    0      0              0                 n/a
## 140        0    0      0              0                 n/a
## 141        0    0      0              0                 n/a
## 142        0    0      0           <NA>                 n/a
## 143        0    0      0           <NA>                 n/a
## 144        0    0      0          16.66                   0
## 145       24   18      6              3                   8
## 146        0    0      0              0                 n/a
## 147        0    0      0              0                 n/a
## 148      406  242    164             31                13.1
## 149       13   10      3           <NA>                 n/a
## 150       60   54      6           13.4                4.48
## 151        0    0      0          15.76                   0
## 152        0    0      0           1.67                   0
## 153        0    0      0            4.1                   0
## 154        0    0      0           28.2                   0
## 155        0    0      0          35.05                   0
## 156        0    0      0           <NA>                 n/a
## 157        0    0      0             25                   0
## 158        0    0      0             31                   0
## 159        0    0      0              0                 n/a
## 160      n/a  n/a    n/a           <NA>                 n/a
## 161      n/a  n/a    n/a              0                 n/a
## 162      503  372    131          66.74                7.54
## 163      341  251     90             19               17.95
## 164       63   40     23           <NA>                 n/a
## 165        0    0      0          78.68                   0
## 166       54   40     14              7                7.71
## 167        0    0      0              1                   0
## 168        0    0      0              2                   0
## 169        0    0      0              0                 n/a
## 170        0    0      0              0                 n/a
## 171        0    0      0              0                 n/a
## 172        0    0      0              0                 n/a
## 173        2    1      1           <NA>                 n/a
## 174        0    0      0              0                 n/a
## 175       17    4     13           <NA>                 n/a
## 176        0    0      0             22                   0
## 177        0    0      0           <NA>                 n/a
## 178        0    0      0           <NA>                 n/a
## 179        0    0      0           15.6                   0
## 180        0    0      0           <NA>                 n/a
## 181      n/a  n/a    n/a           <NA>                 n/a
## 182        0    0      0             34                   0
## 183       49   33     16              3               16.33
## 184       33   25      8              7                4.71
## 185       40   19     21           1.95               20.51
## 186       82   69     13             21                 3.9
## 187       42   31     11           10.1                4.16
## 188      n/a  n/a    n/a           15.8                 n/a
## 189     1100  564    536           78.9               13.94
## 190      933  456    477             69               13.52
## 191      266  138    128           19.4               13.71
## 192      n/a  n/a    n/a           <NA>                 n/a
## 193      n/a  n/a    n/a           <NA>                 n/a
## 194        0    0      0          33.83                   0
## 195        0    0      0          26.34                   0
## 196        0    0      0          28.33                   0
## 197      n/a  n/a    n/a              1                 n/a
## 198      n/a  n/a    n/a            n/a                 n/a
## 199       23   17      6           <NA>                 n/a
## 200       81   78      3          23.27                3.48
## 201       53   46      7            9.3                 5.7
## 202       10    8      2              0                 n/a
## 203       64   39     25              8                   8
## 204        0    0      0             11                   0
## 205       16   12      4              1                  16
## 206        0    0      0             17                   0
## 207       62   39     23           10.1                6.14
## 208      186  140     46           8.02               23.19
## 209     <NA>  n/a    n/a             11                 n/a
## 210        0    0      0           <NA>                 n/a
## 211      n/a  n/a    n/a           <NA>                 n/a
## 212      360  175    185          24.04               14.98
## 213        0    0      0           <NA>                 n/a
## 214      645  357    288          45.42                14.2
## 215        0    0      0             23                   0
## 216      n/a  n/a    n/a           <NA>                 n/a
## 217        0    0      0              3                   0
## 218        0    0      0              0                 n/a
## 219        0    0      0             21                   0
## 220        0    0      0              0                 n/a
## 221        0    0      0              0                 n/a
## 222       70   49     21             12                5.83
## 223        0    0      0           <NA>                 n/a
## 224      486  241    245           40.8               11.91
## 225     <NA>  n/a    n/a           <NA>                 n/a
## 226      562  351    211          23.58               23.83
## 227        0    0      0           <NA>                 n/a
## 228        4    2      2           <NA>                 n/a
## 229        0    0      0           1.95                   0
## 230        0    0      0              0                 n/a
## 231       63   44     19              5                12.6
## 232       90   59     31           28.6                3.15
## 233        7    6      1            1.9                3.68
## 234        0    0      0              9                   0
## 235       84   54     30              7                  12
## 236       28   22      6              4                   7
## 237        0    0      0             20                   0
## 238      116   73     43          10.66               10.88
## 239        4    4    n/a           <NA>                 n/a
## 240       28   16     12              2                  14
## 241        0    0      0             19                   0
## 242      n/a  n/a    n/a           <NA>                 n/a
## 243        0    0      0           25.5                   0
## 244        0    0      0             32                   0
## 245        5    5    n/a           1.11                 4.5
## 246        0    0      0             39                   0
## 247       27   15     12           3.68                7.34
## 248      128   91     37          23.25                5.51
## 249        0    0      0            202                   0
## 250      194  116     78          15.54               12.48
## 251        0    0      0           19.5                   0
## 252     1068  557    511          80.39               13.29
## 253       41   26     15          19.34                2.12
## 254       45   27     18             13                3.46
## 255        0    0      0              0                 n/a
## 256        0    0      0           <NA>                 n/a
## 257        0    0      0             24                   0
## 258        0    0      0             12                   0
## 259        0    0      0             19                   0
## 260        0    0      0             15                   0
## 261        0    0      0              1                   0
## 262      315  237     78          12.99               24.25
## 263        0    0      0            9.3                   0
## 264        0    0      0           2.75                   0
## 265        0    0      0              0                 n/a
## 266        9    4      5              1                   9
## 267       90   61     29          14.58                6.17
## 268       38   33      5           1.75               21.71
## 269      159  112     47           28.5                5.58
## 270        0    0      0             40                   0
## 271        0    0      0            9.5                   0
## 272      n/a  n/a    n/a              0                 n/a
## 273       53   33     20           8.65                6.13
## 274        0    0      0             10                   0
## 275        0    0      0             10                   0
## 276       13    5      8              2                 6.5
## 277      518  280    238             32               16.19
## 278        0    0      0          37.44                   0
## 279        0    0      0             24                   0
## 280      262  172     90          40.72                6.43
## 281      n/a  n/a    n/a           3.06                 n/a
## 282      140   75     65           <NA>                 n/a
## 283      150   74     76           12.1                12.4
## 284        5    3      2              1                   5
## 285      409  287    122          26.01               15.72
## 286      111   80     31          10.09                  11
## 287        0    0      0              3                   0
## 288        0    0      0              0                 n/a
## 289       65   41     24              1                  65
## 290      428  152    276             11               38.91
## 291       90   25     65            3.4               26.47
## 292        0    0      0              3                   0
## 293        0    0      0              4                   0
## 294        0    0      0              4                   0
## 295        0    0      0              0                 n/a
## 296       12    8      4           <NA>                 n/a
## 297      n/a  n/a    n/a           9.51                 n/a
## 298        0    0      0              0                 n/a
## 299        0    0      0           <NA>                 n/a
## 300      119   69     50           6.84                17.4
## 301        0    0      0             16                   0
## 302        0    0      0            2.4                   0
## 303     1622 1168    454          78.05               20.78
## 304        0    0      0             18                   0
## 305        5    4      1              2                 2.5
## 306        0    0      0             36                   0
## 307       98   51     47           7.91               12.39
## 308        0    0      0              5                   0
## 309        0    0      0              0                 n/a
## 310       51   29     22              6                 8.5
## 311       30   25      5              7                4.29
## 312        0    0      0              0                 n/a
## 313        0    0      0              7                   0
## 314        0    0      0              6                   0
## 315        0    0      0              0                 n/a
## 316       23   23    n/a           2.42                 9.5
## 317      205  139     66             17               12.06
## 318       41   26     15            8.2                   5
## 319        0    0      0           <NA>                 n/a
## 320        0    0      0           0.08                   0
## 321       36   22     14              2                  18
## 322        5    4      1              1                   5
## 323      n/a  n/a    n/a              1                 n/a
## 324        0    0      0             11                   0
## 325        0    0      0              0                 n/a
## 326        0    0      0              0                 n/a
## 327        4    4      0           1.03                3.88
## 328      400  287    113             39               10.26
## 329      n/a  n/a    n/a           1.25                 n/a
## 330      n/a  n/a    n/a            n/a                 n/a
## 331        8    6      2           <NA>                 n/a
## 332        8    5      3           <NA>                 n/a
## 333      n/a  n/a    n/a           <NA>                 n/a
## 334       23   17      6           8.23                2.79
## 335      509  366    143          77.59                6.56
## 336      638  492    146          35.49               17.98
## 337        0    0      0           24.5                   0
## 338        0    0      0              0                 n/a
## 339      110   65     45           1.75               62.86
## 340        0    0      0           1.54                   0
## 341        0    0      0            2.5                   0
## 342        0    0      0           1.99                   0
## 343       50   36     14              6                8.33
## 344       19   19    n/a           <NA>                 n/a
## 345       54   43     11            8.5                6.35
## 346      258  138    120          23.02               11.21
## 347      520  277    243           46.8               11.11
## 348        9    8      1              3                   3
## 349        0    0      0              9                   0
## 350        0    0      0          33.56                   0
## 351      n/a  n/a    n/a              0                 n/a
## 352        0    0      0           22.5                   0
## 353       70   50     20           <NA>                 n/a
## 354        9    8      1           <NA>                 n/a
## 355        6    5      1           <NA>                 n/a
## 356       17   13      4           <NA>                 n/a
## 357        8    6      2           <NA>                 n/a
## 358     <NA>  n/a    n/a           <NA>                 n/a
## 359        7    3      4           <NA>                 n/a
## 360        9    8      1           <NA>                 n/a
## 361       27   23      4           6.05                4.46
## 362       12    8      4              1                  12
## 363        0    0      0             30                   0
## 364       20   16      4              8                 2.5
## 365      n/a  n/a    n/a            2.5                 n/a
## 366        0    0      0           <NA>                 n/a
## 367        0    0      0             83                   0
## 368        0    0      0             28                   0
## 369       32   18     14          13.55                2.36
## 370        2    1      1              1                   2
## 371      118   76     42              9               13.11
## 372       45   15     30            5.5                8.18
## 373       56   50      6              8                   7
## 374      117   63     54            9.8               11.94
## 375        0    0      0           <NA>                 n/a
## 376      n/a  n/a    n/a             11                 n/a
## 377        0    0      0              5                   0
## 378       93   56     37              7               13.29
## 379        0    0      0             17                   0
## 380      157  139     18          26.85                5.85
## 381      n/a  n/a    n/a              0                 n/a
## 382        0    0      0             32                   0
## 383       44   32     12             16                2.75
## 384      230  159     71           4.23               54.37
## 385        0    0      0              1                   0
## 386      128   87     41             44                2.91
## 387        9    7      2           1.39                6.47
## 388      457  256    201           32.6               14.02
## 389      300  177    123           36.1                8.31
## 390        0    0      0           <NA>                 n/a
## 391       40   25     15              6                6.67
## 392        0    0      0              0                 n/a
## 393      n/a  n/a    n/a           <NA>                 n/a
## 394      n/a  n/a    n/a           <NA>                 n/a
## 395        7    6      1           6.63                1.06
## 396      n/a  n/a    n/a              0                 n/a
## 397      n/a  n/a    n/a              0                 n/a
## 398      n/a  n/a    n/a              0                 n/a
## 399      391  215    176              0                 n/a
## 400      194   65    129              4                48.5
## 401      n/a  n/a    n/a           0.14                 n/a
## 402        0    0      0              0                 n/a
## 403        0    0      0              0                 n/a
## 404        0    0      0              7                   0
## 405        0    0      0           31.6                   0
## 406      446  133    313          22.65               19.69
## 407      339   96    243             30                11.3
## 408        0    0      0             12                   0
## 409      n/a  n/a    n/a           <NA>                 n/a
## 410       25   14     11           <NA>                 n/a
## 411        0    0      0             37                   0
## 412        0    0      0          14.25                   0
## 413        0    0      0           <NA>                 n/a
## 414       62   37     25           8.65                7.17
## 415      n/a  n/a    n/a             19                 n/a
## 416        0    0      0              0                 n/a
## 417      249  124    125           18.2               13.68
## 418     <NA>  n/a    n/a           <NA>                 n/a
## 419       33   14     19              1                  33
## 420        0    0      0             22                   0
## 421      531  372    159             13               40.85
## 422       16   14      2              5                 3.2
## 423      n/a  n/a    n/a           0.91                 n/a
## 424        0    0      0          10.43                   0
## 425        0    0      0           <NA>                 n/a
## 426        0    0      0             24                   0
## 427       30   11     19           4.16                7.21
## 428       25    4     21            4.4                5.68
## 429        0    0      0              6                   0
## 430        0    0      0              0                 n/a
## 431        0    0      0             10                   0
## 432       68   47     21             17                   4
## 433       81   49     32           6.71               12.07
## 434       82   40     42            4.4               18.64
## 435        0    0      0              0                 n/a
## 436        0    0      0            7.6                   0
## 437      314  222     92             17               18.47
## 438        8    3      5              4                   2
## 439       50   28     22          12.92                3.87
## 440      113   78     35           18.4                6.14
## 441        0    0      0           10.3                   0
## 442        0    0      0              6                   0
## 443      113   78     35             13                8.69
## 444        0    0      0              0                 n/a
## 445      274  156    118           17.3               15.84
## 446      n/a  n/a    n/a          22.51                 n/a
## 447       38   27     11           4.92                7.72
## 448      631  323    308          42.68               14.78
## 449        0    0      0           <NA>                 n/a
## 450        0    0      0           12.5                   0
## 451        0    0      0           13.5                   0
## 452       44   31     13             10                 4.4
## 453       56   28     28           6.18                9.06
## 454        4    3      1              1                   4
## 455       24   17      7            5.5                4.36
## 456        0    0      0           <NA>                 n/a
## 457       36   30      6           8.31                4.33
## 458        0    0      0             16                   0
## 459        0    0      0            9.4                   0
## 460        0    0      0           8.62                   0
## 461        9    7      2              2                 4.5
## 462        0    0      0          84.65                   0
## 463        1    1      0           <NA>                 n/a
## 464        6    4      2            1.4                4.29
## 465     1554  719    835              0                 n/a
## 466      480  243    237           32.8               14.63
## 467       10    6      4              2                   5
## 468       53   38     15           8.58                6.18
## 469        0    0      0            1.6                   0
## 470       47   31     16            9.3                5.05
## 471       21   12      9           0.32               65.63
## 472        0    0      0              2                   0
## 473       80   62     18          28.18                2.84
## 474      106   74     32           19.5                5.44
## 475       48   36     12             11                4.36
## 476        0    0      0           38.5                   0
## 477      106   81     25           46.5                2.28
## 478      n/a  n/a    n/a           <NA>                 n/a
## 479      n/a  n/a    n/a           <NA>                 n/a
## 480        9    4      5           <NA>                 n/a
## 481      n/a  n/a    n/a             16                 n/a
## 482      n/a  n/a    n/a           8.65                 n/a
## 483       13    7      6              6                2.17
## 484      n/a  n/a    n/a              0                 n/a
## 485       69   20     49              4               17.25
## 486        0    0      0              0                 n/a
## 487        0    0      0           25.5                   0
## 488      351  214    137          35.36                9.93
## 489      314  236     78             21               14.95
## 490        0    0      0            1.5                   0
## 491       53   38     15             11                4.82
## 492       50   44      6            8.5                5.88
## 493        8    7      1              2                   4
## 494        9    9    n/a              4                2.25
## 495       14   14    n/a              2                   7
## 496      100   70     30          23.35                4.28
## 497     <NA>  n/a    n/a              2                 n/a
## 498       30   11     19              4                 7.5
## 499        0    0      0            7.5                   0
## 500        0    0      0              1                   0
## 501        0    0      0              0                 n/a
## 502       95   62     33             13                7.31
## 503        2    2    n/a           3.55                0.56
## 504      106   82     24          25.36                4.18
## 505        9    5      4              2                 4.5
## 506       21   15      6          19.24                1.09
## 507      224  144     80           30.5                7.34
## 508        0    0      0           56.3                   0
## 509        0    0      0             12                   0
## 510        0    0      0              0                 n/a
## 511        0    0      0             60                   0
## 512        0    0      0              0                 n/a
## 513        0    0      0             10                   0
## 514        0    0      0              0                 n/a
## 515        0    0      0           <NA>                 n/a
## 516        0    0      0           <NA>                 n/a
## 517        0    0      0          11.83                   0
## 518      747  370    377          57.08               13.09
## 519        0    0      0              2                   0
## 520        0    0      0           <NA>                 n/a
## 521      178  119     59           43.2                4.12
## 522       17   12      5              0                 n/a
## 523        0    0      0              0                 n/a
## 524        0    0      0             69                   0
## 525      n/a  n/a    n/a            n/a                 n/a
## 526        0    0      0              4                   0
## 527        0    0      0              2                   0
## 528        0    0      0              2                   0
## 529        0    0      0              4                   0
## 530        0    0      0              6                   0
## 531        0    0      0           <NA>                 n/a
## 532     <NA>  n/a    n/a           <NA>                 n/a
## 533       54   39     15           3.26               16.56
## 534      n/a  n/a    n/a           10.5                 n/a
## 535        0    0      0              0                 n/a
## 536     <NA>  n/a    n/a           <NA>                 n/a
## 537        0    0      0           <NA>                 n/a
## 538      n/a  n/a    n/a              0                 n/a
## 539      n/a  n/a    n/a             30                 n/a
## 540        0    0      0              3                   0
## 541        0    0      0              0                 n/a
## 542        0    0      0              0                 n/a
## 543       45   15     30           5.09                8.84
## 544       15   15      0              2                 7.5
## 545        0    0      0           18.1                   0
## 546        0    0      0           20.1                   0
## 547        0    0      0           23.8                   0
## 548       47   28     19           30.5                1.54
## 549      169  103     66           32.5                 5.2
## 550        2    2    n/a           <NA>                 n/a
## 551        0    0      0           <NA>                 n/a
## 552       12   11      1           5.05                2.38
## 553        0    0      0             35                   0
## 554        0    0      0             41                   0
## 555      408  214    194          34.75               11.74
## 556       15   15      0           2.04                7.35
## 557       62   40     22            6.5                9.54
## 558        0    0      0           31.5                   0
## 559        0    0      0           86.9                   0
## 560      524  305    219          33.17                15.8
## 561       38   27     11           5.13                7.41
## 562       77   59     18          43.08                1.79
## 563       70   38     32             23                3.04
## 564        0    0      0           0.92                   0
## 565      106   82     24             23                4.61
## 566       31   24      7            7.7                4.03
## 567       10    8      2              1                  10
## 568       23   18      5            4.5                5.11
## 569       46   28     18              2                  23
## 570     <NA>  n/a    n/a           <NA>                 n/a
## 571        0    0      0             28                   0
## 572        7    6      1              2                 3.5
## 573        0    0      0             38                   0
## 574       21   18      3              3                   7
## 575       26   24      2              5                 5.2
## 576       26   12     14              3                8.67
## 577       71   47     24           10.5                6.76
## 578       31   27      4            5.7                5.44
## 579        6    5      1           <NA>                 n/a
## 580        0    0      0              6                   0
## 581       15   11      4            5.6                2.68
## 582      n/a  n/a    n/a           0.25                 n/a
## 583        0    0      0           <NA>                 n/a
## 584        0    0      0           <NA>                 n/a
## 585        0  n/a    n/a           <NA>                 n/a
## 586        0    0      0           <NA>                 n/a
## 587      158  108     50             22                7.18
## 588        0    0      0              7                   0
## 589      154  103     51           31.5                4.89
## 590      n/a  n/a    n/a           <NA>                 n/a
## 591        5    1      4              1                   5
## 592       98   67     31            7.9               12.41
## 593        0    0      0             18                   0
## 594       44   35      9          48.12                0.91
## 595        8    7      1           <NA>                 n/a
## 596      279  199     80             14               19.93
## 597      n/a  n/a    n/a           <NA>                 n/a
## 598        0    0      0              0                 n/a
## 599      n/a  n/a    n/a           11.5                 n/a
## 600        0    0      0              4                   0
## 601       19   19      0           1.83               10.38
## 602       48   28     20            9.9                4.85
## 603       83   70     13             12                6.92
## 604        0    0      0             44                   0
## 605        0    0      0           <NA>                 n/a
## 606      271  114    157          23.86               11.36
## 607      166   94     72             21                 7.9
## 608       38   19     19            7.1                5.35
## 609       13   11      2              0                 n/a
## 610       37   20     17           7.88                 4.7
## 611      n/a  n/a    n/a           <NA>                 n/a
## 612      n/a  n/a    n/a           <NA>                 n/a
## 613       27   18      9              4                6.75
## 614      136  103     33          29.64                4.59
## 615        0    0      0           8.01                   0
## 616        0    0      0           13.5                   0
## 617      111   66     45              9               12.33
## 618        0    0      0           56.5                   0
## 619       62   42     20            4.1               15.12
## 620        0    0      0           <NA>                 n/a
## 621        9    5      4           6.02                 1.5
## 622        0    0      0              1                   0
## 623        0    0      0           <NA>                 n/a
## 624        0    0      0             17                   0
## 625        0    0      0           1.44                   0
## 626      582  294    288           43.5               13.38
## 627      120   68     52           7.48               16.04
## 628      n/a  n/a    n/a           <NA>                 n/a
## 629      653  290    363             65               10.05
## 630      209  147     62          29.75                7.03
## 631        0    0      0              0                 n/a
## 632        0    0      0              6                   0
## 633       36   28      8              9                   4
## 634        5    2      3           1.52                3.29
## 635        8    2      6           1.54                5.19
## 636      n/a  n/a    n/a           21.5                 n/a
## 637       23   21      2           3.17                7.26
## 638        0    0      0             30                   0
## 639       39   33      6          11.98                3.26
## 640        0    0      0              0                 n/a
## 641       20   12      8           <NA>                 n/a
## 642       20   12      8           <NA>                 n/a
## 643        0    0      0             13                   0
## 644       63   34     29            3.9               16.15
## 645       36   25     11              4                   9
## 646       97   69     28           35.5                2.73
## 647       92   70     22           18.5                4.97
## 648       30   18     12           7.61                3.94
## 649      n/a  n/a    n/a              0                 n/a
## 650        0    0      0           <NA>                 n/a
## 651        0    0      0           <NA>                 n/a
## 652      n/a  n/a    n/a            5.6                 n/a
## 653     <NA>  n/a    n/a           <NA>                 n/a
## 654        0    0      0              0                 n/a
## 655      139   76     63            1.2              115.83
## 656       36   19     17           8.41                4.28
## 657        0    0      0              0                 n/a
## 658        0    0      0           0.17                   0
## 659       44   21     23           3.03               14.52
## 660        0    0      0           <NA>                 n/a
## 661        0    0      0           12.5                   0
## 662        0    0      0           <NA>                 n/a
## 663      667  508    159           46.1               14.47
## 664      493  372    121          49.45                9.97
## 665        0    0      0          30.25                   0
## 666       98   65     33             19                5.16
## 667      339  133    206             10                33.9
## 668       51   28     23              5                10.2
## 669       12   11      1              2                   6
## 670       20   10     10              3                6.67
## 671        0    0      0          10.75                   0
## 672      350  171    179          20.43               17.13
## 673       49   31     18           4.58                10.7
## 674       13    9      4           3.37                3.86
## 675        2    1      1           <NA>                 n/a
## 676       11    9      2           1.17                 9.4
## 677       28   20      8           <NA>                 n/a
## 678      n/a  n/a    n/a              3                 n/a
## 679      n/a  n/a    n/a              0                 n/a
## 680       17    9      8           <NA>                 n/a
## 681        0    0      0              0                 n/a
## 682       28   15     13              6                4.67
## 683      937  471    466           68.4                13.7
## 684      n/a  n/a    n/a           <NA>                 n/a
## 685       96   61     35           17.6                5.45
## 686      515  251    264             35               14.71
## 687        0    0      0             18                   0
## 688       18   16      2              3                   6
## 689       74   63     11              7               10.57
## 690        0    0      0            6.4                   0
## 691        4    4    n/a              2                   2
## 692       50   30     20              3               16.67
## 693        0    0      0           <NA>                 n/a
## 694     1625 1187    438           35.5               45.77
## 695        0    0      0              5                   0
## 696        3    2      1           <NA>                 n/a
## 697        2    2      0           <NA>                 n/a
## 698      n/a  n/a    n/a            5.5                 n/a
## 699        0    0      0              0                 n/a
## 700      115   99     16           14.9                7.72
## 701       33   22     11              3                  11
## 702       52   31     21           <NA>                 n/a
## 703       65   55     10             13                   5
## 704        8    8      0           2.53                3.16
## 705        0    0      0              0                 n/a
## 706       13    6      7           <NA>                 n/a
## 707       80   56     24           <NA>                 n/a
## 708      n/a  n/a    n/a           <NA>                 n/a
## 709       29   22      7              6                4.83
## 710      n/a  n/a    n/a           <NA>                 n/a
## 711     <NA>  n/a    n/a              1                 n/a
## 712     <NA>  n/a    n/a           <NA>                 n/a
## 713        0    0      0           20.3                   0
## 714        0    0      0           13.3                   0
## 715        0    0      0              0                 n/a
## 716      127   71     56              0                 n/a
## 717        0    0      0              0                 n/a
## 718      n/a  n/a    n/a             14                 n/a
## 719       60   52      8           8.95                 6.7
## 720       25   21      4              4                6.25
## 721        0    0      0              0                 n/a
## 722        0    0      0           <NA>                 n/a
## 723       86   36     50             11                7.82
## 724        0    0      0           <NA>                 n/a
## 725        0    0      0             46                   0
## 726        0    0      0           <NA>                 n/a
## 727       62   39     23              1                  62
## 728       95   76     19             13                7.31
## 729       38   34      4            7.6                   5
## 730      n/a  n/a    n/a            7.5                 n/a
## 731        1    1    n/a           <NA>                 n/a
## 732     <NA>  n/a    n/a           <NA>                 n/a
## 733      n/a  n/a    n/a              3                 n/a
## 734      232  111    121           11.5               20.17
## 735        0    0      0           1.96                   0
## 736       13   10      3           <NA>                 n/a
## 737        3    3      0           <NA>                 n/a
## 738      n/a  n/a    n/a           <NA>                 n/a
## 739      n/a  n/a    n/a           <NA>                 n/a
## 740      n/a  n/a    n/a           <NA>                 n/a
## 741      n/a  n/a    n/a            2.6                 n/a
## 742        0    0      0          12.75                   0
## 743        0    0      0             12                   0
## 744        0    0      0             12                   0
## 745       54   27     27           3.72               14.52
## 746       60   54      6          11.41                5.26
## 747        0    0      0              0                 n/a
## 748        0    0      0              0                 n/a
## 749        2    2      0           <NA>                 n/a
## 750        0    0      0             11                   0
## 751       16   13      3            6.6                2.42
## 752      n/a  n/a    n/a              3                 n/a
## 753       25   17      8              1                  25
## 754        0    0      0              0                 n/a
## 755        0    0      0              0                 n/a
## 756        0    0      0            6.2                   0
## 757        5    0      5            1.4                3.57
## 758       44   33     11           <NA>                 n/a
## 759       52   43      9           9.69                5.37
## 760       16   12      4           1.18               13.56
## 761      198  130     68           5.39               36.73
## 762        0    0      0          20.84                   0
## 763        0    0      0             17                   0
## 764        0    0      0             20                   0
## 765        0    0      0          22.21                   0
## 766        0    0      0              0                 n/a
## 767        0    0      0          70.75                   0
## 768      n/a  n/a    n/a             12                 n/a
## 769      n/a  n/a    n/a           3.01                 n/a
## 770       19   10      9           3.26                5.83
## 771      590  413    177           16.7               35.33
## 772      954  669    285          27.21               35.06
## 773      631  492    139          17.01                37.1
## 774        0    0      0              0                 n/a
## 775        0    0      0              0                 n/a
## 776       28   12     16            2.3               12.17
## 777       37   32      5          12.15                3.05
## 778      989  714    275          50.01               19.78
## 779      459  315    144          37.99               12.08
## 780      266  206     60          14.99               17.75
## 781       55   36     19           <NA>                 n/a
## 782      123   83     40           5.01               24.55
## 783      239  157     82           47.5                5.03
## 784      n/a  n/a    n/a             21                 n/a
## 785       69   55     14             15                 4.6
## 786        3    2      1              1                   3
## 787       88   72     16             13                6.77
## 788       59   43     16             11                5.36
## 789       46   38      8              5                 9.2
## 790       65   39     26          10.26                6.34
## 791       61   42     19              5                12.2
## 792        2    2    n/a              1                   2
## 793       81   64     17          26.09                 3.1
## 794        6    2      4              2                   3
## 795       18   12      6           4.12                4.37
## 796       66   47     19          16.93                 3.9
## 797       11   11      0           1.26                8.73
## 798        0    0      0           23.5                   0
## 799       30   22      8           6.25                 4.8
## 800        0    0      0              0                 n/a
## 801      n/a  n/a    n/a              6                 n/a
## 802       86   61     25          10.78                7.98
## 803       60   36     24             20                   3
## 804      n/a  n/a    n/a            n/a                 n/a
## 805       87   45     42              5                17.4
## 806        4    3      1              1                   4
## 807       18   13      5           <NA>                 n/a
## 808      210  158     52          46.35                4.53
## 809      n/a  n/a    n/a           3.25                 n/a
## 810        3    1      2           <NA>                 n/a
## 811     <NA>  n/a    n/a           <NA>                 n/a
## 812      n/a  n/a    n/a              0                 n/a
## 813      n/a  n/a    n/a              0                 n/a
## 814        0    0      0            110                   0
## 815        0    0      0             27                   0
## 816       57   33     24            6.5                8.77
## 817       67   54     13           14.1                4.75
## 818      n/a  n/a    n/a           <NA>                 n/a
## 819       24   12     12              7                3.43
## 820        6    3      3              3                   2
## 821       45   31     14           6.98                6.45
## 822        0    0      0             53                   0
## 823       25   18      7              4                6.25
## 824      n/a  n/a    n/a           <NA>                 n/a
## 825      n/a  n/a    n/a           <NA>                 n/a
## 826      n/a  n/a    n/a            n/a                 n/a
## 827        0    0      0              0                 n/a
## 828       22   22      0              4                 5.5
## 829       18   12      6            3.7                4.86
## 830        0    0      0          98.12                   0
## 831       52   30     22            9.6                5.42
## 832        0    0      0           0.17                   0
## 833     <NA>  n/a    n/a           <NA>                 n/a
## 834        0    0      0           <NA>                 n/a
## 835        0    0      0          49.35                   0
## 836      743  363    380           58.9               12.61
## 837      509  261    248           41.4               12.29
## 838        0    0      0             33                   0
## 839      134   90     44           <NA>                 n/a
## 840        5    5      0           1.33                3.76
## 841       49   21     28           5.98                8.19
## 842       23   12     11           3.62                6.35
## 843       18    4     14           2.01                8.96
## 844       22   15      7           4.91                4.48
## 845       32   16     16              2                  16
## 846        9    5      4              1                   9
## 847       26   13     13            5.7                4.56
## 848      n/a  n/a    n/a           <NA>                 n/a
## 849       19   13      6              2                 9.5
## 850       58   31     27           5.25               11.05
## 851       25   19      6           <NA>                 n/a
## 852       15   11      4              5                   3
## 853      n/a  n/a    n/a           <NA>                 n/a
## 854        0    0      0           1.08                   0
## 855      n/a  n/a    n/a           <NA>                 n/a
## 856      n/a  n/a    n/a           <NA>                 n/a
## 857        9    5      4              2                 4.5
## 858        9    3      6           1.99                4.52
## 859        7    4      3           <NA>                 n/a
## 860      196  127     69           21.5                9.12
## 861       55   35     20            3.5               15.71
## 862      378  228    150          48.54                7.79
## 863      323  223    100           22.6               14.29
## 864      183   67    116           16.4               11.16
## 865       71   61     10          14.68                4.84
## 866       94   53     41          12.37                 7.6
## 867        0    0      0             20                   0
## 868        0    0      0             31                   0
## 869        7    7      0           1.45                4.83
## 870        4    3      1           <NA>                 n/a
## 871     <NA>  n/a    n/a           <NA>                 n/a
## 872       15    8      7              2                 7.5
## 873        9    5      4           <NA>                 n/a
## 874       15   11      4            1.5                  10
## 875       16   11      5              1                  16
## 876       12    9      3              1                  12
## 877      n/a  n/a    n/a           <NA>                 n/a
## 878       47   35     12          20.36                2.31
## 879        0    0      0             34                   0
## 880       32   15     17           3.21                9.97
## 881        0    0      0              0                 n/a
## 882        0    0      0              0                 n/a
## 883      n/a  n/a    n/a           <NA>                 n/a
## 884      n/a  n/a    n/a           <NA>                 n/a
## 885       94   64     30             14                6.71
## 886       12    6      6           <NA>                 n/a
## 887       94   54     40              2                  47
## 888        4    2      2           <NA>                 n/a
## 889      508  244    264             37               13.73
## 890      n/a  n/a    n/a           13.9                 n/a
## 891      n/a  n/a    n/a             10                 n/a
## 892      220  127     93           7.62               28.87
## 893      n/a  n/a    n/a           <NA>                 n/a
## 894      n/a  n/a    n/a           <NA>                 n/a
## 895      135   81     54           <NA>                 n/a
## 896      n/a  n/a    n/a           <NA>                 n/a
## 897      n/a  n/a    n/a           <NA>                 n/a
## 898        0    0      0            1.6                   0
## 899        8    6      2            2.5                 3.2
## 900      n/a  n/a    n/a           <NA>                 n/a
## 901      535  283    252             38               14.08
## 902       59   44     15              5                11.8
## 903       15   13      2              5                   3
## 904       55   40     15              7                7.86
## 905      n/a  n/a    n/a           <NA>                 n/a
## 906      306  221     85          20.61               14.85
## 907      392  207    185           30.6               12.81
## 908        0    0      0           <NA>                 n/a
## 909      118   85     33          19.56                6.03
## 910       77   43     34           9.43                8.17
## 911       52   35     17           5.37                9.68
## 912       10    6      4           1.17                8.55
## 913        0    0      0           <NA>                 n/a
## 914      419  203    216             32               13.09
## 915       18   14      4           2.57                   7
## 916      n/a  n/a    n/a           <NA>                 n/a
## 917       12    9      3           <NA>                 n/a
## 918      992  761    231           36.6                27.1
## 919       79   63     16             12                6.58
## 920      264  141    123             17               15.53
## 921       37   22     15           5.49                6.74
## 922        5    3      2              1                   5
## 923        9    7      2              3                   3
## 924     <NA>  n/a    n/a            1.1                 n/a
## 925     <NA>  n/a    n/a           0.77                 n/a
## 926       31   20     11           <NA>                 n/a
## 927       22   15      7           3.55                 6.2
## 928       15   13      2            1.2                12.5
## 929        7    5      2           <NA>                 n/a
## 930        0    0      0              0                 n/a
## 931      n/a  n/a    n/a              0                 n/a
## 932        0    0      0              0                 n/a
## 933      n/a  n/a    n/a              1                 n/a
## 934      n/a  n/a    n/a           <NA>                 n/a
## 935       15    9      6           0.88               17.05
## 936        6    3      3           0.75                   8
## 937       21   12      9           1.95               10.77
## 938        4    1      3           3.04                1.32
## 939        3    3    n/a           0.97                3.09
## 940        3    2      1           <NA>                 n/a
## 941      n/a  n/a    n/a           2.06                 n/a
## 942      n/a  n/a    n/a              0                 n/a
## 943        0    0      0              0                 n/a
## 944        0    0      0              5                   0
## 945       83   67     16              4               20.75
## 946        0    0      0           9.55                   0
## 947       83   37     46           3.51               23.65
## 948      n/a  n/a    n/a             19                 n/a
## 949        0    0      0           <NA>                 n/a
## 950       32   24      8          14.66                2.18
## 951       22   19      3           4.88                4.51
## 952       18   11      7              1                  18
## 953       19   13      6           1.55               12.26
## 954       37   25     12              7                5.29
## 955       18   17      1             10                 1.8
## 956       17   15      2           3.83                4.44
## 957       18    8     10              2                   9
## 958       41   21     20           5.99                6.84
## 959      307  226     81           16.7               18.38
## 960       14   12      2              1                  14
## 961       80   43     37            3.3               24.24
## 962        0    0      0           <NA>                 n/a
## 963        0    0      0           <NA>                 n/a
## 964        0    0      0           <NA>                 n/a
## 965        0    0      0           <NA>                 n/a
## 966        0    0      0           <NA>                 n/a
## 967        0    0      0           <NA>                 n/a
## 968       44   21     23           3.94               11.17
## 969       19   13      6              2                 9.5
## 970        0    0      0             11                   0
## 971       66   49     17          12.21                5.41
## 972        0  n/a    n/a           <NA>                 n/a
## 973        0    0      0           <NA>                 n/a
## 974        0    0      0           <NA>                 n/a
## 975        0    0      0           <NA>                 n/a
## 976       80   60     20             16                   5
## 977        0    0      0             51                   0
## 978       74   47     27           13.7                 5.4
## 979      474  351    123          54.68                8.67
## 980        0    0      0           15.5                   0
## 981        0    0      0           16.5                   0
## 982        0    0      0             49                   0
## 983       50   33     17           7.38                6.78
## 984     <NA>  n/a    n/a           <NA>                 n/a
## 985        0    0      0              0                 n/a
## 986        4    4    n/a          52.84                0.08
## 987       72   49     23             16                 4.5
## 988        0    0      0             11                   0
## 989        0    0      0             16                   0
## 990     <NA>  n/a    n/a           <NA>                 n/a
## 991        0    0      0           <NA>                 n/a
## 992       19   16      3           3.13                6.07
## 993       22   18      4              7                3.14
## 994      n/a  n/a    n/a           <NA>                 n/a
## 995      n/a  n/a    n/a           <NA>                 n/a
## 996      n/a  n/a    n/a              8                 n/a
## 997      n/a  n/a    n/a             26                 n/a
## 998      164  123     41              1                 164
## 999       12    0     12           1.98                6.06
## 1000       0    0      0              1                   0
## 1001       0    0      0           <NA>                 n/a
## 1002       0    0      0           <NA>                 n/a
## 1003     454  222    232           41.2               11.02
## 1004       9    6      3              1                   9
## 1005     n/a  n/a    n/a            n/a                 n/a
## 1006      36   24     12           4.75                7.58
## 1007      21   11     10              1                  21
## 1008       1    1      0              2                 0.5
## 1009       2    1      1           <NA>                 n/a
## 1010      49   45      4              1                  49
## 1011       0    0      0              0                 n/a
## 1012       0    0      0             18                   0
## 1013       0    0      0           <NA>                 n/a
## 1014     n/a  n/a    n/a              0                 n/a
## 1015      69   55     14          16.02                4.31
## 1016     n/a  n/a    n/a              0                 n/a
## 1017      98   42     56          10.04                9.76
## 1018     n/a  n/a    n/a            2.5                 n/a
## 1019     100   88     12          15.91                6.29
## 1020     n/a  n/a    n/a          15.89                 n/a
## 1021       0    0      0              0                 n/a
## 1022       0    0      0           <NA>                 n/a
## 1023       0    0      0             19                   0
## 1024      42   24     18              4                10.5
## 1025      38   32      6           6.21                6.12
## 1026      46   33     13              4                11.5
## 1027     n/a  n/a    n/a           <NA>                 n/a
## 1028     n/a  n/a    n/a              0                 n/a
## 1029     n/a  n/a    n/a           <NA>                 n/a
## 1030      21   13      8            4.5                4.67
## 1031      45   37      8             10                 4.5
## 1032      25   20      5            9.1                2.75
## 1033     139   95     44          18.67                7.45
## 1034      45   37      8          10.13                4.44
## 1035      17   14      3            2.5                 6.8
## 1036     125   78     47          13.94                8.97
## 1037      31   28      3              0                 n/a
## 1038       0    0      0             47                   0
## 1039       0    0      0              0                 n/a
## 1040    <NA>  n/a    n/a              2                 n/a
## 1041      23   10     13              3                7.67
## 1042      12    3      9              1                  12
## 1043       0    0      0              0                 n/a
## 1044      17    7     10              2                 8.5
## 1045       3  n/a      3           0.91                 3.3
## 1046     125   95     30          10.28               12.16
## 1047       0    0      0              0                 n/a
## 1048      58   53      5           9.36                 6.2
## 1049       0    0      0             22                   0
## 1050     n/a  n/a    n/a           0.97                 n/a
## 1051      21   13      8              2                10.5
## 1052      21   15      6           6.06                3.47
## 1053       6    6      0           2.32                2.59
## 1054       7    4      3              0                 n/a
## 1055      20   10     10              0                 n/a
## 1056       2    2      0              0                 n/a
## 1057     101   63     38           <NA>                 n/a
## 1058      24   17      7           <NA>                 n/a
## 1059      35   18     17           <NA>                 n/a
## 1060      85   55     30           <NA>                 n/a
## 1061       9    9      0           <NA>                 n/a
## 1062     254  187     67            8.4               30.24
## 1063      70   59     11          23.05                3.04
## 1064       0    0      0             23                   0
## 1065      62   44     18          12.36                5.02
## 1066       0    0      0             20                   0
## 1067      74   36     38          17.21                 4.3
## 1068       3    1      2              1                   3
## 1069       7    1      6              2                 3.5
## 1070       7    2      5           0.12               58.33
## 1071       5    2      3              1                   5
## 1072     126   99     27          30.52                4.13
## 1073       5    0      5           <NA>                 n/a
## 1074       0    0      0              0                 n/a
## 1075      43   22     21              2                21.5
## 1076      30   24      6           4.05                7.41
## 1077      50   37     13             11                4.55
## 1078      19   17      2           4.04                 4.7
## 1079      19   12      7           3.06                6.21
## 1080      51   41     10           9.78                5.21
## 1081      50   38     12              1                  50
## 1082       2    2      0          34.96                0.06
## 1083      87   63     24             19                4.58
## 1084      78   40     38              6                  13
## 1085       0    0      0           11.6                   0
## 1086      38   26     12           8.98                4.23
## 1087      36   31      5           5.19                6.94
## 1088       4    4      0           1.01                3.96
## 1089      27   12     15              2                13.5
## 1090     101   64     37          20.61                 4.9
## 1091       0    0      0             14                   0
## 1092       0    0      0           11.5                   0
## 1093       0    0      0           <NA>                 n/a
## 1094       1    1    n/a              2                 0.5
## 1095      48   41      7          13.77                3.49
## 1096     200   70    130              4                  50
## 1097     503  261    242             44               11.43
## 1098     n/a  n/a    n/a           <NA>                 n/a
## 1099      49   22     27            1.5               32.67
## 1100     n/a  n/a    n/a           <NA>                 n/a
## 1101      21    0     21           3.08                6.82
## 1102     712  353    359           50.1               14.21
## 1103      41   38      3              6                6.83
## 1104      67   20     47              5                13.4
## 1105     n/a  n/a    n/a           <NA>                 n/a
## 1106      85   70     15           14.5                5.86
## 1107       0    0      0          51.75                   0
## 1108     275  167    108          14.28               19.26
## 1109     n/a  n/a    n/a              2                 n/a
## 1110      65   29     36              4               16.25
## 1111     177  108     69             20                8.85
## 1112      16   10      6              3                5.33
## 1113     116   85     31             13                8.92
## 1114       0    0      0              1                   0
## 1115       4    4    n/a            1.6                 2.5
## 1116      26   15     11            3.7                7.03
## 1117     n/a  n/a    n/a           <NA>                 n/a
## 1118      59   48     11              8                7.38
## 1119      65   53     12              8                8.13
## 1120       9    6      3              2                 4.5
## 1121       0    0      0           <NA>                 n/a
## 1122       0    0      0           41.5                   0
## 1123      58   44     14              8                7.25
## 1124       0    0      0           <NA>                 n/a
## 1125      20   18      2           4.06                4.93
## 1126      70   56     14           9.52                7.35
## 1127       0    0      0             31                   0
## 1128       0    0      0           <NA>                 n/a
## 1129       4    2      2              1                   4
## 1130       0    0      0             70                   0
## 1131     n/a  n/a    n/a             23                 n/a
## 1132       0    0      0             15                   0
## 1133       0    0      0           <NA>                 n/a
## 1134     663  410    253             62               10.69
## 1135       0    0      0              4                   0
## 1136      30   18     12              0                 n/a
## 1137     218  148     70            8.6               25.35
## 1138     n/a  n/a    n/a           18.5                 n/a
## 1139     457  211    246             37               12.35
## 1140       0    0      0           24.5                   0
## 1141       0    0      0             48                   0
## 1142     n/a  n/a    n/a           36.1                 n/a
## 1143     n/a  n/a    n/a           4.05                 n/a
## 1144     n/a  n/a    n/a           <NA>                 n/a
## 1145      40   34      6              6                6.67
## 1146       0    0      0           <NA>                 n/a
## 1147       0    0      0              0                 n/a
## 1148       0    0      0             49                   0
## 1149       0    0      0             28                   0
## 1150       0    0      0             40                   0
## 1151      21   13      8           4.52                4.65
## 1152      66   44     22           8.76                7.53
## 1153       0    0      0             12                   0
## 1154       4    3      1           2.06                1.94
## 1155       0    0      0           0.32                   0
## 1156       0    0      0              0                 n/a
## 1157       0    0      0            1.6                   0
## 1158      37   37      0           5.96                6.21
## 1159     259  138    121              6               43.17
## 1160     n/a  n/a    n/a            n/a                 n/a
## 1161      37   21     16          11.25                3.29
## 1162       0    0      0           0.18                   0
## 1163       1    0      1           1.68                 0.6
## 1164     n/a  n/a    n/a              0                 n/a
## 1165     n/a  n/a    n/a           12.5                 n/a
## 1166     260  178     82              6               43.33
## 1167       0    0      0              0                 n/a
## 1168       0    0      0             15                   0
## 1169       0    0      0           70.5                   0
## 1170       0    0      0             28                   0
## 1171     311  261     50          42.83                7.26
## 1172     284  147    137          18.31               15.51
## 1173       2    2      0              0                 n/a
## 1174      31   15     16              3               10.33
## 1175       4    2      2              3                1.33
## 1176     531  235    296           25.5               20.82
## 1177    <NA>  n/a    n/a           <NA>                 n/a
## 1178     240  123    117          20.55               11.68
## 1179       0    0      0             50                   0
## 1180      17   14      3              3                5.67
## 1181       0    0      0            1.6                   0
## 1182      35   29      6           5.12                6.84
## 1183      39   26     13           7.81                4.99
## 1184     115   65     50          25.25                4.55
## 1185    <NA>  n/a    n/a           <NA>                 n/a
## 1186       9    7      2              2                 4.5
## 1187      35   22     13              2                17.5
## 1188      14   10      4           1.92                7.29
## 1189      16   10      6           <NA>                 n/a
## 1190      24   13     11              3                   8
## 1191      31   21     10           <NA>                 n/a
## 1192      93   59     34            9.8                9.49
## 1193     n/a  n/a    n/a              0                 n/a
## 1194      54   28     26           3.46               15.61
## 1195       2    1      1           <NA>                 n/a
## 1196      13    9      4           6.24                2.08
## 1197     n/a  n/a    n/a              0                 n/a
## 1198       0    0      0             14                   0
## 1199     524  302    222           31.5               16.63
## 1200       6    5      1           <NA>                 n/a
## 1201     361  267     94          10.79               33.46
## 1202       0    0      0             15                   0
## 1203       0    0      0              1                   0
## 1204       0    0      0             25                   0
## 1205       0    0      0              3                   0
## 1206     866  620    246          48.08               18.01
## 1207       8    8      0           0.75               10.67
## 1208       0    0      0             19                   0
## 1209      66   56     10          25.14                2.63
## 1210       6    4      2              1                   6
## 1211      11   11      0           2.03                5.42
## 1212       0    0      0           40.5                   0
## 1213       0    0      0             76                   0
## 1214       0    0      0           <NA>                 n/a
## 1215    <NA>  n/a    n/a           <NA>                 n/a
## 1216      18   16      2              3                   6
## 1217     n/a  n/a    n/a             33                 n/a
## 1218       0    0      0             25                   0
## 1219      10    9      1           2.01                4.98
## 1220      15    8      7              1                  15
## 1221      12    9      3              2                   6
## 1222       9    5      4              1                   9
## 1223     625  321    304           43.7                14.3
## 1224       0    0      0              0                 n/a
## 1225      96   58     38             11                8.73
## 1226       8    6      2           <NA>                 n/a
## 1227     113   65     48             19                5.95
## 1228     241  164     77             38                6.34
## 1229     n/a  n/a    n/a           <NA>                 n/a
## 1230       0    0      0          13.56                   0
## 1231      93   55     38           7.26               12.81
## 1232       1    0      1           <NA>                 n/a
## 1233      10    8      2           <NA>                 n/a
## 1234       0    0      0           <NA>                 n/a
## 1235    1679  950    729            112               14.99
## 1236       0    0      0           <NA>                 n/a
## 1237     102   55     47            9.1               11.21
## 1238      62   44     18             12                5.17
## 1239      17   12      5            3.5                4.86
## 1240     n/a  n/a    n/a              0                 n/a
## 1241      34   17     17           6.49                5.24
## 1242       0    0      0          45.46                   0
## 1243      53   38     15           7.77                6.82
## 1244      36   31      5           8.94                4.03
## 1245      59   36     23           <NA>                 n/a
## 1246       0    0      0              0                 n/a

Schools operates under the RESA district type seems to have missing enrollment information.


Part 1. Data Exploration Summary Reviewing the data, it reveals some useful information. 

  1. For example, we are not including any public schools listing that provides adult education. However, the School name revealed that a portion of these incomplete cases are “ADULT ED” or “Adult education”.

  2. The Updated.Status variables provides information on the operational status of the school. We cannot simply remove school by these categories because enrollment information are included in some categories. Only the “Future” status have no enrollment information.

  3. District Types which is named as Agency type provides information on who operates these schools. Generally, RESA are entities that support local school district and therefore may be serving students that is already counted in a regular school.